277 SUBROUTINE chpsvx( FACT, UPLO, N, NRHS, AP, AFP, IPIV, B, LDB, X,
278 $ ldx, rcond, ferr, berr, work, rwork, info )
287 INTEGER info, ldb, ldx, n, nrhs
292 REAL berr( * ), ferr( * ), rwork( * )
293 COMPLEX afp( * ), ap( * ),
b( ldb, * ), work( * ),
301 parameter( zero = 0.0e+0 )
324 nofact =
lsame( fact,
'N' )
325 IF( .NOT.nofact .AND. .NOT.
lsame( fact,
'F' ) )
THEN
327 ELSE IF( .NOT.
lsame( uplo,
'U' ) .AND. .NOT.
lsame( uplo,
'L' ) )
330 ELSE IF( n.LT.0 )
THEN
332 ELSE IF( nrhs.LT.0 )
THEN
334 ELSE IF( ldb.LT.max( 1, n ) )
THEN
336 ELSE IF( ldx.LT.max( 1, n ) )
THEN
340 CALL
xerbla(
'CHPSVX', -info )
348 CALL
ccopy( n*( n+1 ) / 2, ap, 1, afp, 1 )
349 CALL
chptrf( uplo, n, afp, ipiv, info )
361 anorm =
clanhp(
'I', uplo, n, ap, rwork )
365 CALL
chpcon( uplo, n, afp, ipiv, anorm, rcond, work, info )
369 CALL
clacpy(
'Full', n, nrhs,
b, ldb,
x, ldx )
370 CALL
chptrs( uplo, n, nrhs, afp, ipiv,
x, ldx, info )
375 CALL
chprfs( uplo, n, nrhs, ap, afp, ipiv,
b, ldb,
x, ldx, ferr,
376 $ berr, work, rwork, info )
380 IF( rcond.LT.
slamch(
'Epsilon' ) )
LOGICAL function lsame(CA, CB)
LSAME
REAL function slamch(CMACH)
SLAMCH
subroutine xerbla(SRNAME, INFO)
XERBLA
subroutine chprfs(UPLO, N, NRHS, AP, AFP, IPIV, B, LDB, X, LDX, FERR, BERR, WORK, RWORK, INFO)
CHPRFS
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
subroutine chpcon(UPLO, N, AP, IPIV, ANORM, RCOND, WORK, INFO)
CHPCON
subroutine clacpy(UPLO, M, N, A, LDA, B, LDB)
CLACPY copies all or part of one two-dimensional array to another.
subroutine chpsvx(FACT, UPLO, N, NRHS, AP, AFP, IPIV, B, LDB, X, LDX, RCOND, FERR, BERR, WORK, RWORK, INFO)
CHPSVX computes the solution to system of linear equations A * X = B for OTHER matrices ...
subroutine ccopy(N, CX, INCX, CY, INCY)
CCOPY
subroutine chptrf(UPLO, N, AP, IPIV, INFO)
CHPTRF
REAL function clanhp(NORM, UPLO, N, AP, WORK)
CLANHP returns the value of the 1-norm, or the Frobenius norm, or the infinity norm, or the element of largest absolute value of a complex Hermitian matrix supplied in packed form.
subroutine chptrs(UPLO, N, NRHS, AP, IPIV, B, LDB, INFO)
CHPTRS