Skip to content

Commit 8e63891

Browse files
committed
edits
1 parent 3b291c2 commit 8e63891

File tree

5 files changed

+40
-57
lines changed

5 files changed

+40
-57
lines changed

legacy/stdlib_linalg_lapack_c.fypp

Lines changed: 15 additions & 15 deletions
Original file line numberDiff line numberDiff line change
@@ -41273,7 +41273,7 @@ module stdlib_linalg_lapack_c
4127341273
end subroutine stdlib${ii}$_clalsd
4127441274

4127541275

41276-
real(sp) function stdlib${ii}$_clangb( norm, n, kl, ku, ab, ldab,work )
41276+
real(sp) function stdlib${ii}$_clangb( norm, n, kl, ku, ab, ldab,work )
4127741277
!! CLANGB returns the value of the one norm, or the Frobenius norm, or
4127841278
!! the infinity norm, or the element of largest absolute value of an
4127941279
!! n by n band matrix A, with kl sub-diagonals and ku super-diagonals.
@@ -41348,7 +41348,7 @@ module stdlib_linalg_lapack_c
4134841348
end function stdlib${ii}$_clangb
4134941349

4135041350

41351-
real(sp) function stdlib${ii}$_clange( norm, m, n, a, lda, work )
41351+
real(sp) function stdlib${ii}$_clange( norm, m, n, a, lda, work )
4135241352
!! CLANGE returns the value of the one norm, or the Frobenius norm, or
4135341353
!! the infinity norm, or the element of largest absolute value of a
4135441354
!! complex matrix A.
@@ -41420,7 +41420,7 @@ module stdlib_linalg_lapack_c
4142041420
end function stdlib${ii}$_clange
4142141421

4142241422

41423-
pure real(sp) function stdlib${ii}$_clangt( norm, n, dl, d, du )
41423+
pure real(sp) function stdlib${ii}$_clangt( norm, n, dl, d, du )
4142441424
!! CLANGT returns the value of the one norm, or the Frobenius norm, or
4142541425
!! the infinity norm, or the element of largest absolute value of a
4142641426
!! complex tridiagonal matrix A.
@@ -41496,7 +41496,7 @@ module stdlib_linalg_lapack_c
4149641496
end function stdlib${ii}$_clangt
4149741497

4149841498

41499-
real(sp) function stdlib${ii}$_clanhb( norm, uplo, n, k, ab, ldab,work )
41499+
real(sp) function stdlib${ii}$_clanhb( norm, uplo, n, k, ab, ldab,work )
4150041500
!! CLANHB returns the value of the one norm, or the Frobenius norm, or
4150141501
!! the infinity norm, or the element of largest absolute value of an
4150241502
!! n by n hermitian band matrix A, with k super-diagonals.
@@ -41615,7 +41615,7 @@ module stdlib_linalg_lapack_c
4161541615
end function stdlib${ii}$_clanhb
4161641616

4161741617

41618-
real(sp) function stdlib${ii}$_clanhe( norm, uplo, n, a, lda, work )
41618+
real(sp) function stdlib${ii}$_clanhe( norm, uplo, n, a, lda, work )
4161941619
!! CLANHE returns the value of the one norm, or the Frobenius norm, or
4162041620
!! the infinity norm, or the element of largest absolute value of a
4162141621
!! complex hermitian matrix A.
@@ -42945,7 +42945,7 @@ module stdlib_linalg_lapack_c
4294542945
end function stdlib${ii}$_clanhf
4294642946

4294742947

42948-
real(sp) function stdlib${ii}$_clanhp( norm, uplo, n, ap, work )
42948+
real(sp) function stdlib${ii}$_clanhp( norm, uplo, n, ap, work )
4294942949
!! CLANHP returns the value of the one norm, or the Frobenius norm, or
4295042950
!! the infinity norm, or the element of largest absolute value of a
4295142951
!! complex hermitian matrix A, supplied in packed form.
@@ -43073,7 +43073,7 @@ module stdlib_linalg_lapack_c
4307343073
end function stdlib${ii}$_clanhp
4307443074

4307543075

