1DORMR2(1)                LAPACK routine (version 3.2)                DORMR2(1)
2
3
4

NAME

6       DORMR2  -  overwrites  the general real m by n matrix C with   Q * C if
7       SIDE = 'L' and TRANS = 'N', or   Q'* C if SIDE = 'L' and TRANS  =  'T',
8       or   C * Q if SIDE = 'R' and TRANS = 'N', or   C * Q' if SIDE = 'R' and
9       TRANS = 'T',
10

SYNOPSIS

12       SUBROUTINE DORMR2( SIDE, TRANS, M, N, K, A, LDA,  TAU,  C,  LDC,  WORK,
13                          INFO )
14
15           CHARACTER      SIDE, TRANS
16
17           INTEGER        INFO, K, LDA, LDC, M, N
18
19           DOUBLE         PRECISION  A( LDA, * ), C( LDC, * ), TAU( * ), WORK(
20                          * )
21

PURPOSE

23       DORMR2 overwrites the general real m by n matrix C with where  Q  is  a
24       real  orthogonal  matrix defined as the product of k elementary reflec‐
25       tors
26             Q = H(1) H(2) . . . H(k)
27       as returned by DGERQF. Q is of order m if SIDE = 'L' and of order n  if
28       SIDE = 'R'.
29

ARGUMENTS

31       SIDE    (input) CHARACTER*1
32               = 'L': apply Q or Q' from the Left
33               = 'R': apply Q or Q' from the Right
34
35       TRANS   (input) CHARACTER*1
36               = 'N': apply Q  (No transpose)
37               = 'T': apply Q' (Transpose)
38
39       M       (input) INTEGER
40               The number of rows of the matrix C. M >= 0.
41
42       N       (input) INTEGER
43               The number of columns of the matrix C. N >= 0.
44
45       K       (input) INTEGER
46               The  number  of elementary reflectors whose product defines the
47               matrix Q.  If SIDE = 'L', M >= K >= 0; if SIDE = 'R', N >= K >=
48               0.
49
50       A       (input) DOUBLE PRECISION array, dimension
51               (LDA,M)  if SIDE = 'L', (LDA,N) if SIDE = 'R' The i-th row must
52               contain the vector which defines the elementary reflector H(i),
53               for  i = 1,2,...,k, as returned by DGERQF in the last k rows of
54               its array argument  A.   A  is  modified  by  the  routine  but
55               restored on exit.
56
57       LDA     (input) INTEGER
58               The leading dimension of the array A. LDA >= max(1,K).
59
60       TAU     (input) DOUBLE PRECISION array, dimension (K)
61               TAU(i) must contain the scalar factor of the elementary reflec‐
62               tor H(i), as returned by DGERQF.
63
64       C       (input/output) DOUBLE PRECISION array, dimension (LDC,N)
65               On entry, the m by n matrix C.  On exit, C  is  overwritten  by
66               Q*C or Q'*C or C*Q' or C*Q.
67
68       LDC     (input) INTEGER
69               The leading dimension of the array C. LDC >= max(1,M).
70
71       WORK    (workspace) DOUBLE PRECISION array, dimension
72               (N) if SIDE = 'L', (M) if SIDE = 'R'
73
74       INFO    (output) INTEGER
75               = 0: successful exit
76               < 0: if INFO = -i, the i-th argument had an illegal value
77
78
79
80 LAPACK routine (version 3.2)    November 2008                       DORMR2(1)
Impressum