Ignore:
Timestamp:
Feb 6, 2019 1:10:18 PM (5 years ago)
Author:
kanani
Message:

Correct and clean-up cpu_logs, some overlapping counts (chemistry_model_mod, disturb_heatflux, large_scale_forcing_nudging_mod, ocean_mod, palm, prognostic_equations, synthetic_turbulence_generator_mod, time_integration, time_integration_spinup, turbulence_closure_mod)

File:
1 edited

Legend:

Unmodified
Added
Removed
  • palm/trunk/SOURCE/synthetic_turbulence_generator_mod.f90

    r3646 r3719  
    2525! -----------------
    2626! $Id$
     27! Removed log_point measurement from stg_init, since this part is counted to
     28! log_point(2) 'initialisation' already. Moved other log_points to calls of
     29! the subroutines in time_integration for better overview.
     30!
     31! 3646 2018-12-28 17:58:49Z kanani
    2732! Bugfix: use time_since_reference_point instead of simulated_time (relevant
    2833! when using wall/soil spinup)
     
    182187               syn_turb_gen
    183188
    184     USE cpulog,                                                                &
    185         ONLY:  cpu_log, log_point
    186 
    187189    USE indices,                                                               &
    188190        ONLY:  nbgp, nzb, nzt, nxl, nxlg, nxr, nxrg, nys, nyn, nyng, nysg
     
    573575#endif
    574576
    575     CALL  cpu_log( log_point(57), 'synthetic_turbulence_gen', 'start' )
    576 
    577577#if defined( __parallel )
    578578!
     
    885885    ENDIF
    886886
    887     CALL  cpu_log( log_point(57), 'synthetic_turbulence_gen', 'stop' )
    888 
    889887 END SUBROUTINE stg_init
    890888
     
    10851083    REAL(wp) :: volume_flow_l   !< local mass flux through lateral boundary
    10861084
    1087     CALL  cpu_log( log_point(57), 'synthetic_turbulence_gen', 'start' )
    10881085
    10891086!
     
    14291426    time_stg_call = 0.0_wp
    14301427
    1431     CALL  cpu_log( log_point(57), 'synthetic_turbulence_gen', 'stop' )
    14321428
    14331429 END SUBROUTINE stg_main
     
    18331829    INTEGER(iwp) ::  k
    18341830
    1835     CALL  cpu_log( log_point(57), 'synthetic_turbulence_gen', 'start' )
     1831
    18361832!
    18371833!-- Compute mean boundary layer height according to Richardson-Bulk
     
    18671863    time_stg_adjust = 0.0_wp
    18681864   
    1869     CALL  cpu_log( log_point(57), 'synthetic_turbulence_gen', 'stop' )
    18701865   
    18711866 END SUBROUTINE stg_adjust
Note: See TracChangeset for help on using the changeset viewer.