LAPACK  3.9.0
LAPACK: Linear Algebra PACKage
zhet21.f
Go to the documentation of this file.
1 *> \brief \b ZHET21
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 ZHET21( ITYPE, UPLO, N, KBAND, A, LDA, D, E, U, LDU, V,
12 * LDV, TAU, WORK, RWORK, RESULT )
13 *
14 * .. Scalar Arguments ..
15 * CHARACTER UPLO
16 * INTEGER ITYPE, KBAND, LDA, LDU, LDV, N
17 * ..
18 * .. Array Arguments ..
19 * DOUBLE PRECISION D( * ), E( * ), RESULT( 2 ), RWORK( * )
20 * COMPLEX*16 A( LDA, * ), TAU( * ), U( LDU, * ),
21 * $ V( LDV, * ), WORK( * )
22 * ..
23 *
24 *
25 *> \par Purpose:
26 * =============
27 *>
28 *> \verbatim
29 *>
30 *> ZHET21 generally checks a decomposition of the form
31 *>
32 *> A = U S U**H
33 *>
34 *> where **H means conjugate transpose, A is hermitian, U is unitary, and
35 *> S is diagonal (if KBAND=0) or (real) symmetric tridiagonal (if
36 *> KBAND=1).
37 *>
38 *> If ITYPE=1, then U is represented as a dense matrix; otherwise U is
39 *> expressed as a product of Householder transformations, whose vectors
40 *> are stored in the array "V" and whose scaling constants are in "TAU".
41 *> We shall use the letter "V" to refer to the product of Householder
42 *> transformations (which should be equal to U).
43 *>
44 *> Specifically, if ITYPE=1, then:
45 *>
46 *> RESULT(1) = | A - U S U**H | / ( |A| n ulp ) and
47 *> RESULT(2) = | I - U U**H | / ( n ulp )
48 *>
49 *> If ITYPE=2, then:
50 *>
51 *> RESULT(1) = | A - V S V**H | / ( |A| n ulp )
52 *>
53 *> If ITYPE=3, then:
54 *>
55 *> RESULT(1) = | I - U V**H | / ( n ulp )
56 *>
57 *> For ITYPE > 1, the transformation U is expressed as a product
58 *> V = H(1)...H(n-2), where H(j) = I - tau(j) v(j) v(j)**H and each
59 *> vector v(j) has its first j elements 0 and the remaining n-j elements
60 *> stored in V(j+1:n,j).
61 *> \endverbatim
62 *
63 * Arguments:
64 * ==========
65 *
66 *> \param[in] ITYPE
67 *> \verbatim
68 *> ITYPE is INTEGER
69 *> Specifies the type of tests to be performed.
70 *> 1: U expressed as a dense unitary matrix:
71 *> RESULT(1) = | A - U S U**H | / ( |A| n ulp ) and
72 *> RESULT(2) = | I - U U**H | / ( n ulp )
73 *>
74 *> 2: U expressed as a product V of Housholder transformations:
75 *> RESULT(1) = | A - V S V**H | / ( |A| n ulp )
76 *>
77 *> 3: U expressed both as a dense unitary matrix and
78 *> as a product of Housholder transformations:
79 *> RESULT(1) = | I - U V**H | / ( n ulp )
80 *> \endverbatim
81 *>
82 *> \param[in] UPLO
83 *> \verbatim
84 *> UPLO is CHARACTER
85 *> If UPLO='U', the upper triangle of A and V will be used and
86 *> the (strictly) lower triangle will not be referenced.
87 *> If UPLO='L', the lower triangle of A and V will be used and
88 *> the (strictly) upper triangle will not be referenced.
89 *> \endverbatim
90 *>
91 *> \param[in] N
92 *> \verbatim
93 *> N is INTEGER
94 *> The size of the matrix. If it is zero, ZHET21 does nothing.
95 *> It must be at least zero.
96 *> \endverbatim
97 *>
98 *> \param[in] KBAND
99 *> \verbatim
100 *> KBAND is INTEGER
101 *> The bandwidth of the matrix. It may only be zero or one.
102 *> If zero, then S is diagonal, and E is not referenced. If
103 *> one, then S is symmetric tri-diagonal.
104 *> \endverbatim
105 *>
106 *> \param[in] A
107 *> \verbatim
108 *> A is COMPLEX*16 array, dimension (LDA, N)
109 *> The original (unfactored) matrix. It is assumed to be
110 *> hermitian, and only the upper (UPLO='U') or only the lower
111 *> (UPLO='L') will be referenced.
112 *> \endverbatim
113 *>
114 *> \param[in] LDA
115 *> \verbatim
116 *> LDA is INTEGER
117 *> The leading dimension of A. It must be at least 1
118 *> and at least N.
119 *> \endverbatim
120 *>
121 *> \param[in] D
122 *> \verbatim
123 *> D is DOUBLE PRECISION array, dimension (N)
124 *> The diagonal of the (symmetric tri-) diagonal matrix.
125 *> \endverbatim
126 *>
127 *> \param[in] E
128 *> \verbatim
129 *> E is DOUBLE PRECISION array, dimension (N-1)
130 *> The off-diagonal of the (symmetric tri-) diagonal matrix.
131 *> E(1) is the (1,2) and (2,1) element, E(2) is the (2,3) and
132 *> (3,2) element, etc.
133 *> Not referenced if KBAND=0.
134 *> \endverbatim
135 *>
136 *> \param[in] U
137 *> \verbatim
138 *> U is COMPLEX*16 array, dimension (LDU, N)
139 *> If ITYPE=1 or 3, this contains the unitary matrix in
140 *> the decomposition, expressed as a dense matrix. If ITYPE=2,
141 *> then it is not referenced.
142 *> \endverbatim
143 *>
144 *> \param[in] LDU
145 *> \verbatim
146 *> LDU is INTEGER
147 *> The leading dimension of U. LDU must be at least N and
148 *> at least 1.
149 *> \endverbatim
150 *>
151 *> \param[in] V
152 *> \verbatim
153 *> V is COMPLEX*16 array, dimension (LDV, N)
154 *> If ITYPE=2 or 3, the columns of this array contain the
155 *> Householder vectors used to describe the unitary matrix
156 *> in the decomposition. If UPLO='L', then the vectors are in
157 *> the lower triangle, if UPLO='U', then in the upper
158 *> triangle.
159 *> *NOTE* If ITYPE=2 or 3, V is modified and restored. The
160 *> subdiagonal (if UPLO='L') or the superdiagonal (if UPLO='U')
161 *> is set to one, and later reset to its original value, during
162 *> the course of the calculation.
163 *> If ITYPE=1, then it is neither referenced nor modified.
164 *> \endverbatim
165 *>
166 *> \param[in] LDV
167 *> \verbatim
168 *> LDV is INTEGER
169 *> The leading dimension of V. LDV must be at least N and
170 *> at least 1.
171 *> \endverbatim
172 *>
173 *> \param[in] TAU
174 *> \verbatim
175 *> TAU is COMPLEX*16 array, dimension (N)
176 *> If ITYPE >= 2, then TAU(j) is the scalar factor of
177 *> v(j) v(j)**H in the Householder transformation H(j) of
178 *> the product U = H(1)...H(n-2)
179 *> If ITYPE < 2, then TAU is not referenced.
180 *> \endverbatim
181 *>
182 *> \param[out] WORK
183 *> \verbatim
184 *> WORK is COMPLEX*16 array, dimension (2*N**2)
185 *> \endverbatim
186 *>
187 *> \param[out] RWORK
188 *> \verbatim
189 *> RWORK is DOUBLE PRECISION array, dimension (N)
190 *> \endverbatim
191 *>
192 *> \param[out] RESULT
193 *> \verbatim
194 *> RESULT is DOUBLE PRECISION array, dimension (2)
195 *> The values computed by the two tests described above. The
196 *> values are currently limited to 1/ulp, to avoid overflow.
197 *> RESULT(1) is always modified. RESULT(2) is modified only
198 *> if ITYPE=1.
199 *> \endverbatim
200 *
201 * Authors:
202 * ========
203 *
204 *> \author Univ. of Tennessee
205 *> \author Univ. of California Berkeley
206 *> \author Univ. of Colorado Denver
207 *> \author NAG Ltd.
208 *
209 *> \date December 2016
210 *
211 *> \ingroup complex16_eig
212 *
213 * =====================================================================
214  SUBROUTINE zhet21( ITYPE, UPLO, N, KBAND, A, LDA, D, E, U, LDU, V,
215  $ LDV, TAU, WORK, RWORK, RESULT )
216 *
217 * -- LAPACK test routine (version 3.7.0) --
218 * -- LAPACK is a software package provided by Univ. of Tennessee, --
219 * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
220 * December 2016
221 *
222 * .. Scalar Arguments ..
223  CHARACTER UPLO
224  INTEGER ITYPE, KBAND, LDA, LDU, LDV, N
225 * ..
226 * .. Array Arguments ..
227  DOUBLE PRECISION D( * ), E( * ), RESULT( 2 ), RWORK( * )
228  COMPLEX*16 A( LDA, * ), TAU( * ), U( LDU, * ),
229  $ v( ldv, * ), work( * )
230 * ..
231 *
232 * =====================================================================
233 *
234 * .. Parameters ..
235  DOUBLE PRECISION ZERO, ONE, TEN
236  parameter( zero = 0.0d+0, one = 1.0d+0, ten = 10.0d+0 )
237  COMPLEX*16 CZERO, CONE
238  parameter( czero = ( 0.0d+0, 0.0d+0 ),
239  $ cone = ( 1.0d+0, 0.0d+0 ) )
240 * ..
241 * .. Local Scalars ..
242  LOGICAL LOWER
243  CHARACTER CUPLO
244  INTEGER IINFO, J, JCOL, JR, JROW
245  DOUBLE PRECISION ANORM, ULP, UNFL, WNORM
246  COMPLEX*16 VSAVE
247 * ..
248 * .. External Functions ..
249  LOGICAL LSAME
250  DOUBLE PRECISION DLAMCH, ZLANGE, ZLANHE
251  EXTERNAL lsame, dlamch, zlange, zlanhe
252 * ..
253 * .. External Subroutines ..
254  EXTERNAL zgemm, zher, zher2, zlacpy, zlarfy, zlaset,
255  $ zunm2l, zunm2r
256 * ..
257 * .. Intrinsic Functions ..
258  INTRINSIC dble, dcmplx, max, min
259 * ..
260 * .. Executable Statements ..
261 *
262  result( 1 ) = zero
263  IF( itype.EQ.1 )
264  $ result( 2 ) = zero
265  IF( n.LE.0 )
266  $ RETURN
267 *
268  IF( lsame( uplo, 'U' ) ) THEN
269  lower = .false.
270  cuplo = 'U'
271  ELSE
272  lower = .true.
273  cuplo = 'L'
274  END IF
275 *
276  unfl = dlamch( 'Safe minimum' )
277  ulp = dlamch( 'Epsilon' )*dlamch( 'Base' )
278 *
279 * Some Error Checks
280 *
281  IF( itype.LT.1 .OR. itype.GT.3 ) THEN
282  result( 1 ) = ten / ulp
283  RETURN
284  END IF
285 *
286 * Do Test 1
287 *
288 * Norm of A:
289 *
290  IF( itype.EQ.3 ) THEN
291  anorm = one
292  ELSE
293  anorm = max( zlanhe( '1', cuplo, n, a, lda, rwork ), unfl )
294  END IF
295 *
296 * Compute error matrix:
297 *
298  IF( itype.EQ.1 ) THEN
299 *
300 * ITYPE=1: error = A - U S U**H
301 *
302  CALL zlaset( 'Full', n, n, czero, czero, work, n )
303  CALL zlacpy( cuplo, n, n, a, lda, work, n )
304 *
305  DO 10 j = 1, n
306  CALL zher( cuplo, n, -d( j ), u( 1, j ), 1, work, n )
307  10 CONTINUE
308 *
309  IF( n.GT.1 .AND. kband.EQ.1 ) THEN
310  DO 20 j = 1, n - 1
311  CALL zher2( cuplo, n, -dcmplx( e( j ) ), u( 1, j ), 1,
312  $ u( 1, j-1 ), 1, work, n )
313  20 CONTINUE
314  END IF
315  wnorm = zlanhe( '1', cuplo, n, work, n, rwork )
316 *
317  ELSE IF( itype.EQ.2 ) THEN
318 *
319 * ITYPE=2: error = V S V**H - A
320 *
321  CALL zlaset( 'Full', n, n, czero, czero, work, n )
322 *
323  IF( lower ) THEN
324  work( n**2 ) = d( n )
325  DO 40 j = n - 1, 1, -1
326  IF( kband.EQ.1 ) THEN
327  work( ( n+1 )*( j-1 )+2 ) = ( cone-tau( j ) )*e( j )
328  DO 30 jr = j + 2, n
329  work( ( j-1 )*n+jr ) = -tau( j )*e( j )*v( jr, j )
330  30 CONTINUE
331  END IF
332 *
333  vsave = v( j+1, j )
334  v( j+1, j ) = one
335  CALL zlarfy( 'L', n-j, v( j+1, j ), 1, tau( j ),
336  $ work( ( n+1 )*j+1 ), n, work( n**2+1 ) )
337  v( j+1, j ) = vsave
338  work( ( n+1 )*( j-1 )+1 ) = d( j )
339  40 CONTINUE
340  ELSE
341  work( 1 ) = d( 1 )
342  DO 60 j = 1, n - 1
343  IF( kband.EQ.1 ) THEN
344  work( ( n+1 )*j ) = ( cone-tau( j ) )*e( j )
345  DO 50 jr = 1, j - 1
346  work( j*n+jr ) = -tau( j )*e( j )*v( jr, j+1 )
347  50 CONTINUE
348  END IF
349 *
350  vsave = v( j, j+1 )
351  v( j, j+1 ) = one
352  CALL zlarfy( 'U', j, v( 1, j+1 ), 1, tau( j ), work, n,
353  $ work( n**2+1 ) )
354  v( j, j+1 ) = vsave
355  work( ( n+1 )*j+1 ) = d( j+1 )
356  60 CONTINUE
357  END IF
358 *
359  DO 90 jcol = 1, n
360  IF( lower ) THEN
361  DO 70 jrow = jcol, n
362  work( jrow+n*( jcol-1 ) ) = work( jrow+n*( jcol-1 ) )
363  $ - a( jrow, jcol )
364  70 CONTINUE
365  ELSE
366  DO 80 jrow = 1, jcol
367  work( jrow+n*( jcol-1 ) ) = work( jrow+n*( jcol-1 ) )
368  $ - a( jrow, jcol )
369  80 CONTINUE
370  END IF
371  90 CONTINUE
372  wnorm = zlanhe( '1', cuplo, n, work, n, rwork )
373 *
374  ELSE IF( itype.EQ.3 ) THEN
375 *
376 * ITYPE=3: error = U V**H - I
377 *
378  IF( n.LT.2 )
379  $ RETURN
380  CALL zlacpy( ' ', n, n, u, ldu, work, n )
381  IF( lower ) THEN
382  CALL zunm2r( 'R', 'C', n, n-1, n-1, v( 2, 1 ), ldv, tau,
383  $ work( n+1 ), n, work( n**2+1 ), iinfo )
384  ELSE
385  CALL zunm2l( 'R', 'C', n, n-1, n-1, v( 1, 2 ), ldv, tau,
386  $ work, n, work( n**2+1 ), iinfo )
387  END IF
388  IF( iinfo.NE.0 ) THEN
389  result( 1 ) = ten / ulp
390  RETURN
391  END IF
392 *
393  DO 100 j = 1, n
394  work( ( n+1 )*( j-1 )+1 ) = work( ( n+1 )*( j-1 )+1 ) - cone
395  100 CONTINUE
396 *
397  wnorm = zlange( '1', n, n, work, n, rwork )
398  END IF
399 *
400  IF( anorm.GT.wnorm ) THEN
401  result( 1 ) = ( wnorm / anorm ) / ( n*ulp )
402  ELSE
403  IF( anorm.LT.one ) THEN
404  result( 1 ) = ( min( wnorm, n*anorm ) / anorm ) / ( n*ulp )
405  ELSE
406  result( 1 ) = min( wnorm / anorm, dble( n ) ) / ( n*ulp )
407  END IF
408  END IF
409 *
410 * Do Test 2
411 *
412 * Compute U U**H - I
413 *
414  IF( itype.EQ.1 ) THEN
415  CALL zgemm( 'N', 'C', n, n, n, cone, u, ldu, u, ldu, czero,
416  $ work, n )
417 *
418  DO 110 j = 1, n
419  work( ( n+1 )*( j-1 )+1 ) = work( ( n+1 )*( j-1 )+1 ) - cone
420  110 CONTINUE
421 *
422  result( 2 ) = min( zlange( '1', n, n, work, n, rwork ),
423  $ dble( n ) ) / ( n*ulp )
424  END IF
425 *
426  RETURN
427 *
428 * End of ZHET21
429 *
430  END
zunm2r
subroutine zunm2r(SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, WORK, INFO)
ZUNM2R multiplies a general matrix by the unitary matrix from a QR factorization determined by cgeqrf...
Definition: zunm2r.f:161
zher2
subroutine zher2(UPLO, N, ALPHA, X, INCX, Y, INCY, A, LDA)
ZHER2
Definition: zher2.f:152
zgemm
subroutine zgemm(TRANSA, TRANSB, M, N, K, ALPHA, A, LDA, B, LDB, BETA, C, LDC)
ZGEMM
Definition: zgemm.f:189
zhet21
subroutine zhet21(ITYPE, UPLO, N, KBAND, A, LDA, D, E, U, LDU, V, LDV, TAU, WORK, RWORK, RESULT)
ZHET21
Definition: zhet21.f:216
zlarfy
subroutine zlarfy(UPLO, N, V, INCV, TAU, C, LDC, WORK)
ZLARFY
Definition: zlarfy.f:110
zlaset
subroutine zlaset(UPLO, M, N, ALPHA, BETA, A, LDA)
ZLASET initializes the off-diagonal elements and the diagonal elements of a matrix to given values.
Definition: zlaset.f:108
zlacpy
subroutine zlacpy(UPLO, M, N, A, LDA, B, LDB)
ZLACPY copies all or part of one two-dimensional array to another.
Definition: zlacpy.f:105
zunm2l
subroutine zunm2l(SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, WORK, INFO)
ZUNM2L multiplies a general matrix by the unitary matrix from a QL factorization determined by cgeqlf...
Definition: zunm2l.f:161
zher
subroutine zher(UPLO, N, ALPHA, X, INCX, A, LDA)
ZHER
Definition: zher.f:137