127 SUBROUTINE spot02( UPLO, N, NRHS, A, LDA, X, LDX, B, LDB, RWORK,
137 INTEGER lda, ldb, ldx, n, nrhs
141 REAL a( lda, * ),
b( ldb, * ), rwork( * ),
149 parameter( zero = 0.0e+0, one = 1.0e+0 )
153 REAL anorm, bnorm, eps, xnorm
169 IF( n.LE.0 .OR. nrhs.LE.0 )
THEN
177 anorm =
slansy(
'1', uplo, n, a, lda, rwork )
178 IF( anorm.LE.zero )
THEN
185 CALL
ssymm(
'Left', uplo, n, nrhs, -one, a, lda,
x, ldx, one,
b,
193 bnorm =
sasum( n,
b( 1,
j ), 1 )
194 xnorm =
sasum( n,
x( 1,
j ), 1 )
195 IF( xnorm.LE.zero )
THEN
198 resid = max( resid, ( ( bnorm / anorm ) / xnorm ) / eps )
REAL function slansy(NORM, UPLO, N, A, LDA, WORK)
SLANSY returns the value of the 1-norm, or the Frobenius norm, or the infinity norm, or the element of largest absolute value of a real symmetric matrix.
subroutine ssymm(SIDE, UPLO, M, N, ALPHA, A, LDA, B, LDB, BETA, C, LDC)
SSYMM
REAL function slamch(CMACH)
SLAMCH
subroutine spot02(UPLO, N, NRHS, A, LDA, X, LDX, B, LDB, RWORK, RESID)
SPOT02
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real j
REAL function sasum(N, SX, INCX)
SASUM