zhgeqz - implement a single-shift version of the QZ method for finding the generalized eigenvalues w(i)=ALPHA(i)/BETA(i)
of the equation det( A-w(i) B ) = 0 If JOB='S', then the pair (A,B) is simultaneously reduced to Schur form (i.e., A and B are both upper triangular) by applying one unitary tranformation (usually called Q) on the left and another (usually called Z) on the right
SUBROUTINE ZHGEQZ( JOB, COMPQ, COMPZ, N, ILO, IHI, A, LDA, B, LDB, * ALPHA, BETA, Q, LDQ, Z, LDZ, WORK, LWORK, RWORK, INFO) CHARACTER * 1 JOB, COMPQ, COMPZ DOUBLE COMPLEX A(LDA,*), B(LDB,*), ALPHA(*), BETA(*), Q(LDQ,*), Z(LDZ,*), WORK(*) INTEGER N, ILO, IHI, LDA, LDB, LDQ, LDZ, LWORK, INFO DOUBLE PRECISION RWORK(*)
SUBROUTINE ZHGEQZ_64( JOB, COMPQ, COMPZ, N, ILO, IHI, A, LDA, B, * LDB, ALPHA, BETA, Q, LDQ, Z, LDZ, WORK, LWORK, RWORK, INFO) CHARACTER * 1 JOB, COMPQ, COMPZ DOUBLE COMPLEX A(LDA,*), B(LDB,*), ALPHA(*), BETA(*), Q(LDQ,*), Z(LDZ,*), WORK(*) INTEGER*8 N, ILO, IHI, LDA, LDB, LDQ, LDZ, LWORK, INFO DOUBLE PRECISION RWORK(*)
SUBROUTINE HGEQZ( JOB, COMPQ, COMPZ, [N], ILO, IHI, A, [LDA], B, * [LDB], ALPHA, BETA, Q, [LDQ], Z, [LDZ], [WORK], [LWORK], [RWORK], * [INFO]) CHARACTER(LEN=1) :: JOB, COMPQ, COMPZ COMPLEX(8), DIMENSION(:) :: ALPHA, BETA, WORK COMPLEX(8), DIMENSION(:,:) :: A, B, Q, Z INTEGER :: N, ILO, IHI, LDA, LDB, LDQ, LDZ, LWORK, INFO REAL(8), DIMENSION(:) :: RWORK
SUBROUTINE HGEQZ_64( JOB, COMPQ, COMPZ, [N], ILO, IHI, A, [LDA], B, * [LDB], ALPHA, BETA, Q, [LDQ], Z, [LDZ], [WORK], [LWORK], [RWORK], * [INFO]) CHARACTER(LEN=1) :: JOB, COMPQ, COMPZ COMPLEX(8), DIMENSION(:) :: ALPHA, BETA, WORK COMPLEX(8), DIMENSION(:,:) :: A, B, Q, Z INTEGER(8) :: N, ILO, IHI, LDA, LDB, LDQ, LDZ, LWORK, INFO REAL(8), DIMENSION(:) :: RWORK
#include <sunperf.h>
void zhgeqz(char job, char compq, char compz, int n, int ilo, int ihi, doublecomplex *a, int lda, doublecomplex *b, int ldb, doublecomplex *alpha, doublecomplex *beta, doublecomplex *q, int ldq, doublecomplex *z, int ldz, int *info);
void zhgeqz_64(char job, char compq, char compz, long n, long ilo, long ihi, doublecomplex *a, long lda, doublecomplex *b, long ldb, doublecomplex *alpha, doublecomplex *beta, doublecomplex *q, long ldq, doublecomplex *z, long ldz, long *info);
zhgeqz implements a single-shift version of the QZ
method for finding the generalized eigenvalues w(i)=ALPHA(i)/BETA(i)
of the equation
A are then ALPHA(1),...,ALPHA(N), and of B are BETA(1),...,BETA(N).
If JOB='S' and COMPQ and COMPZ are 'V' or 'I', then the unitary transformations used to reduce (A,B) are accumulated into the arrays Q and Z s.t.:
(in) A(in)
Z(in)* = Q(out)
A(out)
Z(out)*
(in) B(in)
Z(in)* = Q(out)
B(out)
Z(out)*
Ref: C.B. Moler & G.W. Stewart, ``An Algorithm for Generalized Matrixigenvalue Problems'', SIAM J. Numer. Anal., 10(1973),p. 241--256.
= 'E': compute only ALPHA and BETA. A and B will not necessarily be put into generalized Schur form. = 'S': put A and B into generalized Schur form, as well as computing ALPHA and BETA.
= 'N': do not modify Q.
= 'V': multiply the array Q on the right by the conjugate transpose of the unitary tranformation that is applied to the left side of A and B to reduce them to Schur form. = 'I': like COMPQ ='V', except that Q will be initialized to the identity first.
= 'N': do not modify Z.
= 'V': multiply the array Z on the right by the unitary tranformation that is applied to the right side of A and B to reduce them to Schur form. = 'I': like COMPZ ='V', except that Z will be initialized to the identity first.
ALPHA(i)/BETA(i)
i =1,...,N
are the generalized eigenvalues.
ALPHA(i)/BETA(i)
i =1,...,N
are the generalized eigenvalues. A and B are normalized
so that BETA(1),...,BETA(N)
are non-negative real numbers.
WORK(1)
returns the optimal LWORK.
If LWORK = -1, then a workspace query is assumed; the routine only calculates the optimal size of the WORK array, returns this value as the first entry of the WORK array, and no error message related to LWORK is issued by XERBLA.
dimension(N)
= 0: successful exit
< 0: if INFO = -i, the i-th argument had an illegal value
= 1,...,N: the QZ iteration did not converge. (A,B) is not in Schur form, but ALPHA(i) and BETA(i), i =INFO+1,...,N should be correct. = N+1,...,2*N: the shift calculation failed. (A,B) is not in Schur form, but ALPHA(i) and BETA(i), i =INFO-N+1,...,N should be correct. > 2*N: various "impossible" errors.
We assume that complex ABS works as long as its value is less than overflow.