131 SUBROUTINE cpbcon( UPLO, N, KD, AB, LDAB, ANORM, RCOND, WORK,
140 INTEGER INFO, KD, LDAB, N
145 COMPLEX AB( LDAB, * ), WORK( * )
152 parameter( one = 1.0e+0, zero = 0.0e+0 )
158 REAL AINVNM, SCALE, SCALEL, SCALEU, SMLNUM
168 EXTERNAL lsame, icamax, slamch
174 INTRINSIC abs, aimag, real
180 cabs1( zdum ) = abs( real( zdum ) ) + abs( aimag( zdum ) )
187 upper = lsame( uplo,
'U' )
188 IF( .NOT.upper .AND. .NOT.lsame( uplo, 'l
' ) ) THEN
190.LT.
ELSE IF( N0 ) THEN
192.LT.
ELSE IF( KD0 ) THEN
194.LT.
ELSE IF( LDABKD+1 ) THEN
196.LT.
ELSE IF( ANORMZERO ) THEN
200 CALL XERBLA( 'cpbcon', -INFO )
210.EQ.
ELSE IF( ANORMZERO ) THEN
214 SMLNUM = SLAMCH( 'safe minimum
' )
221 CALL CLACN2( N, WORK( N+1 ), WORK, AINVNM, KASE, ISAVE )
227 CALL CLATBS( 'upper
', 'conjugate transpose
', 'non-unit
',
228 $ NORMIN, N, KD, AB, LDAB, WORK, SCALEL, RWORK,
234 CALL CLATBS( 'upper
', 'no transpose
', 'non-unit
', NORMIN, N,
235 $ KD, AB, LDAB, WORK, SCALEU, RWORK, INFO )
240 CALL CLATBS( 'lower
', 'no transpose
', 'non-unit
', NORMIN, N,
241 $ KD, AB, LDAB, WORK, SCALEL, RWORK, INFO )
246 CALL CLATBS( 'lower
', 'conjugate transpose
', 'non-unit
',
247 $ NORMIN, N, KD, AB, LDAB, WORK, SCALEU, RWORK,
253 SCALE = SCALEL*SCALEU
254.NE.
IF( SCALEONE ) THEN
255 IX = ICAMAX( N, WORK, 1 )
256.LT..OR..EQ.
IF( SCALECABS1( WORK( IX ) )*SMLNUM SCALEZERO )
258 CALL CSRSCL( N, SCALE, WORK, 1 )
266 $ RCOND = ( ONE / AINVNM ) / ANORM
subroutine xerbla(srname, info)
XERBLA
subroutine clatbs(uplo, trans, diag, normin, n, kd, ab, ldab, x, scale, cnorm, info)
CLATBS solves a triangular banded system of equations.
subroutine csrscl(n, sa, sx, incx)
CSRSCL multiplies a vector by the reciprocal of a real scalar.
subroutine clacn2(n, v, x, est, kase, isave)
CLACN2 estimates the 1-norm of a square matrix, using reverse communication for evaluating matrix-vec...
subroutine cpbcon(uplo, n, kd, ab, ldab, anorm, rcond, work, rwork, info)
CPBCON