43076-
real(sp) function stdlib${ii}$_clanhs( norm, n, a, lda, work )
43076+
real(sp) function stdlib${ii}$_clanhs( norm, n, a, lda, work )
4307743077
!! CLANHS returns the value of the one norm, or the Frobenius norm, or
4307843078
!! the infinity norm, or the element of largest absolute value of a
4307943079
!! Hessenberg matrix A.
@@ -43145,7 +43145,7 @@ module stdlib_linalg_lapack_c
4314543145
end function stdlib${ii}$_clanhs
4314643146

4314743147

43148-
pure real(sp) function stdlib${ii}$_clanht( norm, n, d, e )
43148+
pure real(sp) function stdlib${ii}$_clanht( norm, n, d, e )
4314943149
!! CLANHT returns the value of the one norm, or the Frobenius norm, or
4315043150
!! the infinity norm, or the element of largest absolute value of a
4315143151
!! complex Hermitian tridiagonal matrix A.
@@ -43208,7 +43208,7 @@ module stdlib_linalg_lapack_c
4320843208
end function stdlib${ii}$_clanht
4320943209

4321043210

43211-
real(sp) function stdlib${ii}$_clansb( norm, uplo, n, k, ab, ldab,work )
43211+
real(sp) function stdlib${ii}$_clansb( norm, uplo, n, k, ab, ldab,work )
4321243212
!! CLANSB returns the value of the one norm, or the Frobenius norm, or
4321343213
!! the infinity norm, or the element of largest absolute value of an
4321443214
!! n by n symmetric band matrix A, with k super-diagonals.
@@ -43313,7 +43313,7 @@ module stdlib_linalg_lapack_c
4331343313
end function stdlib${ii}$_clansb
4331443314

4331543315

43316-
real(sp) function stdlib${ii}$_clansp( norm, uplo, n, ap, work )
43316+
real(sp) function stdlib${ii}$_clansp( norm, uplo, n, ap, work )
4331743317
!! CLANSP returns the value of the one norm, or the Frobenius norm, or
4331843318
!! the infinity norm, or the element of largest absolute value of a
4331943319
!! complex symmetric matrix A, supplied in packed form.
@@ -43446,7 +43446,7 @@ module stdlib_linalg_lapack_c
4344643446
end function stdlib${ii}$_clansp
4344743447

4344843448

43449-
real(sp) function stdlib${ii}$_clansy( norm, uplo, n, a, lda, work )
43449+
real(sp) function stdlib${ii}$_clansy( norm, uplo, n, a, lda, work )
4345043450
!! CLANSY returns the value of the one norm, or the Frobenius norm, or
4345143451
!! the infinity norm, or the element of largest absolute value of a
4345243452
!! complex symmetric matrix A.
@@ -43542,7 +43542,7 @@ module stdlib_linalg_lapack_c
4354243542
end function stdlib${ii}$_clansy
4354343543

4354443544

43545-
real(sp) function stdlib${ii}$_clantb( norm, uplo, diag, n, k, ab,ldab, work )
43545+
real(sp) function stdlib${ii}$_clantb( norm, uplo, diag, n, k, ab,ldab, work )
4354643546
!! CLANTB returns the value of the one norm, or the Frobenius norm, or
4354743547
!! the infinity norm, or the element of largest absolute value of an
4354843548
!! n by n triangular band matrix A, with ( k + 1 ) diagonals.
@@ -43735,7 +43735,7 @@ module stdlib_linalg_lapack_c
4373543735
end function stdlib${ii}$_clantb
4373643736

4373743737

43738-
real(sp) function stdlib${ii}$_clantp( norm, uplo, diag, n, ap, work )
43738+
real(sp) function stdlib${ii}$_clantp( norm, uplo, diag, n, ap, work )
4373943739
!! CLANTP returns the value of the one norm, or the Frobenius norm, or
4374043740
!! the infinity norm, or the element of largest absolute value of a
4374143741
!! triangular matrix A, supplied in packed form.
@@ -43941,7 +43941,7 @@ module stdlib_linalg_lapack_c
4394143941
end function stdlib${ii}$_clantp
4394243942

4394343943

