LAPACK 3.12.1
LAPACK: Linear Algebra PACKage
All Classes Namespaces Files Functions Variables Typedefs Enumerations Enumerator Macros Modules Pages
dorbdb2.f
Go to the documentation of this file.
1*> \brief \b DORBDB2
2*
3* =========== DOCUMENTATION ===========
4*
5* Online html documentation available at
6* http://www.netlib.org/lapack/explore-html/
7*
8*> Download DORBDB2 + dependencies
9*> <a href="http://www.netlib.org/cgi-bin/netlibfiles.tgz?format=tgz&filename=/lapack/lapack_routine/dorbdb2.f">
10*> [TGZ]</a>
11*> <a href="http://www.netlib.org/cgi-bin/netlibfiles.zip?format=zip&filename=/lapack/lapack_routine/dorbdb2.f">
12*> [ZIP]</a>
13*> <a href="http://www.netlib.org/cgi-bin/netlibfiles.txt?format=txt&filename=/lapack/lapack_routine/dorbdb2.f">
14*> [TXT]</a>
15*
16* Definition:
17* ===========
18*
19* SUBROUTINE DORBDB2( M, P, Q, X11, LDX11, X21, LDX21, THETA, PHI,
20* TAUP1, TAUP2, TAUQ1, WORK, LWORK, INFO )
21*
22* .. Scalar Arguments ..
23* INTEGER INFO, LWORK, M, P, Q, LDX11, LDX21
24* ..
25* .. Array Arguments ..
26* DOUBLE PRECISION PHI(*), THETA(*)
27* DOUBLE PRECISION TAUP1(*), TAUP2(*), TAUQ1(*), WORK(*),
28* $ X11(LDX11,*), X21(LDX21,*)
29* ..
30*
31*
32*> \par Purpose:
33* =============
34*>
35*>\verbatim
36*>
37*> DORBDB2 simultaneously bidiagonalizes the blocks of a tall and skinny
38*> matrix X with orthonormal columns:
39*>
40*> [ B11 ]
41*> [ X11 ] [ P1 | ] [ 0 ]
42*> [-----] = [---------] [-----] Q1**T .
43*> [ X21 ] [ | P2 ] [ B21 ]
44*> [ 0 ]
45*>
46*> X11 is P-by-Q, and X21 is (M-P)-by-Q. P must be no larger than M-P,
47*> Q, or M-Q. Routines DORBDB1, DORBDB3, and DORBDB4 handle cases in
48*> which P is not the minimum dimension.
49*>
50*> The orthogonal matrices P1, P2, and Q1 are P-by-P, (M-P)-by-(M-P),
51*> and (M-Q)-by-(M-Q), respectively. They are represented implicitly by
52*> Householder vectors.
53*>
54*> B11 and B12 are P-by-P bidiagonal matrices represented implicitly by
55*> angles THETA, PHI.
56*>
57*>\endverbatim
58*
59* Arguments:
60* ==========
61*
62*> \param[in] M
63*> \verbatim
64*> M is INTEGER
65*> The number of rows X11 plus the number of rows in X21.
66*> \endverbatim
67*>
68*> \param[in] P
69*> \verbatim
70*> P is INTEGER
71*> The number of rows in X11. 0 <= P <= min(M-P,Q,M-Q).
72*> \endverbatim
73*>
74*> \param[in] Q
75*> \verbatim
76*> Q is INTEGER
77*> The number of columns in X11 and X21. 0 <= Q <= M.
78*> \endverbatim
79*>
80*> \param[in,out] X11
81*> \verbatim
82*> X11 is DOUBLE PRECISION array, dimension (LDX11,Q)
83*> On entry, the top block of the matrix X to be reduced. On
84*> exit, the columns of tril(X11) specify reflectors for P1 and
85*> the rows of triu(X11,1) specify reflectors for Q1.
86*> \endverbatim
87*>
88*> \param[in] LDX11
89*> \verbatim
90*> LDX11 is INTEGER
91*> The leading dimension of X11. LDX11 >= P.
92*> \endverbatim
93*>
94*> \param[in,out] X21
95*> \verbatim
96*> X21 is DOUBLE PRECISION array, dimension (LDX21,Q)
97*> On entry, the bottom block of the matrix X to be reduced. On
98*> exit, the columns of tril(X21) specify reflectors for P2.
99*> \endverbatim
100*>
101*> \param[in] LDX21
102*> \verbatim
103*> LDX21 is INTEGER
104*> The leading dimension of X21. LDX21 >= M-P.
105*> \endverbatim
106*>
107*> \param[out] THETA
108*> \verbatim
109*> THETA is DOUBLE PRECISION array, dimension (Q)
110*> The entries of the bidiagonal blocks B11, B21 are defined by
111*> THETA and PHI. See Further Details.
112*> \endverbatim
113*>
114*> \param[out] PHI
115*> \verbatim
116*> PHI is DOUBLE PRECISION array, dimension (Q-1)
117*> The entries of the bidiagonal blocks B11, B21 are defined by
118*> THETA and PHI. See Further Details.
119*> \endverbatim
120*>
121*> \param[out] TAUP1
122*> \verbatim
123*> TAUP1 is DOUBLE PRECISION array, dimension (P-1)
124*> The scalar factors of the elementary reflectors that define
125*> P1.
126*> \endverbatim
127*>
128*> \param[out] TAUP2
129*> \verbatim
130*> TAUP2 is DOUBLE PRECISION array, dimension (Q)
131*> The scalar factors of the elementary reflectors that define
132*> P2.
133*> \endverbatim
134*>
135*> \param[out] TAUQ1
136*> \verbatim
137*> TAUQ1 is DOUBLE PRECISION array, dimension (Q)
138*> The scalar factors of the elementary reflectors that define
139*> Q1.
140*> \endverbatim
141*>
142*> \param[out] WORK
143*> \verbatim
144*> WORK is DOUBLE PRECISION array, dimension (LWORK)
145*> \endverbatim
146*>
147*> \param[in] LWORK
148*> \verbatim
149*> LWORK is INTEGER
150*> The dimension of the array WORK. LWORK >= M-Q.
151*>
152*> If LWORK = -1, then a workspace query is assumed; the routine
153*> only calculates the optimal size of the WORK array, returns
154*> this value as the first entry of the WORK array, and no error
155*> message related to LWORK is issued by XERBLA.
156*> \endverbatim
157*>
158*> \param[out] INFO
159*> \verbatim
160*> INFO is INTEGER
161*> = 0: successful exit.
162*> < 0: if INFO = -i, the i-th argument had an illegal value.
163*> \endverbatim
164*>
165*
166* Authors:
167* ========
168*
169*> \author Univ. of Tennessee
170*> \author Univ. of California Berkeley
171*> \author Univ. of Colorado Denver
172*> \author NAG Ltd.
173*
174*> \ingroup unbdb2
175*
176*> \par Further Details:
177* =====================
178*>
179*> \verbatim
180*>
181*> The upper-bidiagonal blocks B11, B21 are represented implicitly by
182*> angles THETA(1), ..., THETA(Q) and PHI(1), ..., PHI(Q-1). Every entry
183*> in each bidiagonal band is a product of a sine or cosine of a THETA
184*> with a sine or cosine of a PHI. See [1] or DORCSD for details.
185*>
186*> P1, P2, and Q1 are represented as products of elementary reflectors.
187*> See DORCSD2BY1 for details on generating P1, P2, and Q1 using DORGQR
188*> and DORGLQ.
189*> \endverbatim
190*
191*> \par References:
192* ================
193*>
194*> [1] Brian D. Sutton. Computing the complete CS decomposition. Numer.
195*> Algorithms, 50(1):33-65, 2009.
196*>
197* =====================================================================
198 SUBROUTINE dorbdb2( M, P, Q, X11, LDX11, X21, LDX21, THETA,
199 $ PHI,
200 $ TAUP1, TAUP2, TAUQ1, WORK, LWORK, INFO )
201*
202* -- LAPACK computational routine --
203* -- LAPACK is a software package provided by Univ. of Tennessee, --
204* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
205*
206* .. Scalar Arguments ..
207 INTEGER INFO, LWORK, M, P, Q, LDX11, LDX21
208* ..
209* .. Array Arguments ..
210 DOUBLE PRECISION PHI(*), THETA(*)
211 DOUBLE PRECISION TAUP1(*), TAUP2(*), TAUQ1(*), WORK(*),
212 $ x11(ldx11,*), x21(ldx21,*)
213* ..
214*
215* ====================================================================
216*
217* .. Parameters ..
218 DOUBLE PRECISION NEGONE, ONE
219 PARAMETER ( NEGONE = -1.0d0, one = 1.0d0 )
220* ..
221* .. Local Scalars ..
222 DOUBLE PRECISION C, S
223 INTEGER CHILDINFO, I, ILARF, IORBDB5, LLARF, LORBDB5,
224 $ lworkmin, lworkopt
225 LOGICAL LQUERY
226* ..
227* .. External Subroutines ..
228 EXTERNAL dlarf1f, dlarfgp, dorbdb5, drot, dscal,
229 $ xerbla
230* ..
231* .. External Functions ..
232 DOUBLE PRECISION DNRM2
233 EXTERNAL DNRM2
234* ..
235* .. Intrinsic Function ..
236 INTRINSIC atan2, cos, max, sin, sqrt
237* ..
238* .. Executable Statements ..
239*
240* Test input arguments
241*
242 info = 0
243 lquery = lwork .EQ. -1
244*
245 IF( m .LT. 0 ) THEN
246 info = -1
247 ELSE IF( p .LT. 0 .OR. p .GT. m-p ) THEN
248 info = -2
249 ELSE IF( q .LT. 0 .OR. q .LT. p .OR. m-q .LT. p ) THEN
250 info = -3
251 ELSE IF( ldx11 .LT. max( 1, p ) ) THEN
252 info = -5
253 ELSE IF( ldx21 .LT. max( 1, m-p ) ) THEN
254 info = -7
255 END IF
256*
257* Compute workspace
258*
259 IF( info .EQ. 0 ) THEN
260 ilarf = 2
261 llarf = max( p-1, m-p, q-1 )
262 iorbdb5 = 2
263 lorbdb5 = q-1
264 lworkopt = max( ilarf+llarf-1, iorbdb5+lorbdb5-1 )
265 lworkmin = lworkopt
266 work(1) = lworkopt
267 IF( lwork .LT. lworkmin .AND. .NOT.lquery ) THEN
268 info = -14
269 END IF
270 END IF
271 IF( info .NE. 0 ) THEN
272 CALL xerbla( 'DORBDB2', -info )
273 RETURN
274 ELSE IF( lquery ) THEN
275 RETURN
276 END IF
277*
278* Reduce rows 1, ..., P of X11 and X21
279*
280 DO i = 1, p
281*
282 IF( i .GT. 1 ) THEN
283 CALL drot( q-i+1, x11(i,i), ldx11, x21(i-1,i), ldx21, c,
284 $ s )
285 END IF
286 CALL dlarfgp( q-i+1, x11(i,i), x11(i,i+1), ldx11, tauq1(i) )
287 c = x11(i,i)
288 CALL dlarf1f( 'R', p-i, q-i+1, x11(i,i), ldx11, tauq1(i),
289 $ x11(i+1,i), ldx11, work(ilarf) )
290 CALL dlarf1f( 'R', m-p-i+1, q-i+1, x11(i,i), ldx11,
291 $ tauq1(i), x21(i,i), ldx21, work(ilarf) )
292 s = sqrt( dnrm2( p-i, x11(i+1,i), 1 )**2
293 $ + dnrm2( m-p-i+1, x21(i,i), 1 )**2 )
294 theta(i) = atan2( s, c )
295*
296 CALL dorbdb5( p-i, m-p-i+1, q-i, x11(i+1,i), 1, x21(i,i), 1,
297 $ x11(i+1,i+1), ldx11, x21(i,i+1), ldx21,
298 $ work(iorbdb5), lorbdb5, childinfo )
299 CALL dscal( p-i, negone, x11(i+1,i), 1 )
300 CALL dlarfgp( m-p-i+1, x21(i,i), x21(i+1,i), 1, taup2(i) )
301 IF( i .LT. p ) THEN
302 CALL dlarfgp( p-i, x11(i+1,i), x11(i+2,i), 1, taup1(i) )
303 phi(i) = atan2( x11(i+1,i), x21(i,i) )
304 c = cos( phi(i) )
305 s = sin( phi(i) )
306 CALL dlarf1f( 'L', p-i, q-i, x11(i+1,i), 1, taup1(i),
307 $ x11(i+1,i+1), ldx11, work(ilarf) )
308 END IF
309 CALL dlarf1f( 'L', m-p-i+1, q-i, x21(i,i), 1, taup2(i),
310 $ x21(i,i+1), ldx21, work(ilarf) )
311*
312 END DO
313*
314* Reduce the bottom-right portion of X21 to the identity matrix
315*
316 DO i = p + 1, q
317 CALL dlarfgp( m-p-i+1, x21(i,i), x21(i+1,i), 1, taup2(i) )
318 CALL dlarf1f( 'L', m-p-i+1, q-i, x21(i,i), 1, taup2(i),
319 $ x21(i,i+1), ldx21, work(ilarf) )
320 END DO
321*
322 RETURN
323*
324* End of DORBDB2
325*
326 END
327
subroutine xerbla(srname, info)
Definition cblat2.f:3285
subroutine dlarf1f(side, m, n, v, incv, tau, c, ldc, work)
DLARF1F applies an elementary reflector to a general rectangular
Definition dlarf1f.f:157
subroutine dlarfgp(n, alpha, x, incx, tau)
DLARFGP generates an elementary reflector (Householder matrix) with non-negative beta.
Definition dlarfgp.f:102
subroutine drot(n, dx, incx, dy, incy, c, s)
DROT
Definition drot.f:92
subroutine dscal(n, da, dx, incx)
DSCAL
Definition dscal.f:79
subroutine dorbdb2(m, p, q, x11, ldx11, x21, ldx21, theta, phi, taup1, taup2, tauq1, work, lwork, info)
DORBDB2
Definition dorbdb2.f:201
subroutine dorbdb5(m1, m2, n, x1, incx1, x2, incx2, q1, ldq1, q2, ldq2, work, lwork, info)
DORBDB5
Definition dorbdb5.f:155