NAME

dsbgvx - compute selected eigenvalues, and optionally, eigenvectors of a real generalized symmetric-definite banded eigenproblem, of the form A*x=(lambda)*B*x


SYNOPSIS

  SUBROUTINE DSBGVX( JOBZ, RANGE, UPLO, N, KA, KB, AB, LDAB, BB, LDBB, 
 *      Q, LDQ, VL, VU, IL, IU, ABSTOL, M, W, Z, LDZ, WORK, IWORK, IFAIL, 
 *      INFO)
  CHARACTER * 1 JOBZ, RANGE, UPLO
  INTEGER N, KA, KB, LDAB, LDBB, LDQ, IL, IU, M, LDZ, INFO
  INTEGER IWORK(*), IFAIL(*)
  DOUBLE PRECISION VL, VU, ABSTOL
  DOUBLE PRECISION AB(LDAB,*), BB(LDBB,*), Q(LDQ,*), W(*), Z(LDZ,*), WORK(*)
  SUBROUTINE DSBGVX_64( JOBZ, RANGE, UPLO, N, KA, KB, AB, LDAB, BB, 
 *      LDBB, Q, LDQ, VL, VU, IL, IU, ABSTOL, M, W, Z, LDZ, WORK, IWORK, 
 *      IFAIL, INFO)
  CHARACTER * 1 JOBZ, RANGE, UPLO
  INTEGER*8 N, KA, KB, LDAB, LDBB, LDQ, IL, IU, M, LDZ, INFO
  INTEGER*8 IWORK(*), IFAIL(*)
  DOUBLE PRECISION VL, VU, ABSTOL
  DOUBLE PRECISION AB(LDAB,*), BB(LDBB,*), Q(LDQ,*), W(*), Z(LDZ,*), WORK(*)

F95 INTERFACE

  SUBROUTINE SBGVX( JOBZ, RANGE, UPLO, [N], KA, KB, AB, [LDAB], BB, 
 *       [LDBB], Q, [LDQ], VL, VU, IL, IU, ABSTOL, M, W, Z, [LDZ], [WORK], 
 *       [IWORK], IFAIL, [INFO])
  CHARACTER(LEN=1) :: JOBZ, RANGE, UPLO
  INTEGER :: N, KA, KB, LDAB, LDBB, LDQ, IL, IU, M, LDZ, INFO
  INTEGER, DIMENSION(:) :: IWORK, IFAIL
  REAL(8) :: VL, VU, ABSTOL
  REAL(8), DIMENSION(:) :: W, WORK
  REAL(8), DIMENSION(:,:) :: AB, BB, Q, Z
  SUBROUTINE SBGVX_64( JOBZ, RANGE, UPLO, [N], KA, KB, AB, [LDAB], BB, 
 *       [LDBB], Q, [LDQ], VL, VU, IL, IU, ABSTOL, M, W, Z, [LDZ], [WORK], 
 *       [IWORK], IFAIL, [INFO])
  CHARACTER(LEN=1) :: JOBZ, RANGE, UPLO
  INTEGER(8) :: N, KA, KB, LDAB, LDBB, LDQ, IL, IU, M, LDZ, INFO
  INTEGER(8), DIMENSION(:) :: IWORK, IFAIL
  REAL(8) :: VL, VU, ABSTOL
  REAL(8), DIMENSION(:) :: W, WORK
  REAL(8), DIMENSION(:,:) :: AB, BB, Q, Z

C INTERFACE

#include <sunperf.h>

void dsbgvx(char jobz, char range, char uplo, int n, int ka, int kb, double *ab, int ldab, double *bb, int ldbb, double *q, int ldq, double vl, double vu, int il, int iu, double abstol, int *m, double *w, double *z, int ldz, int *ifail, int *info);

void dsbgvx_64(char jobz, char range, char uplo, long n, long ka, long kb, double *ab, long ldab, double *bb, long ldbb, double *q, long ldq, double vl, double vu, long il, long iu, double abstol, long *m, double *w, double *z, long ldz, long *ifail, long *info);


PURPOSE

dsbgvx computes selected eigenvalues, and optionally, eigenvectors of a real generalized symmetric-definite banded eigenproblem, of the form A*x=(lambda)*B*x. Here A and B are assumed to be symmetric and banded, and B is also positive definite. Eigenvalues and eigenvectors can be selected by specifying either all eigenvalues, a range of values or a range of indices for the desired eigenvalues.


ARGUMENTS


FURTHER DETAILS

Based on contributions by

   Mark Fahey, Department of Mathematics, Univ. of Kentucky, USA