492 SUBROUTINE cposvxx( FACT, UPLO, N, NRHS, A, LDA, AF, LDAF, EQUED,
493 $ S, B, LDB, X, LDX, RCOND, RPVGRW, BERR,
494 $ N_ERR_BNDS, ERR_BNDS_NORM, ERR_BNDS_COMP,
495 $ NPARAMS, PARAMS, WORK, RWORK, INFO )
502 CHARACTER EQUED, FACT, UPLO
503 INTEGER INFO, LDA, LDAF, LDB, LDX, N, NRHS, NPARAMS,
508 COMPLEX A( LDA, * ), AF( LDAF, * ), B( LDB, * ),
509 $ WORK( * ), X( LDX, * )
510 REAL S( * ), PARAMS( * ), BERR( * ), RWORK( * ),
511 $ err_bnds_norm( nrhs, * ),
512 $ err_bnds_comp( nrhs, * )
519 PARAMETER ( ZERO = 0.0e+0, one = 1.0e+0 )
520 INTEGER FINAL_NRM_ERR_I, FINAL_CMP_ERR_I, BERR_I
521 INTEGER RCOND_I, NRM_RCOND_I, NRM_ERR_I, CMP_RCOND_I
522 INTEGER CMP_ERR_I, PIV_GROWTH_I
523 parameter( final_nrm_err_i = 1, final_cmp_err_i = 2,
525 parameter( rcond_i = 4, nrm_rcond_i = 5, nrm_err_i = 6 )
526 parameter( cmp_rcond_i = 7, cmp_err_i = 8,
530 LOGICAL EQUIL, NOFACT, RCEQU
532 REAL AMAX, BIGNUM, SMIN, SMAX, SCOND, SMLNUM
537 REAL SLAMCH, CLA_PORPVGRW
549 nofact = lsame( fact,
'N' )
550 equil = lsame( fact,
'E' )
551 smlnum = slamch(
'Safe minimum' )
552 bignum = one / smlnum
553 IF( nofact .OR. equil )
THEN
557 rcequ = lsame( equed,
'Y' )
568 IF( .NOT.nofact .AND. .NOT.equil .AND. .NOT.
569 $ lsame( fact,
'F' ) )
THEN
571 ELSE IF( .NOT.lsame( uplo,
'U' ) .AND.
572 $ .NOT.lsame( uplo,
'L' ) )
THEN
574 ELSE IF( n.LT.0 )
THEN
576 ELSE IF( nrhs.LT.0 )
THEN
578 ELSE IF( lda.LT.max( 1, n ) )
THEN
580 ELSE IF( ldaf.LT.max( 1, n ) )
THEN
582 ELSE IF( lsame( fact,
'F' ) .AND. .NOT.
583 $ ( rcequ .OR. lsame( equed,
'N' ) ) )
THEN
590 smin = min( smin, s( j ) )
591 smax = max( smax, s( j ) )
593 IF( smin.LE.zero )
THEN
595 ELSE IF( n.GT.0 )
THEN
596 scond = max( smin, smlnum ) / min( smax, bignum )
602 IF( ldb.LT.max( 1, n ) )
THEN
604 ELSE IF( ldx.LT.max( 1, n ) )
THEN
611 CALL xerbla(
'CPOSVXX', -info )
619 CALL cpoequb( n, a, lda, s, scond, amax, infequ )
620 IF( infequ.EQ.0 )
THEN
624 CALL claqhe( uplo, n, a, lda, s, scond, amax, equed )
625 rcequ = lsame( equed,
'Y' )
631 IF( rcequ )
CALL clascl2( n, nrhs, s, b, ldb )
633 IF( nofact .OR. equil )
THEN
637 CALL clacpy( uplo, n, n, a, lda, af, ldaf )
638 CALL cpotrf( uplo, n, af, ldaf, info )
648 rpvgrw = cla_porpvgrw( uplo, n, a, lda, af, ldaf, rwork )
655 rpvgrw = cla_porpvgrw( uplo, n, a, lda, af, ldaf, rwork )
659 CALL clacpy(
'Full', n, nrhs, b, ldb, x, ldx )
660 CALL cpotrs( uplo, n, nrhs, af, ldaf, x, ldx, info )
665 CALL cporfsx( uplo, equed, n, nrhs, a, lda, af, ldaf,
666 $ s, b, ldb, x, ldx, rcond, berr, n_err_bnds, err_bnds_norm,
667 $ err_bnds_comp, nparams, params, work, rwork, info )
673 CALL clascl2( n, nrhs, s, x, ldx )
subroutine xerbla(srname, info)
real function cla_porpvgrw(uplo, ncols, a, lda, af, ldaf, work)
CLA_PORPVGRW computes the reciprocal pivot growth factor norm(A)/norm(U) for a symmetric or Hermitian...
subroutine clacpy(uplo, m, n, a, lda, b, ldb)
CLACPY copies all or part of one two-dimensional array to another.
real function slamch(cmach)
SLAMCH
subroutine claqhe(uplo, n, a, lda, s, scond, amax, equed)
CLAQHE scales a Hermitian matrix.
subroutine clascl2(m, n, d, x, ldx)
CLASCL2 performs diagonal scaling on a matrix.
logical function lsame(ca, cb)
LSAME
subroutine cpoequb(n, a, lda, s, scond, amax, info)
CPOEQUB
subroutine cporfsx(uplo, equed, n, nrhs, a, lda, af, ldaf, s, b, ldb, x, ldx, rcond, berr, n_err_bnds, err_bnds_norm, err_bnds_comp, nparams, params, work, rwork, info)
CPORFSX
subroutine cposvxx(fact, uplo, n, nrhs, a, lda, af, ldaf, equed, s, b, ldb, x, ldx, rcond, rpvgrw, berr, n_err_bnds, err_bnds_norm, err_bnds_comp, nparams, params, work, rwork, info)
CPOSVXX computes the solution to system of linear equations A * X = B for PO matrices
subroutine cpotrf(uplo, n, a, lda, info)
CPOTRF
subroutine cpotrs(uplo, n, nrhs, a, lda, b, ldb, info)
CPOTRS