Fix typos in comments and documentation (Reference-LAPACK PR 820)

This commit is contained in:
Martin Kroeker 2023-05-18 12:22:02 +02:00 committed by GitHub
parent 9e22527b66
commit 2ba22b8473
No known key found for this signature in database
GPG Key ID: 4AEE18F83AFDEB23
100 changed files with 146 additions and 150 deletions

View File

@ -252,7 +252,7 @@
*> If JOBV = 'V', 'J' then V contains on exit the N-by-N matrix of
*> the right singular vectors;
*> If JOBV = 'W', AND (JOBU = 'U' AND JOBT = 'T' AND M = N),
*> then V is used as workspace if the pprocedure
*> then V is used as workspace if the procedure
*> replaces A with A^*. In that case, [U] is computed
*> in V as right singular vectors of A^* and then
*> copied back to the U array. This 'W' option is just

View File

@ -363,7 +363,7 @@
*> an optimal implementation would do all necessary scaling before calling
*> CGESVD and the scaling in CGESVD can be switched off.
*> 3. Other comments related to code optimization are given in comments in the
*> code, enlosed in [[double brackets]].
*> code, enclosed in [[double brackets]].
*> \endverbatim
*
*> \par Bugs, examples and comments

View File

@ -52,10 +52,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -75,10 +75,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -87,7 +87,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -480,7 +480,7 @@
A( J, K ) = CONJG( A( P, J ) )
A( P, J ) = T
14 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = CONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( K, K ) )
@ -508,7 +508,7 @@
A( J, KK ) = CONJG( A( KP, J ) )
A( KP, J ) = T
15 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = CONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( KK, KK ) )
@ -834,7 +834,7 @@
A( J, K ) = CONJG( A( P, J ) )
A( P, J ) = T
44 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = CONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( K, K ) )
@ -862,7 +862,7 @@
A( J, KK ) = CONJG( A( KP, J ) )
A( KP, J ) = T
45 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = CONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( KK, KK ) )

View File

@ -420,7 +420,7 @@
A( J, K ) = CONJG( A( P, J ) )
A( P, J ) = T
14 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = CONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( K, K ) )
@ -441,7 +441,7 @@
A( J, KK ) = CONJG( A( KP, J ) )
A( KP, J ) = T
15 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = CONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( KK, KK ) )
@ -733,7 +733,7 @@
A( J, K ) = CONJG( A( P, J ) )
A( P, J ) = T
44 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = CONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( K, K ) )
@ -754,7 +754,7 @@
A( J, KK ) = CONJG( A( KP, J ) )
A( KP, J ) = T
45 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = CONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = REAL( A( KK, KK ) )

View File

