88 SUBROUTINE cdrvrf2( NOUT, NN, NVAL, A, LDA, ARF, AP, ASAV )
99 COMPLEX 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' /
140 iseed( i ) = iseedy( i )
151 uplo = uplos( iuplo )
153 IF ( iuplo.EQ.1 ) lower = .false.
159 cform = forms( iform )
165 a( i, j) = clarnd( 4, iseed )
170 CALL ctrttf( cform, uplo, n, a, lda, arf, info )
173 CALL ctfttp( cform, uplo, n, arf, ap, info )
176 CALL CTPTTR( UPLO, N, AP, ASAV, LDA, INFO )
182.NE.
IF ( A(I,J)ASAV(I,J) ) THEN
190.NE.
IF ( A(I,J)ASAV(I,J) ) THEN
200 CALL CTRTTP( UPLO, N, A, LDA, AP, INFO )
203 CALL CTPTTF( CFORM, UPLO, N, AP, ARF, INFO )
206 CALL CTFTTR( CFORM, UPLO, N, ARF, ASAV, LDA, INFO )
212.NE.
IF ( A(I,J)ASAV(I,J) ) THEN
220.NE.
IF ( A(I,J)ASAV(I,J) ) THEN
227.NOT..OR..NOT.
IF (( OK1 )( OK2 )) THEN
228.EQ.
IF( NERRS0 ) THEN
230 WRITE( NOUT, FMT = 9999 )
232 WRITE( NOUT, FMT = 9998 ) N, UPLO, CFORM
242.EQ.
IF ( NERRS0 ) 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
')
end diagonal values have been computed in the(sparse) matrix id.SOL
subroutine ctfttr(transr, uplo, n, arf, a, lda, info)
CTFTTR copies a triangular matrix from the rectangular full packed format (TF) to the standard full f...
subroutine ctpttr(uplo, n, ap, a, lda, info)
CTPTTR copies a triangular matrix from the standard packed format (TP) to the standard full format (T...
subroutine ctpttf(transr, uplo, n, ap, arf, info)
CTPTTF copies a triangular matrix from the standard packed format (TP) to the rectangular full packed...
subroutine ctrttf(transr, uplo, n, a, lda, arf, info)
CTRTTF copies a triangular matrix from the standard full format (TR) to the rectangular full packed f...
subroutine ctfttp(transr, uplo, n, arf, ap, info)
CTFTTP copies a triangular matrix from the rectangular full packed format (TF) to the standard packed...
subroutine ctrttp(uplo, n, a, lda, ap, info)
CTRTTP copies a triangular matrix from the standard full format (TR) to the standard packed format (T...
subroutine cdrvrf2(nout, nn, nval, a, lda, arf, ap, asav)
CDRVRF2
for(i8=*sizetab-1;i8 >=0;i8--)