Skip to content

Commit

Permalink
Fix typos and sytrd boundary workspace (Reference-LAPACK PR 1030)
Browse files Browse the repository at this point in the history
  • Loading branch information
martin-frbg authored Aug 5, 2024
1 parent 14a8a9a commit bce48d4
Show file tree
Hide file tree
Showing 7 changed files with 27 additions and 20 deletions.
8 changes: 5 additions & 3 deletions lapack-netlib/SRC/cgehrd.f
Original file line number Diff line number Diff line change
Expand Up @@ -163,7 +163,8 @@
*> \endverbatim
*>
* =====================================================================
SUBROUTINE CGEHRD( N, ILO, IHI, A, LDA, TAU, WORK, LWORK, INFO )
SUBROUTINE CGEHRD( N, ILO, IHI, A, LDA, TAU, WORK, LWORK,
$ INFO )
*
* -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, --
Expand Down Expand Up @@ -193,7 +194,8 @@ SUBROUTINE CGEHRD( N, ILO, IHI, A, LDA, TAU, WORK, LWORK, INFO )
COMPLEX EI
* ..
* .. External Subroutines ..
EXTERNAL CAXPY, CGEHD2, CGEMM, CLAHR2, CLARFB, CTRMM,
EXTERNAL CAXPY, CGEHD2, CGEMM, CLAHR2, CLARFB,
$ CTRMM,
$ XERBLA
* ..
* .. Intrinsic Functions ..
Expand Down Expand Up @@ -230,7 +232,7 @@ SUBROUTINE CGEHRD( N, ILO, IHI, A, LDA, TAU, WORK, LWORK, INFO )
IF( NH.LE.1 ) THEN
LWKOPT = 1
ELSE
NB = MIN( NBMAX, ILAENV( 1, 'DGEHRD', ' ', N, ILO, IHI,
NB = MIN( NBMAX, ILAENV( 1, 'CGEHRD', ' ', N, ILO, IHI,
$ -1 ) )
LWKOPT = N*NB + TSIZE
END IF
Expand Down
14 changes: 8 additions & 6 deletions lapack-netlib/SRC/chetrd.f
Original file line number Diff line number Diff line change
Expand Up @@ -139,7 +139,7 @@
*> \author Univ. of Colorado Denver
*> \author NAG Ltd.
*
*> \ingroup complexHEcomputational
*> \ingroup hetrd
*
*> \par Further Details:
* =====================
Expand Down Expand Up @@ -188,7 +188,8 @@
*> \endverbatim
*>
* =====================================================================
SUBROUTINE CHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
SUBROUTINE CHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK,
$ INFO )
*
* -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, --
Expand Down Expand Up @@ -225,7 +226,8 @@ SUBROUTINE CHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
* .. External Functions ..
LOGICAL LSAME
INTEGER ILAENV
EXTERNAL LSAME, ILAENV
REAL SROUNDUP_LWORK
EXTERNAL LSAME, ILAENV, SROUNDUP_LWORK
* ..
* .. Executable Statements ..
*
Expand All @@ -249,8 +251,8 @@ SUBROUTINE CHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
* Determine the block size.
*
NB = ILAENV( 1, 'CHETRD', UPLO, N, -1, -1, -1 )
LWKOPT = N*NB
WORK( 1 ) = LWKOPT
LWKOPT = MAX( 1, N*NB )
WORK( 1 ) = SROUNDUP_LWORK(LWKOPT)
END IF
*
IF( INFO.NE.0 ) THEN
Expand Down Expand Up @@ -367,7 +369,7 @@ SUBROUTINE CHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
$ TAU( I ), IINFO )
END IF
*
WORK( 1 ) = LWKOPT
WORK( 1 ) = SROUNDUP_LWORK(LWKOPT)
RETURN
*
* End of CHETRD
Expand Down
4 changes: 2 additions & 2 deletions lapack-netlib/SRC/sgelqt.f
Original file line number Diff line number Diff line change
Expand Up @@ -18,7 +18,7 @@
*>
*> \verbatim
*>
*> DGELQT computes a blocked LQ factorization of a real M-by-N matrix A
*> SGELQT computes a blocked LQ factorization of a real M-by-N matrix A
*> using the compact WY representation of Q.
*> \endverbatim
*
Expand Down Expand Up @@ -93,7 +93,7 @@
*> \author Univ. of Colorado Denver
*> \author NAG Ltd.
*
*> \ingroup doubleGEcomputational
*> \ingroup gelqt
*
*> \par Further Details:
* =====================
Expand Down
2 changes: 1 addition & 1 deletion lapack-netlib/SRC/sgemlq.f
Original file line number Diff line number Diff line change
Expand Up @@ -74,7 +74,7 @@
*> A is REAL array, dimension
*> (LDA,M) if SIDE = 'L',
*> (LDA,N) if SIDE = 'R'
*> Part of the data structure to represent Q as returned by DGELQ.
*> Part of the data structure to represent Q as returned by SGELQ.
*> \endverbatim
*>
*> \param[in] LDA
Expand Down
4 changes: 2 additions & 2 deletions lapack-netlib/SRC/sgemlqt.f
Original file line number Diff line number Diff line change
Expand Up @@ -20,7 +20,7 @@
*>
*> \verbatim
*>
*> DGEMLQT overwrites the general real M-by-N matrix C with
*> SGEMLQT overwrites the general real M-by-N matrix C with
*>
*> SIDE = 'L' SIDE = 'R'
*> TRANS = 'N': Q C C Q
Expand Down Expand Up @@ -145,7 +145,7 @@
*> \author Univ. of Colorado Denver
*> \author NAG Ltd.
*
*> \ingroup doubleGEcomputational
*> \ingroup gemlqt
*
* =====================================================================
SUBROUTINE SGEMLQT( SIDE, TRANS, M, N, K, MB, V, LDV, T, LDT,
Expand Down
8 changes: 5 additions & 3 deletions lapack-netlib/SRC/ssytrd.f
Original file line number Diff line number Diff line change
Expand Up @@ -188,7 +188,8 @@
*> \endverbatim
*>
* =====================================================================
SUBROUTINE SSYTRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
SUBROUTINE SSYTRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK,
$ INFO )
*
* -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, --
Expand Down Expand Up @@ -248,7 +249,7 @@ SUBROUTINE SSYTRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
* Determine the block size.
*
NB = ILAENV( 1, 'SSYTRD', UPLO, N, -1, -1, -1 )
LWKOPT = N*NB
LWKOPT = MAX( 1, N*NB )
WORK( 1 ) = SROUNDUP_LWORK(LWKOPT)
END IF
*
Expand Down Expand Up @@ -316,7 +317,8 @@ SUBROUTINE SSYTRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
* Update the unreduced submatrix A(1:i-1,1:i-1), using an
* update of the form: A := A - V*W**T - W*V**T
*
CALL SSYR2K( UPLO, 'No transpose', I-1, NB, -ONE, A( 1, I ),
CALL SSYR2K( UPLO, 'No transpose', I-1, NB, -ONE, A( 1,
$ I ),
$ LDA, WORK, LDWORK, ONE, A, LDA )
*
* Copy superdiagonal elements back into A, and diagonal
Expand Down
7 changes: 4 additions & 3 deletions lapack-netlib/SRC/zhetrd.f
Original file line number Diff line number Diff line change
Expand Up @@ -139,7 +139,7 @@
*> \author Univ. of Colorado Denver
*> \author NAG Ltd.
*
*> \ingroup complex16HEcomputational
*> \ingroup hetrd
*
*> \par Further Details:
* =====================
Expand Down Expand Up @@ -188,7 +188,8 @@
*> \endverbatim
*>
* =====================================================================
SUBROUTINE ZHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
SUBROUTINE ZHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK,
$ INFO )
*
* -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, --
Expand Down Expand Up @@ -249,7 +250,7 @@ SUBROUTINE ZHETRD( UPLO, N, A, LDA, D, E, TAU, WORK, LWORK, INFO )
* Determine the block size.
*
NB = ILAENV( 1, 'ZHETRD', UPLO, N, -1, -1, -1 )
LWKOPT = N*NB
LWKOPT = MAX( 1, N*NB )
WORK( 1 ) = LWKOPT
END IF
*
Expand Down

0 comments on commit bce48d4

Please sign in to comment.