43944-
real(sp) function stdlib${ii}$_clantr( norm, uplo, diag, m, n, a, lda,work )
43944+
real(sp) function stdlib${ii}$_clantr( norm, uplo, diag, m, n, a, lda,work )
4394543945
!! CLANTR returns the value of the one norm, or the Frobenius norm, or
4394643946
!! the infinity norm, or the element of largest absolute value of a
4394743947
!! trapezoidal or triangular matrix A.
@@ -79708,7 +79708,7 @@ module stdlib_linalg_lapack_c
7970879708
alpha( * ), beta( * ), work( * )
7970979709
real(sp), intent( out ) :: rwork( * )
7971079710

79711-
79711+
! ================================================================
7971279712
! local scalars
7971379713
real(sp) :: smlnum, ulp, safmin, safmax, c1, tempr
7971479714
complex(sp) :: eshift, s1, temp

legacy/stdlib_linalg_lapack_d.fypp

Lines changed: 3 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -2717,17 +2717,11 @@ module stdlib_linalg_lapack_d
27172717
! =====================================================================
27182718

27192719
! Local Scalars
2720-
real(dp) :: rnd, eps, sfmin, small, rmach
2720+
real(dp) :: sfmin, small, rmach
27212721
! Intrinsic Functions
27222722
intrinsic :: digits,epsilon,huge,maxexponent,minexponent,radix,tiny
27232723
! Executable Statements
27242724
! assume rounding, not chopping. always.
2725-
rnd = one
2726-
if( one==rnd ) then
2727-
eps = epsilon(zero) * 0.5
2728-
else
2729-
eps = epsilon(zero)
2730-
end if
27312725
if( stdlib_lsame( cmach, 'E' ) ) then
27322726
rmach = eps
27332727
else if( stdlib_lsame( cmach, 'S' ) ) then
@@ -2746,7 +2740,7 @@ module stdlib_linalg_lapack_d
27462740
else if( stdlib_lsame( cmach, 'N' ) ) then
27472741
rmach = digits(zero)
27482742
else if( stdlib_lsame( cmach, 'R' ) ) then
2749-
rmach = rnd
2743+
rmach = one
27502744
else if( stdlib_lsame( cmach, 'M' ) ) then
27512745
rmach = minexponent(zero)
27522746
else if( stdlib_lsame( cmach, 'U' ) ) then
@@ -32077,7 +32071,7 @@ module stdlib_linalg_lapack_d
3207732071
integer(${ik}$), intent( in ) :: lda, ldb
3207832072
real(dp), intent( in ) :: a( lda, * ), b( ldb, * ), sr1,sr2, si, beta1, beta2
3207932073
real(dp), intent( out ) :: v( * )
32080-
32074+
! ================================================================
3208132075
! local scalars
3208232076
real(dp) :: w(2_${ik}$), safmin, safmax, scale1, scale2
3208332077
safmin = stdlib${ii}$_dlamch( 'SAFE MINIMUM' )

legacy/stdlib_linalg_lapack_q.fypp

Lines changed: 2 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -30827,17 +30827,11 @@ module stdlib_linalg_lapack_${ri}$
3082730827
! =====================================================================
3082830828

3082930829
! Local Scalars
30830-
real(${rk}$) :: rnd, eps, sfmin, small, rmach
30830+
real(${rk}$) :: sfmin, small, rmach
3083130831
! Intrinsic Functions
3083230832
intrinsic :: digits,epsilon,huge,maxexponent,minexponent,radix,tiny
3083330833
! Executable Statements
3083430834
! assume rounding, not chopping. always.
30835-
rnd = one
30836-
if( one==rnd ) then
30837-
eps = epsilon(zero) * 0.5
30838-
else
30839-
eps = epsilon(zero)
30840-
end if
3084130835
if( stdlib_lsame( cmach, 'E' ) ) then
3084230836
rmach = eps
3084330837
else if( stdlib_lsame( cmach, 'S' ) ) then
@@ -30856,7 +30850,7 @@ module stdlib_linalg_lapack_${ri}$
3085630850
else if( stdlib_lsame( cmach, 'N' ) ) then
3085730851
rmach = digits(zero)
3085830852
else if( stdlib_lsame( cmach, 'R' ) ) then
30859-
rmach = rnd
30853+
rmach = one
3086030854
else if( stdlib_lsame( cmach, 'M' ) ) then
3086130855
rmach = minexponent(zero)
3086230856
else if( stdlib_lsame( cmach, 'U' ) ) then

