127 SUBROUTINE cpot02( UPLO, N, NRHS, A, LDA, X, LDX, B, LDB, RWORK,
137 INTEGER lda, ldb, ldx, n, nrhs
142 COMPLEX a( lda, * ),
b( ldb, * ),
x( ldx, * )
149 parameter( zero = 0.0e+0, one = 1.0e+0 )
151 parameter( cone = ( 1.0e+0, 0.0e+0 ) )
155 REAL anorm, bnorm, eps, xnorm
171 IF( n.LE.0 .OR. nrhs.LE.0 )
THEN
179 anorm =
clanhe(
'1', uplo, n, a, lda, rwork )
180 IF( anorm.LE.zero )
THEN
187 CALL
chemm(
'Left', uplo, n, nrhs, -cone, a, lda,
x, ldx, cone,
b,
197 IF( xnorm.LE.zero )
THEN
200 resid = max( resid, ( ( bnorm/anorm )/xnorm )/eps )
REAL function clanhe(NORM, UPLO, N, A, LDA, WORK)
CLANHE 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.
REAL function slamch(CMACH)
SLAMCH
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
subroutine cpot02(UPLO, N, NRHS, A, LDA, X, LDX, B, LDB, RWORK, RESID)
CPOT02
REAL function scasum(N, CX, INCX)
SCASUM
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real j
subroutine chemm(SIDE, UPLO, M, N, ALPHA, A, LDA, B, LDB, BETA, C, LDC)
CHEMM