LAPACK  3.6.1
LAPACK: Linear Algebra PACKage
cunbdb4.f
Go to the documentation of this file.
1 *> \brief \b CUNBDB4
2 *
3 * =========== DOCUMENTATION ===========
4 *
5 * Online html documentation available at
6 * http://www.netlib.org/lapack/explore-html/
7 *
8 *> \htmlonly
9 *> Download CUNBDB4 + dependencies
10 *> <a href="http://www.netlib.org/cgi-bin/netlibfiles.tgz?format=tgz&filename=/lapack/lapack_routine/cunbdb4.f">
11 *> [TGZ]</a>
12 *> <a href="http://www.netlib.org/cgi-bin/netlibfiles.zip?format=zip&filename=/lapack/lapack_routine/cunbdb4.f">
13 *> [ZIP]</a>
14 *> <a href="http://www.netlib.org/cgi-bin/netlibfiles.txt?format=txt&filename=/lapack/lapack_routine/cunbdb4.f">
15 *> [TXT]</a>
16 *> \endhtmlonly
17 *
18 * Definition:
19 * ===========
20 *
21 * SUBROUTINE CUNBDB4( M, P, Q, X11, LDX11, X21, LDX21, THETA, PHI,
22 * TAUP1, TAUP2, TAUQ1, PHANTOM, WORK, LWORK,
23 * INFO )
24 *
25 * .. Scalar Arguments ..
26 * INTEGER INFO, LWORK, M, P, Q, LDX11, LDX21
27 * ..
28 * .. Array Arguments ..
29 * REAL PHI(*), THETA(*)
30 * COMPLEX PHANTOM(*), TAUP1(*), TAUP2(*), TAUQ1(*),
31 * $ WORK(*), X11(LDX11,*), X21(LDX21,*)
32 * ..
33 *
34 *
35 *> \par Purpose:
36 *> =============
37 *>
38 *>\verbatim
39 *>
40 *> CUNBDB4 simultaneously bidiagonalizes the blocks of a tall and skinny
41 *> matrix X with orthonomal columns:
42 *>
43 *> [ B11 ]
44 *> [ X11 ] [ P1 | ] [ 0 ]
45 *> [-----] = [---------] [-----] Q1**T .
46 *> [ X21 ] [ | P2 ] [ B21 ]
47 *> [ 0 ]
48 *>
49 *> X11 is P-by-Q, and X21 is (M-P)-by-Q. M-Q must be no larger than P,
50 *> M-P, or Q. Routines CUNBDB1, CUNBDB2, and CUNBDB3 handle cases in
51 *> which M-Q is not the minimum dimension.
52 *>
53 *> The unitary matrices P1, P2, and Q1 are P-by-P, (M-P)-by-(M-P),
54 *> and (M-Q)-by-(M-Q), respectively. They are represented implicitly by
55 *> Householder vectors.
56 *>
57 *> B11 and B12 are (M-Q)-by-(M-Q) bidiagonal matrices represented
58 *> implicitly by angles THETA, PHI.
59 *>
60 *>\endverbatim
61 *
62 * Arguments:
63 * ==========
64 *
65 *> \param[in] M
66 *> \verbatim
67 *> M is INTEGER
68 *> The number of rows X11 plus the number of rows in X21.
69 *> \endverbatim
70 *>
71 *> \param[in] P
72 *> \verbatim
73 *> P is INTEGER
74 *> The number of rows in X11. 0 <= P <= M.
75 *> \endverbatim
76 *>
77 *> \param[in] Q
78 *> \verbatim
79 *> Q is INTEGER
80 *> The number of columns in X11 and X21. 0 <= Q <= M and
81 *> M-Q <= min(P,M-P,Q).
82 *> \endverbatim
83 *>
84 *> \param[in,out] X11
85 *> \verbatim
86 *> X11 is COMPLEX array, dimension (LDX11,Q)
87 *> On entry, the top block of the matrix X to be reduced. On
88 *> exit, the columns of tril(X11) specify reflectors for P1 and
89 *> the rows of triu(X11,1) specify reflectors for Q1.
90 *> \endverbatim
91 *>
92 *> \param[in] LDX11
93 *> \verbatim
94 *> LDX11 is INTEGER
95 *> The leading dimension of X11. LDX11 >= P.
96 *> \endverbatim
97 *>
98 *> \param[in,out] X21
99 *> \verbatim
100 *> X21 is COMPLEX array, dimension (LDX21,Q)
101 *> On entry, the bottom block of the matrix X to be reduced. On
102 *> exit, the columns of tril(X21) specify reflectors for P2.
103 *> \endverbatim
104 *>
105 *> \param[in] LDX21
106 *> \verbatim
107 *> LDX21 is INTEGER
108 *> The leading dimension of X21. LDX21 >= M-P.
109 *> \endverbatim
110 *>
111 *> \param[out] THETA
112 *> \verbatim
113 *> THETA is REAL array, dimension (Q)
114 *> The entries of the bidiagonal blocks B11, B21 are defined by
115 *> THETA and PHI. See Further Details.
116 *> \endverbatim
117 *>
118 *> \param[out] PHI
119 *> \verbatim
120 *> PHI is REAL array, dimension (Q-1)
121 *> The entries of the bidiagonal blocks B11, B21 are defined by
122 *> THETA and PHI. See Further Details.
123 *> \endverbatim
124 *>
125 *> \param[out] TAUP1
126 *> \verbatim
127 *> TAUP1 is COMPLEX array, dimension (P)
128 *> The scalar factors of the elementary reflectors that define
129 *> P1.
130 *> \endverbatim
131 *>
132 *> \param[out] TAUP2
133 *> \verbatim
134 *> TAUP2 is COMPLEX array, dimension (M-P)
135 *> The scalar factors of the elementary reflectors that define
136 *> P2.
137 *> \endverbatim
138 *>
139 *> \param[out] TAUQ1
140 *> \verbatim
141 *> TAUQ1 is COMPLEX array, dimension (Q)
142 *> The scalar factors of the elementary reflectors that define
143 *> Q1.
144 *> \endverbatim
145 *>
146 *> \param[out] PHANTOM
147 *> \verbatim
148 *> PHANTOM is COMPLEX array, dimension (M)
149 *> The routine computes an M-by-1 column vector Y that is
150 *> orthogonal to the columns of [ X11; X21 ]. PHANTOM(1:P) and
151 *> PHANTOM(P+1:M) contain Householder vectors for Y(1:P) and
152 *> Y(P+1:M), respectively.
153 *> \endverbatim
154 *>
155 *> \param[out] WORK
156 *> \verbatim
157 *> WORK is COMPLEX array, dimension (LWORK)
158 *> \endverbatim
159 *>
160 *> \param[in] LWORK
161 *> \verbatim
162 *> LWORK is INTEGER
163 *> The dimension of the array WORK. LWORK >= M-Q.
164 *>
165 *> If LWORK = -1, then a workspace query is assumed; the routine
166 *> only calculates the optimal size of the WORK array, returns
167 *> this value as the first entry of the WORK array, and no error
168 *> message related to LWORK is issued by XERBLA.
169 *> \endverbatim
170 *>
171 *> \param[out] INFO
172 *> \verbatim
173 *> INFO is INTEGER
174 *> = 0: successful exit.
175 *> < 0: if INFO = -i, the i-th argument had an illegal value.
176 *> \endverbatim
177 *
178 * Authors:
179 * ========
180 *
181 *> \author Univ. of Tennessee
182 *> \author Univ. of California Berkeley
183 *> \author Univ. of Colorado Denver
184 *> \author NAG Ltd.
185 *
186 *> \date July 2012
187 *
188 *> \ingroup complexOTHERcomputational
189 *
190 *> \par Further Details:
191 * =====================
192 
193 *> \verbatim
194 *>
195 *> The upper-bidiagonal blocks B11, B21 are represented implicitly by
196 *> angles THETA(1), ..., THETA(Q) and PHI(1), ..., PHI(Q-1). Every entry
197 *> in each bidiagonal band is a product of a sine or cosine of a THETA
198 *> with a sine or cosine of a PHI. See [1] or CUNCSD for details.
199 *>
200 *> P1, P2, and Q1 are represented as products of elementary reflectors.
201 *> See CUNCSD2BY1 for details on generating P1, P2, and Q1 using CUNGQR
202 *> and CUNGLQ.
203 *> \endverbatim
204 *
205 *> \par References:
206 * ================
207 *>
208 *> [1] Brian D. Sutton. Computing the complete CS decomposition. Numer.
209 *> Algorithms, 50(1):33-65, 2009.
210 *>
211 * =====================================================================
212  SUBROUTINE cunbdb4( M, P, Q, X11, LDX11, X21, LDX21, THETA, PHI,
213  $ taup1, taup2, tauq1, phantom, work, lwork,
214  $ info )
215 *
216 * -- LAPACK computational routine (version 3.6.1) --
217 * -- LAPACK is a software package provided by Univ. of Tennessee, --
218 * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
219 * July 2012
220 *
221 * .. Scalar Arguments ..
222  INTEGER INFO, LWORK, M, P, Q, LDX11, LDX21
223 * ..
224 * .. Array Arguments ..
225  REAL PHI(*), THETA(*)
226  COMPLEX PHANTOM(*), TAUP1(*), TAUP2(*), TAUQ1(*),
227  $ work(*), x11(ldx11,*), x21(ldx21,*)
228 * ..
229 *
230 * ====================================================================
231 *
232 * .. Parameters ..
233  COMPLEX NEGONE, ONE, ZERO
234  parameter ( negone = (-1.0e0,0.0e0), one = (1.0e0,0.0e0),
235  $ zero = (0.0e0,0.0e0) )
236 * ..
237 * .. Local Scalars ..
238  REAL C, S
239  INTEGER CHILDINFO, I, ILARF, IORBDB5, J, LLARF,
240  $ lorbdb5, lworkmin, lworkopt
241  LOGICAL LQUERY
242 * ..
243 * .. External Subroutines ..
244  EXTERNAL clarf, clarfgp, cunbdb5, csrot, cscal, xerbla
245 * ..
246 * .. External Functions ..
247  REAL SCNRM2
248  EXTERNAL scnrm2
249 * ..
250 * .. Intrinsic Function ..
251  INTRINSIC atan2, cos, max, sin, sqrt
252 * ..
253 * .. Executable Statements ..
254 *
255 * Test input arguments
256 *
257  info = 0
258  lquery = lwork .EQ. -1
259 *
260  IF( m .LT. 0 ) THEN
261  info = -1
262  ELSE IF( p .LT. m-q .OR. m-p .LT. m-q ) THEN
263  info = -2
264  ELSE IF( q .LT. m-q .OR. q .GT. m ) THEN
265  info = -3
266  ELSE IF( ldx11 .LT. max( 1, p ) ) THEN
267  info = -5
268  ELSE IF( ldx21 .LT. max( 1, m-p ) ) THEN
269  info = -7
270  END IF
271 *
272 * Compute workspace
273 *
274  IF( info .EQ. 0 ) THEN
275  ilarf = 2
276  llarf = max( q-1, p-1, m-p-1 )
277  iorbdb5 = 2
278  lorbdb5 = q
279  lworkopt = ilarf + llarf - 1
280  lworkopt = max( lworkopt, iorbdb5 + lorbdb5 - 1 )
281  lworkmin = lworkopt
282  work(1) = lworkopt
283  IF( lwork .LT. lworkmin .AND. .NOT.lquery ) THEN
284  info = -14
285  END IF
286  END IF
287  IF( info .NE. 0 ) THEN
288  CALL xerbla( 'CUNBDB4', -info )
289  RETURN
290  ELSE IF( lquery ) THEN
291  RETURN
292  END IF
293 *
294 * Reduce columns 1, ..., M-Q of X11 and X21
295 *
296  DO i = 1, m-q
297 *
298  IF( i .EQ. 1 ) THEN
299  DO j = 1, m
300  phantom(j) = zero
301  END DO
302  CALL cunbdb5( p, m-p, q, phantom(1), 1, phantom(p+1), 1,
303  $ x11, ldx11, x21, ldx21, work(iorbdb5),
304  $ lorbdb5, childinfo )
305  CALL cscal( p, negone, phantom(1), 1 )
306  CALL clarfgp( p, phantom(1), phantom(2), 1, taup1(1) )
307  CALL clarfgp( m-p, phantom(p+1), phantom(p+2), 1, taup2(1) )
308  theta(i) = atan2( REAL( PHANTOM(1) ), REAL( PHANTOM(P+1) ) )
309  c = cos( theta(i) )
310  s = sin( theta(i) )
311  phantom(1) = one
312  phantom(p+1) = one
313  CALL clarf( 'L', p, q, phantom(1), 1, conjg(taup1(1)), x11,
314  $ ldx11, work(ilarf) )
315  CALL clarf( 'L', m-p, q, phantom(p+1), 1, conjg(taup2(1)),
316  $ x21, ldx21, work(ilarf) )
317  ELSE
318  CALL cunbdb5( p-i+1, m-p-i+1, q-i+1, x11(i,i-1), 1,
319  $ x21(i,i-1), 1, x11(i,i), ldx11, x21(i,i),
320  $ ldx21, work(iorbdb5), lorbdb5, childinfo )
321  CALL cscal( p-i+1, negone, x11(i,i-1), 1 )
322  CALL clarfgp( p-i+1, x11(i,i-1), x11(i+1,i-1), 1, taup1(i) )
323  CALL clarfgp( m-p-i+1, x21(i,i-1), x21(i+1,i-1), 1,
324  $ taup2(i) )
325  theta(i) = atan2( REAL( X11(I,I-1) ), REAL( X21(I,I-1) ) )
326  c = cos( theta(i) )
327  s = sin( theta(i) )
328  x11(i,i-1) = one
329  x21(i,i-1) = one
330  CALL clarf( 'L', p-i+1, q-i+1, x11(i,i-1), 1,
331  $ conjg(taup1(i)), x11(i,i), ldx11, work(ilarf) )
332  CALL clarf( 'L', m-p-i+1, q-i+1, x21(i,i-1), 1,
333  $ conjg(taup2(i)), x21(i,i), ldx21, work(ilarf) )
334  END IF
335 *
336  CALL csrot( q-i+1, x11(i,i), ldx11, x21(i,i), ldx21, s, -c )
337  CALL clacgv( q-i+1, x21(i,i), ldx21 )
338  CALL clarfgp( q-i+1, x21(i,i), x21(i,i+1), ldx21, tauq1(i) )
339  c = REAL( X21(I,I) )
340  x21(i,i) = one
341  CALL clarf( 'R', p-i, q-i+1, x21(i,i), ldx21, tauq1(i),
342  $ x11(i+1,i), ldx11, work(ilarf) )
343  CALL clarf( 'R', m-p-i, q-i+1, x21(i,i), ldx21, tauq1(i),
344  $ x21(i+1,i), ldx21, work(ilarf) )
345  CALL clacgv( q-i+1, x21(i,i), ldx21 )
346  IF( i .LT. m-q ) THEN
347  s = sqrt( scnrm2( p-i, x11(i+1,i), 1 )**2
348  $ + scnrm2( m-p-i, x21(i+1,i), 1 )**2 )
349  phi(i) = atan2( s, c )
350  END IF
351 *
352  END DO
353 *
354 * Reduce the bottom-right portion of X11 to [ I 0 ]
355 *
356  DO i = m - q + 1, p
357  CALL clacgv( q-i+1, x11(i,i), ldx11 )
358  CALL clarfgp( q-i+1, x11(i,i), x11(i,i+1), ldx11, tauq1(i) )
359  x11(i,i) = one
360  CALL clarf( 'R', p-i, q-i+1, x11(i,i), ldx11, tauq1(i),
361  $ x11(i+1,i), ldx11, work(ilarf) )
362  CALL clarf( 'R', q-p, q-i+1, x11(i,i), ldx11, tauq1(i),
363  $ x21(m-q+1,i), ldx21, work(ilarf) )
364  CALL clacgv( q-i+1, x11(i,i), ldx11 )
365  END DO
366 *
367 * Reduce the bottom-right portion of X21 to [ 0 I ]
368 *
369  DO i = p + 1, q
370  CALL clacgv( q-i+1, x21(m-q+i-p,i), ldx21 )
371  CALL clarfgp( q-i+1, x21(m-q+i-p,i), x21(m-q+i-p,i+1), ldx21,
372  $ tauq1(i) )
373  x21(m-q+i-p,i) = one
374  CALL clarf( 'R', q-i, q-i+1, x21(m-q+i-p,i), ldx21, tauq1(i),
375  $ x21(m-q+i-p+1,i), ldx21, work(ilarf) )
376  CALL clacgv( q-i+1, x21(m-q+i-p,i), ldx21 )
377  END DO
378 *
379  RETURN
380 *
381 * End of CUNBDB4
382 *
383  END
384 
subroutine cunbdb4(M, P, Q, X11, LDX11, X21, LDX21, THETA, PHI, TAUP1, TAUP2, TAUQ1, PHANTOM, WORK, LWORK, INFO)
CUNBDB4
Definition: cunbdb4.f:215
subroutine cunbdb5(M1, M2, N, X1, INCX1, X2, INCX2, Q1, LDQ1, Q2, LDQ2, WORK, LWORK, INFO)
CUNBDB5
Definition: cunbdb5.f:158
subroutine xerbla(SRNAME, INFO)
XERBLA
Definition: xerbla.f:62
subroutine cscal(N, CA, CX, INCX)
CSCAL
Definition: cscal.f:54
subroutine clarfgp(N, ALPHA, X, INCX, TAU)
CLARFGP generates an elementary reflector (Householder matrix) with non-negative beta.
Definition: clarfgp.f:106
subroutine clarf(SIDE, M, N, V, INCV, TAU, C, LDC, WORK)
CLARF applies an elementary reflector to a general rectangular matrix.
Definition: clarf.f:130
subroutine csrot(N, CX, INCX, CY, INCY, C, S)
CSROT
Definition: csrot.f:100
subroutine clacgv(N, X, INCX)
CLACGV conjugates a complex vector.
Definition: clacgv.f:76