update to LAPACK version 3.10.1

This commit is contained in:
Axel Kohlmeyer
2022-07-21 08:41:44 -04:00
parent 11c46a6e90
commit c8cc2b1b24
178 changed files with 471 additions and 864 deletions

View File

@ -54,8 +54,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level1 *> \ingroup double_blas_level1
* *
*> \par Further Details: *> \par Further Details:
@ -71,10 +69,9 @@
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DASUM(N,DX,INCX) DOUBLE PRECISION FUNCTION DASUM(N,DX,INCX)
* *
* -- Reference BLAS level1 routine (version 3.7.0) -- * -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INCX,N INTEGER INCX,N
@ -128,4 +125,7 @@
END IF END IF
DASUM = DTEMP DASUM = DTEMP
RETURN RETURN
*
* End of DASUM
*
END END

View File

@ -73,8 +73,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level1 *> \ingroup double_blas_level1
* *
*> \par Further Details: *> \par Further Details:
@ -89,10 +87,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DAXPY(N,DA,DX,INCX,DY,INCY) SUBROUTINE DAXPY(N,DA,DX,INCX,DY,INCY)
* *
* -- Reference BLAS level1 routine (version 3.7.0) -- * -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION DA DOUBLE PRECISION DA
@ -149,4 +146,7 @@
END DO END DO
END IF END IF
RETURN RETURN
*
* End of DAXPY
*
END END

View File

@ -166,7 +166,7 @@
*> *>
*> \param[out] WORK *> \param[out] WORK
*> \verbatim *> \verbatim
*> WORK is DOUBLE PRECISION array, dimension (4*N) *> WORK is DOUBLE PRECISION array, dimension (4*(N-1))
*> \endverbatim *> \endverbatim
*> *>
*> \param[out] INFO *> \param[out] INFO
@ -233,18 +233,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DBDSQR( UPLO, N, NCVT, NRU, NCC, D, E, VT, LDVT, U, SUBROUTINE DBDSQR( UPLO, N, NCVT, NRU, NCC, D, E, VT, LDVT, U,
$ LDU, C, LDC, WORK, INFO ) $ LDU, C, LDC, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.1) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -40,17 +40,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level1 *> \ingroup double_blas_level1
* *
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DCABS1(Z) DOUBLE PRECISION FUNCTION DCABS1(Z)
* *
* -- Reference BLAS level1 routine (version 3.7.0) -- * -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
COMPLEX*16 Z COMPLEX*16 Z
@ -63,4 +60,7 @@
* *
DCABS1 = ABS(DBLE(Z)) + ABS(DIMAG(Z)) DCABS1 = ABS(DBLE(Z)) + ABS(DIMAG(Z))
RETURN RETURN
*
* End of DCABS1
*
END END

View File

@ -66,8 +66,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level1 *> \ingroup double_blas_level1
* *
*> \par Further Details: *> \par Further Details:
@ -82,10 +80,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DCOPY(N,DX,INCX,DY,INCY) SUBROUTINE DCOPY(N,DX,INCX,DY,INCY)
* *
* -- Reference BLAS level1 routine (version 3.7.0) -- * -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INCX,INCY,N INTEGER INCX,INCY,N
@ -143,4 +140,7 @@
END DO END DO
END IF END IF
RETURN RETURN
*
* End of DCOPY
*
END END

View File

@ -66,8 +66,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level1 *> \ingroup double_blas_level1
* *
*> \par Further Details: *> \par Further Details:
@ -82,10 +80,9 @@
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DDOT(N,DX,INCX,DY,INCY) DOUBLE PRECISION FUNCTION DDOT(N,DX,INCX,DY,INCY)
* *
* -- Reference BLAS level1 routine (version 3.7.0) -- * -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INCX,INCY,N INTEGER INCX,INCY,N
@ -145,4 +142,7 @@
END IF END IF
DDOT = DTEMP DDOT = DTEMP
RETURN RETURN
*
* End of DDOT
*
END END

View File

@ -132,8 +132,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -189,10 +187,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGEBD2( M, N, A, LDA, D, E, TAUQ, TAUP, WORK, INFO ) SUBROUTINE DGEBD2( M, N, A, LDA, D, E, TAUQ, TAUP, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.1) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, M, N INTEGER INFO, LDA, M, N

View File

@ -147,8 +147,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -205,10 +203,9 @@
SUBROUTINE DGEBRD( M, N, A, LDA, D, E, TAUQ, TAUP, WORK, LWORK, SUBROUTINE DGEBRD( M, N, A, LDA, D, E, TAUQ, TAUP, WORK, LWORK,
$ INFO ) $ INFO )
* *
* -- LAPACK computational routine (version 3.7.1) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, LWORK, M, N INTEGER INFO, LDA, LWORK, M, N
@ -227,8 +224,7 @@
* .. Local Scalars .. * .. Local Scalars ..
LOGICAL LQUERY LOGICAL LQUERY
INTEGER I, IINFO, J, LDWRKX, LDWRKY, LWKOPT, MINMN, NB, INTEGER I, IINFO, J, LDWRKX, LDWRKY, LWKOPT, MINMN, NB,
$ NBMIN, NX $ NBMIN, NX, WS
DOUBLE PRECISION WS
* .. * ..
* .. External Subroutines .. * .. External Subroutines ..
EXTERNAL DGEBD2, DGEMM, DLABRD, XERBLA EXTERNAL DGEBD2, DGEMM, DLABRD, XERBLA

View File

