1 SUBROUTINE pcevcinfo( SUMMRY, NOUT, NMAT, NVAL, LDNVAL, NNB,
2 $ NBVAL, LDNBVAL, NGRIDS, PVAL, LDPVAL, QVAL,
3 $ LDQVAL, THRESH, WORK, IAM, NPROCS )
11 CHARACTER*( * ) SUMMRY
12 INTEGER IAM, LDNBVAL, LDNVAL, LDPVAL, LDQVAL, NGRIDS,
13 $ nmat, nnb, nout, nprocs
17 INTEGER NBVAL( LDNBVAL ), NVAL( LDNVAL ),
18 $ PVAL( LDPVAL ), QVAL( LDQVAL ), WORK( * )
108 PARAMETER ( NIN = 11 )
116 EXTERNAL blacs_abort, blacs_get, blacs_gridexit,
117 $ blacs_gridinit, blacs_setup,
icopy, igebr2d,
118 $ igebs2d, sgebr2d, sgebs2d
136 OPEN( nin, file =
'EVC.dat', status =
'OLD' )
137 READ( nin, fmt = * )summry
142 READ( nin, fmt = 9999 )usrinfo
146 READ( nin, fmt = * )summry
147 READ( nin, fmt = * )nout
148 IF( nout.NE.0 .AND. nout.NE.6 )
149 $
OPEN( nout, file = summry, status =
'UNKNOWN' )
155 READ( nin, fmt = * )nmat
156 IF( nmat.LT.1 .OR. nmat.GT.ldnval )
THEN
157 WRITE( nout, fmt = 9994 )
'N', ldnval
160 READ( nin, fmt = * )( nval( i ), i = 1, nmat )
164 READ( nin, fmt = * )nnb
165 IF( nnb.GT.ldnbval )
THEN
166 WRITE( nout, fmt = 9994 )
'NB', ldnbval
169 READ( nin, fmt = * )( nbval( i ), i = 1, nnb )
172 IF( nbval( i ).LT.6 )
THEN
173 WRITE( nout, fmt = 9992 )nbval( i )
180 READ( nin, fmt = * )ngrids
181 IF( ngrids.LT.1 .OR. ngrids.GT.ldpval )
THEN
182 WRITE( nout, fmt = 9994 )
'Grids', ldpval
184 ELSE IF( ngrids.GT.ldqval )
THEN
185 WRITE( nout, fmt = 9994 )
'Grids', ldqval
191 READ( nin, fmt = * )( pval( i ), i = 1, ngrids )
192 READ( nin, fmt = * )( qval( i ), i = 1, ngrids )
196 READ( nin, fmt = * )thresh
205 IF( nprocs.LT.1 )
THEN
208 nprocs =
max( nprocs, pval( i )*qval( i ) )
210 CALL blacs_setup( iam, nprocs )
216 CALL blacs_get( -1, 0, ictxt )
217 CALL blacs_gridinit( ictxt,
'Row-major', 1, nprocs )
221 eps = pslamch( ictxt,
'eps' )
225 CALL sgebs2d( ictxt,
'All',
' ', 1, 1, thresh, 1 )
230 CALL igebs2d( ictxt,
'All',
' ', 3, 1, work, 3 )
233 CALL icopy( nmat, nval, 1, work( i ), 1 )
235 CALL icopy( nnb, nbval, 1, work( i ), 1 )
237 CALL icopy( ngrids, pval, 1, work( i ), 1 )
239 CALL icopy( ngrids, qval, 1, work( i ), 1 )
241 CALL igebs2d( ictxt,
'All',
' ', i, 1, work, i )
245 WRITE( nout, fmt = 9999 )
246 $
'ScaLAPACK nonsymmetric eigenvector calculation.'
247 WRITE( nout, fmt = 9999 )usrinfo
248 WRITE( nout, fmt = * )
249 WRITE( nout, fmt = 9999 )
'Tests of the parallel ' //
250 $
'complex single precision eigenvector calculation.'
251 WRITE( nout, fmt = 9999 )
'The following scaled residual ' //
252 $
'checks will be computed:'
253 WRITE( nout, fmt = 9999 )
254 $
' Residual = max( ||T*R-R*D||/(||H||*eps*N)' //
255 $
' , ||T^H*L-L*D^H||/(||H||*eps*N) )'
256 WRITE( nout, fmt = 9999 )
257 $
' Normalization residual = max(max_j(max|R(j)|-1),' //
258 $
' max_j(max|L(j)|-1))/(eps*N)'
259 WRITE( nout, fmt = 9999 )
'The matrix A is randomly ' //
260 $
'generated for each test.'
261 WRITE( nout, fmt = * )
262 WRITE( nout, fmt = 9999 )
'An explanation of the input/output '
263 $ //
'parameters follows:'
264 WRITE( nout, fmt = 9999 )
265 $
'TIME : Indicates whether WALL or ' //
266 $
'CPU time was used.'
268 WRITE( nout, fmt = 9999 )
269 $
'N : The number of columns in the ' //
'matrix A.'
270 WRITE( nout, fmt = 9999 )
271 $
'NB : The size of the square blocks the' //
272 $
' matrix A is split into.'
273 WRITE( nout, fmt = 9999 )
274 $
'P : The number of process rows.'
275 WRITE( nout, fmt = 9999 )
276 $
'Q : The number of process columns.'
277 WRITE( nout, fmt = 9999 )
278 $
'THRESH : If a residual value is less than' //
279 $
' THRESH, CHECK is flagged as PASSED'
280 WRITE( nout, fmt = 9999 )
281 $
'NEP time : Time in seconds to decompose the ' //
' matrix'
282 WRITE( nout, fmt = 9999 )
'MFLOPS : Rate of execution '
283 WRITE( nout, fmt = * )
284 WRITE( nout, fmt = 9999 )
285 $
'The following parameter values will be used:'
286 WRITE( nout, fmt = 9996 )
'N ',
287 $ ( nval( i ), i = 1,
min( nmat, 10 ) )
289 $
WRITE( nout, fmt = 9997 )( nval( i ), i = 11, nmat )
290 WRITE( nout, fmt = 9996 )
'NB ',
291 $ ( nbval( i ), i = 1,
min( nnb, 10 ) )
293 $
WRITE( nout, fmt = 9997 )( nbval( i ), i = 11, nnb )
294 WRITE( nout, fmt = 9996 )
'P ',
295 $ ( pval( i ), i = 1,
min( ngrids, 10 ) )
297 $
WRITE( nout, fmt = 9997 )( pval( i ), i = 11, ngrids )
298 WRITE( nout, fmt = 9996 )
'Q ',
299 $ ( qval( i ), i = 1,
min( ngrids, 10 ) )
301 $
WRITE( nout, fmt = 9997 )( qval( i ), i = 11, ngrids )
302 WRITE( nout, fmt = * )
303 WRITE( nout, fmt = 9995 )eps
304 WRITE( nout, fmt = 9998 )thresh
311 $
CALL blacs_setup( iam, nprocs )
316 CALL blacs_get( -1, 0, ictxt )
317 CALL blacs_gridinit( ictxt,
'Row-major', 1, nprocs )
321 eps = pslamch( ictxt,
'eps' )
323 CALL sgebr2d( ictxt,
'All',
' ', 1, 1, thresh, 1, 0, 0 )
324 CALL igebr2d( ictxt,
'All',
' ', 3, 1, work, 3, 0, 0 )
329 i = nmat + nnb + 2*ngrids
330 CALL igebr2d( ictxt,
'All',
' ', i, 1, work, i, 0, 0 )
332 CALL icopy( nmat, work( i ), 1, nval, 1 )
334 CALL icopy( nnb, work( i ), 1, nbval, 1 )
336 CALL icopy( ngrids, work( i ), 1, pval, 1 )
338 CALL icopy( ngrids, work( i ), 1, qval, 1 )
342 CALL blacs_gridexit( ictxt )
347 WRITE( nout, fmt = 9993 )
349 IF( nout.NE.6 .AND. nout.NE.0 )
351 CALL blacs_abort( ictxt, 1 )
356 9998
FORMAT(
'Routines pass computational tests if scaled residual ',
357 $
'is less than ', g12.5 )
358 9997
FORMAT(
' ', 10i6 )
359 9996
FORMAT( 2x, a5,
' : ', 10i6 )
360 9995
FORMAT(
'Relative machine precision (eps) is taken to be ',
362 9994
FORMAT(
' Number of values of ', 5a,
363 $
' is less than 1 or greater ',
'than ', i2 )
364 9993
FORMAT(
' Illegal input in file ', 40a,
'. Aborting run.' )
365 9992
FORMAT(
' Blocking size too small at ', i2,
' must be >=6.' )