Skip to content

Commit

Permalink
HELIUM: Fix conversion error
Browse files Browse the repository at this point in the history
  • Loading branch information
cschran authored and hforbert committed Sep 12, 2019
1 parent 67dafef commit f88c4c6
Showing 1 changed file with 5 additions and 5 deletions.
10 changes: 5 additions & 5 deletions src/motion/helium_io.F
Original file line number Diff line number Diff line change
Expand Up @@ -475,9 +475,9 @@ SUBROUTINE helium_print_energy(helium_env)
CHARACTER(len=*), PARAMETER :: routineN = 'helium_print_energy', &
routineP = moduleN//':'//routineN
INTEGER :: handle, iteration, k, m, ntot, unit_nr
INTEGER :: handle, iteration, k, m, unit_nr
LOGICAL :: cepsample, file_is_new, should_output
REAL(KIND=dp) :: naccptd
REAL(KIND=dp) :: naccptd, ntot
REAL(KIND=dp), DIMENSION(:), POINTER :: my_energy
TYPE(cp_logger_type), POINTER :: logger
TYPE(section_vals_type), POINTER :: print_key
Expand All @@ -502,15 +502,15 @@ SUBROUTINE helium_print_energy(helium_env)
naccptd = 0.0_dp
IF (cepsample) THEN
ntot = 0
ntot = 0.0_dp
DO k = 1, SIZE(helium_env)
ntot = ntot+helium_env(1)%helium%iter_norot*helium_env(1)%helium%iter_rot
DO m = 1, helium_env(k)%helium%maxcycle
naccptd = naccptd+helium_env(k)%helium%num_accepted(helium_env(k)%helium%bisctlog2+2, m)
END DO
END DO
ELSE !(wormsample)
ntot = 0
ntot = 0.0_dp
DO k = 1, SIZE(helium_env)
naccptd = naccptd+helium_env(k)%helium%num_accepted(1, 1)
ntot = ntot+helium_env(k)%helium%num_accepted(2, 1)
Expand Down Expand Up @@ -544,7 +544,7 @@ SUBROUTINE helium_print_energy(helium_env)
WRITE (unit_nr, "(I9,7(1X,F20.9))") &
iteration, &
REAL(naccptd, dp)/REAL(ntot, dp), &
naccptd/ntot, &
my_energy(e_id_potential), &
my_energy(e_id_kinetic), &
my_energy(e_id_thermo), &
Expand Down

0 comments on commit f88c4c6

Please sign in to comment.