Skip to content
Merged
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
The table of contents is too big for display.
Diff view
Diff view
  •  
  •  
  •  
The diff you're trying to view is too large. We only load the first 3000 changed files.
1 change: 1 addition & 0 deletions BLAS/SRC/caxpy.f
Original file line number Diff line number Diff line change
Expand Up @@ -85,6 +85,7 @@
*>
* =====================================================================
SUBROUTINE CAXPY(N,CA,CX,INCX,CY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ccopy.f
Original file line number Diff line number Diff line change
Expand Up @@ -78,6 +78,7 @@
*>
* =====================================================================
SUBROUTINE CCOPY(N,CX,INCX,CY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cdotc.f
Original file line number Diff line number Diff line change
Expand Up @@ -80,6 +80,7 @@
*>
* =====================================================================
COMPLEX FUNCTION CDOTC(N,CX,INCX,CY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cdotu.f
Original file line number Diff line number Diff line change
Expand Up @@ -80,6 +80,7 @@
*>
* =====================================================================
COMPLEX FUNCTION CDOTU(N,CX,INCX,CY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cgbmv.f
Original file line number Diff line number Diff line change
Expand Up @@ -187,6 +187,7 @@
* =====================================================================
SUBROUTINE CGBMV(TRANS,M,N,KL,KU,ALPHA,A,LDA,X,INCX,
+ BETA,Y,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cgemm.f
Original file line number Diff line number Diff line change
Expand Up @@ -206,6 +206,7 @@
* =====================================================================
SUBROUTINE CGEMM(TRANSA,TRANSB,M,N,K,ALPHA,A,LDA,B,LDB,
+ BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cgemv.f
Original file line number Diff line number Diff line change
Expand Up @@ -157,6 +157,7 @@
*>
* =====================================================================
SUBROUTINE CGEMV(TRANS,M,N,ALPHA,A,LDA,X,INCX,BETA,Y,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cgerc.f
Original file line number Diff line number Diff line change
Expand Up @@ -127,6 +127,7 @@
*>
* =====================================================================
SUBROUTINE CGERC(M,N,ALPHA,X,INCX,Y,INCY,A,LDA)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cgeru.f
Original file line number Diff line number Diff line change
Expand Up @@ -127,6 +127,7 @@
*>
* =====================================================================
SUBROUTINE CGERU(M,N,ALPHA,X,INCX,Y,INCY,A,LDA)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/chbmv.f
Original file line number Diff line number Diff line change
Expand Up @@ -184,6 +184,7 @@
*>
* =====================================================================
SUBROUTINE CHBMV(UPLO,N,K,ALPHA,A,LDA,X,INCX,BETA,Y,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/chemm.f
Original file line number Diff line number Diff line change
Expand Up @@ -188,6 +188,7 @@
*>
* =====================================================================
SUBROUTINE CHEMM(SIDE,UPLO,M,N,ALPHA,A,LDA,B,LDB,BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/chemv.f
Original file line number Diff line number Diff line change
Expand Up @@ -151,6 +151,7 @@
*>
* =====================================================================
SUBROUTINE CHEMV(UPLO,N,ALPHA,A,LDA,X,INCX,BETA,Y,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cher.f
Original file line number Diff line number Diff line change
Expand Up @@ -132,6 +132,7 @@
*>
* =====================================================================
SUBROUTINE CHER(UPLO,N,ALPHA,X,INCX,A,LDA)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cher2.f
Original file line number Diff line number Diff line change
Expand Up @@ -147,6 +147,7 @@
*>
* =====================================================================
SUBROUTINE CHER2(UPLO,N,ALPHA,X,INCX,Y,INCY,A,LDA)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cher2k.f
Original file line number Diff line number Diff line change
Expand Up @@ -194,6 +194,7 @@
*>
* =====================================================================
SUBROUTINE CHER2K(UPLO,TRANS,N,K,ALPHA,A,LDA,B,LDB,BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cherk.f
Original file line number Diff line number Diff line change
Expand Up @@ -170,6 +170,7 @@
*>
* =====================================================================
SUBROUTINE CHERK(UPLO,TRANS,N,K,ALPHA,A,LDA,BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/chpmv.f
Original file line number Diff line number Diff line change
Expand Up @@ -146,6 +146,7 @@
*>
* =====================================================================
SUBROUTINE CHPMV(UPLO,N,ALPHA,AP,X,INCX,BETA,Y,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/chpr.f
Original file line number Diff line number Diff line change
Expand Up @@ -127,6 +127,7 @@
*>
* =====================================================================
SUBROUTINE CHPR(UPLO,N,ALPHA,X,INCX,AP)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/chpr2.f
Original file line number Diff line number Diff line change
Expand Up @@ -142,6 +142,7 @@
*>
* =====================================================================
SUBROUTINE CHPR2(UPLO,N,ALPHA,X,INCX,Y,INCY,AP)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/crotg.f90
Original file line number Diff line number Diff line change
Expand Up @@ -86,6 +86,7 @@
!
! =====================================================================
subroutine CROTG( a, b, c, s )
implicit none
integer, parameter :: wp = kind(1.e0)
!
! -- Reference BLAS level1 routine --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cscal.f
Original file line number Diff line number Diff line change
Expand Up @@ -75,6 +75,7 @@
*>
* =====================================================================
SUBROUTINE CSCAL(N,CA,CX,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/csrot.f
Original file line number Diff line number Diff line change
Expand Up @@ -95,6 +95,7 @@
*
* =====================================================================
SUBROUTINE CSROT( N, CX, INCX, CY, INCY, C, S )
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/csscal.f
Original file line number Diff line number Diff line change
Expand Up @@ -75,6 +75,7 @@
*>
* =====================================================================
SUBROUTINE CSSCAL(N,SA,CX,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/cswap.f
Original file line number Diff line number Diff line change
Expand Up @@ -78,6 +78,7 @@
*>
* =====================================================================
SUBROUTINE CSWAP(N,CX,INCX,CY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/csymm.f
Original file line number Diff line number Diff line change
Expand Up @@ -186,6 +186,7 @@
*>
* =====================================================================
SUBROUTINE CSYMM(SIDE,UPLO,M,N,ALPHA,A,LDA,B,LDB,BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/csyr2k.f
Original file line number Diff line number Diff line change
Expand Up @@ -185,6 +185,7 @@
*>
* =====================================================================
SUBROUTINE CSYR2K(UPLO,TRANS,N,K,ALPHA,A,LDA,B,LDB,BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/csyrk.f
Original file line number Diff line number Diff line change
Expand Up @@ -164,6 +164,7 @@
*>
* =====================================================================
SUBROUTINE CSYRK(UPLO,TRANS,N,K,ALPHA,A,LDA,BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctbmv.f
Original file line number Diff line number Diff line change
Expand Up @@ -183,6 +183,7 @@
*>
* =====================================================================
SUBROUTINE CTBMV(UPLO,TRANS,DIAG,N,K,A,LDA,X,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctbsv.f
Original file line number Diff line number Diff line change
Expand Up @@ -186,6 +186,7 @@
*>
* =====================================================================
SUBROUTINE CTBSV(UPLO,TRANS,DIAG,N,K,A,LDA,X,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctpmv.f
Original file line number Diff line number Diff line change
Expand Up @@ -139,6 +139,7 @@
*>
* =====================================================================
SUBROUTINE CTPMV(UPLO,TRANS,DIAG,N,AP,X,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctpsv.f
Original file line number Diff line number Diff line change
Expand Up @@ -141,6 +141,7 @@
*>
* =====================================================================
SUBROUTINE CTPSV(UPLO,TRANS,DIAG,N,AP,X,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctrmm.f
Original file line number Diff line number Diff line change
Expand Up @@ -174,6 +174,7 @@
*>
* =====================================================================
SUBROUTINE CTRMM(SIDE,UPLO,TRANSA,DIAG,M,N,ALPHA,A,LDA,B,LDB)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctrmv.f
Original file line number Diff line number Diff line change
Expand Up @@ -144,6 +144,7 @@
*>
* =====================================================================
SUBROUTINE CTRMV(UPLO,TRANS,DIAG,N,A,LDA,X,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctrsm.f
Original file line number Diff line number Diff line change
Expand Up @@ -177,6 +177,7 @@
*>
* =====================================================================
SUBROUTINE CTRSM(SIDE,UPLO,TRANSA,DIAG,M,N,ALPHA,A,LDA,B,LDB)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ctrsv.f
Original file line number Diff line number Diff line change
Expand Up @@ -146,6 +146,7 @@
*>
* =====================================================================
SUBROUTINE CTRSV(UPLO,TRANS,DIAG,N,A,LDA,X,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/dasum.f
Original file line number Diff line number Diff line change
Expand Up @@ -68,6 +68,7 @@
*>
* =====================================================================
DOUBLE PRECISION FUNCTION DASUM(N,DX,INCX)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/daxpy.f
Original file line number Diff line number Diff line change
Expand Up @@ -86,6 +86,7 @@
*>
* =====================================================================
SUBROUTINE DAXPY(N,DA,DX,INCX,DY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/dcabs1.f
Original file line number Diff line number Diff line change
Expand Up @@ -44,6 +44,7 @@
*
* =====================================================================
DOUBLE PRECISION FUNCTION DCABS1(Z)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/dcopy.f
Original file line number Diff line number Diff line change
Expand Up @@ -79,6 +79,7 @@
*>
* =====================================================================
SUBROUTINE DCOPY(N,DX,INCX,DY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/ddot.f
Original file line number Diff line number Diff line change
Expand Up @@ -79,6 +79,7 @@
*>
* =====================================================================
DOUBLE PRECISION FUNCTION DDOT(N,DX,INCX,DY,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/dgbmv.f
Original file line number Diff line number Diff line change
Expand Up @@ -185,6 +185,7 @@
* =====================================================================
SUBROUTINE DGBMV(TRANS,M,N,KL,KU,ALPHA,A,LDA,X,INCX,
+ BETA,Y,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/dgemm.f
Original file line number Diff line number Diff line change
Expand Up @@ -212,6 +212,7 @@
* =====================================================================
SUBROUTINE DGEMM(TRANSA,TRANSB,M,N,K,ALPHA,A,LDA,B,LDB,
+ BETA,C,LDC)
IMPLICIT NONE
*
* -- Reference BLAS level3 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/dgemv.f
Original file line number Diff line number Diff line change
Expand Up @@ -155,6 +155,7 @@
*>
* =====================================================================
SUBROUTINE DGEMV(TRANS,M,N,ALPHA,A,LDA,X,INCX,BETA,Y,INCY)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/dger.f
Original file line number Diff line number Diff line change
Expand Up @@ -127,6 +127,7 @@
*>
* =====================================================================
SUBROUTINE DGER(M,N,ALPHA,X,INCX,Y,INCY,A,LDA)
IMPLICIT NONE
*
* -- Reference BLAS level2 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
3 changes: 2 additions & 1 deletion BLAS/SRC/dnrm2.f90
Original file line number Diff line number Diff line change
Expand Up @@ -85,7 +85,8 @@
!> \endverbatim
!>
! =====================================================================
function DNRM2( n, x, incx )
function DNRM2( n, x, incx )
implicit none
integer, parameter :: wp = kind(1.d0)
real(wp) :: DNRM2
!
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/drot.f
Original file line number Diff line number Diff line change
Expand Up @@ -89,6 +89,7 @@
*>
* =====================================================================
SUBROUTINE DROT(N,DX,INCX,DY,INCY,C,S)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/drotg.f90
Original file line number Diff line number Diff line change
Expand Up @@ -89,6 +89,7 @@
!
! =====================================================================
subroutine DROTG( a, b, c, s )
implicit none
integer, parameter :: wp = kind(1.d0)
!
! -- Reference BLAS level1 routine --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/drotm.f
Original file line number Diff line number Diff line change
Expand Up @@ -97,6 +97,7 @@
*
* =====================================================================
SUBROUTINE DROTM(N,DX,INCX,DY,INCY,DPARAM)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
1 change: 1 addition & 0 deletions BLAS/SRC/drotmg.f
Original file line number Diff line number Diff line change
Expand Up @@ -87,6 +87,7 @@
*
* =====================================================================
SUBROUTINE DROTMG(DD1,DD2,DX1,DY1,DPARAM)
IMPLICIT NONE
*
* -- Reference BLAS level1 routine --
* -- Reference BLAS is a software package provided by Univ. of Tennessee, --
Expand Down
Loading
Loading