LAPACK  3.9.0
LAPACK: Linear Algebra PACKage

◆ zerrunhr_col()

subroutine zerrunhr_col ( character(len=3)  PATH,
integer  NUNIT 
)

ZERRUNHR_COL

Purpose:
 ZERRUNHR_COL tests the error exits for ZUNHR_COL that does
 Householder reconstruction from the ouput of tall-skinny
 factorization ZLATSQR.
Parameters
[in]PATH
          PATH is CHARACTER*3
          The LAPACK path name for the routines to be tested.
[in]NUNIT
          NUNIT is INTEGER
          The unit number for output.
Author
Univ. of Tennessee
Univ. of California Berkeley
Univ. of Colorado Denver
NAG Ltd.
Date
November 2019

Definition at line 58 of file zerrunhr_col.f.

58  IMPLICIT NONE
59 *
60 * -- LAPACK test routine (version 3.9.0) --
61 * -- LAPACK is a software package provided by Univ. of Tennessee, --
62 * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
63 * November 2019
64 *
65 * .. Scalar Arguments ..
66  CHARACTER(LEN=3) PATH
67  INTEGER NUNIT
68 * ..
69 *
70 * =====================================================================
71 *
72 * .. Parameters ..
73  INTEGER NMAX
74  parameter( nmax = 2 )
75 * ..
76 * .. Local Scalars ..
77  INTEGER I, INFO, J
78 * ..
79 * .. Local Arrays ..
80  COMPLEX*16 A( NMAX, NMAX ), T( NMAX, NMAX ), D(NMAX)
81 * ..
82 * .. External Subroutines ..
83  EXTERNAL alaesm, chkxer, zunhr_col
84 * ..
85 * .. Scalars in Common ..
86  LOGICAL LERR, OK
87  CHARACTER(LEN=32) SRNAMT
88  INTEGER INFOT, NOUT
89 * ..
90 * .. Common blocks ..
91  COMMON / infoc / infot, nout, ok, lerr
92  COMMON / srnamc / srnamt
93 * ..
94 * .. Intrinsic Functions ..
95  INTRINSIC dble, dcmplx
96 * ..
97 * .. Executable Statements ..
98 *
99  nout = nunit
100  WRITE( nout, fmt = * )
101 *
102 * Set the variables to innocuous values.
103 *
104  DO j = 1, nmax
105  DO i = 1, nmax
106  a( i, j ) = dcmplx( 1.d+0 / dble( i+j ) )
107  t( i, j ) = dcmplx( 1.d+0 / dble( i+j ) )
108  END DO
109  d( j ) = ( 0.d+0, 0.d+0 )
110  END DO
111  ok = .true.
112 *
113 * Error exits for Householder reconstruction
114 *
115 * ZUNHR_COL
116 *
117  srnamt = 'ZUNHR_COL'
118 *
119  infot = 1
120  CALL zunhr_col( -1, 0, 1, a, 1, t, 1, d, info )
121  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
122 *
123  infot = 2
124  CALL zunhr_col( 0, -1, 1, a, 1, t, 1, d, info )
125  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
126  CALL zunhr_col( 1, 2, 1, a, 1, t, 1, d, info )
127  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
128 *
129  infot = 3
130  CALL zunhr_col( 0, 0, -1, a, 1, t, 1, d, info )
131  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
132 *
133  CALL zunhr_col( 0, 0, 0, a, 1, t, 1, d, info )
134  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
135 *
136  infot = 5
137  CALL zunhr_col( 0, 0, 1, a, -1, t, 1, d, info )
138  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
139 *
140  CALL zunhr_col( 0, 0, 1, a, 0, t, 1, d, info )
141  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
142 *
143  CALL zunhr_col( 2, 0, 1, a, 1, t, 1, d, info )
144  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
145 *
146  infot = 7
147  CALL zunhr_col( 0, 0, 1, a, 1, t, -1, d, info )
148  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
149 *
150  CALL zunhr_col( 0, 0, 1, a, 1, t, 0, d, info )
151  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
152 *
153  CALL zunhr_col( 4, 3, 2, a, 4, t, 1, d, info )
154  CALL chkxer( 'ZUNHR_COL', infot, nout, lerr, ok )
155 *
156 * Print a summary line.
157 *
158  CALL alaesm( path, ok, nout )
159 *
160  RETURN
161 *
162 * End of ZERRUNHR_COL
163 *
Here is the call graph for this function:
Here is the caller graph for this function:
alaesm
subroutine alaesm(PATH, OK, NOUT)
ALAESM
Definition: alaesm.f:65
zunhr_col
subroutine zunhr_col(M, N, NB, A, LDA, T, LDT, D, INFO)
ZUNHR_COL
Definition: zunhr_col.f:260
chkxer
subroutine chkxer(SRNAMT, INFOT, NOUT, LERR, OK)
Definition: cblat2.f:3199