@ -74,7 +74,7 @@
*>
*> On exit, the tridiagonal matrix is stored in the diagonals
*> and the subdiagonals of A just below (or above) the diagonals,
*> and L is stored below (or above) the subdiaonals, when UPLO
*> and L is stored below (or above) the subdiagonals, when UPLO
*> is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -75,7 +75,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -18,7 +18,7 @@
* Definition:
* ===========
*
* SUBROUTINE CLA_GBRFSX_EXTENDED ( PREC_TYPE, TRANS_TYPE, N, KL, KU,
* SUBROUTINE CLA_GBRFSX_EXTENDED( PREC_TYPE, TRANS_TYPE, N, KL, KU,
* NRHS, AB, LDAB, AFB, LDAFB, IPIV,
* COLEQU, C, B, LDB, Y, LDY,
* BERR_OUT, N_NORMS, ERR_BNDS_NORM,
@ -400,7 +400,7 @@
*> \ingroup complexGBcomputational
*
* =====================================================================
SUBROUTINE CLA_GBRFSX_EXTENDED ( PREC_TYPE, TRANS_TYPE, N, KL, KU,
SUBROUTINE CLA_GBRFSX_EXTENDED( PREC_TYPE, TRANS_TYPE, N, KL, KU,
$ NRHS, AB, LDAB, AFB, LDAFB, IPIV,
$ COLEQU, C, B, LDB, Y, LDY,
$ BERR_OUT, N_NORMS, ERR_BNDS_NORM,
@ -651,7 +651,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL CAXPY( N, (1.0E+0,0.0E+0), DY, 1, Y(1,J), 1 )

View File

@ -637,7 +637,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL CAXPY( N, (1.0E+0,0.0E+0), DY, 1, Y(1,J), 1 )

View File

@ -654,7 +654,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL CAXPY( N, CMPLX(1.0), DY, 1, Y(1,J), 1 )

View File

@ -625,7 +625,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL CAXPY( N, CMPLX(1.0), DY, 1, Y(1,J), 1 )

View File

@ -654,7 +654,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL CAXPY( N, CMPLX(1.0), DY, 1, Y(1,J), 1 )

View File

@ -363,7 +363,7 @@
RETURN
END IF
*
* Prepare the INDXQ sorting premutation.
* Prepare the INDXQ sorting permutation.
*
N1 = K
N2 = N - K

View File

@ -89,7 +89,7 @@
*> Anal., 29(2006), pp. 199--227.
*>
*> Ref: T. Steel, D. Camps, K. Meerbergen, R. Vandebril "A multishift,
*> multipole rational QZ method with agressive early deflation"
*> multipole rational QZ method with aggressive early deflation"
*> \endverbatim
*
* Arguments:
@ -310,7 +310,7 @@
CHARACTER :: JBCMPZ*3
* External Functions
EXTERNAL :: XERBLA, CHGEQZ, CLAQZ2, CLAQZ3, CLASET, SLABAD,
EXTERNAL :: XERBLA, CHGEQZ, CLAQZ2, CLAQZ3, CLASET,
$ CLARTG, CROT
REAL, EXTERNAL :: SLAMCH, CLANHS
LOGICAL, EXTERNAL :: LSAME
@ -462,7 +462,6 @@
* Get machine constants
SAFMIN = SLAMCH( 'SAFE MINIMUM' )
SAFMAX = ONE/SAFMIN
CALL SLABAD( SAFMIN, SAFMAX )
ULP = SLAMCH( 'PRECISION' )
SMLNUM = SAFMIN*( REAL( N )/ULP )
@ -533,7 +532,7 @@
DO WHILE ( K.GE.ISTART2 )
IF( ABS( B( K, K ) ) .LT. BTOL ) THEN
* A diagonal element of B is negligable, move it
* A diagonal element of B is negligible, move it
* to the top and deflate it
DO K2 = K, ISTART2+1, -1

View File

@ -452,7 +452,7 @@
IF( LNOTIDENT ) THEN
*
* col2_(2) Compute W2: = (V1**H) * W2 = (A1**H) * W2,
* V1 is not an identy matrix, but unit lower-triangular
* V1 is not an identity matrix, but unit lower-triangular
* V1 stored in A1 (diagonal ones are not stored).
*
*

View File

@ -227,7 +227,7 @@
BM = RHS( J ) - CONE
SPLUS = ONE
*
* Lockahead for L- part RHS(1:N-1) = +-1
* Look-ahead for L- part RHS(1:N-1) = +-1
* SPLUS and SMIN computed more efficiently than in BSOLVE[1].
*
SPLUS = SPLUS + REAL( CDOTC( N-J, Z( J+1, J ), 1, Z( J+1,

View File

@ -577,7 +577,7 @@
* Prepare the linear update to be executed with GEMM.
* For each column, compute a consistent scaling, a
* scaling factor to survive the linear update, and
* rescale the column segments, if necesssary. Then
* rescale the column segments, if necessary. Then
* the linear update is safely executed.
*
DO KK = 1, K2-K1

View File

@ -39,7 +39,7 @@
*> CSYTRF provided on entry in parameter A into the factorization
*> output format used in CSYTRF_RK (or CSYTRF_BK) that is stored
*> on exit in parameters A and E. It also converts in place details of
*> the intechanges stored in IPIV from the format used in CSYTRF into
*> the interchanges stored in IPIV from the format used in CSYTRF into
*> the format used in CSYTRF_RK (or CSYTRF_BK).
*>
*> If parameter WAY = 'R':
@ -48,7 +48,7 @@
*> (or CSYTRF_BK) provided on entry in parameters A and E into
*> the factorization output format used in CSYTRF that is stored
*> on exit in parameter A. It also converts in place details of
*> the intechanges stored in IPIV from the format used in CSYTRF_RK
*> the interchanges stored in IPIV from the format used in CSYTRF_RK
*> (or CSYTRF_BK) into the format used in CSYTRF.
*>
*> CSYCONVF can also convert in Hermitian matrix case, i.e. between
@ -325,7 +325,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -469,7 +469,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -535,7 +535,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -520,7 +520,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -87,7 +87,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -74,7 +74,7 @@
*>
*> On exit, the tridiagonal matrix is stored in the diagonals
*> and the subdiagonals of A just below (or above) the diagonals,
*> and L is stored below (or above) the subdiaonals, when UPLO
*> and L is stored below (or above) the subdiagonals, when UPLO
*> is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -75,7 +75,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -40,7 +40,7 @@
*>
*> The Schur form T is reordered by a unitary similarity transformation
*> Z**H*T*Z, and optionally the matrix Q of Schur vectors is updated by
*> postmultplying it with Z.
*> postmultiplying it with Z.
*> \endverbatim
*
* Arguments:

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> CUNBDB1 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> CUNBDB2 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> CUNBDB3 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -38,7 +38,7 @@
*>\verbatim
*>
*> CUNBDB4 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -45,7 +45,7 @@
*>
*> Given an upper bidiagonal B with diagonal D = [ d_1 d_2 ... d_N ]
*> and superdiagonal E = [ e_1 e_2 ... e_N-1 ], DBDSVDX computes the
*> singular value decompositon of B through the eigenvalues and
*> singular value decomposition of B through the eigenvalues and
*> eigenvectors of the N*2-by-N*2 tridiagonal matrix
*>
*> | 0 d_1 |

View File

@ -253,7 +253,7 @@
*> If JOBV = 'V', 'J' then V contains on exit the N-by-N matrix of
*> the right singular vectors;
*> If JOBV = 'W', AND (JOBU = 'U' AND JOBT = 'T' AND M = N),
*> then V is used as workspace if the pprocedure
*> then V is used as workspace if the procedure
*> replaces A with A^t. In that case, [U] is computed
*> in V as right singular vectors of A^t and then
*> copied back to the U array. This 'W' option is just

View File

@ -365,7 +365,7 @@
*> an optimal implementation would do all necessary scaling before calling
*> CGESVD and the scaling in CGESVD can be switched off.
*> 3. Other comments related to code optimization are given in comments in the
*> code, enlosed in [[double brackets]].
*> code, enclosed in [[double brackets]].
*> \endverbatim
*
*> \par Bugs, examples and comments

View File

@ -52,10 +52,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -75,10 +75,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -645,7 +645,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL DAXPY( N, 1.0D+0, DY, 1, Y(1,J), 1 )

View File

@ -625,7 +625,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL DAXPY( N, 1.0D+0, DY, 1, Y( 1, J ), 1 )

View File

@ -617,7 +617,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL DAXPY( N, 1.0D+0, DY, 1, Y(1,J), 1 )

View File

@ -647,7 +647,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL DAXPY( N, 1.0D+0, DY, 1, Y(1,J), 1 )

View File

@ -102,7 +102,7 @@
*> Anal., 29(2006), pp. 199--227.
*>
*> Ref: T. Steel, D. Camps, K. Meerbergen, R. Vandebril "A multishift,
*> multipole rational QZ method with agressive early deflation"
*> multipole rational QZ method with aggressive early deflation"
*> \endverbatim
*
* Arguments:
@ -332,7 +332,7 @@
CHARACTER :: JBCMPZ*3
* External Functions
EXTERNAL :: XERBLA, DHGEQZ, DLASET, DLAQZ3, DLAQZ4, DLABAD,
EXTERNAL :: XERBLA, DHGEQZ, DLASET, DLAQZ3, DLAQZ4,
$ DLARTG, DROT
DOUBLE PRECISION, EXTERNAL :: DLAMCH, DLANHS
LOGICAL, EXTERNAL :: LSAME
@ -482,7 +482,6 @@
* Get machine constants
SAFMIN = DLAMCH( 'SAFE MINIMUM' )
SAFMAX = ONE/SAFMIN
CALL DLABAD( SAFMIN, SAFMAX )
ULP = DLAMCH( 'PRECISION' )
SMLNUM = SAFMIN*( DBLE( N )/ULP )
@ -567,7 +566,7 @@
DO WHILE ( K.GE.ISTART2 )
IF( ABS( B( K, K ) ) .LT. BTOL ) THEN
* A diagonal element of B is negligable, move it
* A diagonal element of B is negligible, move it
* to the top and deflate it
DO K2 = K, ISTART2+1, -1

View File

@ -451,7 +451,7 @@
IF( LNOTIDENT ) THEN
*
* col2_(2) Compute W2: = (V1**T) * W2 = (A1**T) * W2,
* V1 is not an identy matrix, but unit lower-triangular
* V1 is not an identity matrix, but unit lower-triangular
* V1 stored in A1 (diagonal ones are not stored).
*
*

View File

@ -574,7 +574,7 @@
* Prepare the linear update to be executed with GEMM.
* For each column, compute a consistent scaling, a
* scaling factor to survive the linear update, and
* rescale the column segments, if necesssary. Then
* rescale the column segments, if necessary. Then
* the linear update is safely executed.
*
DO KK = 1, K2-K1

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> DORBDB1 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> DORBDB2 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> DORBDB3 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -38,7 +38,7 @@
*>\verbatim
*>
*> DORBDB4 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -39,7 +39,7 @@
*> DSYTRF provided on entry in parameter A into the factorization
*> output format used in DSYTRF_RK (or DSYTRF_BK) that is stored
*> on exit in parameters A and E. It also converts in place details of
*> the intechanges stored in IPIV from the format used in DSYTRF into
*> the interchanges stored in IPIV from the format used in DSYTRF into
*> the format used in DSYTRF_RK (or DSYTRF_BK).
*>
*> If parameter WAY = 'R':
@ -48,7 +48,7 @@
*> (or DSYTRF_BK) provided on entry in parameters A and E into
*> the factorization output format used in DSYTRF that is stored
*> on exit in parameter A. It also converts in place details of
*> the intechanges stored in IPIV from the format used in DSYTRF_RK
*> the interchanges stored in IPIV from the format used in DSYTRF_RK
*> (or DSYTRF_BK) into the format used in DSYTRF.
*> \endverbatim
*
@ -322,7 +322,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -466,7 +466,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -532,7 +532,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -517,7 +517,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -89,7 +89,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -74,7 +74,7 @@
*>
*> On exit, the tridiagonal matrix is stored in the diagonals
*> and the subdiagonals of A just below (or above) the diagonals,
*> and L is stored below (or above) the subdiaonals, when UPLO
*> and L is stored below (or above) the subdiagonals, when UPLO
*> is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -75,7 +75,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -45,7 +45,7 @@
*>
*> Given an upper bidiagonal B with diagonal D = [ d_1 d_2 ... d_N ]
*> and superdiagonal E = [ e_1 e_2 ... e_N-1 ], SBDSVDX computes the
*> singular value decompositon of B through the eigenvalues and
*> singular value decomposition of B through the eigenvalues and
*> eigenvectors of the N*2-by-N*2 tridiagonal matrix
*>
*> | 0 d_1 |

View File

@ -253,7 +253,7 @@
*> If JOBV = 'V', 'J' then V contains on exit the N-by-N matrix of
*> the right singular vectors;
*> If JOBV = 'W', AND (JOBU = 'U' AND JOBT = 'T' AND M = N),
*> then V is used as workspace if the pprocedure
*> then V is used as workspace if the procedure
*> replaces A with A^t. In that case, [U] is computed
*> in V as right singular vectors of A^t and then
*> copied back to the U array. This 'W' option is just

View File

@ -365,7 +365,7 @@
*> an optimal implementation would do all necessary scaling before calling
*> CGESVD and the scaling in CGESVD can be switched off.
*> 3. Other comments related to code optimization are given in comments in the
*> code, enlosed in [[double brackets]].
*> code, enclosed in [[double brackets]].
*> \endverbatim
*
*> \par Bugs, examples and comments

View File

@ -52,10 +52,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -75,10 +75,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -644,7 +644,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL SAXPY( N, 1.0, DY, 1, Y(1,J), 1 )

View File

@ -628,7 +628,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL SAXPY( N, 1.0, DY, 1, Y( 1, J ), 1 )

View File

@ -617,7 +617,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL SAXPY( N, 1.0, DY, 1, Y(1,J), 1 )

View File

@ -647,7 +647,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL SAXPY( N, 1.0, DY, 1, Y(1,J), 1 )

View File

@ -100,7 +100,7 @@
*> Anal., 29(2006), pp. 199--227.
*>
*> Ref: T. Steel, D. Camps, K. Meerbergen, R. Vandebril "A multishift,
*> multipole rational QZ method with agressive early deflation"
*> multipole rational QZ method with aggressive early deflation"
*> \endverbatim
*
* Arguments:
@ -329,7 +329,7 @@
CHARACTER :: JBCMPZ*3
* External Functions
EXTERNAL :: XERBLA, SHGEQZ, SLAQZ3, SLAQZ4, SLASET, SLABAD,
EXTERNAL :: XERBLA, SHGEQZ, SLAQZ3, SLAQZ4, SLASET,
$ SLARTG, SROT
REAL, EXTERNAL :: SLAMCH, SLANHS
LOGICAL, EXTERNAL :: LSAME
@ -479,7 +479,6 @@
* Get machine constants
SAFMIN = SLAMCH( 'SAFE MINIMUM' )
SAFMAX = ONE/SAFMIN
CALL SLABAD( SAFMIN, SAFMAX )
ULP = SLAMCH( 'PRECISION' )
SMLNUM = SAFMIN*( REAL( N )/ULP )
@ -564,7 +563,7 @@
DO WHILE ( K.GE.ISTART2 )
IF( ABS( B( K, K ) ) .LT. BTOL ) THEN
* A diagonal element of B is negligable, move it
* A diagonal element of B is negligible, move it
* to the top and deflate it
DO K2 = K, ISTART2+1, -1

View File

@ -451,7 +451,7 @@
IF( LNOTIDENT ) THEN
*
* col2_(2) Compute W2: = (V1**T) * W2 = (A1**T) * W2,
* V1 is not an identy matrix, but unit lower-triangular
* V1 is not an identity matrix, but unit lower-triangular
* V1 stored in A1 (diagonal ones are not stored).
*
*

View File

@ -574,7 +574,7 @@
* Prepare the linear update to be executed with GEMM.
* For each column, compute a consistent scaling, a
* scaling factor to survive the linear update, and
* rescale the column segments, if necesssary. Then
* rescale the column segments, if necessary. Then
* the linear update is safely executed.
*
DO KK = 1, K2-K1

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> SORBDB1 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> SORBDB2 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> SORBDB3 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -38,7 +38,7 @@
*>\verbatim
*>
*> SORBDB4 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -39,7 +39,7 @@
*> SSYTRF provided on entry in parameter A into the factorization
*> output format used in SSYTRF_RK (or SSYTRF_BK) that is stored
*> on exit in parameters A and E. It also converts in place details of
*> the intechanges stored in IPIV from the format used in SSYTRF into
*> the interchanges stored in IPIV from the format used in SSYTRF into
*> the format used in SSYTRF_RK (or SSYTRF_BK).
*>
*> If parameter WAY = 'R':
@ -48,7 +48,7 @@
*> (or SSYTRF_BK) provided on entry in parameters A and E into
*> the factorization output format used in SSYTRF that is stored
*> on exit in parameter A. It also converts in place details of
*> the intechanges stored in IPIV from the format used in SSYTRF_RK
*> the interchanges stored in IPIV from the format used in SSYTRF_RK
*> (or SSYTRF_BK) into the format used in SSYTRF.
*> \endverbatim
*
@ -322,7 +322,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -466,7 +466,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -532,7 +532,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -517,7 +517,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -88,7 +88,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -74,7 +74,7 @@
*>
*> On exit, the tridiagonal matrix is stored in the diagonals
*> and the subdiagonals of A just below (or above) the diagonals,
*> and L is stored below (or above) the subdiaonals, when UPLO
*> and L is stored below (or above) the subdiagonals, when UPLO
*> is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -75,7 +75,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -252,7 +252,7 @@
*> If JOBV = 'V', 'J' then V contains on exit the N-by-N matrix of
*> the right singular vectors;
*> If JOBV = 'W', AND (JOBU = 'U' AND JOBT = 'T' AND M = N),
*> then V is used as workspace if the pprocedure
*> then V is used as workspace if the procedure
*> replaces A with A^*. In that case, [U] is computed
*> in V as right singular vectors of A^* and then
*> copied back to the U array. This 'W' option is just

View File

@ -363,7 +363,7 @@
*> an optimal implementation would do all necessary scaling before calling
*> CGESVD and the scaling in CGESVD can be switched off.
*> 3. Other comments related to code optimization are given in comments in the
*> code, enlosed in [[double brackets]].
*> code, enclosed in [[double brackets]].
*> \endverbatim
*
*> \par Bugs, examples and comments

View File

@ -52,10 +52,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -75,10 +75,10 @@
*> Specifies whether the output from this procedure is used
*> to compute the matrix V:
*> = 'V': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the N-by-N array V.
*> by postmultiplying the N-by-N array V.
*> (See the description of V.)
*> = 'A': the product of the Jacobi rotations is accumulated
*> by postmulyiplying the MV-by-N array V.
*> by postmultiplying the MV-by-N array V.
*> (See the descriptions of MV and V.)
*> = 'N': the Jacobi rotations are not accumulated.
*> \endverbatim

View File

@ -88,7 +88,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -480,7 +480,7 @@
A( J, K ) = DCONJG( A( P, J ) )
A( P, J ) = T
14 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = DCONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( K, K ) )
@ -508,7 +508,7 @@
A( J, KK ) = DCONJG( A( KP, J ) )
A( KP, J ) = T
15 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = DCONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( KK, KK ) )
@ -834,7 +834,7 @@
A( J, K ) = DCONJG( A( P, J ) )
A( P, J ) = T
44 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = DCONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( K, K ) )
@ -862,7 +862,7 @@
A( J, KK ) = DCONJG( A( KP, J ) )
A( KP, J ) = T
45 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = DCONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( KK, KK ) )

View File

@ -420,7 +420,7 @@
A( J, K ) = DCONJG( A( P, J ) )
A( P, J ) = T
14 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = DCONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( K, K ) )
@ -441,7 +441,7 @@
A( J, KK ) = DCONJG( A( KP, J ) )
A( KP, J ) = T
15 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = DCONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( KK, KK ) )
@ -733,7 +733,7 @@
A( J, K ) = DCONJG( A( P, J ) )
A( P, J ) = T
44 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( P, K ) = DCONJG( A( P, K ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( K, K ) )
@ -754,7 +754,7 @@
A( J, KK ) = DCONJG( A( KP, J ) )
A( KP, J ) = T
45 CONTINUE
* (3) Swap and conjugate corner elements at row-col interserction
* (3) Swap and conjugate corner elements at row-col intersection
A( KP, KK ) = DCONJG( A( KP, KK ) )
* (4) Swap diagonal elements at row-col intersection
R1 = DBLE( A( KK, KK ) )

View File

@ -74,7 +74,7 @@
*>
*> On exit, the tridiagonal matrix is stored in the diagonals
*> and the subdiagonals of A just below (or above) the diagonals,
*> and L is stored below (or above) the subdiaonals, when UPLO
*> and L is stored below (or above) the subdiagonals, when UPLO
*> is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -75,7 +75,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -651,7 +651,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL ZAXPY( N, (1.0D+0,0.0D+0), DY, 1, Y(1,J), 1 )

View File

@ -636,7 +636,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL ZAXPY( N, (1.0D+0,0.0D+0), DY, 1, Y(1,J), 1 )

View File

@ -655,7 +655,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL ZAXPY( N, DCMPLX(1.0D+0), DY, 1, Y(1,J), 1 )

View File

@ -626,7 +626,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF (Y_PREC_STATE .LT. EXTRA_Y) THEN
CALL ZAXPY( N, DCMPLX(1.0D+0), DY, 1, Y(1,J), 1 )

View File

@ -655,7 +655,7 @@
PREVNORMDX = NORMDX
PREV_DZ_Z = DZ_Z
*
* Update soluton.
* Update solution.
*
IF ( Y_PREC_STATE .LT. EXTRA_Y ) THEN
CALL ZAXPY( N, DCMPLX(1.0D+0), DY, 1, Y(1,J), 1 )

View File

@ -363,7 +363,7 @@
RETURN
END IF
*
* Prepare the INDXQ sorting premutation.
* Prepare the INDXQ sorting permutation.
*
N1 = K
N2 = N - K

View File

@ -89,7 +89,7 @@
*> Anal., 29(2006), pp. 199--227.
*>
*> Ref: T. Steel, D. Camps, K. Meerbergen, R. Vandebril "A multishift,
*> multipole rational QZ method with agressive early deflation"
*> multipole rational QZ method with aggressive early deflation"
*> \endverbatim
*
* Arguments:
@ -312,7 +312,7 @@
CHARACTER :: JBCMPZ*3
* External Functions
EXTERNAL :: XERBLA, ZHGEQZ, ZLAQZ2, ZLAQZ3, ZLASET, DLABAD,
EXTERNAL :: XERBLA, ZHGEQZ, ZLAQZ2, ZLAQZ3, ZLASET,
$ ZLARTG, ZROT
DOUBLE PRECISION, EXTERNAL :: DLAMCH, ZLANHS
LOGICAL, EXTERNAL :: LSAME
@ -464,7 +464,6 @@
* Get machine constants
SAFMIN = DLAMCH( 'SAFE MINIMUM' )
SAFMAX = ONE/SAFMIN
CALL DLABAD( SAFMIN, SAFMAX )
ULP = DLAMCH( 'PRECISION' )
SMLNUM = SAFMIN*( DBLE( N )/ULP )
@ -535,7 +534,7 @@
DO WHILE ( K.GE.ISTART2 )
IF( ABS( B( K, K ) ) .LT. BTOL ) THEN
* A diagonal element of B is negligable, move it
* A diagonal element of B is negligible, move it
* to the top and deflate it
DO K2 = K, ISTART2+1, -1

View File

@ -452,7 +452,7 @@
IF( LNOTIDENT ) THEN
*
* col2_(2) Compute W2: = (V1**H) * W2 = (A1**H) * W2,
* V1 is not an identy matrix, but unit lower-triangular
* V1 is not an identity matrix, but unit lower-triangular
* V1 stored in A1 (diagonal ones are not stored).
*
*

View File

@ -227,7 +227,7 @@
BM = RHS( J ) - CONE
SPLUS = ONE
*
* Lockahead for L- part RHS(1:N-1) = +-1
* Look-ahead for L- part RHS(1:N-1) = +-1
* SPLUS and SMIN computed more efficiently than in BSOLVE[1].
*
SPLUS = SPLUS + DBLE( ZDOTC( N-J, Z( J+1, J ), 1, Z( J+1,

View File

@ -577,7 +577,7 @@
* Prepare the linear update to be executed with GEMM.
* For each column, compute a consistent scaling, a
* scaling factor to survive the linear update, and
* rescale the column segments, if necesssary. Then
* rescale the column segments, if necessary. Then
* the linear update is safely executed.
*
DO KK = 1, K2 - K1

View File

@ -39,7 +39,7 @@
*> ZSYTRF provided on entry in parameter A into the factorization
*> output format used in ZSYTRF_RK (or ZSYTRF_BK) that is stored
*> on exit in parameters A and E. It also converts in place details of
*> the intechanges stored in IPIV from the format used in ZSYTRF into
*> the interchanges stored in IPIV from the format used in ZSYTRF into
*> the format used in ZSYTRF_RK (or ZSYTRF_BK).
*>
*> If parameter WAY = 'R':
@ -48,7 +48,7 @@
*> (or ZSYTRF_BK) provided on entry in parameters A and E into
*> the factorization output format used in ZSYTRF that is stored
*> on exit in parameter A. It also converts in place details of
*> the intechanges stored in IPIV from the format used in ZSYTRF_RK
*> the interchanges stored in IPIV from the format used in ZSYTRF_RK
*> (or ZSYTRF_BK) into the format used in ZSYTRF.
*>
*> ZSYCONVF can also convert in Hermitian matrix case, i.e. between
@ -325,7 +325,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -469,7 +469,7 @@
END IF
*
* Convert IPIV
* There is no interchnge of rows i and and IPIV(i),
* There is no interchange of rows i and and IPIV(i),
* so this should be reflected in IPIV format for
* *SYTRF_RK ( or *SYTRF_BK)
*
@ -535,7 +535,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -520,7 +520,7 @@
*
* Revert VALUE
* Assign subdiagonal entries of D from array E to
* subgiagonal entries of A.
* subdiagonal entries of A.
*
I = 1
DO WHILE ( I.LE.N-1 )

View File

@ -87,7 +87,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -74,7 +74,7 @@
*>
*> On exit, the tridiagonal matrix is stored in the diagonals
*> and the subdiagonals of A just below (or above) the diagonals,
*> and L is stored below (or above) the subdiaonals, when UPLO
*> and L is stored below (or above) the subdiagonals, when UPLO
*> is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -75,7 +75,7 @@
*> triangular part of the matrix A, and the strictly upper
*> triangular part of A is not referenced.
*>
*> On exit, L is stored below (or above) the subdiaonal blocks,
*> On exit, L is stored below (or above) the subdiagonal blocks,
*> when UPLO is 'L' (or 'U').
*> \endverbatim
*>

View File

@ -40,7 +40,7 @@
*>
*> The Schur form T is reordered by a unitary similarity transformation
*> Z**H*T*Z, and optionally the matrix Q of Schur vectors is updated by
*> postmultplying it with Z.
*> postmultiplying it with Z.
*> \endverbatim
*
* Arguments:

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> ZUNBDB1 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> ZUNBDB2 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -37,7 +37,7 @@
*>\verbatim
*>
*> ZUNBDB3 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]

View File

@ -38,7 +38,7 @@
*>\verbatim
*>
*> ZUNBDB4 simultaneously bidiagonalizes the blocks of a tall and skinny
*> matrix X with orthonomal columns:
*> matrix X with orthonormal columns:
*>
*> [ B11 ]
*> [ X11 ] [ P1 | ] [ 0 ]