1DGELSX(1) LAPACK driver routine (version 3.2) DGELSX(1)
2
3
4
6 DGELSX - routine i deprecated and has been replaced by routine DGELSY
7
9 SUBROUTINE DGELSX( M, N, NRHS, A, LDA, B, LDB, JPVT, RCOND, RANK, WORK,
10 INFO )
11
12 INTEGER INFO, LDA, LDB, M, N, NRHS, RANK
13
14 DOUBLE PRECISION RCOND
15
16 INTEGER JPVT( * )
17
18 DOUBLE PRECISION A( LDA, * ), B( LDB, * ), WORK( * )
19
21 This routine is deprecated and has been replaced by routine DGELSY.
22 DGELSX computes the minimum-norm solution to a real linear least
23 squares problem:
24 minimize || A * X - B ||
25 using a complete orthogonal factorization of A. A is an M-by-N matrix
26 which may be rank-deficient.
27 Several right hand side vectors b and solution vectors x can be handled
28 in a single call; they are stored as the columns of the M-by-NRHS right
29 hand side matrix B and the N-by-NRHS solution matrix X.
30 The routine first computes a QR factorization with column pivoting:
31 A * P = Q * [ R11 R12 ]
32 [ 0 R22 ]
33 with R11 defined as the largest leading submatrix whose estimated con‐
34 dition number is less than 1/RCOND. The order of R11, RANK, is the
35 effective rank of A.
36 Then, R22 is considered to be negligible, and R12 is annihilated by
37 orthogonal transformations from the right, arriving at the complete
38 orthogonal factorization:
39 A * P = Q * [ T11 0 ] * Z
40 [ 0 0 ]
41 The minimum-norm solution is then
42 X = P * Z' [ inv(T11)*Q1'*B ]
43 [ 0 ]
44 where Q1 consists of the first RANK columns of Q.
45
47 M (input) INTEGER
48 The number of rows of the matrix A. M >= 0.
49
50 N (input) INTEGER
51 The number of columns of the matrix A. N >= 0.
52
53 NRHS (input) INTEGER
54 The number of right hand sides, i.e., the number of columns of
55 matrices B and X. NRHS >= 0.
56
57 A (input/output) DOUBLE PRECISION array, dimension (LDA,N)
58 On entry, the M-by-N matrix A. On exit, A has been overwritten
59 by details of its complete orthogonal factorization.
60
61 LDA (input) INTEGER
62 The leading dimension of the array A. LDA >= max(1,M).
63
64 B (input/output) DOUBLE PRECISION array, dimension (LDB,NRHS)
65 On entry, the M-by-NRHS right hand side matrix B. On exit, the
66 N-by-NRHS solution matrix X. If m >= n and RANK = n, the
67 residual sum-of-squares for the solution in the i-th column is
68 given by the sum of squares of elements N+1:M in that column.
69
70 LDB (input) INTEGER
71 The leading dimension of the array B. LDB >= max(1,M,N).
72
73 JPVT (input/output) INTEGER array, dimension (N)
74 On entry, if JPVT(i) .ne. 0, the i-th column of A is an initial
75 column, otherwise it is a free column. Before the QR factor‐
76 ization of A, all initial columns are permuted to the leading
77 positions; only the remaining free columns are moved as a
78 result of column pivoting during the factorization. On exit,
79 if JPVT(i) = k, then the i-th column of A*P was the k-th column
80 of A.
81
82 RCOND (input) DOUBLE PRECISION
83 RCOND is used to determine the effective rank of A, which is
84 defined as the order of the largest leading triangular subma‐
85 trix R11 in the QR factorization with pivoting of A, whose
86 estimated condition number < 1/RCOND.
87
88 RANK (output) INTEGER
89 The effective rank of A, i.e., the order of the submatrix R11.
90 This is the same as the order of the submatrix T11 in the com‐
91 plete orthogonal factorization of A.
92
93 WORK (workspace) DOUBLE PRECISION array, dimension
94 (max( min(M,N)+3*N, 2*min(M,N)+NRHS )),
95
96 INFO (output) INTEGER
97 = 0: successful exit
98 < 0: if INFO = -i, the i-th argument had an illegal value
99
100
101
102 LAPACK driver routine (version 3.N2o)vember 2008 DGELSX(1)