88 SUBROUTINE sdrvrf2( NOUT, NN, NVAL, A, LDA, ARF, AP, ASAV )
99 REAL A( LDA, * ), ARF( * ), AP(*), ASAV( LDA, * )
105 LOGICAL LOWER, OK1, OK2
106 CHARACTER UPLO, CFORM
107 INTEGER I, IFORM, IIN, INFO, IUPLO, J, N,
111 CHARACTER UPLOS( 2 ), FORMS( 2 )
112 INTEGER ISEED( 4 ), ISEEDY( 4 )
125 COMMON / srnamc / srnamt
128 DATA iseedy / 1988, 1989, 1990, 1991 /
129 DATA uplos /
'U',
'L' /
130 DATA forms /
'N',
'T' /
140 iseed( i ) = iseedy( i )
151 uplo = uplos( iuplo )
153 IF ( iuplo.EQ.1 ) lower = .false.
159 cform = forms( iform )
165 a( i, j) = slarnd( 2, iseed )
170 CALL strttf( cform, uplo, n, a, lda, arf, info )
173 CALL stfttp( cform, uplo, n, arf, ap, info )
176 CALL stpttr( uplo, n, ap, asav, lda, info )
182 IF ( a(i,j).NE.asav(i,j) )
THEN
190 IF ( a(i,j).NE.asav(i,j) )
THEN
200 CALL strttp( uplo, n, a, lda, ap, info )
203 CALL stpttf( cform, uplo, n, ap, arf, info )
206 CALL stfttr( cform, uplo, n, arf, asav, lda, info )
212 IF ( a(i,j).NE.asav(i,j) )
THEN
220 IF ( a(i,j).NE.asav(i,j) )
THEN
227 IF (( .NOT.ok1 ).OR.( .NOT.ok2 ))
THEN
228 IF( nerrs.EQ.0 )
THEN
230 WRITE( nout, fmt = 9999 )
232 WRITE( nout, fmt = 9998 ) n, uplo, cform
242 IF ( nerrs.EQ.0 )
THEN
243 WRITE( nout, fmt = 9997 ) nrun
245 WRITE( nout, fmt = 9996 ) nerrs, nrun
248 9999
FORMAT( 1x,
' *** Error(s) while testing the RFP conversion',
250 9998
FORMAT( 1x,
' Error in RFP,conversion routines N=',i5,
251 +
' UPLO=''', a1,
''', FORM =''',a1,
'''')
252 9997
FORMAT( 1x,
'All tests for the RFP conversion routines passed ( ',
254 9996
FORMAT( 1x,
'RFP conversion routines: ',i5,
' out of ',i5,
255 +
' error message recorded')
subroutine stfttp(transr, uplo, n, arf, ap, info)
STFTTP copies a triangular matrix from the rectangular full packed format (TF) to the standard packed...
subroutine stfttr(transr, uplo, n, arf, a, lda, info)
STFTTR copies a triangular matrix from the rectangular full packed format (TF) to the standard full f...
subroutine stpttf(transr, uplo, n, ap, arf, info)
STPTTF copies a triangular matrix from the standard packed format (TP) to the rectangular full packed...
subroutine stpttr(uplo, n, ap, a, lda, info)
STPTTR copies a triangular matrix from the standard packed format (TP) to the standard full format (T...
subroutine strttf(transr, uplo, n, a, lda, arf, info)
STRTTF copies a triangular matrix from the standard full format (TR) to the rectangular full packed f...
subroutine strttp(uplo, n, a, lda, ap, info)
STRTTP copies a triangular matrix from the standard full format (TR) to the standard packed format (T...
subroutine sdrvrf2(nout, nn, nval, a, lda, arf, ap, asav)
SDRVRF2