legacy/stdlib_linalg_lapack_s.fypp

Lines changed: 19 additions & 24 deletions
Original file line numberDiff line numberDiff line change
@@ -2737,7 +2737,7 @@ module stdlib_linalg_lapack_s
27372737
end function stdlib${ii}$_slaisnan
27382738

27392739

2740-
pure real(sp) function stdlib${ii}$_slamch( cmach )
2740+
pure real(sp) function stdlib${ii}$_slamch( cmach )
27412741
!! SLAMCH determines single precision machine parameters.
27422742
! -- lapack auxiliary routine --
27432743
! -- lapack is a software package provided by univ. of tennessee, --
@@ -2747,17 +2747,11 @@ module stdlib_linalg_lapack_s
27472747
! =====================================================================
27482748

27492749
! Local Scalars
2750-
real(sp) :: rnd, eps, sfmin, small, rmach
2750+
real(sp) :: sfmin, small, rmach
27512751
! Intrinsic Functions
27522752
intrinsic :: digits,epsilon,huge,maxexponent,minexponent,radix,tiny
27532753
! Executable Statements
27542754
! assume rounding, not chopping. always.
2755-
rnd = one
2756-
if( one==rnd ) then
2757-
eps = epsilon(zero) * 0.5
2758-
else
2759-
eps = epsilon(zero)
2760-
end if
27612755
if( stdlib_lsame( cmach, 'E' ) ) then
27622756
rmach = eps
27632757
else if( stdlib_lsame( cmach, 'S' ) ) then
@@ -2776,7 +2770,7 @@ module stdlib_linalg_lapack_s
27762770
else if( stdlib_lsame( cmach, 'N' ) ) then
27772771
rmach = digits(zero)
27782772
else if( stdlib_lsame( cmach, 'R' ) ) then
2779-
rmach = rnd
2773+
rmach = one
27802774
else if( stdlib_lsame( cmach, 'M' ) ) then
27812775
rmach = minexponent(zero)
27822776
else if( stdlib_lsame( cmach, 'U' ) ) then
@@ -2793,7 +2787,7 @@ module stdlib_linalg_lapack_s
27932787
end function stdlib${ii}$_slamch
27942788

27952789

2796-
pure real(sp) function stdlib${ii}$_slamc3( a, b )
2790+
pure real(sp) function stdlib${ii}$_slamc3( a, b )
27972791
! -- lapack auxiliary routine --
27982792
! univ. of tennessee, univ. of california berkeley and nag ltd..
27992793
! Scalar Arguments
@@ -3135,7 +3129,7 @@ module stdlib_linalg_lapack_s
31353129
end subroutine stdlib${ii}$_slapmt
31363130

31373131

3138-
pure real(sp) function stdlib${ii}$_slapy3( x, y, z )
3132+
pure real(sp) function stdlib${ii}$_slapy3( x, y, z )
31393133
!! SLAPY3 returns sqrt(x**2+y**2+z**2), taking care not to cause
31403134
!! unnecessary overflow and unnecessary underflow.
31413135
! -- lapack auxiliary routine --
@@ -29907,7 +29901,7 @@ module stdlib_linalg_lapack_s
2990729901
end function stdlib${ii}$_slaneg
2990829902

2990929903

29910-
real(sp) function stdlib${ii}$_slangb( norm, n, kl, ku, ab, ldab,work )
29904+
real(sp) function stdlib${ii}$_slangb( norm, n, kl, ku, ab, ldab,work )
2991129905
!! SLANGB returns the value of the one norm, or the Frobenius norm, or
2991229906
!! the infinity norm, or the element of largest absolute value of an
2991329907
!! n by n band matrix A, with kl sub-diagonals and ku super-diagonals.
@@ -29982,7 +29976,7 @@ module stdlib_linalg_lapack_s
2998229976
end function stdlib${ii}$_slangb
2998329977

