LAPACK 3.12.0
LAPACK: Linear Algebra PACKage
Loading...
Searching...
No Matches
cerrtr.f
Go to the documentation of this file.
1*> \brief \b CERRTR
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 CERRTR( PATH, NUNIT )
12*
13* .. Scalar Arguments ..
14* CHARACTER*3 PATH
15* INTEGER NUNIT
16* ..
17*
18*
19*> \par Purpose:
20* =============
21*>
22*> \verbatim
23*>
24*> CERRTR tests the error exits for the COMPLEX triangular routines.
25*> \endverbatim
26*
27* Arguments:
28* ==========
29*
30*> \param[in] PATH
31*> \verbatim
32*> PATH is CHARACTER*3
33*> The LAPACK path name for the routines to be tested.
34*> \endverbatim
35*>
36*> \param[in] NUNIT
37*> \verbatim
38*> NUNIT is INTEGER
39*> The unit number for output.
40*> \endverbatim
41*
42* Authors:
43* ========
44*
45*> \author Univ. of Tennessee
46*> \author Univ. of California Berkeley
47*> \author Univ. of Colorado Denver
48*> \author NAG Ltd.
49*
50*> \ingroup complex_lin
51*
52* =====================================================================
53 SUBROUTINE cerrtr( PATH, NUNIT )
54*
55* -- LAPACK test routine --
56* -- LAPACK is a software package provided by Univ. of Tennessee, --
57* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
58*
59* .. Scalar Arguments ..
60 CHARACTER*3 PATH
61 INTEGER NUNIT
62* ..
63*
64* =====================================================================
65*
66* .. Parameters ..
67 INTEGER NMAX
68 parameter( nmax = 2 )
69* ..
70* .. Local Scalars ..
71 CHARACTER*2 C2
72 INTEGER INFO
73 REAL RCOND, SCALE, SCALES(0)
74* ..
75* .. Local Arrays ..
76 REAL R1( NMAX ), R2( NMAX ), RW( NMAX )
77 COMPLEX A( NMAX, NMAX ), B( NMAX ), W( NMAX ),
78 $ X( NMAX )
79* ..
80* .. External Functions ..
81 LOGICAL LSAMEN
82 EXTERNAL lsamen
83* ..
84* .. External Subroutines ..
85 EXTERNAL alaesm, chkxer, clatbs, clatps, clatrs,
88 $ ctrtri, ctrtrs
89* ..
90* .. Scalars in Common ..
91 LOGICAL LERR, OK
92 CHARACTER*32 SRNAMT
93 INTEGER INFOT, NOUT
94* ..
95* .. Common blocks ..
96 COMMON / infoc / infot, nout, ok, lerr
97 COMMON / srnamc / srnamt
98* ..
99* .. Executable Statements ..
100*
101 nout = nunit
102 WRITE( nout, fmt = * )
103 c2 = path( 2: 3 )
104 a( 1, 1 ) = 1.
105 a( 1, 2 ) = 2.
106 a( 2, 2 ) = 3.
107 a( 2, 1 ) = 4.
108 ok = .true.
109*
110* Test error exits for the general triangular routines.
111*
112 IF( lsamen( 2, c2, 'TR' ) ) THEN
113*
114* CTRTRI
115*
116 srnamt = 'CTRTRI'
117 infot = 1
118 CALL ctrtri( '/', 'N', 0, a, 1, info )
119 CALL chkxer( 'CTRTRI', infot, nout, lerr, ok )
120 infot = 2
121 CALL ctrtri( 'U', '/', 0, a, 1, info )
122 CALL chkxer( 'CTRTRI', infot, nout, lerr, ok )
123 infot = 3
124 CALL ctrtri( 'U', 'N', -1, a, 1, info )
125 CALL chkxer( 'CTRTRI', infot, nout, lerr, ok )
126 infot = 5
127 CALL ctrtri( 'U', 'N', 2, a, 1, info )
128 CALL chkxer( 'CTRTRI', infot, nout, lerr, ok )
129*
130* CTRTI2
131*
132 srnamt = 'CTRTI2'
133 infot = 1
134 CALL ctrti2( '/', 'N', 0, a, 1, info )
135 CALL chkxer( 'CTRTI2', infot, nout, lerr, ok )
136 infot = 2
137 CALL ctrti2( 'U', '/', 0, a, 1, info )
138 CALL chkxer( 'CTRTI2', infot, nout, lerr, ok )
139 infot = 3
140 CALL ctrti2( 'U', 'N', -1, a, 1, info )
141 CALL chkxer( 'CTRTI2', infot, nout, lerr, ok )
142 infot = 5
143 CALL ctrti2( 'U', 'N', 2, a, 1, info )
144 CALL chkxer( 'CTRTI2', infot, nout, lerr, ok )
145*
146*
147* CTRTRS
148*
149 srnamt = 'CTRTRS'
150 infot = 1
151 CALL ctrtrs( '/', 'N', 'N', 0, 0, a, 1, x, 1, info )
152 CALL chkxer( 'CTRTRS', infot, nout, lerr, ok )
153 infot = 2
154 CALL ctrtrs( 'U', '/', 'N', 0, 0, a, 1, x, 1, info )
155 CALL chkxer( 'CTRTRS', infot, nout, lerr, ok )
156 infot = 3
157 CALL ctrtrs( 'U', 'N', '/', 0, 0, a, 1, x, 1, info )
158 CALL chkxer( 'CTRTRS', infot, nout, lerr, ok )
159 infot = 4
160 CALL ctrtrs( 'U', 'N', 'N', -1, 0, a, 1, x, 1, info )
161 CALL chkxer( 'CTRTRS', infot, nout, lerr, ok )
162 infot = 5
163 CALL ctrtrs( 'U', 'N', 'N', 0, -1, a, 1, x, 1, info )
164 CALL chkxer( 'CTRTRS', infot, nout, lerr, ok )
165 infot = 7
166*
167* CTRRFS
168*
169 srnamt = 'CTRRFS'
170 infot = 1
171 CALL ctrrfs( '/', 'N', 'N', 0, 0, a, 1, b, 1, x, 1, r1, r2, w,
172 $ rw, info )
173 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
174 infot = 2
175 CALL ctrrfs( 'U', '/', 'N', 0, 0, a, 1, b, 1, x, 1, r1, r2, w,
176 $ rw, info )
177 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
178 infot = 3
179 CALL ctrrfs( 'U', 'N', '/', 0, 0, a, 1, b, 1, x, 1, r1, r2, w,
180 $ rw, info )
181 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
182 infot = 4
183 CALL ctrrfs( 'U', 'N', 'N', -1, 0, a, 1, b, 1, x, 1, r1, r2, w,
184 $ rw, info )
185 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
186 infot = 5
187 CALL ctrrfs( 'U', 'N', 'N', 0, -1, a, 1, b, 1, x, 1, r1, r2, w,
188 $ rw, info )
189 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
190 infot = 7
191 CALL ctrrfs( 'U', 'N', 'N', 2, 1, a, 1, b, 2, x, 2, r1, r2, w,
192 $ rw, info )
193 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
194 infot = 9
195 CALL ctrrfs( 'U', 'N', 'N', 2, 1, a, 2, b, 1, x, 2, r1, r2, w,
196 $ rw, info )
197 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
198 infot = 11
199 CALL ctrrfs( 'U', 'N', 'N', 2, 1, a, 2, b, 2, x, 1, r1, r2, w,
200 $ rw, info )
201 CALL chkxer( 'CTRRFS', infot, nout, lerr, ok )
202*
203* CTRCON
204*
205 srnamt = 'CTRCON'
206 infot = 1
207 CALL ctrcon( '/', 'U', 'N', 0, a, 1, rcond, w, rw, info )
208 CALL chkxer( 'CTRCON', infot, nout, lerr, ok )
209 infot = 2
210 CALL ctrcon( '1', '/', 'N', 0, a, 1, rcond, w, rw, info )
211 CALL chkxer( 'CTRCON', infot, nout, lerr, ok )
212 infot = 3
213 CALL ctrcon( '1', 'U', '/', 0, a, 1, rcond, w, rw, info )
214 CALL chkxer( 'CTRCON', infot, nout, lerr, ok )
215 infot = 4
216 CALL ctrcon( '1', 'U', 'N', -1, a, 1, rcond, w, rw, info )
217 CALL chkxer( 'CTRCON', infot, nout, lerr, ok )
218 infot = 6
219 CALL ctrcon( '1', 'U', 'N', 2, a, 1, rcond, w, rw, info )
220 CALL chkxer( 'CTRCON', infot, nout, lerr, ok )
221*
222* CLATRS
223*
224 srnamt = 'CLATRS'
225 infot = 1
226 CALL clatrs( '/', 'N', 'N', 'N', 0, a, 1, x, scale, rw, info )
227 CALL chkxer( 'CLATRS', infot, nout, lerr, ok )
228 infot = 2
229 CALL clatrs( 'U', '/', 'N', 'N', 0, a, 1, x, scale, rw, info )
230 CALL chkxer( 'CLATRS', infot, nout, lerr, ok )
231 infot = 3
232 CALL clatrs( 'U', 'N', '/', 'N', 0, a, 1, x, scale, rw, info )
233 CALL chkxer( 'CLATRS', infot, nout, lerr, ok )
234 infot = 4
235 CALL clatrs( 'U', 'N', 'N', '/', 0, a, 1, x, scale, rw, info )
236 CALL chkxer( 'CLATRS', infot, nout, lerr, ok )
237 infot = 5
238 CALL clatrs( 'U', 'N', 'N', 'N', -1, a, 1, x, scale, rw, info )
239 CALL chkxer( 'CLATRS', infot, nout, lerr, ok )
240 infot = 7
241 CALL clatrs( 'U', 'N', 'N', 'N', 2, a, 1, x, scale, rw, info )
242 CALL chkxer( 'CLATRS', infot, nout, lerr, ok )
243*
244* CLATRS3
245*
246 srnamt = 'CLATRS3'
247 infot = 1
248 CALL clatrs3( '/', 'N', 'N', 'N', 0, 0, a, 1, x, 1, scales,
249 $ rw, rw( 2 ), 1, info )
250 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
251 infot = 2
252 CALL clatrs3( 'U', '/', 'N', 'N', 0, 0, a, 1, x, 1, scales,
253 $ rw, rw( 2 ), 1, info )
254 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
255 infot = 3
256 CALL clatrs3( 'U', 'N', '/', 'N', 0, 0, a, 1, x, 1, scales,
257 $ rw, rw( 2 ), 1, info )
258 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
259 infot = 4
260 CALL clatrs3( 'U', 'N', 'N', '/', 0, 0, a, 1, x, 1, scales,
261 $ rw, rw( 2 ), 1, info )
262 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
263 infot = 5
264 CALL clatrs3( 'U', 'N', 'N', 'N', -1, 0, a, 1, x, 1, scales,
265 $ rw, rw( 2 ), 1, info )
266 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
267 infot = 6
268 CALL clatrs3( 'U', 'N', 'N', 'N', 0, -1, a, 1, x, 1, scales,
269 $ rw, rw( 2 ), 1, info )
270 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
271 infot = 8
272 CALL clatrs3( 'U', 'N', 'N', 'N', 2, 0, a, 1, x, 1, scales,
273 $ rw, rw( 2 ), 1, info )
274 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
275 infot = 10
276 CALL clatrs3( 'U', 'N', 'N', 'N', 2, 0, a, 2, x, 1, scales,
277 $ rw, rw( 2 ), 1, info )
278 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
279 infot = 14
280 CALL clatrs3( 'U', 'N', 'N', 'N', 1, 0, a, 1, x, 1, scales,
281 $ rw, rw( 2 ), 0, info )
282 CALL chkxer( 'CLATRS3', infot, nout, lerr, ok )
283*
284* Test error exits for the packed triangular routines.
285*
286 ELSE IF( lsamen( 2, c2, 'TP' ) ) THEN
287*
288* CTPTRI
289*
290 srnamt = 'CTPTRI'
291 infot = 1
292 CALL ctptri( '/', 'N', 0, a, info )
293 CALL chkxer( 'CTPTRI', infot, nout, lerr, ok )
294 infot = 2
295 CALL ctptri( 'U', '/', 0, a, info )
296 CALL chkxer( 'CTPTRI', infot, nout, lerr, ok )
297 infot = 3
298 CALL ctptri( 'U', 'N', -1, a, info )
299 CALL chkxer( 'CTPTRI', infot, nout, lerr, ok )
300*
301* CTPTRS
302*
303 srnamt = 'CTPTRS'
304 infot = 1
305 CALL ctptrs( '/', 'N', 'N', 0, 0, a, x, 1, info )
306 CALL chkxer( 'CTPTRS', infot, nout, lerr, ok )
307 infot = 2
308 CALL ctptrs( 'U', '/', 'N', 0, 0, a, x, 1, info )
309 CALL chkxer( 'CTPTRS', infot, nout, lerr, ok )
310 infot = 3
311 CALL ctptrs( 'U', 'N', '/', 0, 0, a, x, 1, info )
312 CALL chkxer( 'CTPTRS', infot, nout, lerr, ok )
313 infot = 4
314 CALL ctptrs( 'U', 'N', 'N', -1, 0, a, x, 1, info )
315 CALL chkxer( 'CTPTRS', infot, nout, lerr, ok )
316 infot = 5
317 CALL ctptrs( 'U', 'N', 'N', 0, -1, a, x, 1, info )
318 CALL chkxer( 'CTPTRS', infot, nout, lerr, ok )
319 infot = 8
320 CALL ctptrs( 'U', 'N', 'N', 2, 1, a, x, 1, info )
321 CALL chkxer( 'CTPTRS', infot, nout, lerr, ok )
322*
323* CTPRFS
324*
325 srnamt = 'CTPRFS'
326 infot = 1
327 CALL ctprfs( '/', 'N', 'N', 0, 0, a, b, 1, x, 1, r1, r2, w, rw,
328 $ info )
329 CALL chkxer( 'CTPRFS', infot, nout, lerr, ok )
330 infot = 2
331 CALL ctprfs( 'U', '/', 'N', 0, 0, a, b, 1, x, 1, r1, r2, w, rw,
332 $ info )
333 CALL chkxer( 'CTPRFS', infot, nout, lerr, ok )
334 infot = 3
335 CALL ctprfs( 'U', 'N', '/', 0, 0, a, b, 1, x, 1, r1, r2, w, rw,
336 $ info )
337 CALL chkxer( 'CTPRFS', infot, nout, lerr, ok )
338 infot = 4
339 CALL ctprfs( 'U', 'N', 'N', -1, 0, a, b, 1, x, 1, r1, r2, w,
340 $ rw, info )
341 CALL chkxer( 'CTPRFS', infot, nout, lerr, ok )
342 infot = 5
343 CALL ctprfs( 'U', 'N', 'N', 0, -1, a, b, 1, x, 1, r1, r2, w,
344 $ rw, info )
345 CALL chkxer( 'CTPRFS', infot, nout, lerr, ok )
346 infot = 8
347 CALL ctprfs( 'U', 'N', 'N', 2, 1, a, b, 1, x, 2, r1, r2, w, rw,
348 $ info )
349 CALL chkxer( 'CTPRFS', infot, nout, lerr, ok )
350 infot = 10
351 CALL ctprfs( 'U', 'N', 'N', 2, 1, a, b, 2, x, 1, r1, r2, w, rw,
352 $ info )
353 CALL chkxer( 'CTPRFS', infot, nout, lerr, ok )
354*
355* CTPCON
356*
357 srnamt = 'CTPCON'
358 infot = 1
359 CALL ctpcon( '/', 'U', 'N', 0, a, rcond, w, rw, info )
360 CALL chkxer( 'CTPCON', infot, nout, lerr, ok )
361 infot = 2
362 CALL ctpcon( '1', '/', 'N', 0, a, rcond, w, rw, info )
363 CALL chkxer( 'CTPCON', infot, nout, lerr, ok )
364 infot = 3
365 CALL ctpcon( '1', 'U', '/', 0, a, rcond, w, rw, info )
366 CALL chkxer( 'CTPCON', infot, nout, lerr, ok )
367 infot = 4
368 CALL ctpcon( '1', 'U', 'N', -1, a, rcond, w, rw, info )
369 CALL chkxer( 'CTPCON', infot, nout, lerr, ok )
370*
371* CLATPS
372*
373 srnamt = 'CLATPS'
374 infot = 1
375 CALL clatps( '/', 'N', 'N', 'N', 0, a, x, scale, rw, info )
376 CALL chkxer( 'CLATPS', infot, nout, lerr, ok )
377 infot = 2
378 CALL clatps( 'U', '/', 'N', 'N', 0, a, x, scale, rw, info )
379 CALL chkxer( 'CLATPS', infot, nout, lerr, ok )
380 infot = 3
381 CALL clatps( 'U', 'N', '/', 'N', 0, a, x, scale, rw, info )
382 CALL chkxer( 'CLATPS', infot, nout, lerr, ok )
383 infot = 4
384 CALL clatps( 'U', 'N', 'N', '/', 0, a, x, scale, rw, info )
385 CALL chkxer( 'CLATPS', infot, nout, lerr, ok )
386 infot = 5
387 CALL clatps( 'U', 'N', 'N', 'N', -1, a, x, scale, rw, info )
388 CALL chkxer( 'CLATPS', infot, nout, lerr, ok )
389*
390* Test error exits for the banded triangular routines.
391*
392 ELSE IF( lsamen( 2, c2, 'TB' ) ) THEN
393*
394* CTBTRS
395*
396 srnamt = 'CTBTRS'
397 infot = 1
398 CALL ctbtrs( '/', 'N', 'N', 0, 0, 0, a, 1, x, 1, info )
399 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
400 infot = 2
401 CALL ctbtrs( 'U', '/', 'N', 0, 0, 0, a, 1, x, 1, info )
402 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
403 infot = 3
404 CALL ctbtrs( 'U', 'N', '/', 0, 0, 0, a, 1, x, 1, info )
405 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
406 infot = 4
407 CALL ctbtrs( 'U', 'N', 'N', -1, 0, 0, a, 1, x, 1, info )
408 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
409 infot = 5
410 CALL ctbtrs( 'U', 'N', 'N', 0, -1, 0, a, 1, x, 1, info )
411 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
412 infot = 6
413 CALL ctbtrs( 'U', 'N', 'N', 0, 0, -1, a, 1, x, 1, info )
414 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
415 infot = 8
416 CALL ctbtrs( 'U', 'N', 'N', 2, 1, 1, a, 1, x, 2, info )
417 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
418 infot = 10
419 CALL ctbtrs( 'U', 'N', 'N', 2, 0, 1, a, 1, x, 1, info )
420 CALL chkxer( 'CTBTRS', infot, nout, lerr, ok )
421*
422* CTBRFS
423*
424 srnamt = 'CTBRFS'
425 infot = 1
426 CALL ctbrfs( '/', 'N', 'N', 0, 0, 0, a, 1, b, 1, x, 1, r1, r2,
427 $ w, rw, info )
428 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
429 infot = 2
430 CALL ctbrfs( 'U', '/', 'N', 0, 0, 0, a, 1, b, 1, x, 1, r1, r2,
431 $ w, rw, info )
432 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
433 infot = 3
434 CALL ctbrfs( 'U', 'N', '/', 0, 0, 0, a, 1, b, 1, x, 1, r1, r2,
435 $ w, rw, info )
436 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
437 infot = 4
438 CALL ctbrfs( 'U', 'N', 'N', -1, 0, 0, a, 1, b, 1, x, 1, r1, r2,
439 $ w, rw, info )
440 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
441 infot = 5
442 CALL ctbrfs( 'U', 'N', 'N', 0, -1, 0, a, 1, b, 1, x, 1, r1, r2,
443 $ w, rw, info )
444 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
445 infot = 6
446 CALL ctbrfs( 'U', 'N', 'N', 0, 0, -1, a, 1, b, 1, x, 1, r1, r2,
447 $ w, rw, info )
448 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
449 infot = 8
450 CALL ctbrfs( 'U', 'N', 'N', 2, 1, 1, a, 1, b, 2, x, 2, r1, r2,
451 $ w, rw, info )
452 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
453 infot = 10
454 CALL ctbrfs( 'U', 'N', 'N', 2, 1, 1, a, 2, b, 1, x, 2, r1, r2,
455 $ w, rw, info )
456 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
457 infot = 12
458 CALL ctbrfs( 'U', 'N', 'N', 2, 1, 1, a, 2, b, 2, x, 1, r1, r2,
459 $ w, rw, info )
460 CALL chkxer( 'CTBRFS', infot, nout, lerr, ok )
461*
462* CTBCON
463*
464 srnamt = 'CTBCON'
465 infot = 1
466 CALL ctbcon( '/', 'U', 'N', 0, 0, a, 1, rcond, w, rw, info )
467 CALL chkxer( 'CTBCON', infot, nout, lerr, ok )
468 infot = 2
469 CALL ctbcon( '1', '/', 'N', 0, 0, a, 1, rcond, w, rw, info )
470 CALL chkxer( 'CTBCON', infot, nout, lerr, ok )
471 infot = 3
472 CALL ctbcon( '1', 'U', '/', 0, 0, a, 1, rcond, w, rw, info )
473 CALL chkxer( 'CTBCON', infot, nout, lerr, ok )
474 infot = 4
475 CALL ctbcon( '1', 'U', 'N', -1, 0, a, 1, rcond, w, rw, info )
476 CALL chkxer( 'CTBCON', infot, nout, lerr, ok )
477 infot = 5
478 CALL ctbcon( '1', 'U', 'N', 0, -1, a, 1, rcond, w, rw, info )
479 CALL chkxer( 'CTBCON', infot, nout, lerr, ok )
480 infot = 7
481 CALL ctbcon( '1', 'U', 'N', 2, 1, a, 1, rcond, w, rw, info )
482 CALL chkxer( 'CTBCON', infot, nout, lerr, ok )
483*
484* CLATBS
485*
486 srnamt = 'CLATBS'
487 infot = 1
488 CALL clatbs( '/', 'N', 'N', 'N', 0, 0, a, 1, x, scale, rw,
489 $ info )
490 CALL chkxer( 'CLATBS', infot, nout, lerr, ok )
491 infot = 2
492 CALL clatbs( 'U', '/', 'N', 'N', 0, 0, a, 1, x, scale, rw,
493 $ info )
494 CALL chkxer( 'CLATBS', infot, nout, lerr, ok )
495 infot = 3
496 CALL clatbs( 'U', 'N', '/', 'N', 0, 0, a, 1, x, scale, rw,
497 $ info )
498 CALL chkxer( 'CLATBS', infot, nout, lerr, ok )
499 infot = 4
500 CALL clatbs( 'U', 'N', 'N', '/', 0, 0, a, 1, x, scale, rw,
501 $ info )
502 CALL chkxer( 'CLATBS', infot, nout, lerr, ok )
503 infot = 5
504 CALL clatbs( 'U', 'N', 'N', 'N', -1, 0, a, 1, x, scale, rw,
505 $ info )
506 CALL chkxer( 'CLATBS', infot, nout, lerr, ok )
507 infot = 6
508 CALL clatbs( 'U', 'N', 'N', 'N', 1, -1, a, 1, x, scale, rw,
509 $ info )
510 CALL chkxer( 'CLATBS', infot, nout, lerr, ok )
511 infot = 8
512 CALL clatbs( 'U', 'N', 'N', 'N', 2, 1, a, 1, x, scale, rw,
513 $ info )
514 CALL chkxer( 'CLATBS', infot, nout, lerr, ok )
515 END IF
516*
517* Print a summary line.
518*
519 CALL alaesm( path, ok, nout )
520*
521 RETURN
522*
523* End of CERRTR
524*
525 END
subroutine alaesm(path, ok, nout)
ALAESM
Definition alaesm.f:63
subroutine chkxer(srnamt, infot, nout, lerr, ok)
Definition cblat2.f:3224
subroutine cerrtr(path, nunit)
CERRTR
Definition cerrtr.f:54
subroutine clatbs(uplo, trans, diag, normin, n, kd, ab, ldab, x, scale, cnorm, info)
CLATBS solves a triangular banded system of equations.
Definition clatbs.f:243
subroutine clatps(uplo, trans, diag, normin, n, ap, x, scale, cnorm, info)
CLATPS solves a triangular system of equations with the matrix held in packed storage.
Definition clatps.f:231
subroutine clatrs3(uplo, trans, diag, normin, n, nrhs, a, lda, x, ldx, scale, cnorm, work, lwork, info)
CLATRS3 solves a triangular system of equations with the scale factors set to prevent overflow.
Definition clatrs3.f:230
subroutine clatrs(uplo, trans, diag, normin, n, a, lda, x, scale, cnorm, info)
CLATRS solves a triangular system of equations with the scale factor set to prevent overflow.
Definition clatrs.f:239
subroutine ctbcon(norm, uplo, diag, n, kd, ab, ldab, rcond, work, rwork, info)
CTBCON
Definition ctbcon.f:143
subroutine ctbrfs(uplo, trans, diag, n, kd, nrhs, ab, ldab, b, ldb, x, ldx, ferr, berr, work, rwork, info)
CTBRFS
Definition ctbrfs.f:188
subroutine ctbtrs(uplo, trans, diag, n, kd, nrhs, ab, ldab, b, ldb, info)
CTBTRS
Definition ctbtrs.f:146
subroutine ctpcon(norm, uplo, diag, n, ap, rcond, work, rwork, info)
CTPCON
Definition ctpcon.f:130
subroutine ctprfs(uplo, trans, diag, n, nrhs, ap, b, ldb, x, ldx, ferr, berr, work, rwork, info)
CTPRFS
Definition ctprfs.f:174
subroutine ctptri(uplo, diag, n, ap, info)
CTPTRI
Definition ctptri.f:117
subroutine ctptrs(uplo, trans, diag, n, nrhs, ap, b, ldb, info)
CTPTRS
Definition ctptrs.f:130
subroutine ctrcon(norm, uplo, diag, n, a, lda, rcond, work, rwork, info)
CTRCON
Definition ctrcon.f:137
subroutine ctrrfs(uplo, trans, diag, n, nrhs, a, lda, b, ldb, x, ldx, ferr, berr, work, rwork, info)
CTRRFS
Definition ctrrfs.f:182
subroutine ctrti2(uplo, diag, n, a, lda, info)
CTRTI2 computes the inverse of a triangular matrix (unblocked algorithm).
Definition ctrti2.f:110
subroutine ctrtri(uplo, diag, n, a, lda, info)
CTRTRI
Definition ctrtri.f:109
subroutine ctrtrs(uplo, trans, diag, n, nrhs, a, lda, b, ldb, info)
CTRTRS
Definition ctrtrs.f:140