LAPACK  3.4.2
LAPACK: Linear Algebra PACKage
 All Files Functions Groups
cchkqrt.f
Go to the documentation of this file.
1 *> \brief \b CCHKQRT
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 CCHKQRT( THRESH, TSTERR, NM, MVAL, NN, NVAL, NNB,
12 * NBVAL, NOUT )
13 *
14 * .. Scalar Arguments ..
15 * LOGICAL TSTERR
16 * INTEGER NM, NN, NNB, NOUT
17 * REAL THRESH
18 * ..
19 * .. Array Arguments ..
20 * INTEGER MVAL( * ), NBVAL( * ), NVAL( * )
21 *
22 *> \par Purpose:
23 * =============
24 *>
25 *> \verbatim
26 *>
27 *> CCHKQRT tests CGEQRT and CGEMQRT.
28 *> \endverbatim
29 *
30 * Arguments:
31 * ==========
32 *
33 *> \param[in] THRESH
34 *> \verbatim
35 *> THRESH is REAL
36 *> The threshold value for the test ratios. A result is
37 *> included in the output file if RESULT >= THRESH. To have
38 *> every test ratio printed, use THRESH = 0.
39 *> \endverbatim
40 *>
41 *> \param[in] TSTERR
42 *> \verbatim
43 *> TSTERR is LOGICAL
44 *> Flag that indicates whether error exits are to be tested.
45 *> \endverbatim
46 *>
47 *> \param[in] NM
48 *> \verbatim
49 *> NM is INTEGER
50 *> The number of values of M contained in the vector MVAL.
51 *> \endverbatim
52 *>
53 *> \param[in] MVAL
54 *> \verbatim
55 *> MVAL is INTEGER array, dimension (NM)
56 *> The values of the matrix row dimension M.
57 *> \endverbatim
58 *>
59 *> \param[in] NN
60 *> \verbatim
61 *> NN is INTEGER
62 *> The number of values of N contained in the vector NVAL.
63 *> \endverbatim
64 *>
65 *> \param[in] NVAL
66 *> \verbatim
67 *> NVAL is INTEGER array, dimension (NN)
68 *> The values of the matrix column dimension N.
69 *> \endverbatim
70 *>
71 *> \param[in] NNB
72 *> \verbatim
73 *> NNB is INTEGER
74 *> The number of values of NB contained in the vector NBVAL.
75 *> \endverbatim
76 *>
77 *> \param[in] NBVAL
78 *> \verbatim
79 *> NBVAL is INTEGER array, dimension (NBVAL)
80 *> The values of the blocksize NB.
81 *> \endverbatim
82 *>
83 *> \param[in] NOUT
84 *> \verbatim
85 *> NOUT is INTEGER
86 *> The unit number for output.
87 *> \endverbatim
88 *
89 * Authors:
90 * ========
91 *
92 *> \author Univ. of Tennessee
93 *> \author Univ. of California Berkeley
94 *> \author Univ. of Colorado Denver
95 *> \author NAG Ltd.
96 *
97 *> \date November 2011
98 *
99 *> \ingroup complex_lin
100 *
101 * =====================================================================
102  SUBROUTINE cchkqrt( THRESH, TSTERR, NM, MVAL, NN, NVAL, NNB,
103  $ nbval, nout )
104  IMPLICIT NONE
105 *
106 * -- LAPACK test routine (version 3.4.0) --
107 * -- LAPACK is a software package provided by Univ. of Tennessee, --
108 * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
109 * November 2011
110 *
111 * .. Scalar Arguments ..
112  LOGICAL tsterr
113  INTEGER nm, nn, nnb, nout
114  REAL thresh
115 * ..
116 * .. Array Arguments ..
117  INTEGER mval( * ), nbval( * ), nval( * )
118 * ..
119 *
120 * =====================================================================
121 *
122 * .. Parameters ..
123  INTEGER ntests
124  parameter( ntests = 6 )
125 * ..
126 * .. Local Scalars ..
127  CHARACTER*3 path
128  INTEGER i, j, k, t, m, n, nb, nfail, nerrs, nrun,
129  $ minmn
130 * ..
131 * .. Local Arrays ..
132  REAL result( ntests )
133 * ..
134 * .. External Subroutines ..
135  EXTERNAL alaerh, alahd, alasum, cerrqrt, cqrt04
136 * ..
137 * .. Scalars in Common ..
138  LOGICAL lerr, ok
139  CHARACTER*32 srnamt
140  INTEGER infot, nunit
141 * ..
142 * .. Common blocks ..
143  common / infoc / infot, nunit, ok, lerr
144  common / srnamc / srnamt
145 * ..
146 * .. Executable Statements ..
147 *
148 * Initialize constants
149 *
150  path( 1: 1 ) = 'C'
151  path( 2: 3 ) = 'QT'
152  nrun = 0
153  nfail = 0
154  nerrs = 0
155 *
156 * Test the error exits
157 *
158  IF( tsterr ) CALL cerrqrt( path, nout )
159  infot = 0
160 *
161 * Do for each value of M in MVAL.
162 *
163  DO i = 1, nm
164  m = mval( i )
165 *
166 * Do for each value of N in NVAL.
167 *
168  DO j = 1, nn
169  n = nval( j )
170 *
171 * Do for each possible value of NB
172 *
173  minmn = min( m, n )
174  DO k = 1, nnb
175  nb = nbval( k )
176 *
177 * Test CGEQRT and CGEMQRT
178 *
179  IF( (nb.LE.minmn).AND.(nb.GT.0) ) THEN
180  CALL cqrt04( m, n, nb, result )
181 *
182 * Print information about the tests that did not
183 * pass the threshold.
184 *
185  DO t = 1, ntests
186  IF( result( t ).GE.thresh ) THEN
187  IF( nfail.EQ.0 .AND. nerrs.EQ.0 )
188  $ CALL alahd( nout, path )
189  WRITE( nout, fmt = 9999 )m, n, nb,
190  $ t, result( t )
191  nfail = nfail + 1
192  END IF
193  END DO
194  nrun = nrun + ntests
195  END IF
196  END DO
197  END DO
198  END DO
199 *
200 * Print a summary of the results.
201 *
202  CALL alasum( path, nout, nfail, nrun, nerrs )
203 *
204  9999 format( ' M=', i5, ', N=', i5, ', NB=', i4,
205  $ ' test(', i2, ')=', g12.5 )
206  return
207 *
208 * End of CCHKQRT
209 *
210  END