2998429978

29985-
real(sp) function stdlib${ii}$_slange( norm, m, n, a, lda, work )
29979+
real(sp) function stdlib${ii}$_slange( norm, m, n, a, lda, work )
2998629980
!! SLANGE returns the value of the one norm, or the Frobenius norm, or
2998729981
!! the infinity norm, or the element of largest absolute value of a
2998829982
!! real matrix A.
@@ -30054,7 +30048,7 @@ module stdlib_linalg_lapack_s
3005430048
end function stdlib${ii}$_slange
3005530049

3005630050

30057-
pure real(sp) function stdlib${ii}$_slangt( norm, n, dl, d, du )
30051+
pure real(sp) function stdlib${ii}$_slangt( norm, n, dl, d, du )
3005830052
!! SLANGT returns the value of the one norm, or the Frobenius norm, or
3005930053
!! the infinity norm, or the element of largest absolute value of a
3006030054
!! real tridiagonal matrix A.
@@ -30130,7 +30124,7 @@ module stdlib_linalg_lapack_s
3013030124
end function stdlib${ii}$_slangt
3013130125

3013230126

30133-
real(sp) function stdlib${ii}$_slanhs( norm, n, a, lda, work )
30127+
real(sp) function stdlib${ii}$_slanhs( norm, n, a, lda, work )
3013430128
!! SLANHS returns the value of the one norm, or the Frobenius norm, or
3013530129
!! the infinity norm, or the element of largest absolute value of a
3013630130
!! Hessenberg matrix A.
@@ -30202,7 +30196,7 @@ module stdlib_linalg_lapack_s
3020230196
end function stdlib${ii}$_slanhs
3020330197

3020430198

30205-
real(sp) function stdlib${ii}$_slansb( norm, uplo, n, k, ab, ldab,work )
30199+
real(sp) function stdlib${ii}$_slansb( norm, uplo, n, k, ab, ldab,work )
3020630200
!! SLANSB returns the value of the one norm, or the Frobenius norm, or
3020730201
!! the infinity norm, or the element of largest absolute value of an
3020830202
!! n by n symmetric band matrix A, with k super-diagonals.
@@ -31011,7 +31005,7 @@ module stdlib_linalg_lapack_s
3101131005
end function stdlib${ii}$_slansf
3101231006

3101331007

31014-
real(sp) function stdlib${ii}$_slansp( norm, uplo, n, ap, work )
31008+
real(sp) function stdlib${ii}$_slansp( norm, uplo, n, ap, work )
3101531009
!! SLANSP returns the value of the one norm, or the Frobenius norm, or
3101631010
!! the infinity norm, or the element of largest absolute value of a
3101731011
!! real symmetric matrix A, supplied in packed form.
@@ -31135,7 +31129,7 @@ module stdlib_linalg_lapack_s
3113531129
end function stdlib${ii}$_slansp
3113631130

3113731131

31138-
pure real(sp) function stdlib${ii}$_slanst( norm, n, d, e )
31132+
pure real(sp) function stdlib${ii}$_slanst( norm, n, d, e )
3113931133
!! SLANST returns the value of the one norm, or the Frobenius norm, or
3114031134
!! the infinity norm, or the element of largest absolute value of a
3114131135
!! real symmetric tridiagonal matrix A.
@@ -31197,7 +31191,7 @@ module stdlib_linalg_lapack_s
3119731191
end function stdlib${ii}$_slanst
3119831192

3119931193

31200-
real(sp) function stdlib${ii}$_slansy( norm, uplo, n, a, lda, work )
31194+
real(sp) function stdlib${ii}$_slansy( norm, uplo, n, a, lda, work )
3120131195
!! SLANSY returns the value of the one norm, or the Frobenius norm, or
3120231196
!! the infinity norm, or the element of largest absolute value of a
3120331197
!! real symmetric matrix A.
@@ -31293,7 +31287,7 @@ module stdlib_linalg_lapack_s
3129331287
end function stdlib${ii}$_slansy
3129431288

