Merge remote-tracking branch 'origin/release-v4.6.1'
[WRF.git] / var / external / lapack / dorgqr.inc
blobc8b7f00aa3d21d621a1ddff31abfa216ae8841fb
1       SUBROUTINE DORGQR( M, N, K, A, LDA, TAU, WORK, LWORK, INFO )
3 !  -- LAPACK routine (version 3.1) --
4 !     Univ. of Tennessee, Univ. of California Berkeley and NAG Ltd..
5 !     November 2006
7 !     .. Scalar Arguments ..
8       INTEGER            INFO, K, LDA, LWORK, M, N
9 !     ..
10 !     .. Array Arguments ..
11       DOUBLE PRECISION   A( LDA, * ), TAU( * ), WORK( * )
12 !     ..
14 !  Purpose
15 !  =======
17 !  DORGQR generates an M-by-N real matrix Q with orthonormal columns,
18 !  which is defined as the first N columns of a product of K elementary
19 !  reflectors of order M
21 !        Q  =  H(1) H(2) . . . H(k)
23 !  as returned by DGEQRF.
25 !  Arguments
26 !  =========
28 !  M       (input) INTEGER
29 !          The number of rows of the matrix Q. M >= 0.
31 !  N       (input) INTEGER
32 !          The number of columns of the matrix Q. M >= N >= 0.
34 !  K       (input) INTEGER
35 !          The number of elementary reflectors whose product defines the
36 !          matrix Q. N >= K >= 0.
38 !  A       (input/output) DOUBLE PRECISION array, dimension (LDA,N)
39 !          On entry, the i-th column must contain the vector which
40 !          defines the elementary reflector H(i), for i = 1,2,...,k, as
41 !          returned by DGEQRF in the first k columns of its array
42 !          argument A.
43 !          On exit, the M-by-N matrix Q.
45 !  LDA     (input) INTEGER
46 !          The first dimension of the array A. LDA >= max(1,M).
48 !  TAU     (input) DOUBLE PRECISION array, dimension (K)
49 !          TAU(i) must contain the scalar factor of the elementary
50 !          reflector H(i), as returned by DGEQRF.
52 !  WORK    (workspace/output) DOUBLE PRECISION array, dimension (MAX(1,LWORK))
53 !          On exit, if INFO = 0, WORK(1) returns the optimal LWORK.
55 !  LWORK   (input) INTEGER
56 !          The dimension of the array WORK. LWORK >= max(1,N).
57 !          For optimum performance LWORK >= N*NB, where NB is the
58 !          optimal blocksize.
60 !          If LWORK = -1, then a workspace query is assumed; the routine
61 !          only calculates the optimal size of the WORK array, returns
62 !          this value as the first entry of the WORK array, and no error
63 !          message related to LWORK is issued by XERBLA.
65 !  INFO    (output) INTEGER
66 !          = 0:  successful exit
67 !          < 0:  if INFO = -i, the i-th argument has an illegal value
69 !  =====================================================================
71 !     .. Parameters ..
72       DOUBLE PRECISION   ZERO
73       PARAMETER          ( ZERO = 0.0D+0 )
74 !     ..
75 !     .. Local Scalars ..
76       LOGICAL            LQUERY
77       INTEGER            I, IB, IINFO, IWS, J, KI, KK, L, LDWORK, &
78                          LWKOPT, NB, NBMIN, NX
79 !     ..
80 !     .. External Subroutines ..
81 !     EXTERNAL           DLARFB, DLARFT, DORG2R, XERBLA
82 !     ..
83 !     .. Intrinsic Functions ..
84       INTRINSIC          MAX, MIN
85 !     ..
86 !     .. External Functions ..
87 !     INTEGER            ILAENV
88 !     EXTERNAL           ILAENV
89 !     ..
90 !     .. Executable Statements ..
92 !     Test the input arguments
94       INFO = 0
95       NB = ILAENV( 1, 'DORGQR', ' ', M, N, K, -1 )
96       LWKOPT = MAX( 1, N )*NB
97       WORK( 1 ) = LWKOPT
98       LQUERY = ( LWORK.EQ.-1 )
99       IF( M.LT.0 ) THEN
100          INFO = -1
101       ELSE IF( N.LT.0 .OR. N.GT.M ) THEN
102          INFO = -2
103       ELSE IF( K.LT.0 .OR. K.GT.N ) THEN
104          INFO = -3
105       ELSE IF( LDA.LT.MAX( 1, M ) ) THEN
106          INFO = -5
107       ELSE IF( LWORK.LT.MAX( 1, N ) .AND. .NOT.LQUERY ) THEN
108          INFO = -8
109       END IF
110       IF( INFO.NE.0 ) THEN
111          CALL XERBLA( 'DORGQR', -INFO )
112          RETURN
113       ELSE IF( LQUERY ) THEN
114          RETURN
115       END IF
117 !     Quick return if possible
119       IF( N.LE.0 ) THEN
120          WORK( 1 ) = 1
121          RETURN
122       END IF
124       NBMIN = 2
125       NX = 0
126       IWS = N
127       IF( NB.GT.1 .AND. NB.LT.K ) THEN
129 !        Determine when to cross over from blocked to unblocked code.
131          NX = MAX( 0, ILAENV( 3, 'DORGQR', ' ', M, N, K, -1 ) )
132          IF( NX.LT.K ) THEN
134 !           Determine if workspace is large enough for blocked code.
136             LDWORK = N
137             IWS = LDWORK*NB
138             IF( LWORK.LT.IWS ) THEN
140 !              Not enough workspace to use optimal NB:  reduce NB and
141 !              determine the minimum value of NB.
143                NB = LWORK / LDWORK
144                NBMIN = MAX( 2, ILAENV( 2, 'DORGQR', ' ', M, N, K, -1 ) )
145             END IF
146          END IF
147       END IF
149       IF( NB.GE.NBMIN .AND. NB.LT.K .AND. NX.LT.K ) THEN
151 !        Use blocked code after the last block.
152 !        The first kk columns are handled by the block method.
154          KI = ( ( K-NX-1 ) / NB )*NB
155          KK = MIN( K, KI+NB )
157 !        Set A(1:kk,kk+1:n) to zero.
159          DO 20 J = KK + 1, N
160             DO 10 I = 1, KK
161                A( I, J ) = ZERO
162    10       CONTINUE
163    20    CONTINUE
164       ELSE
165          KK = 0
166       END IF
168 !     Use unblocked code for the last or only block.
170       IF( KK.LT.N ) &
171          CALL DORG2R( M-KK, N-KK, K-KK, A( KK+1, KK+1 ), LDA, &
172                       TAU( KK+1 ), WORK, IINFO )
174       IF( KK.GT.0 ) THEN
176 !        Use blocked code
178          DO 50 I = KI + 1, 1, -NB
179             IB = MIN( NB, K-I+1 )
180             IF( I+IB.LE.N ) THEN
182 !              Form the triangular factor of the block reflector
183 !              H = H(i) H(i+1) . . . H(i+ib-1)
185                CALL DLARFT( 'Forward', 'Columnwise', M-I+1, IB, &
186                             A( I, I ), LDA, TAU( I ), WORK, LDWORK )
188 !              Apply H to A(i:m,i+ib:n) from the left
190                CALL DLARFB( 'Left', 'No transpose', 'Forward', &
191                             'Columnwise', M-I+1, N-I-IB+1, IB, &
192                             A( I, I ), LDA, WORK, LDWORK, A( I, I+IB ), &
193                             LDA, WORK( IB+1 ), LDWORK )
194             END IF
196 !           Apply H to rows i:m of current block
198             CALL DORG2R( M-I+1, IB, IB, A( I, I ), LDA, TAU( I ), WORK, &
199                          IINFO )
201 !           Set rows 1:i-1 of current block to zero
203             DO 40 J = I, I + IB - 1
204                DO 30 L = 1, I - 1
205                   A( L, J ) = ZERO
206    30          CONTINUE
207    40       CONTINUE
208    50    CONTINUE
209       END IF
211       WORK( 1 ) = IWS
212       RETURN
214 !     End of DORGQR
216       END SUBROUTINE DORGQR