@ -116,18 +116,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGECON( NORM, N, A, LDA, ANORM, RCOND, WORK, IWORK, SUBROUTINE DGECON( NORM, N, A, LDA, ANORM, RCOND, WORK, IWORK,
$ INFO ) $ INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER NORM CHARACTER NORM

View File

@ -33,8 +33,16 @@
*> *>
*> \verbatim *> \verbatim
*> *>
*> DGELQ2 computes an LQ factorization of a real m by n matrix A: *> DGELQ2 computes an LQ factorization of a real m-by-n matrix A:
*> A = L * Q. *>
*> A = ( L 0 ) * Q
*>
*> where:
*>
*> Q is a n-by-n orthogonal matrix;
*> L is a lower-triangular m-by-m matrix;
*> 0 is a m-by-(n-m) zero matrix, if m < n.
*>
*> \endverbatim *> \endverbatim
* *
* Arguments: * Arguments:
@ -96,8 +104,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -121,10 +127,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGELQ2( M, N, A, LDA, TAU, WORK, INFO ) SUBROUTINE DGELQ2( M, N, A, LDA, TAU, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, M, N INTEGER INFO, LDA, M, N

View File

@ -34,7 +34,15 @@
*> \verbatim *> \verbatim
*> *>
*> DGELQF computes an LQ factorization of a real M-by-N matrix A: *> DGELQF computes an LQ factorization of a real M-by-N matrix A:
*> A = L * Q. *>
*> A = ( L 0 ) * Q
*>
*> where:
*>
*> Q is a N-by-N orthogonal matrix;
*> L is a lower-triangular M-by-M matrix;
*> 0 is a M-by-(N-M) zero matrix, if M < N.
*>
*> \endverbatim *> \endverbatim
* *
* Arguments: * Arguments:
@ -110,8 +118,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -135,10 +141,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGELQF( M, N, A, LDA, TAU, WORK, LWORK, INFO ) SUBROUTINE DGELQF( M, N, A, LDA, TAU, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, LWORK, M, N INTEGER INFO, LDA, LWORK, M, N

View File

@ -194,8 +194,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup doubleGEsolve *> \ingroup doubleGEsolve
* *
*> \par Contributors: *> \par Contributors:
@ -209,10 +207,9 @@
SUBROUTINE DGELSD( M, N, NRHS, A, LDA, B, LDB, S, RCOND, RANK, SUBROUTINE DGELSD( M, N, NRHS, A, LDA, B, LDB, S, RCOND, RANK,
$ WORK, LWORK, IWORK, INFO ) $ WORK, LWORK, IWORK, INFO )
* *
* -- LAPACK driver routine (version 3.7.1) -- * -- LAPACK driver routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, LDB, LWORK, M, N, NRHS, RANK INTEGER INFO, LDA, LDB, LWORK, M, N, NRHS, RANK

View File

@ -164,18 +164,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEsolve *> \ingroup doubleGEsolve
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGELSS( M, N, NRHS, A, LDA, B, LDB, S, RCOND, RANK, SUBROUTINE DGELSS( M, N, NRHS, A, LDA, B, LDB, S, RCOND, RANK,
$ WORK, LWORK, INFO ) $ WORK, LWORK, INFO )
* *
* -- LAPACK driver routine (version 3.7.0) -- * -- LAPACK driver routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, LDB, LWORK, M, N, NRHS, RANK INTEGER INFO, LDA, LDB, LWORK, M, N, NRHS, RANK

View File

@ -166,8 +166,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level3 *> \ingroup double_blas_level3
* *
*> \par Further Details: *> \par Further Details:
@ -187,10 +185,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGEMM(TRANSA,TRANSB,M,N,K,ALPHA,A,LDA,B,LDB,BETA,C,LDC) SUBROUTINE DGEMM(TRANSA,TRANSB,M,N,K,ALPHA,A,LDA,B,LDB,BETA,C,LDC)
* *
* -- Reference BLAS level3 routine (version 3.7.0) -- * -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION ALPHA,BETA DOUBLE PRECISION ALPHA,BETA
@ -215,7 +212,7 @@
* .. * ..
* .. Local Scalars .. * .. Local Scalars ..
DOUBLE PRECISION TEMP DOUBLE PRECISION TEMP
INTEGER I,INFO,J,L,NCOLA,NROWA,NROWB INTEGER I,INFO,J,L,NROWA,NROWB
LOGICAL NOTA,NOTB LOGICAL NOTA,NOTB
* .. * ..
* .. Parameters .. * .. Parameters ..
@ -224,17 +221,15 @@
* .. * ..
* *
* Set NOTA and NOTB as true if A and B respectively are not * Set NOTA and NOTB as true if A and B respectively are not
* transposed and set NROWA, NCOLA and NROWB as the number of rows * transposed and set NROWA and NROWB as the number of rows of A
* and columns of A and the number of rows of B respectively. * and B respectively.
* *
NOTA = LSAME(TRANSA,'N') NOTA = LSAME(TRANSA,'N')
NOTB = LSAME(TRANSB,'N') NOTB = LSAME(TRANSB,'N')
IF (NOTA) THEN IF (NOTA) THEN
NROWA = M NROWA = M
NCOLA = K
ELSE ELSE
NROWA = K NROWA = K
NCOLA = M
END IF END IF
IF (NOTB) THEN IF (NOTB) THEN
NROWB = K NROWB = K
@ -379,6 +374,6 @@
* *
RETURN RETURN
* *
* End of DGEMM . * End of DGEMM
* *
END END

View File

@ -134,8 +134,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level2 *> \ingroup double_blas_level2
* *
*> \par Further Details: *> \par Further Details:
@ -156,10 +154,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGEMV(TRANS,M,N,ALPHA,A,LDA,X,INCX,BETA,Y,INCY) SUBROUTINE DGEMV(TRANS,M,N,ALPHA,A,LDA,X,INCX,BETA,Y,INCY)
* *
* -- Reference BLAS level2 routine (version 3.7.0) -- * -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION ALPHA,BETA DOUBLE PRECISION ALPHA,BETA
@ -325,6 +322,6 @@
* *
RETURN RETURN
* *
* End of DGEMV . * End of DGEMV
* *
END END

View File

@ -33,8 +33,17 @@
*> *>
*> \verbatim *> \verbatim
*> *>
*> DGEQR2 computes a QR factorization of a real m by n matrix A: *> DGEQR2 computes a QR factorization of a real m-by-n matrix A:
*> A = Q * R. *>
*> A = Q * ( R ),
*> ( 0 )
*>
*> where:
*>
*> Q is a m-by-m orthogonal matrix;
*> R is an upper-triangular n-by-n matrix;
*> 0 is a (m-n)-by-n zero matrix, if m > n.
*>
*> \endverbatim *> \endverbatim
* *
* Arguments: * Arguments:
@ -96,8 +105,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -121,10 +128,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGEQR2( M, N, A, LDA, TAU, WORK, INFO ) SUBROUTINE DGEQR2( M, N, A, LDA, TAU, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, M, N INTEGER INFO, LDA, M, N

View File

@ -34,7 +34,16 @@
*> \verbatim *> \verbatim
*> *>
*> DGEQRF computes a QR factorization of a real M-by-N matrix A: *> DGEQRF computes a QR factorization of a real M-by-N matrix A:
*> A = Q * R. *>
*> A = Q * ( R ),
*> ( 0 )
*>
*> where:
*>
*> Q is a M-by-M orthogonal matrix;
*> R is an upper-triangular N-by-N matrix;
*> 0 is a (M-N)-by-N zero matrix, if M > N.
*>
*> \endverbatim *> \endverbatim
* *
* Arguments: * Arguments:
@ -86,7 +95,8 @@
*> \param[in] LWORK *> \param[in] LWORK
*> \verbatim *> \verbatim
*> LWORK is INTEGER *> LWORK is INTEGER
*> The dimension of the array WORK. LWORK >= max(1,N). *> The dimension of the array WORK.
*> LWORK >= 1, if MIN(M,N) = 0, and LWORK >= N, otherwise.
*> For optimum performance LWORK >= N*NB, where NB is *> For optimum performance LWORK >= N*NB, where NB is
*> the optimal blocksize. *> the optimal blocksize.
*> *>
@ -111,8 +121,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -136,10 +144,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGEQRF( M, N, A, LDA, TAU, WORK, LWORK, INFO ) SUBROUTINE DGEQRF( M, N, A, LDA, TAU, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, LWORK, M, N INTEGER INFO, LDA, LWORK, M, N
@ -169,10 +176,9 @@
* *
* Test the input arguments * Test the input arguments
* *
K = MIN( M, N )
INFO = 0 INFO = 0
NB = ILAENV( 1, 'DGEQRF', ' ', M, N, -1, -1 ) NB = ILAENV( 1, 'DGEQRF', ' ', M, N, -1, -1 )
LWKOPT = N*NB
WORK( 1 ) = LWKOPT
LQUERY = ( LWORK.EQ.-1 ) LQUERY = ( LWORK.EQ.-1 )
IF( M.LT.0 ) THEN IF( M.LT.0 ) THEN
INFO = -1 INFO = -1
@ -180,19 +186,25 @@
INFO = -2 INFO = -2
ELSE IF( LDA.LT.MAX( 1, M ) ) THEN ELSE IF( LDA.LT.MAX( 1, M ) ) THEN
INFO = -4 INFO = -4
ELSE IF( LWORK.LT.MAX( 1, N ) .AND. .NOT.LQUERY ) THEN ELSE IF( .NOT.LQUERY ) THEN
INFO = -7 IF( LWORK.LE.0 .OR. ( M.GT.0 .AND. LWORK.LT.MAX( 1, N ) ) )
$ INFO = -7
END IF END IF
IF( INFO.NE.0 ) THEN IF( INFO.NE.0 ) THEN
CALL XERBLA( 'DGEQRF', -INFO ) CALL XERBLA( 'DGEQRF', -INFO )
RETURN RETURN
ELSE IF( LQUERY ) THEN ELSE IF( LQUERY ) THEN
IF( K.EQ.0 ) THEN
LWKOPT = 1
ELSE
LWKOPT = N*NB
END IF
WORK( 1 ) = LWKOPT
RETURN RETURN
END IF END IF
* *
* Quick return if possible * Quick return if possible
* *
K = MIN( M, N )
IF( K.EQ.0 ) THEN IF( K.EQ.0 ) THEN
WORK( 1 ) = 1 WORK( 1 ) = 1
RETURN RETURN

View File

@ -109,8 +109,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup double_blas_level2 *> \ingroup double_blas_level2
* *
*> \par Further Details: *> \par Further Details:
@ -130,10 +128,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DGER(M,N,ALPHA,X,INCX,Y,INCY,A,LDA) SUBROUTINE DGER(M,N,ALPHA,X,INCX,Y,INCY,A,LDA)
* *
* -- Reference BLAS level2 routine (version 3.7.0) -- * -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, -- * -- Reference BLAS is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION ALPHA DOUBLE PRECISION ALPHA
@ -222,6 +219,6 @@
* *
RETURN RETURN
* *
* End of DGER . * End of DGER
* *
END END

View File

@ -115,17 +115,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEsolve *> \ingroup doubleGEsolve
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGESV( N, NRHS, A, LDA, IPIV, B, LDB, INFO ) SUBROUTINE DGESV( N, NRHS, A, LDA, IPIV, B, LDB, INFO )
* *
* -- LAPACK driver routine (version 3.7.0) -- * -- LAPACK driver routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, LDB, N, NRHS INTEGER INFO, LDA, LDB, N, NRHS

View File

@ -203,18 +203,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date April 2012
*
*> \ingroup doubleGEsing *> \ingroup doubleGEsing
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGESVD( JOBU, JOBVT, M, N, A, LDA, S, U, LDU, SUBROUTINE DGESVD( JOBU, JOBVT, M, N, A, LDA, S, U, LDU,
$ VT, LDVT, WORK, LWORK, INFO ) $ VT, LDVT, WORK, LWORK, INFO )
* *
* -- LAPACK driver routine (version 3.7.0) -- * -- LAPACK driver routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* April 2012
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER JOBU, JOBVT CHARACTER JOBU, JOBVT

View File

@ -101,17 +101,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGETF2( M, N, A, LDA, IPIV, INFO ) SUBROUTINE DGETF2( M, N, A, LDA, IPIV, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, M, N INTEGER INFO, LDA, M, N

View File

@ -101,17 +101,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGETRF( M, N, A, LDA, IPIV, INFO ) SUBROUTINE DGETRF( M, N, A, LDA, IPIV, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, M, N INTEGER INFO, LDA, M, N

View File

@ -106,17 +106,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
* ===================================================================== * =====================================================================
RECURSIVE SUBROUTINE DGETRF2( M, N, A, LDA, IPIV, INFO ) RECURSIVE SUBROUTINE DGETRF2( M, N, A, LDA, IPIV, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, M, N INTEGER INFO, LDA, M, N

View File

@ -107,17 +107,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGETRI( N, A, LDA, IPIV, WORK, LWORK, INFO ) SUBROUTINE DGETRI( N, A, LDA, IPIV, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, LDA, LWORK, N INTEGER INFO, LDA, LWORK, N

View File

@ -114,17 +114,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEcomputational *> \ingroup doubleGEcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DGETRS( TRANS, N, NRHS, A, LDA, IPIV, B, LDB, INFO ) SUBROUTINE DGETRS( TRANS, N, NRHS, A, LDA, IPIV, B, LDB, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER TRANS CHARACTER TRANS

View File

@ -52,17 +52,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
LOGICAL FUNCTION DISNAN( DIN ) LOGICAL FUNCTION DISNAN( DIN )
* *
* -- LAPACK auxiliary routine (version 3.7.1) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION, INTENT(IN) :: DIN DOUBLE PRECISION, INTENT(IN) :: DIN

View File

@ -67,17 +67,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLABAD( SMALL, LARGE ) SUBROUTINE DLABAD( SMALL, LARGE )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION LARGE, SMALL DOUBLE PRECISION LARGE, SMALL

View File

@ -156,8 +156,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -210,10 +208,9 @@
SUBROUTINE DLABRD( M, N, NB, A, LDA, D, E, TAUQ, TAUP, X, LDX, Y, SUBROUTINE DLABRD( M, N, NB, A, LDA, D, E, TAUQ, TAUP, X, LDX, Y,
$ LDY ) $ LDY )
* *
* -- LAPACK auxiliary routine (version 3.7.1) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER LDA, LDX, LDY, M, N, NB INTEGER LDA, LDX, LDY, M, N, NB

View File

@ -101,8 +101,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -136,10 +134,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLACN2( N, V, X, ISGN, EST, KASE, ISAVE ) SUBROUTINE DLACN2( N, V, X, ISGN, EST, KASE, ISAVE )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER KASE, N INTEGER KASE, N
@ -160,7 +157,7 @@
* .. * ..
* .. Local Scalars .. * .. Local Scalars ..
INTEGER I, JLAST INTEGER I, JLAST
DOUBLE PRECISION ALTSGN, ESTOLD, TEMP DOUBLE PRECISION ALTSGN, ESTOLD, TEMP, XS
* .. * ..
* .. External Functions .. * .. External Functions ..
INTEGER IDAMAX INTEGER IDAMAX
@ -171,7 +168,7 @@
EXTERNAL DCOPY EXTERNAL DCOPY
* .. * ..
* .. Intrinsic Functions .. * .. Intrinsic Functions ..
INTRINSIC ABS, DBLE, NINT, SIGN INTRINSIC ABS, DBLE, NINT
* .. * ..
* .. Executable Statements .. * .. Executable Statements ..
* *
@ -199,7 +196,11 @@
EST = DASUM( N, X, 1 ) EST = DASUM( N, X, 1 )
* *
DO 30 I = 1, N DO 30 I = 1, N
X( I ) = SIGN( ONE, X( I ) ) IF( X(I).GE.ZERO ) THEN
X(I) = ONE
ELSE
X(I) = -ONE
END IF
ISGN( I ) = NINT( X( I ) ) ISGN( I ) = NINT( X( I ) )
30 CONTINUE 30 CONTINUE
KASE = 2 KASE = 2
@ -232,7 +233,12 @@
ESTOLD = EST ESTOLD = EST
EST = DASUM( N, V, 1 ) EST = DASUM( N, V, 1 )
DO 80 I = 1, N DO 80 I = 1, N
IF( NINT( SIGN( ONE, X( I ) ) ).NE.ISGN( I ) ) IF( X(I).GE.ZERO ) THEN
XS = ONE
ELSE
XS = -ONE
END IF
IF( NINT( XS ).NE.ISGN( I ) )
$ GO TO 90 $ GO TO 90
80 CONTINUE 80 CONTINUE
* REPEATED SIGN VECTOR DETECTED, HENCE ALGORITHM HAS CONVERGED. * REPEATED SIGN VECTOR DETECTED, HENCE ALGORITHM HAS CONVERGED.
@ -244,7 +250,11 @@
$ GO TO 120 $ GO TO 120
* *
DO 100 I = 1, N DO 100 I = 1, N
X( I ) = SIGN( ONE, X( I ) ) IF( X(I).GE.ZERO ) THEN
X(I) = ONE
ELSE
X(I) = -ONE
END IF
ISGN( I ) = NINT( X( I ) ) ISGN( I ) = NINT( X( I ) )
100 CONTINUE 100 CONTINUE
KASE = 2 KASE = 2

View File

@ -96,17 +96,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLACPY( UPLO, M, N, A, LDA, B, LDB ) SUBROUTINE DLACPY( UPLO, M, N, A, LDA, B, LDB )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -84,17 +84,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date January 2013
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLADIV( A, B, C, D, P, Q ) SUBROUTINE DLADIV( A, B, C, D, P, Q )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* January 2013
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION A, B, C, D, P, Q DOUBLE PRECISION A, B, C, D, P, Q
@ -178,10 +175,9 @@
SUBROUTINE DLADIV1( A, B, C, D, P, Q ) SUBROUTINE DLADIV1( A, B, C, D, P, Q )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* January 2013
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION A, B, C, D, P, Q DOUBLE PRECISION A, B, C, D, P, Q
@ -218,10 +214,9 @@
DOUBLE PRECISION FUNCTION DLADIV2( A, B, C, D, R, T ) DOUBLE PRECISION FUNCTION DLADIV2( A, B, C, D, R, T )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* January 2013
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION A, B, C, D, R, T DOUBLE PRECISION A, B, C, D, R, T
@ -251,6 +246,6 @@
* *
RETURN RETURN
* *
* End of DLADIV12 * End of DLADIV2
* *
END END

View File

@ -78,8 +78,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -102,10 +100,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLAE2( A, B, C, RT1, RT2 ) SUBROUTINE DLAE2( A, B, C, RT1, RT2 )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION A, B, C, RT1, RT2 DOUBLE PRECISION A, B, C, RT1, RT2

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED0 used by sstedc. Computes all eigenvalues and corresponding eigenvectors of an unreduced symmetric tridiagonal matrix using the divide and conquer method. *> \brief \b DLAED0 used by DSTEDC. Computes all eigenvalues and corresponding eigenvectors of an unreduced symmetric tridiagonal matrix using the divide and conquer method.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -158,8 +158,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -172,10 +170,9 @@
SUBROUTINE DLAED0( ICOMPQ, QSIZ, N, D, E, Q, LDQ, QSTORE, LDQS, SUBROUTINE DLAED0( ICOMPQ, QSIZ, N, D, E, Q, LDQ, QSTORE, LDQS,
$ WORK, IWORK, INFO ) $ WORK, IWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER ICOMPQ, INFO, LDQ, LDQS, N, QSIZ INTEGER ICOMPQ, INFO, LDQ, LDQS, N, QSIZ

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED1 used by sstedc. Computes the updated eigensystem of a diagonal matrix after modification by a rank-one symmetric matrix. Used when the original matrix is tridiagonal. *> \brief \b DLAED1 used by DSTEDC. Computes the updated eigensystem of a diagonal matrix after modification by a rank-one symmetric matrix. Used when the original matrix is tridiagonal.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -148,8 +148,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -163,10 +161,9 @@
SUBROUTINE DLAED1( N, D, Q, LDQ, INDXQ, RHO, CUTPNT, WORK, IWORK, SUBROUTINE DLAED1( N, D, Q, LDQ, INDXQ, RHO, CUTPNT, WORK, IWORK,
$ INFO ) $ INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER CUTPNT, INFO, LDQ, N INTEGER CUTPNT, INFO, LDQ, N

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED2 used by sstedc. Merges eigenvalues and deflates secular equation. Used when the original matrix is tridiagonal. *> \brief \b DLAED2 used by DSTEDC. Merges eigenvalues and deflates secular equation. Used when the original matrix is tridiagonal.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -197,8 +197,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -212,10 +210,9 @@
SUBROUTINE DLAED2( K, N, N1, D, Q, LDQ, INDXQ, RHO, Z, DLAMDA, W, SUBROUTINE DLAED2( K, N, N1, D, Q, LDQ, INDXQ, RHO, Z, DLAMDA, W,
$ Q2, INDX, INDXC, INDXP, COLTYP, INFO ) $ Q2, INDX, INDXC, INDXP, COLTYP, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDQ, N, N1 INTEGER INFO, K, LDQ, N, N1

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED3 used by sstedc. Finds the roots of the secular equation and updates the eigenvectors. Used when the original matrix is tridiagonal. *> \brief \b DLAED3 used by DSTEDC. Finds the roots of the secular equation and updates the eigenvectors. Used when the original matrix is tridiagonal.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -170,8 +170,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -185,10 +183,9 @@
SUBROUTINE DLAED3( K, N, N1, D, Q, LDQ, RHO, DLAMDA, Q2, INDX, SUBROUTINE DLAED3( K, N, N1, D, Q, LDQ, RHO, DLAMDA, Q2, INDX,
$ CTOT, W, S, INFO ) $ CTOT, W, S, INFO )
* *
* -- LAPACK computational routine (version 3.7.1) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDQ, N, N1 INTEGER INFO, K, LDQ, N, N1

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED4 used by sstedc. Finds a single root of the secular equation. *> \brief \b DLAED4 used by DSTEDC. Finds a single root of the secular equation.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -82,7 +82,7 @@
*> \param[out] DELTA *> \param[out] DELTA
*> \verbatim *> \verbatim
*> DELTA is DOUBLE PRECISION array, dimension (N) *> DELTA is DOUBLE PRECISION array, dimension (N)
*> If N .GT. 2, DELTA contains (D(j) - lambda_I) in its j-th *> If N > 2, DELTA contains (D(j) - lambda_I) in its j-th
*> component. If N = 1, then DELTA(1) = 1. If N = 2, see DLAED5 *> component. If N = 1, then DELTA(1) = 1. If N = 2, see DLAED5
*> for detail. The vector DELTA contains the information necessary *> for detail. The vector DELTA contains the information necessary
*> to construct the eigenvectors by DLAED3 and DLAED9. *> to construct the eigenvectors by DLAED3 and DLAED9.
@ -132,8 +132,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -145,10 +143,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLAED4( N, I, D, Z, DELTA, RHO, DLAM, INFO ) SUBROUTINE DLAED4( N, I, D, Z, DELTA, RHO, DLAM, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER I, INFO, N INTEGER I, INFO, N

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED5 used by sstedc. Solves the 2-by-2 secular equation. *> \brief \b DLAED5 used by DSTEDC. Solves the 2-by-2 secular equation.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -95,8 +95,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -108,10 +106,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLAED5( I, D, Z, DELTA, RHO, DLAM ) SUBROUTINE DLAED5( I, D, Z, DELTA, RHO, DLAM )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER I INTEGER I
@ -184,6 +181,6 @@
END IF END IF
RETURN RETURN
* *
* End OF DLAED5 * End of DLAED5
* *
END END

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED6 used by sstedc. Computes one Newton step in solution of the secular equation. *> \brief \b DLAED6 used by DSTEDC. Computes one Newton step in solution of the secular equation.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -115,8 +115,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -140,10 +138,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLAED6( KNITER, ORGATI, RHO, D, Z, FINIT, TAU, INFO ) SUBROUTINE DLAED6( KNITER, ORGATI, RHO, D, Z, FINIT, TAU, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
LOGICAL ORGATI LOGICAL ORGATI

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED7 used by sstedc. Computes the updated eigensystem of a diagonal matrix after modification by a rank-one symmetric matrix. Used when the original matrix is dense. *> \brief \b DLAED7 used by DSTEDC. Computes the updated eigensystem of a diagonal matrix after modification by a rank-one symmetric matrix. Used when the original matrix is dense.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -244,8 +244,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -260,10 +258,9 @@
$ PERM, GIVPTR, GIVCOL, GIVNUM, WORK, IWORK, $ PERM, GIVPTR, GIVCOL, GIVNUM, WORK, IWORK,
$ INFO ) $ INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER CURLVL, CURPBM, CUTPNT, ICOMPQ, INFO, LDQ, N, INTEGER CURLVL, CURPBM, CUTPNT, ICOMPQ, INFO, LDQ, N,

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED8 used by sstedc. Merges eigenvalues and deflates secular equation. Used when the original matrix is dense. *> \brief \b DLAED8 used by DSTEDC. Merges eigenvalues and deflates secular equation. Used when the original matrix is dense.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -228,8 +228,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -243,10 +241,9 @@
$ CUTPNT, Z, DLAMDA, Q2, LDQ2, W, PERM, GIVPTR, $ CUTPNT, Z, DLAMDA, Q2, LDQ2, W, PERM, GIVPTR,
$ GIVCOL, GIVNUM, INDXP, INDX, INFO ) $ GIVCOL, GIVNUM, INDXP, INDX, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER CUTPNT, GIVPTR, ICOMPQ, INFO, K, LDQ, LDQ2, N, INTEGER CUTPNT, GIVPTR, ICOMPQ, INFO, K, LDQ, LDQ2, N,

View File

@ -1,4 +1,4 @@
*> \brief \b DLAED9 used by sstedc. Finds the roots of the secular equation and updates the eigenvectors. Used when the original matrix is dense. *> \brief \b DLAED9 used by DSTEDC. Finds the roots of the secular equation and updates the eigenvectors. Used when the original matrix is dense.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -142,8 +142,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -156,10 +154,9 @@
SUBROUTINE DLAED9( K, KSTART, KSTOP, N, D, Q, LDQ, RHO, DLAMDA, W, SUBROUTINE DLAED9( K, KSTART, KSTOP, N, D, Q, LDQ, RHO, DLAMDA, W,
$ S, LDS, INFO ) $ S, LDS, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, KSTART, KSTOP, LDQ, LDS, N INTEGER INFO, K, KSTART, KSTOP, LDQ, LDS, N

View File

@ -1,4 +1,4 @@
*> \brief \b DLAEDA used by sstedc. Computes the Z vector determining the rank-one modification of the diagonal matrix. Used when the original matrix is dense. *> \brief \b DLAEDA used by DSTEDC. Computes the Z vector determining the rank-one modification of the diagonal matrix. Used when the original matrix is dense.
* *
* =========== DOCUMENTATION =========== * =========== DOCUMENTATION ===========
* *
@ -152,8 +152,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -166,10 +164,9 @@
SUBROUTINE DLAEDA( N, TLVLS, CURLVL, CURPBM, PRMPTR, PERM, GIVPTR, SUBROUTINE DLAEDA( N, TLVLS, CURLVL, CURPBM, PRMPTR, PERM, GIVPTR,
$ GIVCOL, GIVNUM, Q, QPTR, Z, ZTEMP, INFO ) $ GIVCOL, GIVNUM, Q, QPTR, Z, ZTEMP, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER CURLVL, CURPBM, INFO, N, TLVLS INTEGER CURLVL, CURPBM, INFO, N, TLVLS

View File

@ -94,8 +94,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -120,10 +118,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLAEV2( A, B, C, RT1, RT2, CS1, SN1 ) SUBROUTINE DLAEV2( A, B, C, RT1, RT2, CS1, SN1 )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION A, B, C, CS1, RT1, RT2, SN1 DOUBLE PRECISION A, B, C, CS1, RT1, RT2, SN1

View File

@ -67,17 +67,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
LOGICAL FUNCTION DLAISNAN( DIN1, DIN2 ) LOGICAL FUNCTION DLAISNAN( DIN1, DIN2 )
* *
* -- LAPACK auxiliary routine (version 3.7.1) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION, INTENT(IN) :: DIN1, DIN2 DOUBLE PRECISION, INTENT(IN) :: DIN1, DIN2

View File

@ -252,8 +252,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -268,10 +266,9 @@
$ PERM, GIVPTR, GIVCOL, LDGCOL, GIVNUM, LDGNUM, $ PERM, GIVPTR, GIVCOL, LDGCOL, GIVNUM, LDGNUM,
$ POLES, DIFL, DIFR, Z, K, C, S, WORK, INFO ) $ POLES, DIFL, DIFR, Z, K, C, S, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER GIVPTR, ICOMPQ, INFO, K, LDB, LDBX, LDGCOL, INTEGER GIVPTR, ICOMPQ, INFO, K, LDB, LDBX, LDGCOL,

View File

@ -43,7 +43,7 @@
*> *>
*> \verbatim *> \verbatim
*> *>
*> DLALSA is an intermediate step in solving the least squares problem *> DLALSA is an itermediate step in solving the least squares problem
*> by computing the SVD of the coefficient matrix in compact form (The *> by computing the SVD of the coefficient matrix in compact form (The
*> singular vectors are computed as products of simple orthorgonal *> singular vectors are computed as products of simple orthorgonal
*> matrices.). *> matrices.).
@ -250,8 +250,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -267,10 +265,9 @@
$ GIVCOL, LDGCOL, PERM, GIVNUM, C, S, WORK, $ GIVCOL, LDGCOL, PERM, GIVNUM, C, S, WORK,
$ IWORK, INFO ) $ IWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.1) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER ICOMPQ, INFO, LDB, LDBX, LDGCOL, LDU, N, NRHS, INTEGER ICOMPQ, INFO, LDB, LDBX, LDGCOL, LDU, N, NRHS,

View File

@ -164,8 +164,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
*> \par Contributors: *> \par Contributors:
@ -179,10 +177,9 @@
SUBROUTINE DLALSD( UPLO, SMLSIZ, N, NRHS, D, E, B, LDB, RCOND, SUBROUTINE DLALSD( UPLO, SMLSIZ, N, NRHS, D, E, B, LDB, RCOND,
$ RANK, WORK, IWORK, INFO ) $ RANK, WORK, IWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -92,17 +92,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLAMRG( N1, N2, A, DTRD1, DTRD2, INDEX ) SUBROUTINE DLAMRG( N1, N2, A, DTRD1, DTRD2, INDEX )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER DTRD1, DTRD2, N1, N2 INTEGER DTRD1, DTRD2, N1, N2

View File

@ -107,17 +107,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleGEauxiliary *> \ingroup doubleGEauxiliary
* *
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DLANGE( NORM, M, N, A, LDA, WORK ) DOUBLE PRECISION FUNCTION DLANGE( NORM, M, N, A, LDA, WORK )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER NORM CHARACTER NORM

View File

@ -93,17 +93,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DLANST( NORM, N, D, E ) DOUBLE PRECISION FUNCTION DLANST( NORM, N, D, E )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER NORM CHARACTER NORM

View File

@ -115,17 +115,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleSYauxiliary *> \ingroup doubleSYauxiliary
* *
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DLANSY( NORM, UPLO, N, A, LDA, WORK ) DOUBLE PRECISION FUNCTION DLANSY( NORM, UPLO, N, A, LDA, WORK )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER NORM, UPLO CHARACTER NORM, UPLO

View File

@ -31,7 +31,7 @@
*> \verbatim *> \verbatim
*> *>
*> DLAPY2 returns sqrt(x**2+y**2), taking care not to cause unnecessary *> DLAPY2 returns sqrt(x**2+y**2), taking care not to cause unnecessary
*> overflow. *> overflow and unnecessary underflow.
*> \endverbatim *> \endverbatim
* *
* Arguments: * Arguments:
@ -56,17 +56,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DLAPY2( X, Y ) DOUBLE PRECISION FUNCTION DLAPY2( X, Y )
* *
* -- LAPACK auxiliary routine (version 3.7.1) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION X, Y DOUBLE PRECISION X, Y
@ -81,13 +78,16 @@
PARAMETER ( ONE = 1.0D0 ) PARAMETER ( ONE = 1.0D0 )
* .. * ..
* .. Local Scalars .. * .. Local Scalars ..
DOUBLE PRECISION W, XABS, YABS, Z DOUBLE PRECISION W, XABS, YABS, Z, HUGEVAL
LOGICAL X_IS_NAN, Y_IS_NAN LOGICAL X_IS_NAN, Y_IS_NAN
* .. * ..
* .. External Functions .. * .. External Functions ..
LOGICAL DISNAN LOGICAL DISNAN
EXTERNAL DISNAN EXTERNAL DISNAN
* .. * ..
* .. External Subroutines ..
DOUBLE PRECISION DLAMCH
* ..
* .. Intrinsic Functions .. * .. Intrinsic Functions ..
INTRINSIC ABS, MAX, MIN, SQRT INTRINSIC ABS, MAX, MIN, SQRT
* .. * ..
@ -97,13 +97,14 @@
Y_IS_NAN = DISNAN( Y ) Y_IS_NAN = DISNAN( Y )
IF ( X_IS_NAN ) DLAPY2 = X IF ( X_IS_NAN ) DLAPY2 = X
IF ( Y_IS_NAN ) DLAPY2 = Y IF ( Y_IS_NAN ) DLAPY2 = Y
HUGEVAL = DLAMCH( 'Overflow' )
* *
IF ( .NOT.( X_IS_NAN.OR.Y_IS_NAN ) ) THEN IF ( .NOT.( X_IS_NAN.OR.Y_IS_NAN ) ) THEN
XABS = ABS( X ) XABS = ABS( X )
YABS = ABS( Y ) YABS = ABS( Y )
W = MAX( XABS, YABS ) W = MAX( XABS, YABS )
Z = MIN( XABS, YABS ) Z = MIN( XABS, YABS )
IF( Z.EQ.ZERO ) THEN IF( Z.EQ.ZERO .OR. W.GT.HUGEVAL ) THEN
DLAPY2 = W DLAPY2 = W
ELSE ELSE
DLAPY2 = W*SQRT( ONE+( Z / W )**2 ) DLAPY2 = W*SQRT( ONE+( Z / W )**2 )

View File

@ -31,7 +31,7 @@
*> \verbatim *> \verbatim
*> *>
*> DLAPY3 returns sqrt(x**2+y**2+z**2), taking care not to cause *> DLAPY3 returns sqrt(x**2+y**2+z**2), taking care not to cause
*> unnecessary overflow. *> unnecessary overflow and unnecessary underflow.
*> \endverbatim *> \endverbatim
* *
* Arguments: * Arguments:
@ -61,17 +61,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
DOUBLE PRECISION FUNCTION DLAPY3( X, Y, Z ) DOUBLE PRECISION FUNCTION DLAPY3( X, Y, Z )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION X, Y, Z DOUBLE PRECISION X, Y, Z
@ -84,18 +81,22 @@
PARAMETER ( ZERO = 0.0D0 ) PARAMETER ( ZERO = 0.0D0 )
* .. * ..
* .. Local Scalars .. * .. Local Scalars ..
DOUBLE PRECISION W, XABS, YABS, ZABS DOUBLE PRECISION W, XABS, YABS, ZABS, HUGEVAL
* ..
* .. External Subroutines ..
DOUBLE PRECISION DLAMCH
* .. * ..
* .. Intrinsic Functions .. * .. Intrinsic Functions ..
INTRINSIC ABS, MAX, SQRT INTRINSIC ABS, MAX, SQRT
* .. * ..
* .. Executable Statements .. * .. Executable Statements ..
* *
HUGEVAL = DLAMCH( 'Overflow' )
XABS = ABS( X ) XABS = ABS( X )
YABS = ABS( Y ) YABS = ABS( Y )
ZABS = ABS( Z ) ZABS = ABS( Z )
W = MAX( XABS, YABS, ZABS ) W = MAX( XABS, YABS, ZABS )
IF( W.EQ.ZERO ) THEN IF( W.EQ.ZERO .OR. W.GT.HUGEVAL ) THEN
* W can be zero for max(0,nan,0) * W can be zero for max(0,nan,0)
* adding all three entries together will make sure * adding all three entries together will make sure
* NaN will not disappear. * NaN will not disappear.

View File

@ -117,17 +117,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLARF( SIDE, M, N, V, INCV, TAU, C, LDC, WORK ) SUBROUTINE DLARF( SIDE, M, N, V, INCV, TAU, C, LDC, WORK )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE CHARACTER SIDE

View File

@ -92,6 +92,8 @@
*> K is INTEGER *> K is INTEGER
*> The order of the matrix T (= the number of elementary *> The order of the matrix T (= the number of elementary
*> reflectors whose product defines the block reflector). *> reflectors whose product defines the block reflector).
*> If SIDE = 'L', M >= K >= 0;
*> if SIDE = 'R', N >= K >= 0.
*> \endverbatim *> \endverbatim
*> *>
*> \param[in] V *> \param[in] V
@ -159,8 +161,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2013
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -195,10 +195,9 @@
SUBROUTINE DLARFB( SIDE, TRANS, DIRECT, STOREV, M, N, K, V, LDV, SUBROUTINE DLARFB( SIDE, TRANS, DIRECT, STOREV, M, N, K, V, LDV,
$ T, LDT, C, LDC, WORK, LDWORK ) $ T, LDT, C, LDC, WORK, LDWORK )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2013
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER DIRECT, SIDE, STOREV, TRANS CHARACTER DIRECT, SIDE, STOREV, TRANS

View File

@ -99,17 +99,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLARFG( N, ALPHA, X, INCX, TAU ) SUBROUTINE DLARFG( N, ALPHA, X, INCX, TAU )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INCX, N INTEGER INCX, N
@ -170,7 +167,7 @@
CALL DSCAL( N-1, RSAFMN, X, INCX ) CALL DSCAL( N-1, RSAFMN, X, INCX )
BETA = BETA*RSAFMN BETA = BETA*RSAFMN
ALPHA = ALPHA*RSAFMN ALPHA = ALPHA*RSAFMN
IF( ABS( BETA ).LT.SAFMIN ) IF( (ABS( BETA ).LT.SAFMIN) .AND. (KNT .LT. 20) )
$ GO TO 10 $ GO TO 10
* *
* New BETA is at most 1, at least SAFMIN * New BETA is at most 1, at least SAFMIN

View File

@ -130,8 +130,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -163,10 +161,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLARFT( DIRECT, STOREV, N, K, V, LDV, TAU, T, LDT ) SUBROUTINE DLARFT( DIRECT, STOREV, N, K, V, LDV, TAU, T, LDT )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER DIRECT, STOREV CHARACTER DIRECT, STOREV

View File

@ -78,8 +78,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -107,10 +105,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLAS2( F, G, H, SSMIN, SSMAX ) SUBROUTINE DLAS2( F, G, H, SSMIN, SSMAX )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION F, G, H, SSMAX, SSMIN DOUBLE PRECISION F, G, H, SSMAX, SSMIN

View File

@ -136,17 +136,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLASCL( TYPE, KL, KU, CFROM, CTO, M, N, A, LDA, INFO ) SUBROUTINE DLASCL( TYPE, KL, KU, CFROM, CTO, M, N, A, LDA, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER TYPE CHARACTER TYPE

View File

@ -140,8 +140,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -153,10 +151,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLASD4( N, I, D, Z, DELTA, RHO, SIGMA, WORK, INFO ) SUBROUTINE DLASD4( N, I, D, Z, DELTA, RHO, SIGMA, WORK, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER I, INFO, N INTEGER I, INFO, N

View File

@ -103,8 +103,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -116,10 +114,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLASD5( I, D, Z, DELTA, RHO, DSIGMA, WORK ) SUBROUTINE DLASD5( I, D, Z, DELTA, RHO, DSIGMA, WORK )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER I INTEGER I

View File

@ -297,8 +297,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -313,10 +311,9 @@
$ LDGNUM, POLES, DIFL, DIFR, Z, K, C, S, WORK, $ LDGNUM, POLES, DIFL, DIFR, Z, K, C, S, WORK,
$ IWORK, INFO ) $ IWORK, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER GIVPTR, ICOMPQ, INFO, K, LDGCOL, LDGNUM, NL, INTEGER GIVPTR, ICOMPQ, INFO, K, LDGCOL, LDGNUM, NL,

View File

@ -264,8 +264,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -280,10 +278,9 @@
$ PERM, GIVPTR, GIVCOL, LDGCOL, GIVNUM, LDGNUM, $ PERM, GIVPTR, GIVCOL, LDGCOL, GIVNUM, LDGNUM,
$ C, S, INFO ) $ C, S, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER GIVPTR, ICOMPQ, INFO, K, LDGCOL, LDGNUM, NL, INTEGER GIVPTR, ICOMPQ, INFO, K, LDGCOL, LDGNUM, NL,

View File

@ -152,8 +152,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -166,10 +164,9 @@
SUBROUTINE DLASD8( ICOMPQ, K, D, Z, VF, VL, DIFL, DIFR, LDDIFR, SUBROUTINE DLASD8( ICOMPQ, K, D, Z, VF, VL, DIFL, DIFR, LDDIFR,
$ DSIGMA, WORK, INFO ) $ DSIGMA, WORK, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.1) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER ICOMPQ, INFO, K, LDDIFR INTEGER ICOMPQ, INFO, K, LDDIFR

View File

@ -258,8 +258,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -273,10 +271,9 @@
$ DIFL, DIFR, Z, POLES, GIVPTR, GIVCOL, LDGCOL, $ DIFL, DIFR, Z, POLES, GIVPTR, GIVCOL, LDGCOL,
$ PERM, GIVNUM, C, S, WORK, IWORK, INFO ) $ PERM, GIVNUM, C, S, WORK, IWORK, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.1) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER ICOMPQ, INFO, LDGCOL, LDU, N, SMLSIZ, SQRE INTEGER ICOMPQ, INFO, LDGCOL, LDU, N, SMLSIZ, SQRE

View File

@ -197,8 +197,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -211,10 +209,9 @@
SUBROUTINE DLASDQ( UPLO, SQRE, N, NCVT, NRU, NCC, D, E, VT, LDVT, SUBROUTINE DLASDQ( UPLO, SQRE, N, NCVT, NRU, NCC, D, E, VT, LDVT,
$ U, LDU, C, LDC, WORK, INFO ) $ U, LDU, C, LDC, WORK, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -92,8 +92,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Contributors: *> \par Contributors:
@ -105,10 +103,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLASDT( N, LVL, ND, INODE, NDIML, NDIMR, MSUB ) SUBROUTINE DLASDT( N, LVL, ND, INODE, NDIML, NDIMR, MSUB )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER LVL, MSUB, N, ND INTEGER LVL, MSUB, N, ND

View File

@ -103,17 +103,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLASET( UPLO, M, N, ALPHA, BETA, A, LDA ) SUBROUTINE DLASET( UPLO, M, N, ALPHA, BETA, A, LDA )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -101,17 +101,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLASQ1( N, D, E, WORK, INFO ) SUBROUTINE DLASQ1( N, D, E, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, N INTEGER INFO, N

View File

@ -95,8 +95,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -112,10 +110,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLASQ2( N, Z, INFO ) SUBROUTINE DLASQ2( N, Z, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, N INTEGER INFO, N
@ -184,10 +181,18 @@
* *
* 2-by-2 case. * 2-by-2 case.
* *
IF( Z( 2 ).LT.ZERO .OR. Z( 3 ).LT.ZERO ) THEN IF( Z( 1 ).LT.ZERO ) THEN
INFO = -2 INFO = -201
CALL XERBLA( 'DLASQ2', 2 ) CALL XERBLA( 'DLASQ2', 2 )
RETURN RETURN
ELSE IF( Z( 2 ).LT.ZERO ) THEN
INFO = -202
CALL XERBLA( 'DLASQ2', 2 )
RETURN
ELSE IF( Z( 3 ).LT.ZERO ) THEN
INFO = -203
CALL XERBLA( 'DLASQ2', 2 )
RETURN
ELSE IF( Z( 3 ).GT.Z( 1 ) ) THEN ELSE IF( Z( 3 ).GT.Z( 1 ) ) THEN
D = Z( 3 ) D = Z( 3 )
Z( 3 ) = Z( 1 ) Z( 3 ) = Z( 1 )
@ -267,8 +272,7 @@
* *
* Check whether the machine is IEEE conformable. * Check whether the machine is IEEE conformable.
* *
IEEE = ILAENV( 10, 'DLASQ2', 'N', 1, 2, 3, 4 ).EQ.1 .AND. IEEE = ( ILAENV( 10, 'DLASQ2', 'N', 1, 2, 3, 4 ).EQ.1 )
$ ILAENV( 11, 'DLASQ2', 'N', 1, 2, 3, 4 ).EQ.1
* *
* Rearrange data for locality: Z=(q1,qq1,e1,ee1,q2,qq2,e2,ee2,...). * Rearrange data for locality: Z=(q1,qq1,e1,ee1,q2,qq2,e2,ee2,...).
* *

View File

@ -173,8 +173,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
* ===================================================================== * =====================================================================
@ -182,10 +180,9 @@
$ ITER, NDIV, IEEE, TTYPE, DMIN1, DMIN2, DN, DN1, $ ITER, NDIV, IEEE, TTYPE, DMIN1, DMIN2, DN, DN1,
$ DN2, G, TAU ) $ DN2, G, TAU )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
LOGICAL IEEE LOGICAL IEEE

View File

@ -135,8 +135,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
*> \par Further Details: *> \par Further Details:
@ -151,10 +149,9 @@
SUBROUTINE DLASQ4( I0, N0, Z, PP, N0IN, DMIN, DMIN1, DMIN2, DN, SUBROUTINE DLASQ4( I0, N0, Z, PP, N0IN, DMIN, DMIN1, DMIN2, DN,
$ DN1, DN2, TAU, TTYPE, G ) $ DN1, DN2, TAU, TTYPE, G )
* *
* -- LAPACK computational routine (version 3.7.1) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER I0, N0, N0IN, PP, TTYPE INTEGER I0, N0, N0IN, PP, TTYPE

View File

@ -136,18 +136,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLASQ5( I0, N0, Z, PP, TAU, SIGMA, DMIN, DMIN1, DMIN2, SUBROUTINE DLASQ5( I0, N0, Z, PP, TAU, SIGMA, DMIN, DMIN1, DMIN2,
$ DN, DNM1, DNM2, IEEE, EPS ) $ DN, DNM1, DNM2, IEEE, EPS )
* *
* -- LAPACK computational routine (version 3.7.1) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
LOGICAL IEEE LOGICAL IEEE

View File

@ -111,18 +111,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLASQ6( I0, N0, Z, PP, DMIN, DMIN1, DMIN2, DN, SUBROUTINE DLASQ6( I0, N0, Z, PP, DMIN, DMIN1, DMIN2, DN,
$ DNM1, DNM2 ) $ DNM1, DNM2 )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER I0, N0, PP INTEGER I0, N0, PP

View File

@ -175,7 +175,7 @@
*> \verbatim *> \verbatim
*> A is DOUBLE PRECISION array, dimension (LDA,N) *> A is DOUBLE PRECISION array, dimension (LDA,N)
*> The M-by-N matrix A. On exit, A is overwritten by P*A if *> The M-by-N matrix A. On exit, A is overwritten by P*A if
*> SIDE = 'R' or by A*P**T if SIDE = 'L'. *> SIDE = 'L' or by A*P**T if SIDE = 'R'.
*> \endverbatim *> \endverbatim
*> *>
*> \param[in] LDA *> \param[in] LDA
@ -192,17 +192,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLASR( SIDE, PIVOT, DIRECT, M, N, C, S, A, LDA ) SUBROUTINE DLASR( SIDE, PIVOT, DIRECT, M, N, C, S, A, LDA )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER DIRECT, PIVOT, SIDE CHARACTER DIRECT, PIVOT, SIDE

View File

@ -81,17 +81,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2016
*
*> \ingroup auxOTHERcomputational *> \ingroup auxOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DLASRT( ID, N, D, INFO ) SUBROUTINE DLASRT( ID, N, D, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER ID CHARACTER ID

View File

@ -107,8 +107,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup OTHERauxiliary *> \ingroup OTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -138,10 +136,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLASV2( F, G, H, SSMIN, SSMAX, SNR, CSR, SNL, CSL ) SUBROUTINE DLASV2( F, G, H, SSMIN, SSMAX, SNR, CSR, SNL, CSL )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
DOUBLE PRECISION CSL, CSR, F, G, H, SNL, SNR, SSMAX, SSMIN DOUBLE PRECISION CSL, CSR, F, G, H, SNL, SNR, SSMAX, SSMIN

View File

@ -99,8 +99,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date June 2017
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -115,10 +113,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLASWP( N, A, LDA, K1, K2, IPIV, INCX ) SUBROUTINE DLASWP( N, A, LDA, K1, K2, IPIV, INCX )
* *
* -- LAPACK auxiliary routine (version 3.7.1) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* June 2017
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INCX, K1, K2, LDA, N INTEGER INCX, K1, K2, LDA, N

View File

@ -139,8 +139,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -198,10 +196,9 @@
* ===================================================================== * =====================================================================
SUBROUTINE DLATRD( UPLO, N, NB, A, LDA, E, TAU, W, LDW ) SUBROUTINE DLATRD( UPLO, N, NB, A, LDA, E, TAU, W, LDW )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -158,8 +158,6 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERauxiliary *> \ingroup doubleOTHERauxiliary
* *
*> \par Further Details: *> \par Further Details:
@ -238,10 +236,9 @@
SUBROUTINE DLATRS( UPLO, TRANS, DIAG, NORMIN, N, A, LDA, X, SCALE, SUBROUTINE DLATRS( UPLO, TRANS, DIAG, NORMIN, N, A, LDA, X, SCALE,
$ CNORM, INFO ) $ CNORM, INFO )
* *
* -- LAPACK auxiliary routine (version 3.7.0) -- * -- LAPACK auxiliary routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER DIAG, NORMIN, TRANS, UPLO CHARACTER DIAG, NORMIN, TRANS, UPLO

View File

@ -107,17 +107,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORG2L( M, N, K, A, LDA, TAU, WORK, INFO ) SUBROUTINE DORG2L( M, N, K, A, LDA, TAU, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDA, M, N INTEGER INFO, K, LDA, M, N

View File

@ -107,17 +107,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORG2R( M, N, K, A, LDA, TAU, WORK, INFO ) SUBROUTINE DORG2R( M, N, K, A, LDA, TAU, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDA, M, N INTEGER INFO, K, LDA, M, N

View File

@ -150,17 +150,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date April 2012
*
*> \ingroup doubleGBcomputational *> \ingroup doubleGBcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORGBR( VECT, M, N, K, A, LDA, TAU, WORK, LWORK, INFO ) SUBROUTINE DORGBR( VECT, M, N, K, A, LDA, TAU, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* April 2012
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER VECT CHARACTER VECT
@ -221,8 +218,8 @@
CALL DORGQR( M, N, K, A, LDA, TAU, WORK, -1, IINFO ) CALL DORGQR( M, N, K, A, LDA, TAU, WORK, -1, IINFO )
ELSE ELSE
IF( M.GT.1 ) THEN IF( M.GT.1 ) THEN
CALL DORGQR( M-1, M-1, M-1, A( 2, 2 ), LDA, TAU, WORK, CALL DORGQR( M-1, M-1, M-1, A, LDA, TAU, WORK, -1,
$ -1, IINFO ) $ IINFO )
END IF END IF
END IF END IF
ELSE ELSE
@ -230,8 +227,8 @@
CALL DORGLQ( M, N, K, A, LDA, TAU, WORK, -1, IINFO ) CALL DORGLQ( M, N, K, A, LDA, TAU, WORK, -1, IINFO )
ELSE ELSE
IF( N.GT.1 ) THEN IF( N.GT.1 ) THEN
CALL DORGLQ( N-1, N-1, N-1, A( 2, 2 ), LDA, TAU, WORK, CALL DORGLQ( N-1, N-1, N-1, A, LDA, TAU, WORK, -1,
$ -1, IINFO ) $ IINFO )
END IF END IF
END IF END IF
END IF END IF

View File

@ -106,17 +106,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORGL2( M, N, K, A, LDA, TAU, WORK, INFO ) SUBROUTINE DORGL2( M, N, K, A, LDA, TAU, WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDA, M, N INTEGER INFO, K, LDA, M, N

View File

@ -120,17 +120,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORGLQ( M, N, K, A, LDA, TAU, WORK, LWORK, INFO ) SUBROUTINE DORGLQ( M, N, K, A, LDA, TAU, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDA, LWORK, M, N INTEGER INFO, K, LDA, LWORK, M, N

View File

@ -121,17 +121,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORGQL( M, N, K, A, LDA, TAU, WORK, LWORK, INFO ) SUBROUTINE DORGQL( M, N, K, A, LDA, TAU, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDA, LWORK, M, N INTEGER INFO, K, LDA, LWORK, M, N

View File

@ -121,17 +121,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORGQR( M, N, K, A, LDA, TAU, WORK, LWORK, INFO ) SUBROUTINE DORGQR( M, N, K, A, LDA, TAU, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
INTEGER INFO, K, LDA, LWORK, M, N INTEGER INFO, K, LDA, LWORK, M, N

View File

@ -116,17 +116,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORGTR( UPLO, N, A, LDA, TAU, WORK, LWORK, INFO ) SUBROUTINE DORGTR( UPLO, N, A, LDA, TAU, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -151,18 +151,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORM2L( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, SUBROUTINE DORM2L( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC,
$ WORK, INFO ) $ WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS CHARACTER SIDE, TRANS

View File

@ -151,18 +151,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORM2R( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, SUBROUTINE DORM2R( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC,
$ WORK, INFO ) $ WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS CHARACTER SIDE, TRANS

View File

@ -187,18 +187,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORMBR( VECT, SIDE, TRANS, M, N, K, A, LDA, TAU, C, SUBROUTINE DORMBR( VECT, SIDE, TRANS, M, N, K, A, LDA, TAU, C,
$ LDC, WORK, LWORK, INFO ) $ LDC, WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS, VECT CHARACTER SIDE, TRANS, VECT
@ -240,10 +237,10 @@
* *
IF( LEFT ) THEN IF( LEFT ) THEN
NQ = M NQ = M
NW = N NW = MAX( 1, N )
ELSE ELSE
NQ = N NQ = N
NW = M NW = MAX( 1, M )
END IF END IF
IF( .NOT.APPLYQ .AND. .NOT.LSAME( VECT, 'P' ) ) THEN IF( .NOT.APPLYQ .AND. .NOT.LSAME( VECT, 'P' ) ) THEN
INFO = -1 INFO = -1
@ -263,7 +260,7 @@
INFO = -8 INFO = -8
ELSE IF( LDC.LT.MAX( 1, M ) ) THEN ELSE IF( LDC.LT.MAX( 1, M ) ) THEN
INFO = -11 INFO = -11
ELSE IF( LWORK.LT.MAX( 1, NW ) .AND. .NOT.LQUERY ) THEN ELSE IF( LWORK.LT.NW .AND. .NOT.LQUERY ) THEN
INFO = -13 INFO = -13
END IF END IF
* *
@ -285,7 +282,7 @@
$ -1 ) $ -1 )
END IF END IF
END IF END IF
LWKOPT = MAX( 1, NW )*NB LWKOPT = NW*NB
WORK( 1 ) = LWKOPT WORK( 1 ) = LWKOPT
END IF END IF
* *

View File

@ -151,18 +151,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORML2( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, SUBROUTINE DORML2( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC,
$ WORK, INFO ) $ WORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS CHARACTER SIDE, TRANS

View File

@ -159,18 +159,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORMLQ( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, SUBROUTINE DORMLQ( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC,
$ WORK, LWORK, INFO ) $ WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS CHARACTER SIDE, TRANS
@ -217,10 +214,10 @@
* *
IF( LEFT ) THEN IF( LEFT ) THEN
NQ = M NQ = M
NW = N NW = MAX( 1, N )
ELSE ELSE
NQ = N NQ = N
NW = M NW = MAX( 1, M )
END IF END IF
IF( .NOT.LEFT .AND. .NOT.LSAME( SIDE, 'R' ) ) THEN IF( .NOT.LEFT .AND. .NOT.LSAME( SIDE, 'R' ) ) THEN
INFO = -1 INFO = -1
@ -236,7 +233,7 @@
INFO = -7 INFO = -7
ELSE IF( LDC.LT.MAX( 1, M ) ) THEN ELSE IF( LDC.LT.MAX( 1, M ) ) THEN
INFO = -10 INFO = -10
ELSE IF( LWORK.LT.MAX( 1, NW ) .AND. .NOT.LQUERY ) THEN ELSE IF( LWORK.LT.NW .AND. .NOT.LQUERY ) THEN
INFO = -12 INFO = -12
END IF END IF
* *
@ -246,7 +243,7 @@
* *
NB = MIN( NBMAX, ILAENV( 1, 'DORMLQ', SIDE // TRANS, M, N, K, NB = MIN( NBMAX, ILAENV( 1, 'DORMLQ', SIDE // TRANS, M, N, K,
$ -1 ) ) $ -1 ) )
LWKOPT = MAX( 1, NW )*NB + TSIZE LWKOPT = NW*NB + TSIZE
WORK( 1 ) = LWKOPT WORK( 1 ) = LWKOPT
END IF END IF
* *
@ -267,7 +264,7 @@
NBMIN = 2 NBMIN = 2
LDWORK = NW LDWORK = NW
IF( NB.GT.1 .AND. NB.LT.K ) THEN IF( NB.GT.1 .AND. NB.LT.K ) THEN
IF( LWORK.LT.NW*NB+TSIZE ) THEN IF( LWORK.LT.LWKOPT ) THEN
NB = (LWORK-TSIZE) / LDWORK NB = (LWORK-TSIZE) / LDWORK
NBMIN = MAX( 2, ILAENV( 2, 'DORMLQ', SIDE // TRANS, M, N, K, NBMIN = MAX( 2, ILAENV( 2, 'DORMLQ', SIDE // TRANS, M, N, K,
$ -1 ) ) $ -1 ) )

View File

@ -159,18 +159,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORMQL( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, SUBROUTINE DORMQL( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC,
$ WORK, LWORK, INFO ) $ WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS CHARACTER SIDE, TRANS
@ -269,7 +266,7 @@
NBMIN = 2 NBMIN = 2
LDWORK = NW LDWORK = NW
IF( NB.GT.1 .AND. NB.LT.K ) THEN IF( NB.GT.1 .AND. NB.LT.K ) THEN
IF( LWORK.LT.NW*NB+TSIZE ) THEN IF( LWORK.LT.LWKOPT ) THEN
NB = (LWORK-TSIZE) / LDWORK NB = (LWORK-TSIZE) / LDWORK
NBMIN = MAX( 2, ILAENV( 2, 'DORMQL', SIDE // TRANS, M, N, K, NBMIN = MAX( 2, ILAENV( 2, 'DORMQL', SIDE // TRANS, M, N, K,
$ -1 ) ) $ -1 ) )

View File

@ -159,18 +159,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORMQR( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC, SUBROUTINE DORMQR( SIDE, TRANS, M, N, K, A, LDA, TAU, C, LDC,
$ WORK, LWORK, INFO ) $ WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS CHARACTER SIDE, TRANS
@ -216,10 +213,10 @@
* *
IF( LEFT ) THEN IF( LEFT ) THEN
NQ = M NQ = M
NW = N NW = MAX( 1, N )
ELSE ELSE
NQ = N NQ = N
NW = M NW = MAX( 1, M )
END IF END IF
IF( .NOT.LEFT .AND. .NOT.LSAME( SIDE, 'R' ) ) THEN IF( .NOT.LEFT .AND. .NOT.LSAME( SIDE, 'R' ) ) THEN
INFO = -1 INFO = -1
@ -235,7 +232,7 @@
INFO = -7 INFO = -7
ELSE IF( LDC.LT.MAX( 1, M ) ) THEN ELSE IF( LDC.LT.MAX( 1, M ) ) THEN
INFO = -10 INFO = -10
ELSE IF( LWORK.LT.MAX( 1, NW ) .AND. .NOT.LQUERY ) THEN ELSE IF( LWORK.LT.NW .AND. .NOT.LQUERY ) THEN
INFO = -12 INFO = -12
END IF END IF
* *
@ -245,7 +242,7 @@
* *
NB = MIN( NBMAX, ILAENV( 1, 'DORMQR', SIDE // TRANS, M, N, K, NB = MIN( NBMAX, ILAENV( 1, 'DORMQR', SIDE // TRANS, M, N, K,
$ -1 ) ) $ -1 ) )
LWKOPT = MAX( 1, NW )*NB + TSIZE LWKOPT = NW*NB + TSIZE
WORK( 1 ) = LWKOPT WORK( 1 ) = LWKOPT
END IF END IF
* *
@ -266,7 +263,7 @@
NBMIN = 2 NBMIN = 2
LDWORK = NW LDWORK = NW
IF( NB.GT.1 .AND. NB.LT.K ) THEN IF( NB.GT.1 .AND. NB.LT.K ) THEN
IF( LWORK.LT.NW*NB+TSIZE ) THEN IF( LWORK.LT.LWKOPT ) THEN
NB = (LWORK-TSIZE) / LDWORK NB = (LWORK-TSIZE) / LDWORK
NBMIN = MAX( 2, ILAENV( 2, 'DORMQR', SIDE // TRANS, M, N, K, NBMIN = MAX( 2, ILAENV( 2, 'DORMQR', SIDE // TRANS, M, N, K,
$ -1 ) ) $ -1 ) )

View File

@ -163,18 +163,15 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doubleOTHERcomputational *> \ingroup doubleOTHERcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DORMTR( SIDE, UPLO, TRANS, M, N, A, LDA, TAU, C, LDC, SUBROUTINE DORMTR( SIDE, UPLO, TRANS, M, N, A, LDA, TAU, C, LDC,
$ WORK, LWORK, INFO ) $ WORK, LWORK, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER SIDE, TRANS, UPLO CHARACTER SIDE, TRANS, UPLO
@ -214,10 +211,10 @@
* *
IF( LEFT ) THEN IF( LEFT ) THEN
NQ = M NQ = M
NW = N NW = MAX( 1, N )
ELSE ELSE
NQ = N NQ = N
NW = M NW = MAX( 1, M )
END IF END IF
IF( .NOT.LEFT .AND. .NOT.LSAME( SIDE, 'R' ) ) THEN IF( .NOT.LEFT .AND. .NOT.LSAME( SIDE, 'R' ) ) THEN
INFO = -1 INFO = -1
@ -234,7 +231,7 @@
INFO = -7 INFO = -7
ELSE IF( LDC.LT.MAX( 1, M ) ) THEN ELSE IF( LDC.LT.MAX( 1, M ) ) THEN
INFO = -10 INFO = -10
ELSE IF( LWORK.LT.MAX( 1, NW ) .AND. .NOT.LQUERY ) THEN ELSE IF( LWORK.LT.NW .AND. .NOT.LQUERY ) THEN
INFO = -12 INFO = -12
END IF END IF
* *
@ -256,7 +253,7 @@
$ -1 ) $ -1 )
END IF END IF
END IF END IF
LWKOPT = MAX( 1, NW )*NB LWKOPT = NW*NB
WORK( 1 ) = LWKOPT WORK( 1 ) = LWKOPT
END IF END IF
* *

View File

@ -102,17 +102,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doublePOcomputational *> \ingroup doublePOcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DPOTF2( UPLO, N, A, LDA, INFO ) SUBROUTINE DPOTF2( UPLO, N, A, LDA, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -100,17 +100,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doublePOcomputational *> \ingroup doublePOcomputational
* *
* ===================================================================== * =====================================================================
SUBROUTINE DPOTRF( UPLO, N, A, LDA, INFO ) SUBROUTINE DPOTRF( UPLO, N, A, LDA, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

View File

@ -99,17 +99,14 @@
*> \author Univ. of Colorado Denver *> \author Univ. of Colorado Denver
*> \author NAG Ltd. *> \author NAG Ltd.
* *
*> \date December 2016
*
*> \ingroup doublePOcomputational *> \ingroup doublePOcomputational
* *
* ===================================================================== * =====================================================================
RECURSIVE SUBROUTINE DPOTRF2( UPLO, N, A, LDA, INFO ) RECURSIVE SUBROUTINE DPOTRF2( UPLO, N, A, LDA, INFO )
* *
* -- LAPACK computational routine (version 3.7.0) -- * -- LAPACK computational routine --
* -- LAPACK is a software package provided by Univ. of Tennessee, -- * -- LAPACK is a software package provided by Univ. of Tennessee, --
* -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..-- * -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
* December 2016
* *
* .. Scalar Arguments .. * .. Scalar Arguments ..
CHARACTER UPLO CHARACTER UPLO

Some files were not shown because too many files have changed in this diff Show More