127 SUBROUTINE csyt02( 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 =
clansy(
'1', uplo, n, a, lda, rwork )
180 IF( anorm.LE.zero )
THEN
187 CALL
csymm(
'Left', uplo, n, nrhs, -cone, a, lda, x, ldx, cone,
b,
196 xnorm =
scasum( n, x( 1,
j ), 1 )
197 IF( xnorm.LE.zero )
THEN
200 resid = max( resid, ( ( bnorm/anorm )/xnorm )/eps )
real function scasum(N, CX, INCX)
SCASUM
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
real function slamch(CMACH)
SLAMCH
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real j
real function clansy(NORM, UPLO, N, A, LDA, WORK)
CLANSY 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 symmetric matrix.
subroutine csyt02(UPLO, N, NRHS, A, LDA, X, LDX, B, LDB, RWORK, RESID)
CSYT02
subroutine csymm(SIDE, UPLO, M, N, ALPHA, A, LDA, B, LDB, BETA, C, LDC)
CSYMM