LAPACK  3.6.1
LAPACK: Linear Algebra PACKage
cdrvrfp.f
Go to the documentation of this file.
1 *> \brief \b CDRVRFP
2 *
3 * =========== DOCUMENTATION ===========
4 *
5 * Online html documentation available at
6 * http://www.netlib.org/lapack/explore-html/
7 *
8 * Definition:
9 * ===========
10 *
11 * SUBROUTINE CDRVRFP( NOUT, NN, NVAL, NNS, NSVAL, NNT, NTVAL,
12 * + THRESH, A, ASAV, AFAC, AINV, B,
13 * + BSAV, XACT, X, ARF, ARFINV,
14 * + C_WORK_CLATMS, C_WORK_CPOT02,
15 * + C_WORK_CPOT03, S_WORK_CLATMS, S_WORK_CLANHE,
16 * + S_WORK_CPOT01, S_WORK_CPOT02, S_WORK_CPOT03 )
17 *
18 * .. Scalar Arguments ..
19 * INTEGER NN, NNS, NNT, NOUT
20 * REAL THRESH
21 * ..
22 * .. Array Arguments ..
23 * INTEGER NVAL( NN ), NSVAL( NNS ), NTVAL( NNT )
24 * COMPLEX A( * )
25 * COMPLEX AINV( * )
26 * COMPLEX ASAV( * )
27 * COMPLEX B( * )
28 * COMPLEX BSAV( * )
29 * COMPLEX AFAC( * )
30 * COMPLEX ARF( * )
31 * COMPLEX ARFINV( * )
32 * COMPLEX XACT( * )
33 * COMPLEX X( * )
34 * COMPLEX C_WORK_CLATMS( * )
35 * COMPLEX C_WORK_CPOT02( * )
36 * COMPLEX C_WORK_CPOT03( * )
37 * REAL S_WORK_CLATMS( * )
38 * REAL S_WORK_CLANHE( * )
39 * REAL S_WORK_CPOT01( * )
40 * REAL S_WORK_CPOT02( * )
41 * REAL S_WORK_CPOT03( * )
42 * ..
43 *
44 *
45 *> \par Purpose:
46 * =============
47 *>
48 *> \verbatim
49 *>
50 *> CDRVRFP tests the LAPACK RFP routines:
51 *> CPFTRF, CPFTRS, and CPFTRI.
52 *>
53 *> This testing routine follow the same tests as CDRVPO (test for the full
54 *> format Symmetric Positive Definite solver).
55 *>
56 *> The tests are performed in Full Format, convertion back and forth from
57 *> full format to RFP format are performed using the routines CTRTTF and
58 *> CTFTTR.
59 *>
60 *> First, a specific matrix A of size N is created. There is nine types of
61 *> different matrixes possible.
62 *> 1. Diagonal 6. Random, CNDNUM = sqrt(0.1/EPS)
63 *> 2. Random, CNDNUM = 2 7. Random, CNDNUM = 0.1/EPS
64 *> *3. First row and column zero 8. Scaled near underflow
65 *> *4. Last row and column zero 9. Scaled near overflow
66 *> *5. Middle row and column zero
67 *> (* - tests error exits from CPFTRF, no test ratios are computed)
68 *> A solution XACT of size N-by-NRHS is created and the associated right
69 *> hand side B as well. Then CPFTRF is called to compute L (or U), the
70 *> Cholesky factor of A. Then L (or U) is used to solve the linear system
71 *> of equations AX = B. This gives X. Then L (or U) is used to compute the
72 *> inverse of A, AINV. The following four tests are then performed:
73 *> (1) norm( L*L' - A ) / ( N * norm(A) * EPS ) or
74 *> norm( U'*U - A ) / ( N * norm(A) * EPS ),
75 *> (2) norm(B - A*X) / ( norm(A) * norm(X) * EPS ),
76 *> (3) norm( I - A*AINV ) / ( N * norm(A) * norm(AINV) * EPS ),
77 *> (4) ( norm(X-XACT) * RCOND ) / ( norm(XACT) * EPS ),
78 *> where EPS is the machine precision, RCOND the condition number of A, and
79 *> norm( . ) the 1-norm for (1,2,3) and the inf-norm for (4).
80 *> Errors occur when INFO parameter is not as expected. Failures occur when
81 *> a test ratios is greater than THRES.
82 *> \endverbatim
83 *
84 * Arguments:
85 * ==========
86 *
87 *> \param[in] NOUT
88 *> \verbatim
89 *> NOUT is INTEGER
90 *> The unit number for output.
91 *> \endverbatim
92 *>
93 *> \param[in] NN
94 *> \verbatim
95 *> NN is INTEGER
96 *> The number of values of N contained in the vector NVAL.
97 *> \endverbatim
98 *>
99 *> \param[in] NVAL
100 *> \verbatim
101 *> NVAL is INTEGER array, dimension (NN)
102 *> The values of the matrix dimension N.
103 *> \endverbatim
104 *>
105 *> \param[in] NNS
106 *> \verbatim
107 *> NNS is INTEGER
108 *> The number of values of NRHS contained in the vector NSVAL.
109 *> \endverbatim
110 *>
111 *> \param[in] NSVAL
112 *> \verbatim
113 *> NSVAL is INTEGER array, dimension (NNS)
114 *> The values of the number of right-hand sides NRHS.
115 *> \endverbatim
116 *>
117 *> \param[in] NNT
118 *> \verbatim
119 *> NNT is INTEGER
120 *> The number of values of MATRIX TYPE contained in the vector NTVAL.
121 *> \endverbatim
122 *>
123 *> \param[in] NTVAL
124 *> \verbatim
125 *> NTVAL is INTEGER array, dimension (NNT)
126 *> The values of matrix type (between 0 and 9 for PO/PP/PF matrices).
127 *> \endverbatim
128 *>
129 *> \param[in] THRESH
130 *> \verbatim
131 *> THRESH is REAL
132 *> The threshold value for the test ratios. A result is
133 *> included in the output file if RESULT >= THRESH. To have
134 *> every test ratio printed, use THRESH = 0.
135 *> \endverbatim
136 *>
137 *> \param[out] A
138 *> \verbatim
139 *> A is COMPLEX array, dimension (NMAX*NMAX)
140 *> \endverbatim
141 *>
142 *> \param[out] ASAV
143 *> \verbatim
144 *> ASAV is COMPLEX array, dimension (NMAX*NMAX)
145 *> \endverbatim
146 *>
147 *> \param[out] AFAC
148 *> \verbatim
149 *> AFAC is COMPLEX array, dimension (NMAX*NMAX)
150 *> \endverbatim
151 *>
152 *> \param[out] AINV
153 *> \verbatim
154 *> AINV is COMPLEX array, dimension (NMAX*NMAX)
155 *> \endverbatim
156 *>
157 *> \param[out] B
158 *> \verbatim
159 *> B is COMPLEX array, dimension (NMAX*MAXRHS)
160 *> \endverbatim
161 *>
162 *> \param[out] BSAV
163 *> \verbatim
164 *> BSAV is COMPLEX array, dimension (NMAX*MAXRHS)
165 *> \endverbatim
166 *>
167 *> \param[out] XACT
168 *> \verbatim
169 *> XACT is COMPLEX array, dimension (NMAX*MAXRHS)
170 *> \endverbatim
171 *>
172 *> \param[out] X
173 *> \verbatim
174 *> X is COMPLEX array, dimension (NMAX*MAXRHS)
175 *> \endverbatim
176 *>
177 *> \param[out] ARF
178 *> \verbatim
179 *> ARF is COMPLEX array, dimension ((NMAX*(NMAX+1))/2)
180 *> \endverbatim
181 *>
182 *> \param[out] ARFINV
183 *> \verbatim
184 *> ARFINV is COMPLEX array, dimension ((NMAX*(NMAX+1))/2)
185 *> \endverbatim
186 *>
187 *> \param[out] C_WORK_CLATMS
188 *> \verbatim
189 *> C_WORK_CLATMS is COMPLEX array, dimension ( 3*NMAX )
190 *> \endverbatim
191 *>
192 *> \param[out] C_WORK_CPOT02
193 *> \verbatim
194 *> C_WORK_CPOT02 is COMPLEX array, dimension ( NMAX*MAXRHS )
195 *> \endverbatim
196 *>
197 *> \param[out] C_WORK_CPOT03
198 *> \verbatim
199 *> C_WORK_CPOT03 is COMPLEX array, dimension ( NMAX*NMAX )
200 *> \endverbatim
201 *>
202 *> \param[out] S_WORK_CLATMS
203 *> \verbatim
204 *> S_WORK_CLATMS is REAL array, dimension ( NMAX )
205 *> \endverbatim
206 *>
207 *> \param[out] S_WORK_CLANHE
208 *> \verbatim
209 *> S_WORK_CLANHE is REAL array, dimension ( NMAX )
210 *> \endverbatim
211 *>
212 *> \param[out] S_WORK_CPOT01
213 *> \verbatim
214 *> S_WORK_CPOT01 is REAL array, dimension ( NMAX )
215 *> \endverbatim
216 *>
217 *> \param[out] S_WORK_CPOT02
218 *> \verbatim
219 *> S_WORK_CPOT02 is REAL array, dimension ( NMAX )
220 *> \endverbatim
221 *>
222 *> \param[out] S_WORK_CPOT03
223 *> \verbatim
224 *> S_WORK_CPOT03 is REAL array, dimension ( NMAX )
225 *> \endverbatim
226 *
227 * Authors:
228 * ========
229 *
230 *> \author Univ. of Tennessee
231 *> \author Univ. of California Berkeley
232 *> \author Univ. of Colorado Denver
233 *> \author NAG Ltd.
234 *
235 *> \date November 2013
236 *
237 *> \ingroup complex_lin
238 *
239 * =====================================================================
240  SUBROUTINE cdrvrfp( NOUT, NN, NVAL, NNS, NSVAL, NNT, NTVAL,
241  + thresh, a, asav, afac, ainv, b,
242  + bsav, xact, x, arf, arfinv,
243  + c_work_clatms, c_work_cpot02,
244  + c_work_cpot03, s_work_clatms, s_work_clanhe,
245  + s_work_cpot01, s_work_cpot02, s_work_cpot03 )
246 *
247 * -- LAPACK test routine (version 3.5.0) --
248 * -- LAPACK is a software package provided by Univ. of Tennessee, --
249 * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
250 * November 2013
251 *
252 * .. Scalar Arguments ..
253  INTEGER NN, NNS, NNT, NOUT
254  REAL THRESH
255 * ..
256 * .. Array Arguments ..
257  INTEGER NVAL( nn ), NSVAL( nns ), NTVAL( nnt )
258  COMPLEX A( * )
259  COMPLEX AINV( * )
260  COMPLEX ASAV( * )
261  COMPLEX B( * )
262  COMPLEX BSAV( * )
263  COMPLEX AFAC( * )
264  COMPLEX ARF( * )
265  COMPLEX ARFINV( * )
266  COMPLEX XACT( * )
267  COMPLEX X( * )
268  COMPLEX C_WORK_CLATMS( * )
269  COMPLEX C_WORK_CPOT02( * )
270  COMPLEX C_WORK_CPOT03( * )
271  REAL S_WORK_CLATMS( * )
272  REAL S_WORK_CLANHE( * )
273  REAL S_WORK_CPOT01( * )
274  REAL S_WORK_CPOT02( * )
275  REAL S_WORK_CPOT03( * )
276 * ..
277 *
278 * =====================================================================
279 *
280 * .. Parameters ..
281  REAL ONE, ZERO
282  parameter ( one = 1.0e+0, zero = 0.0e+0 )
283  INTEGER NTESTS
284  parameter ( ntests = 4 )
285 * ..
286 * .. Local Scalars ..
287  LOGICAL ZEROT
288  INTEGER I, INFO, IUPLO, LDA, LDB, IMAT, NERRS, NFAIL,
289  + nrhs, nrun, izero, ioff, k, nt, n, iform, iin,
290  + iit, iis
291  CHARACTER DIST, CTYPE, UPLO, CFORM
292  INTEGER KL, KU, MODE
293  REAL ANORM, AINVNM, CNDNUM, RCONDC
294 * ..
295 * .. Local Arrays ..
296  CHARACTER UPLOS( 2 ), FORMS( 2 )
297  INTEGER ISEED( 4 ), ISEEDY( 4 )
298  REAL RESULT( ntests )
299 * ..
300 * .. External Functions ..
301  REAL CLANHE
302  EXTERNAL clanhe
303 * ..
304 * .. External Subroutines ..
305  EXTERNAL aladhd, alaerh, alasvm, cget04, ctfttr, clacpy,
308  + ctrttf
309 * ..
310 * .. Scalars in Common ..
311  CHARACTER*32 SRNAMT
312 * ..
313 * .. Common blocks ..
314  COMMON / srnamc / srnamt
315 * ..
316 * .. Data statements ..
317  DATA iseedy / 1988, 1989, 1990, 1991 /
318  DATA uplos / 'U', 'L' /
319  DATA forms / 'N', 'C' /
320 * ..
321 * .. Executable Statements ..
322 *
323 * Initialize constants and the random number seed.
324 *
325  nrun = 0
326  nfail = 0
327  nerrs = 0
328  DO 10 i = 1, 4
329  iseed( i ) = iseedy( i )
330  10 CONTINUE
331 *
332  DO 130 iin = 1, nn
333 *
334  n = nval( iin )
335  lda = max( n, 1 )
336  ldb = max( n, 1 )
337 *
338  DO 980 iis = 1, nns
339 *
340  nrhs = nsval( iis )
341 *
342  DO 120 iit = 1, nnt
343 *
344  imat = ntval( iit )
345 *
346 * If N.EQ.0, only consider the first type
347 *
348  IF( n.EQ.0 .AND. iit.GE.1 ) GO TO 120
349 *
350 * Skip types 3, 4, or 5 if the matrix size is too small.
351 *
352  IF( imat.EQ.4 .AND. n.LE.1 ) GO TO 120
353  IF( imat.EQ.5 .AND. n.LE.2 ) GO TO 120
354 *
355 * Do first for UPLO = 'U', then for UPLO = 'L'
356 *
357  DO 110 iuplo = 1, 2
358  uplo = uplos( iuplo )
359 *
360 * Do first for CFORM = 'N', then for CFORM = 'C'
361 *
362  DO 100 iform = 1, 2
363  cform = forms( iform )
364 *
365 * Set up parameters with CLATB4 and generate a test
366 * matrix with CLATMS.
367 *
368  CALL clatb4( 'CPO', imat, n, n, ctype, kl, ku,
369  + anorm, mode, cndnum, dist )
370 *
371  srnamt = 'CLATMS'
372  CALL clatms( n, n, dist, iseed, ctype,
373  + s_work_clatms,
374  + mode, cndnum, anorm, kl, ku, uplo, a,
375  + lda, c_work_clatms, info )
376 *
377 * Check error code from CLATMS.
378 *
379  IF( info.NE.0 ) THEN
380  CALL alaerh( 'CPF', 'CLATMS', info, 0, uplo, n,
381  + n, -1, -1, -1, iit, nfail, nerrs,
382  + nout )
383  GO TO 100
384  END IF
385 *
386 * For types 3-5, zero one row and column of the matrix to
387 * test that INFO is returned correctly.
388 *
389  zerot = imat.GE.3 .AND. imat.LE.5
390  IF( zerot ) THEN
391  IF( iit.EQ.3 ) THEN
392  izero = 1
393  ELSE IF( iit.EQ.4 ) THEN
394  izero = n
395  ELSE
396  izero = n / 2 + 1
397  END IF
398  ioff = ( izero-1 )*lda
399 *
400 * Set row and column IZERO of A to 0.
401 *
402  IF( iuplo.EQ.1 ) THEN
403  DO 20 i = 1, izero - 1
404  a( ioff+i ) = zero
405  20 CONTINUE
406  ioff = ioff + izero
407  DO 30 i = izero, n
408  a( ioff ) = zero
409  ioff = ioff + lda
410  30 CONTINUE
411  ELSE
412  ioff = izero
413  DO 40 i = 1, izero - 1
414  a( ioff ) = zero
415  ioff = ioff + lda
416  40 CONTINUE
417  ioff = ioff - izero
418  DO 50 i = izero, n
419  a( ioff+i ) = zero
420  50 CONTINUE
421  END IF
422  ELSE
423  izero = 0
424  END IF
425 *
426 * Set the imaginary part of the diagonals.
427 *
428  CALL claipd( n, a, lda+1, 0 )
429 *
430 * Save a copy of the matrix A in ASAV.
431 *
432  CALL clacpy( uplo, n, n, a, lda, asav, lda )
433 *
434 * Compute the condition number of A (RCONDC).
435 *
436  IF( zerot ) THEN
437  rcondc = zero
438  ELSE
439 *
440 * Compute the 1-norm of A.
441 *
442  anorm = clanhe( '1', uplo, n, a, lda,
443  + s_work_clanhe )
444 *
445 * Factor the matrix A.
446 *
447  CALL cpotrf( uplo, n, a, lda, info )
448 *
449 * Form the inverse of A.
450 *
451  CALL cpotri( uplo, n, a, lda, info )
452 *
453 * Compute the 1-norm condition number of A.
454 *
455  IF ( n .NE. 0 ) THEN
456  ainvnm = clanhe( '1', uplo, n, a, lda,
457  + s_work_clanhe )
458  rcondc = ( one / anorm ) / ainvnm
459 *
460 * Restore the matrix A.
461 *
462  CALL clacpy( uplo, n, n, asav, lda, a, lda )
463  END IF
464 
465 *
466  END IF
467 *
468 * Form an exact solution and set the right hand side.
469 *
470  srnamt = 'CLARHS'
471  CALL clarhs( 'CPO', 'N', uplo, ' ', n, n, kl, ku,
472  + nrhs, a, lda, xact, lda, b, lda,
473  + iseed, info )
474  CALL clacpy( 'Full', n, nrhs, b, lda, bsav, lda )
475 *
476 * Compute the L*L' or U'*U factorization of the
477 * matrix and solve the system.
478 *
479  CALL clacpy( uplo, n, n, a, lda, afac, lda )
480  CALL clacpy( 'Full', n, nrhs, b, ldb, x, ldb )
481 *
482  srnamt = 'CTRTTF'
483  CALL ctrttf( cform, uplo, n, afac, lda, arf, info )
484  srnamt = 'CPFTRF'
485  CALL cpftrf( cform, uplo, n, arf, info )
486 *
487 * Check error code from CPFTRF.
488 *
489  IF( info.NE.izero ) THEN
490 *
491 * LANGOU: there is a small hick here: IZERO should
492 * always be INFO however if INFO is ZERO, ALAERH does not
493 * complain.
494 *
495  CALL alaerh( 'CPF', 'CPFSV ', info, izero,
496  + uplo, n, n, -1, -1, nrhs, iit,
497  + nfail, nerrs, nout )
498  GO TO 100
499  END IF
500 *
501 * Skip the tests if INFO is not 0.
502 *
503  IF( info.NE.0 ) THEN
504  GO TO 100
505  END IF
506 *
507  srnamt = 'CPFTRS'
508  CALL cpftrs( cform, uplo, n, nrhs, arf, x, ldb,
509  + info )
510 *
511  srnamt = 'CTFTTR'
512  CALL ctfttr( cform, uplo, n, arf, afac, lda, info )
513 *
514 * Reconstruct matrix from factors and compute
515 * residual.
516 *
517  CALL clacpy( uplo, n, n, afac, lda, asav, lda )
518  CALL cpot01( uplo, n, a, lda, afac, lda,
519  + s_work_cpot01, result( 1 ) )
520  CALL clacpy( uplo, n, n, asav, lda, afac, lda )
521 *
522 * Form the inverse and compute the residual.
523 *
524  IF(mod(n,2).EQ.0)THEN
525  CALL clacpy( 'A', n+1, n/2, arf, n+1, arfinv,
526  + n+1 )
527  ELSE
528  CALL clacpy( 'A', n, (n+1)/2, arf, n, arfinv,
529  + n )
530  END IF
531 *
532  srnamt = 'CPFTRI'
533  CALL cpftri( cform, uplo, n, arfinv , info )
534 *
535  srnamt = 'CTFTTR'
536  CALL ctfttr( cform, uplo, n, arfinv, ainv, lda,
537  + info )
538 *
539 * Check error code from CPFTRI.
540 *
541  IF( info.NE.0 )
542  + CALL alaerh( 'CPO', 'CPFTRI', info, 0, uplo, n,
543  + n, -1, -1, -1, imat, nfail, nerrs,
544  + nout )
545 *
546  CALL cpot03( uplo, n, a, lda, ainv, lda,
547  + c_work_cpot03, lda, s_work_cpot03,
548  + rcondc, result( 2 ) )
549 *
550 * Compute residual of the computed solution.
551 *
552  CALL clacpy( 'Full', n, nrhs, b, lda,
553  + c_work_cpot02, lda )
554  CALL cpot02( uplo, n, nrhs, a, lda, x, lda,
555  + c_work_cpot02, lda, s_work_cpot02,
556  + result( 3 ) )
557 *
558 * Check solution from generated exact solution.
559 *
560  CALL cget04( n, nrhs, x, lda, xact, lda, rcondc,
561  + result( 4 ) )
562  nt = 4
563 *
564 * Print information about the tests that did not
565 * pass the threshold.
566 *
567  DO 60 k = 1, nt
568  IF( result( k ).GE.thresh ) THEN
569  IF( nfail.EQ.0 .AND. nerrs.EQ.0 )
570  + CALL aladhd( nout, 'CPF' )
571  WRITE( nout, fmt = 9999 )'CPFSV ', uplo,
572  + n, iit, k, result( k )
573  nfail = nfail + 1
574  END IF
575  60 CONTINUE
576  nrun = nrun + nt
577  100 CONTINUE
578  110 CONTINUE
579  120 CONTINUE
580  980 CONTINUE
581  130 CONTINUE
582 *
583 * Print a summary of the results.
584 *
585  CALL alasvm( 'CPF', nout, nfail, nrun, nerrs )
586 *
587  9999 FORMAT( 1x, a6, ', UPLO=''', a1, ''', N =', i5, ', type ', i1,
588  + ', test(', i1, ')=', g12.5 )
589 *
590  RETURN
591 *
592 * End of CDRVRFP
593 *
594  END
subroutine alasvm(TYPE, NOUT, NFAIL, NRUN, NERRS)
ALASVM
Definition: alasvm.f:75
subroutine alaerh(PATH, SUBNAM, INFO, INFOE, OPTS, M, N, KL, KU, N5, IMAT, NFAIL, NERRS, NOUT)
ALAERH
Definition: alaerh.f:149
subroutine clarhs(PATH, XTYPE, UPLO, TRANS, M, N, KL, KU, NRHS, A, LDA, X, LDX, B, LDB, ISEED, INFO)
CLARHS
Definition: clarhs.f:211
subroutine cpotri(UPLO, N, A, LDA, INFO)
CPOTRI
Definition: cpotri.f:97
subroutine claipd(N, A, INDA, VINDA)
CLAIPD
Definition: claipd.f:85
subroutine cpot01(UPLO, N, A, LDA, AFAC, LDAFAC, RWORK, RESID)
CPOT01
Definition: cpot01.f:108
subroutine cpftrs(TRANSR, UPLO, N, NRHS, A, B, LDB, INFO)
CPFTRS
Definition: cpftrs.f:222
subroutine cpot02(UPLO, N, NRHS, A, LDA, X, LDX, B, LDB, RWORK, RESID)
CPOT02
Definition: cpot02.f:129
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...
Definition: ctfttr.f:218
subroutine clatms(M, N, DIST, ISEED, SYM, D, MODE, COND, DMAX, KL, KU, PACK, A, LDA, WORK, INFO)
CLATMS
Definition: clatms.f:334
subroutine aladhd(IOUNIT, PATH)
ALADHD
Definition: aladhd.f:80
subroutine cdrvrfp(NOUT, NN, NVAL, NNS, NSVAL, NNT, NTVAL, THRESH, A, ASAV, AFAC, AINV, B, BSAV, XACT, X, ARF, ARFINV, C_WORK_CLATMS, C_WORK_CPOT02, C_WORK_CPOT03, S_WORK_CLATMS, S_WORK_CLANHE, S_WORK_CPOT01, S_WORK_CPOT02, S_WORK_CPOT03)
CDRVRFP
Definition: cdrvrfp.f:246
subroutine cpotrf(UPLO, N, A, LDA, INFO)
CPOTRF
Definition: cpotrf.f:109
subroutine clacpy(UPLO, M, N, A, LDA, B, LDB)
CLACPY copies all or part of one two-dimensional array to another.
Definition: clacpy.f:105
subroutine cpot03(UPLO, N, A, LDA, AINV, LDAINV, WORK, LDWORK, RWORK, RCOND, RESID)
CPOT03
Definition: cpot03.f:128
subroutine cpftri(TRANSR, UPLO, N, A, INFO)
CPFTRI
Definition: cpftri.f:214
subroutine clatb4(PATH, IMAT, M, N, TYPE, KL, KU, ANORM, MODE, CNDNUM, DIST)
CLATB4
Definition: clatb4.f:123
subroutine cpftrf(TRANSR, UPLO, N, A, INFO)
CPFTRF
Definition: cpftrf.f:213
subroutine cget04(N, NRHS, X, LDX, XACT, LDXACT, RCOND, RESID)
CGET04
Definition: cget04.f:104
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...
Definition: ctrttf.f:218