Some max_second confusion cleaned up. It is still initialized in too

many different places, but at least to the same value (10^7 s)


git-svn-id: http://qeforge.qe-forge.org/svn/q-e/trunk/espresso@3980 c92efa57-630b-4861-b058-cf58834340f0
This commit is contained in:
giannozz 2007-06-25 13:35:29 +00:00
parent 9b8c7c7217
commit ddfe7191ca
6 changed files with 10 additions and 15 deletions

View File

@ -558,8 +558,8 @@
frich = frich * greash
! ... stop the code if either the file .cp_stop is present or the
! ... cpu time is greater than max_seconds
! ... stop the code if either the file .cp_stop is present or if
! ... the cpu time exceeds the limit set in input (max_seconds)
tstop = check_stop_now()

View File

@ -32,7 +32,7 @@ MODULE path_routines
USE input_parameters, ONLY : pos, CI_scheme, opt_scheme, num_of_images, &
first_last_opt, temp_req, ds, k_max, &
k_min, path_thr, restart_mode, nstep, &
calculation, max_seconds, use_freezing, &
calculation, use_freezing, &
phase_space, ion_dynamics, etot_conv_thr, &
forc_conv_thr
!

View File

@ -24,7 +24,6 @@ PROGRAM phcg
REAL(DP), ALLOCATABLE :: dchi_dtau(:,:,:,:), dynout(:,:)
REAL(DP), ALLOCATABLE :: w2(:)
REAL(DP):: max_seconds = 1.D+6
CHARACTER(len=9) :: cdate, ctime, code = 'PHCG'
LOGICAL :: exst
INTEGER :: i

View File

@ -138,7 +138,7 @@ SUBROUTINE phq_readin()
elph = .FALSE.
lraman = .FALSE.
elop = .FALSE.
max_seconds = 10000000.D0
max_seconds = 1.E+7_DP
reduce_io = .FALSE.
CALL get_env( 'ESPRESSO_TMPDIR', outdir )
IF ( TRIM( outdir ) == ' ' ) outdir = './'

View File

@ -18,7 +18,6 @@ SUBROUTINE phqscf
!
USE io_global, ONLY : stdout, ionode
! USE check_stop, ONLY: max_seconds
USE pwcom
USE kinds, ONLY : DP
USE phcom
@ -90,7 +89,6 @@ SUBROUTINE phqscf
ENDIF
!
tcpu = get_clock ('PHONON')
! if (tcpu > max_second) then
!
! We test here if we have done the appropriate number of
! representation

View File

@ -26,7 +26,7 @@ subroutine solve_e_vdw ( iu )
USE io_global, ONLY : stdout
USE io_files, ONLY : iunigk, prefix, iunwfc, nwordwfc
use pwcom
USE check_stop, ONLY : time_max => max_seconds
USE check_stop, ONLY : check_stop_now
! USE wavefunctions_module, ONLY : evc
USE kinds, ONLY : DP
USE becmod, ONLY : becp
@ -400,16 +400,14 @@ subroutine solve_e_vdw ( iu )
! close (unit = iunrec, status = 'keep')
tcpu = get_clock ('VdW')
if (convt.or.tcpu.gt.time_max) goto 155
if (check_stop_now()) then
call stop_ph (.false.)
endif
if (convt) goto 155
enddo ! of iteration
!
155 continue
if (tcpu.gt.time_max) then
WRITE( stdout, "(/,5x,'Stopping for time limit ',2f10.0)") tcpu, &
time_max
call stop_ph (.false.)
endif
!
deallocate (eprec)
deallocate (h_diag)