LAPACK 3.12.1
LAPACK: Linear Algebra PACKage
Loading...
Searching...
No Matches

◆ slauu2()

subroutine slauu2 ( character uplo,
integer n,
real, dimension( lda, * ) a,
integer lda,
integer info )

SLAUU2 computes the product UUH or LHL, where U and L are upper or lower triangular matrices (unblocked algorithm).

Download SLAUU2 + dependencies [TGZ] [ZIP] [TXT]

Purpose:
!>
!> SLAUU2 computes the product U * U**T or L**T * L, where the triangular
!> factor U or L is stored in the upper or lower triangular part of
!> the array A.
!>
!> If UPLO = 'U' or 'u' then the upper triangle of the result is stored,
!> overwriting the factor U in A.
!> If UPLO = 'L' or 'l' then the lower triangle of the result is stored,
!> overwriting the factor L in A.
!>
!> This is the unblocked form of the algorithm, calling Level 2 BLAS.
!> 
Parameters
[in]UPLO
!>          UPLO is CHARACTER*1
!>          Specifies whether the triangular factor stored in the array A
!>          is upper or lower triangular:
!>          = 'U':  Upper triangular
!>          = 'L':  Lower triangular
!> 
[in]N
!>          N is INTEGER
!>          The order of the triangular factor U or L.  N >= 0.
!> 
[in,out]A
!>          A is REAL array, dimension (LDA,N)
!>          On entry, the triangular factor U or L.
!>          On exit, if UPLO = 'U', the upper triangle of A is
!>          overwritten with the upper triangle of the product U * U**T;
!>          if UPLO = 'L', the lower triangle of A is overwritten with
!>          the lower triangle of the product L**T * L.
!> 
[in]LDA
!>          LDA is INTEGER
!>          The leading dimension of the array A.  LDA >= max(1,N).
!> 
[out]INFO
!>          INFO is INTEGER
!>          = 0: successful exit
!>          < 0: if INFO = -k, the k-th argument had an illegal value
!> 
Author
Univ. of Tennessee
Univ. of California Berkeley
Univ. of Colorado Denver
NAG Ltd.

Definition at line 99 of file slauu2.f.

100*
101* -- LAPACK auxiliary routine --
102* -- LAPACK is a software package provided by Univ. of Tennessee, --
103* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
104*
105* .. Scalar Arguments ..
106 CHARACTER UPLO
107 INTEGER INFO, LDA, N
108* ..
109* .. Array Arguments ..
110 REAL A( LDA, * )
111* ..
112*
113* =====================================================================
114*
115* .. Parameters ..
116 REAL ONE
117 parameter( one = 1.0e+0 )
118* ..
119* .. Local Scalars ..
120 LOGICAL UPPER
121 INTEGER I
122 REAL AII
123* ..
124* .. External Functions ..
125 LOGICAL LSAME
126 REAL SDOT
127 EXTERNAL lsame, sdot
128* ..
129* .. External Subroutines ..
130 EXTERNAL sgemv, sscal, xerbla
131* ..
132* .. Intrinsic Functions ..
133 INTRINSIC max
134* ..
135* .. Executable Statements ..
136*
137* Test the input parameters.
138*
139 info = 0
140 upper = lsame( uplo, 'U' )
141 IF( .NOT.upper .AND. .NOT.lsame( uplo, 'L' ) ) THEN
142 info = -1
143 ELSE IF( n.LT.0 ) THEN
144 info = -2
145 ELSE IF( lda.LT.max( 1, n ) ) THEN
146 info = -4
147 END IF
148 IF( info.NE.0 ) THEN
149 CALL xerbla( 'SLAUU2', -info )
150 RETURN
151 END IF
152*
153* Quick return if possible
154*
155 IF( n.EQ.0 )
156 $ RETURN
157*
158 IF( upper ) THEN
159*
160* Compute the product U * U**T.
161*
162 DO 10 i = 1, n
163 aii = a( i, i )
164 IF( i.LT.n ) THEN
165 a( i, i ) = sdot( n-i+1, a( i, i ), lda, a( i, i ),
166 $ lda )
167 CALL sgemv( 'No transpose', i-1, n-i, one, a( 1,
168 $ i+1 ),
169 $ lda, a( i, i+1 ), lda, aii, a( 1, i ), 1 )
170 ELSE
171 CALL sscal( i, aii, a( 1, i ), 1 )
172 END IF
173 10 CONTINUE
174*
175 ELSE
176*
177* Compute the product L**T * L.
178*
179 DO 20 i = 1, n
180 aii = a( i, i )
181 IF( i.LT.n ) THEN
182 a( i, i ) = sdot( n-i+1, a( i, i ), 1, a( i, i ), 1 )
183 CALL sgemv( 'Transpose', n-i, i-1, one, a( i+1, 1 ),
184 $ lda,
185 $ a( i+1, i ), 1, aii, a( i, 1 ), lda )
186 ELSE
187 CALL sscal( i, aii, a( i, 1 ), lda )
188 END IF
189 20 CONTINUE
190 END IF
191*
192 RETURN
193*
194* End of SLAUU2
195*
subroutine xerbla(srname, info)
Definition cblat2.f:3285
real function sdot(n, sx, incx, sy, incy)
SDOT
Definition sdot.f:82
subroutine sgemv(trans, m, n, alpha, a, lda, x, incx, beta, y, incy)
SGEMV
Definition sgemv.f:158
logical function lsame(ca, cb)
LSAME
Definition lsame.f:48
subroutine sscal(n, sa, sx, incx)
SSCAL
Definition sscal.f:79
Here is the call graph for this function:
Here is the caller graph for this function: