123 SUBROUTINE cgesv( N, NRHS, A, LDA, IPIV, B, LDB, INFO )
131 INTEGER info, lda, ldb, n, nrhs
135 COMPLEX a( lda, * ),
b( ldb, * )
153 ELSE IF( nrhs.LT.0 )
THEN
155 ELSE IF( lda.LT.max( 1, n ) )
THEN
157 ELSE IF( ldb.LT.max( 1, n ) )
THEN
161 CALL
xerbla(
'CGESV ', -info )
167 CALL
cgetrf( n, n, a, lda, ipiv, info )
172 CALL
cgetrs(
'No transpose', n, nrhs, a, lda, ipiv,
b, ldb,
subroutine cgetrs(TRANS, N, NRHS, A, LDA, IPIV, B, LDB, INFO)
CGETRS
subroutine xerbla(SRNAME, INFO)
XERBLA
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
subroutine cgetrf(M, N, A, LDA, IPIV, INFO)
CGETRF
subroutine cgesv(N, NRHS, A, LDA, IPIV, B, LDB, INFO)
CGESV computes the solution to system of linear equations A * X = B for GE matrices (simple driver) ...