136 SUBROUTINE cpbt02( UPLO, N, KD, NRHS, A, LDA, X, LDX, B, LDB,
146 INTEGER kd, lda, ldb, ldx, n, nrhs
151 COMPLEX a( lda, * ),
b( ldb, * ),
x( ldx, * )
158 parameter( zero = 0.0e+0, one = 1.0e+0 )
160 parameter( cone = ( 1.0e+0, 0.0e+0 ) )
164 REAL anorm, bnorm, eps, xnorm
180 IF( n.LE.0 .OR. nrhs.LE.0 )
THEN
188 anorm =
clanhb(
'1', uplo, n, kd, a, lda, rwork )
189 IF( anorm.LE.zero )
THEN
197 CALL
chbmv( uplo, n, kd, -cone, a, lda,
x( 1,
j ), 1, cone,
208 IF( xnorm.LE.zero )
THEN
211 resid = max( resid, ( ( bnorm/anorm )/xnorm )/eps )
REAL function slamch(CMACH)
SLAMCH
subroutine cpbt02(UPLO, N, KD, NRHS, A, LDA, X, LDX, B, LDB, RWORK, RESID)
CPBT02
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
subroutine chbmv(UPLO, N, K, ALPHA, A, LDA, X, INCX, BETA, Y, INCY)
CHBMV
REAL function scasum(N, CX, INCX)
SCASUM
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real j
REAL function clanhb(NORM, UPLO, N, K, AB, LDAB, WORK)
CLANHB returns the value of the 1-norm, or the Frobenius norm, or the infinity norm, or the element of largest absolute value of a Hermitian band matrix.