92 SUBROUTINE dqrt13( SCALE, M, N, A, LDA, NORMA, ISEED )
100 INTEGER lda, m, n, scale
101 DOUBLE PRECISION norma
105 DOUBLE PRECISION a( lda, * )
112 parameter( one = 1.0d0 )
116 DOUBLE PRECISION bignum, smlnum
129 DOUBLE PRECISION dummy( 1 )
133 IF( m.LE.0 .OR. n.LE.0 )
139 CALL
dlarnv( 2, iseed, m, a( 1,
j ) )
141 a(
j,
j ) = a(
j,
j ) + sign(
dasum( m, a( 1,
j ), 1 ),
148 IF( scale.NE.1 )
THEN
149 norma =
dlange(
'Max', m, n, a, lda, dummy )
150 smlnum =
dlamch(
'Safe minimum' )
151 bignum = one / smlnum
152 CALL
dlabad( smlnum, bignum )
153 smlnum = smlnum /
dlamch(
'Epsilon' )
154 bignum = one / smlnum
156 IF( scale.EQ.2 )
THEN
160 CALL
dlascl(
'General', 0, 0, norma, bignum, m, n, a, lda,
162 ELSE IF( scale.EQ.3 )
THEN
166 CALL
dlascl(
'General', 0, 0, norma, smlnum, m, n, a, lda,
171 norma =
dlange(
'One-norm', m, n, a, lda, dummy )
subroutine dlarnv(IDIST, ISEED, N, X)
DLARNV returns a vector of random numbers from a uniform or normal distribution.
subroutine dlascl(TYPE, KL, KU, CFROM, CTO, M, N, A, LDA, INFO)
DLASCL multiplies a general rectangular matrix by a real scalar defined as cto/cfrom.
subroutine dlabad(SMALL, LARGE)
DLABAD
subroutine dqrt13(SCALE, M, N, A, LDA, NORMA, ISEED)
DQRT13
double precision function dlange(NORM, M, N, A, LDA, WORK)
DLANGE returns the value of the 1-norm, Frobenius norm, infinity-norm, or the largest absolute value ...
double precision function dlamch(CMACH)
DLAMCH
set ue cd $ADTTMP cat<< EOF > tmp f Program LinearEquations Implicit none Real j
double precision function dasum(N, DX, INCX)
DASUM