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