205 SUBROUTINE zhesv_rook( UPLO, N, NRHS, A, LDA, IPIV, B, LDB, WORK,
215 INTEGER info, lda, ldb, lwork, n, nrhs
219 COMPLEX*16 a( lda, * ),
b( ldb, * ), work( * )
244 lquery = ( lwork.EQ.-1 )
245 IF( .NOT.
lsame( uplo,
'U' ) .AND. .NOT.
lsame( uplo,
'L' ) )
THEN
247 ELSE IF( n.LT.0 )
THEN
249 ELSE IF( nrhs.LT.0 )
THEN
251 ELSE IF( lda.LT.max( 1, n ) )
THEN
253 ELSE IF( ldb.LT.max( 1, n ) )
THEN
255 ELSE IF( lwork.LT.1 .AND. .NOT.lquery )
THEN
263 nb =
ilaenv( 1,
'ZHETRF_ROOK', uplo, n, -1, -1, -1 )
270 CALL
xerbla(
'ZHESV_ROOK ', -info )
272 ELSE IF( lquery )
THEN
278 CALL
zhetrf_rook( uplo, n, a, lda, ipiv, work, lwork, info )
285 CALL
zhetrs_rook( uplo, n, nrhs, a, lda, ipiv,
b, ldb, info )
subroutine zhetrs_rook(UPLO, N, NRHS, A, LDA, IPIV, B, LDB, INFO)
ZHETRS_ROOK computes the solution to a system of linear equations A * X = B for HE matrices using fac...
subroutine zhesv_rook(UPLO, N, NRHS, A, LDA, IPIV, B, LDB, WORK, LWORK, INFO)
ZHESV_ROOK computes the solution to a system of linear equations A * X = B for HE matrices using the ...
subroutine xerbla(SRNAME, INFO)
XERBLA
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
logical function lsame(CA, CB)
LSAME
subroutine zhetrf_rook(UPLO, N, A, LDA, IPIV, WORK, LWORK, INFO)
ZHETRF_ROOK computes the factorization of a complex Hermitian indefinite matrix using the bounded Bun...
integer function ilaenv(ISPEC, NAME, OPTS, N1, N2, N3, N4)