3129531289

31296-
real(sp) function stdlib${ii}$_slantb( norm, uplo, diag, n, k, ab,ldab, work )
31290+
real(sp) function stdlib${ii}$_slantb( norm, uplo, diag, n, k, ab,ldab, work )
3129731291
!! SLANTB returns the value of the one norm, or the Frobenius norm, or
3129831292
!! the infinity norm, or the element of largest absolute value of an
3129931293
!! n by n triangular band matrix A, with ( k + 1 ) diagonals.
@@ -31486,7 +31480,7 @@ module stdlib_linalg_lapack_s
3148631480
end function stdlib${ii}$_slantb
3148731481

3148831482

31489-
real(sp) function stdlib${ii}$_slantp( norm, uplo, diag, n, ap, work )
31483+
real(sp) function stdlib${ii}$_slantp( norm, uplo, diag, n, ap, work )
3149031484
!! SLANTP returns the value of the one norm, or the Frobenius norm, or
3149131485
!! the infinity norm, or the element of largest absolute value of a
3149231486
!! triangular matrix A, supplied in packed form.
@@ -31692,7 +31686,7 @@ module stdlib_linalg_lapack_s
3169231686
end function stdlib${ii}$_slantp
3169331687

3169431688

31695-
real(sp) function stdlib${ii}$_slantr( norm, uplo, diag, m, n, a, lda,work )
31689+
real(sp) function stdlib${ii}$_slantr( norm, uplo, diag, m, n, a, lda,work )
3169631690
!! SLANTR returns the value of the one norm, or the Frobenius norm, or
3169731691
!! the infinity norm, or the element of largest absolute value of a
3169831692
!! trapezoidal or triangular matrix A.
@@ -31972,7 +31966,7 @@ module stdlib_linalg_lapack_s
3197231966
end subroutine stdlib${ii}$_slaorhr_col_getrfnp
3197331967

3197431968

31975-
pure real(sp) function stdlib${ii}$_slapy2( x, y )
31969+
pure real(sp) function stdlib${ii}$_slapy2( x, y )
3197631970
!! SLAPY2 returns sqrt(x**2+y**2), taking care not to cause unnecessary
3197731971
!! overflow and unnecessary underflow.
3197831972
! -- lapack auxiliary routine --
@@ -81042,7 +81036,7 @@ module stdlib_linalg_lapack_s
8104281036
integer(${ik}$), intent( out ) :: info
8104381037
real(sp), intent( inout ) :: a( lda, * ), b( ldb, * ), q( ldq, * ),z( ldz, * ), alphar(&
8104481038
* ), alphai( * ), beta( * ), work( * )
81045-
81039+
! ================================================================
8104681040
! local scalars
8104781041
real(sp) :: smlnum, ulp, eshift, safmin, safmax, c1, s1, temp, swap
8104881042
integer(${ik}$) :: istart, istop, iiter, maxit, istart2, k, ld, nshifts, nblock, nw, nmin,&
@@ -81392,6 +81386,7 @@ module stdlib_linalg_lapack_s
8139281386
real(sp), intent(inout) :: qc(ldqc,*), zc(ldzc,*)
8139381387
real(sp), intent(out) :: work(*)
8139481388

81389+
! ================================================================
8139581390
! local scalars
8139681391
logical(lk) :: bulge
8139781392
integer(${ik}$) :: jw, kwtop, kwbot, istopm, istartm, k, k2, stgexc_info, ifst, ilst, &

legacy/stdlib_linalg_lapack_w.fypp

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -47990,7 +47990,7 @@ module stdlib_linalg_lapack_${ci}$
4799047990
integer(${ik}$), intent( in ) :: k, lda, ldb, ldq, ldz, istartm, istopm,nq, nz, qstart, &
4799147991
zstart, ihi
4799247992
complex(${ck}$), intent(inout) :: a(lda,*), b(ldb,*), q(ldq,*), z(ldz,*)
47993-
47993+
! ================================================================
4799447994
! local variables
4799547995
real(${ck}$) :: c
4799647996
complex(${ck}$) :: s, temp

0 commit comments

Comments
 (0)