282 SUBROUTINE chesvx( FACT, UPLO, N, NRHS, A, LDA, AF, LDAF, IPIV, B,
283 $ LDB, X, LDX, RCOND, FERR, BERR, WORK, LWORK,
292 INTEGER INFO, LDA, LDAF, LDB, LDX, LWORK, N, NRHS
297 REAL BERR( * ), FERR( * ), RWORK( * )
298 COMPLEX A( LDA, * ), AF( LDAF, * ), B( LDB, * ),
299 $ work( * ), x( ldx, * )
306 PARAMETER ( ZERO = 0.0e+0 )
309 LOGICAL LQUERY, NOFACT
317 EXTERNAL ilaenv, lsame, clanhe, slamch
330 nofact = lsame( fact,
'N' )
331 lquery = ( lwork.EQ.-1 )
332 IF( .NOT.nofact .AND. .NOT.lsame( fact,
'F' ) )
THEN
334 ELSE IF( .NOT.lsame( uplo,
'U' ) .AND. .NOT.lsame( uplo,
'L' ) )
337 ELSE IF( n.LT.0 )
THEN
339 ELSE IF( nrhs.LT.0 )
THEN
341 ELSE IF( lda.LT.
max( 1, n ) )
THEN
343 ELSE IF( ldaf.LT.
max( 1, n ) )
THEN
345 ELSE IF( ldb.LT.
max( 1, n ) )
THEN
347 ELSE IF( ldx.LT.
max( 1, n ) )
THEN
349 ELSE IF( lwork.LT.
max( 1, 2*n ) .AND. .NOT.lquery )
THEN
354 lwkopt =
max( 1, 2*n )
356 nb = ilaenv( 1,
'CHETRF', uplo, n, -1, -1, -1 )
357 lwkopt =
max( lwkopt, n*nb )
363 CALL xerbla(
'CHESVX', -info )
365 ELSE IF( lquery )
THEN
373 CALL clacpy( uplo, n, n, a, lda, af, ldaf )
374 CALL chetrf( uplo, n, af, ldaf, ipiv, work, lwork, info )
386 anorm = clanhe(
'I', uplo, n, a, lda, rwork )
390 CALL checon( uplo, n, af, ldaf, ipiv, anorm, rcond, work, info )
394 CALL clacpy(
'Full', n, nrhs, b, ldb, x, ldx )
395 CALL chetrs( uplo, n, nrhs, af, ldaf, ipiv, x, ldx, info )
400 CALL cherfs( uplo, n, nrhs, a, lda, af, ldaf, ipiv, b, ldb, x,
401 $ ldx, ferr, berr, work, rwork, info )
405 IF( rcond.LT.slamch(
'Epsilon' ) )
subroutine cherfs(uplo, n, nrhs, a, lda, af, ldaf, ipiv, b, ldb, x, ldx, ferr, berr, work, rwork, info)
CHERFS
subroutine chesvx(fact, uplo, n, nrhs, a, lda, af, ldaf, ipiv, b, ldb, x, ldx, rcond, ferr, berr, work, lwork, rwork, info)
CHESVX computes the solution to system of linear equations A * X = B for HE matrices
subroutine clacpy(uplo, m, n, a, lda, b, ldb)
CLACPY copies all or part of one two-dimensional array to another.