123 SUBROUTINE zspt02( UPLO, N, NRHS, A, X, LDX, B, LDB, RWORK,
133 INTEGER ldb, ldx, n, nrhs
134 DOUBLE PRECISION resid
137 DOUBLE PRECISION rwork( * )
138 COMPLEX*16 a( * ),
b( ldb, * ),
x( ldx, * )
144 DOUBLE PRECISION zero, one
145 parameter( zero = 0.0d+0, one = 1.0d+0 )
147 parameter( cone = ( 1.0d+0, 0.0d+0 ) )
151 DOUBLE PRECISION anorm, bnorm, eps, xnorm
167 IF( n.LE.0 .OR. nrhs.LE.0 )
THEN
175 anorm =
zlansp(
'1', uplo, n, a, rwork )
176 IF( anorm.LE.zero )
THEN
184 CALL
zspmv( uplo, n, -cone, a,
x( 1,
j ), 1, cone,
b( 1,
j ),
195 IF( xnorm.LE.zero )
THEN
198 resid = max( resid, ( ( bnorm / anorm ) / xnorm ) / eps )
DOUBLE PRECISION function dzasum(N, ZX, INCX)
DZASUM
subroutine zspmv(UPLO, N, ALPHA, AP, X, INCX, BETA, Y, INCY)
ZSPMV computes a matrix-vector product for complex vectors using a complex symmetric packed matrix ...
DOUBLE PRECISION function zlansp(NORM, UPLO, N, AP, WORK)
ZLANSP returns the value of the 1-norm, or the Frobenius norm, or the infinity norm, or the element of largest absolute value of a symmetric matrix supplied in packed form.
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
DOUBLE PRECISION function dlamch(CMACH)
DLAMCH
subroutine zspt02(UPLO, N, NRHS, A, X, LDX, B, LDB, RWORK, RESID)
ZSPT02