NAME

dgeev - compute for an N-by-N real nonsymmetric matrix A, the eigenvalues and, optionally, the left and/or right eigenvectors


SYNOPSIS

  SUBROUTINE DGEEV( JOBVL, JOBVR, N, A, LDA, WR, WI, VL, LDVL, VR, 
 *      LDVR, WORK, LDWORK, INFO)
  CHARACTER * 1 JOBVL, JOBVR
  INTEGER N, LDA, LDVL, LDVR, LDWORK, INFO
  DOUBLE PRECISION A(LDA,*), WR(*), WI(*), VL(LDVL,*), VR(LDVR,*), WORK(*)
  SUBROUTINE DGEEV_64( JOBVL, JOBVR, N, A, LDA, WR, WI, VL, LDVL, VR, 
 *      LDVR, WORK, LDWORK, INFO)
  CHARACTER * 1 JOBVL, JOBVR
  INTEGER*8 N, LDA, LDVL, LDVR, LDWORK, INFO
  DOUBLE PRECISION A(LDA,*), WR(*), WI(*), VL(LDVL,*), VR(LDVR,*), WORK(*)

F95 INTERFACE

  SUBROUTINE GEEV( JOBVL, JOBVR, [N], A, [LDA], WR, WI, VL, [LDVL], 
 *       VR, [LDVR], [WORK], [LDWORK], [INFO])
  CHARACTER(LEN=1) :: JOBVL, JOBVR
  INTEGER :: N, LDA, LDVL, LDVR, LDWORK, INFO
  REAL(8), DIMENSION(:) :: WR, WI, WORK
  REAL(8), DIMENSION(:,:) :: A, VL, VR
  SUBROUTINE GEEV_64( JOBVL, JOBVR, [N], A, [LDA], WR, WI, VL, [LDVL], 
 *       VR, [LDVR], [WORK], [LDWORK], [INFO])
  CHARACTER(LEN=1) :: JOBVL, JOBVR
  INTEGER(8) :: N, LDA, LDVL, LDVR, LDWORK, INFO
  REAL(8), DIMENSION(:) :: WR, WI, WORK
  REAL(8), DIMENSION(:,:) :: A, VL, VR

C INTERFACE

#include <sunperf.h>

void dgeev(char jobvl, char jobvr, int n, double *a, int lda, double *wr, double *wi, double *vl, int ldvl, double *vr, int ldvr, int *info);

void dgeev_64(char jobvl, char jobvr, long n, double *a, long lda, double *wr, double *wi, double *vl, long ldvl, double *vr, long ldvr, long *info);


PURPOSE

dgeev computes for an N-by-N real nonsymmetric matrix A, the eigenvalues and, optionally, the left and/or right eigenvectors.

The right eigenvector v(j) of A satisfies

                 A * v(j) = lambda(j) * v(j)

where lambda(j) is its eigenvalue.

The left eigenvector u(j) of A satisfies

              u(j)**H * A = lambda(j) * u(j)**H

where u(j)**H denotes the conjugate transpose of u(j).

The computed eigenvectors are normalized to have Euclidean norm equal to 1 and largest component real.


ARGUMENTS