cgetrs - solve a system of linear equations A * X = B, A**T * X = B, or A**H * X = B with a general N-by-N matrix A using the LU factoriza- tion computed by CGETRF
SUBROUTINE CGETRS(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB, INFO) CHARACTER*1 TRANSA COMPLEX A(LDA,*), B(LDB,*) INTEGER N, NRHS, LDA, LDB, INFO INTEGER IPIVOT(*) SUBROUTINE CGETRS_64(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB, INFO) CHARACTER*1 TRANSA COMPLEX A(LDA,*), B(LDB,*) INTEGER*8 N, NRHS, LDA, LDB, INFO INTEGER*8 IPIVOT(*) F95 INTERFACE SUBROUTINE GETRS(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB, INFO) CHARACTER(LEN=1) :: TRANSA COMPLEX, DIMENSION(:,:) :: A, B INTEGER :: N, NRHS, LDA, LDB, INFO INTEGER, DIMENSION(:) :: IPIVOT SUBROUTINE GETRS_64(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB, INFO) CHARACTER(LEN=1) :: TRANSA COMPLEX, DIMENSION(:,:) :: A, B INTEGER(8) :: N, NRHS, LDA, LDB, INFO INTEGER(8), DIMENSION(:) :: IPIVOT C INTERFACE #include <sunperf.h> void cgetrs(char transa, int n, int nrhs, complex *a, int lda, int *ipivot, complex *b, int ldb, int *info); void cgetrs_64(char transa, long n, long nrhs, complex *a, long lda, long *ipivot, complex *b, long ldb, long *info);
Oracle Solaris Studio Performance Library                           cgetrs(3P)
NAME
       cgetrs  -  solve a system of linear equations  A * X = B, A**T * X = B,
       or A**H * X = B with a general N-by-N matrix A using the LU  factoriza-
       tion computed by CGETRF
SYNOPSIS
       SUBROUTINE CGETRS(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB, INFO)
       CHARACTER*1 TRANSA
       COMPLEX A(LDA,*), B(LDB,*)
       INTEGER N, NRHS, LDA, LDB, INFO
       INTEGER IPIVOT(*)
       SUBROUTINE CGETRS_64(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB, INFO)
       CHARACTER*1 TRANSA
       COMPLEX A(LDA,*), B(LDB,*)
       INTEGER*8 N, NRHS, LDA, LDB, INFO
       INTEGER*8 IPIVOT(*)
   F95 INTERFACE
       SUBROUTINE GETRS(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB,
              INFO)
       CHARACTER(LEN=1) :: TRANSA
       COMPLEX, DIMENSION(:,:) :: A, B
       INTEGER :: N, NRHS, LDA, LDB, INFO
       INTEGER, DIMENSION(:) :: IPIVOT
       SUBROUTINE GETRS_64(TRANSA, N, NRHS, A, LDA, IPIVOT, B, LDB,
              INFO)
       CHARACTER(LEN=1) :: TRANSA
       COMPLEX, DIMENSION(:,:) :: A, B
       INTEGER(8) :: N, NRHS, LDA, LDB, INFO
       INTEGER(8), DIMENSION(:) :: IPIVOT
   C INTERFACE
       #include <sunperf.h>
       void  cgetrs(char  transa,  int  n,  int nrhs, complex *a, int lda, int
                 *ipivot, complex *b, int ldb, int *info);
       void cgetrs_64(char transa, long n, long nrhs, complex  *a,  long  lda,
                 long *ipivot, complex *b, long ldb, long *info);
PURPOSE
       cgetrs solves a system of linear equations
          A  *  X  = B,  A**T * X = B,  or  A**H * X = B with a general N-by-N
       matrix A using the LU factorization computed by CGETRF.
ARGUMENTS
       TRANSA (input)
                 Specifies the form of the system of equations:
                 = 'N':  A * X = B     (No transpose)
                 = 'T':  A**T * X = B  (Transpose)
                 = 'C':  A**H * X = B  (Conjugate transpose)
       N (input) The order of the matrix A.  N >= 0.
       NRHS (input)
                 The number of right hand sides, i.e., the number  of  columns
                 of the matrix B.  NRHS >= 0.
       A (input) The  factors L and U from the factorization A = P*L*U as com-
                 puted by CGETRF.
       LDA (input)
                 The leading dimension of the array A.  LDA >= max(1,N).
       IPIVOT (input)
                 The pivot indices from CGETRF; for  1<=i<=N,  row  i  of  the
                 matrix was interchanged with row IPIVOT(i).
       B (input/output)
                 On  entry,  the right hand side matrix B.  On exit, the solu-
                 tion matrix X.
       LDB (input)
                 The leading dimension of the array B.  LDB >= max(1,N).
       INFO (output)
                 = 0:  successful exit
                 < 0:  if INFO = -i, the i-th argument had an illegal value
                                  7 Nov 2015                        cgetrs(3P)