189 SUBROUTINE ctpqrt( M, N, L, NB, A, LDA, B, LDB, T, LDT, WORK,
198 INTEGER info, lda, ldb, ldt, n, m, l, nb
201 COMPLEX a( lda, * ),
b( ldb, * ), t( ldt, * ), work( * )
208 INTEGER i, ib, lb, mb, iinfo
220 ELSE IF( n.LT.0 )
THEN
222 ELSE IF( l.LT.0 .OR. (l.GT.min(m,n) .AND. min(m,n).GE.0))
THEN
224 ELSE IF( nb.LT.1 .OR. (nb.GT.n .AND. n.GT.0))
THEN
226 ELSE IF( lda.LT.max( 1, n ) )
THEN
228 ELSE IF( ldb.LT.max( 1, m ) )
THEN
230 ELSE IF( ldt.LT.nb )
THEN
234 CALL
xerbla(
'CTPQRT', -info )
240 IF( m.EQ.0 .OR. n.EQ.0 )
RETURN
246 ib = min( n-i+1, nb )
247 mb = min( m-l+i+ib-1, m )
254 CALL
ctpqrt2( mb, ib, lb, a(i,i), lda,
b( 1, i ), ldb,
255 $ t(1, i ), ldt, iinfo )
260 CALL
ctprfb(
'L',
'C',
'F',
'C', mb, n-i-ib+1, ib, lb,
261 $
b( 1, i ), ldb, t( 1, i ), ldt,
262 $ a( i, i+ib ), lda,
b( 1, i+ib ), ldb,
subroutine xerbla(SRNAME, INFO)
XERBLA
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real b(3) integer i
subroutine ctpqrt(M, N, L, NB, A, LDA, B, LDB, T, LDT, WORK, INFO)
CTPQRT
subroutine ctprfb(SIDE, TRANS, DIRECT, STOREV, M, N, K, L, V, LDV, T, LDT, A, LDA, B, LDB, WORK, LDWORK)
CTPRFB applies a real or complex "triangular-pentagonal" blocked reflector to a real or complex matri...
subroutine ctpqrt2(M, N, L, A, LDA, B, LDB, T, LDT, INFO)
CTPQRT2 computes a QR factorization of a real or complex "triangular-pentagonal" matrix, which is composed of a triangular block and a pentagonal block, using the compact WY representation for Q.