129 SUBROUTINE cpbcon( UPLO, N, KD, AB, LDAB, ANORM, RCOND, WORK,
138 INTEGER INFO, KD, LDAB, N
143 COMPLEX AB( LDAB, * ), WORK( * )
150 parameter( one = 1.0e+0, zero = 0.0e+0 )
156 REAL AINVNM, SCALE, SCALEL, SCALEU, SMLNUM
166 EXTERNAL lsame, icamax, slamch
172 INTRINSIC abs, aimag, real
178 cabs1( zdum ) = abs( real( zdum ) ) + abs( aimag( zdum ) )
185 upper = lsame( uplo,
'U' )
186 IF( .NOT.upper .AND. .NOT.lsame( uplo,
'L' ) )
THEN
188 ELSE IF( n.LT.0 )
THEN
190 ELSE IF( kd.LT.0 )
THEN
192 ELSE IF( ldab.LT.kd+1 )
THEN
194 ELSE IF( anorm.LT.zero )
THEN
198 CALL xerbla(
'CPBCON', -info )
208 ELSE IF( anorm.EQ.zero )
THEN
212 smlnum = slamch(
'Safe minimum' )
219 CALL clacn2( n, work( n+1 ), work, ainvnm, kase, isave )
225 CALL clatbs(
'Upper',
'Conjugate transpose',
'Non-unit',
226 $ normin, n, kd, ab, ldab, work, scalel, rwork,
232 CALL clatbs(
'Upper',
'No transpose',
'Non-unit', normin,
234 $ kd, ab, ldab, work, scaleu, rwork, info )
239 CALL clatbs(
'Lower',
'No transpose',
'Non-unit', normin,
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 IF( scale.NE.one )
THEN
255 ix = icamax( n, work, 1 )
256 IF( scale.LT.cabs1( work( ix ) )*smlnum .OR. scale.EQ.zero )
258 CALL csrscl( n, scale, work, 1 )
266 $ rcond = ( one / ainvnm ) / anorm
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 clatbs(uplo, trans, diag, normin, n, kd, ab, ldab, x, scale, cnorm, info)
CLATBS solves a triangular banded system of equations.
subroutine cpbcon(uplo, n, kd, ab, ldab, anorm, rcond, work, rwork, info)
CPBCON
subroutine csrscl(n, sa, sx, incx)
CSRSCL multiplies a vector by the reciprocal of a real scalar.