122 SUBROUTINE sgecon( NORM, N, A, LDA, ANORM, RCOND, WORK, IWORK,
136 REAL A( LDA, * ), WORK( * )
143 parameter( one = 1.0e+0, zero = 0.0e+0 )
148 INTEGER IX, KASE, KASE1
149 REAL AINVNM, SCALE, SL, , SU
158 EXTERNAL lsame, isamax, slamch
171 onenrm = norm.EQ.
'1' .OR. lsame( norm,
'O' )
172 IF( .NOT.onenrm .AND. .NOT.lsame( norm,
'I'THEN
174 ELSE IF( n.LT.0 )
THEN
176 ELSE IF( lda.LT.
max( 1, n ) )
THEN
178 ELSE IF( anorm.LT.zero )
THEN
192.EQ.
ELSE IF( ANORMZERO ) THEN
196 SMLNUM = SLAMCH( 'safe minimum
' )
209 CALL SLACN2( N, WORK( N+1 ), WORK, IWORK, AINVNM, KASE, ISAVE )
211.EQ.
IF( KASEKASE1 ) THEN
215 CALL SLATRS( 'lower
', 'no transpose
', 'unit
', NORMIN, N, A,
216 $ LDA, WORK, SL, WORK( 2*N+1 ), INFO )
220 CALL SLATRS( 'upper
', 'no transpose
', 'non-unit
', NORMIN, N,
221 $ A, LDA, WORK, SU, WORK( 3*N+1 ), INFO )
226 CALL SLATRS( 'upper
', 'transpose
', 'non-unit
', NORMIN, N, A,
227 $ LDA, WORK, SU, WORK( 3*N+1 ), INFO )
231 CALL SLATRS( 'lower
', 'transpose
', 'unit
', NORMIN, N, A,
232 $ LDA, WORK, SL, WORK( 2*N+1 ), INFO )
239.NE.
IF( SCALEONE ) THEN
240 IX = ISAMAX( N, WORK, 1 )
241.LT..OR..EQ.
IF( SCALEABS( WORK( IX ) )*SMLNUM SCALEZERO )
243 CALL SRSCL( N, SCALE, WORK, 1 )
251 $ RCOND = ( ONE / AINVNM ) / ANORM
subroutine xerbla(srname, info)
XERBLA
subroutine sgecon(norm, n, a, lda, anorm, rcond, work, iwork, info)
SGECON
subroutine slatrs(uplo, trans, diag, normin, n, a, lda, x, scale, cnorm, info)
SLATRS solves a triangular system of equations with the scale factor set to prevent overflow.
subroutine srscl(n, sa, sx, incx)
SRSCL multiplies a vector by the reciprocal of a real scalar.
subroutine slacn2(n, v, x, isgn, est, kase, isave)
SLACN2 estimates the 1-norm of a square matrix, using reverse communication for evaluating matrix-vec...