Ignore:
Timestamp:
May 22, 2019 9:52:13 AM (5 years ago)
Author:
kanani
Message:

clean up location, debug and error messages

File:
1 edited

Legend:

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

    r3943 r3987  
    2828! -----------------
    2929! $Id$
     30! Introduce alternative switch for debug output during timestepping
     31!
     32! 3943 2019-05-02 09:50:41Z maronga
    3033! Missing blank characteer added.
    3134!
     
    623626    USE control_parameters,                                                    &
    624627        ONLY:  cloud_droplets, coupling_char,                                  &
    625                debug_output, debug_string,                                     &
     628               debug_output, debug_output_timestep, debug_string,              &
    626629               dz, dt_spinup, end_time,                                        &
    627630               humidity,                                                       &
     
    13591362
    13601363
    1361        IF ( debug_output )  CALL debug_message( 'radiation_control', 'start' )
     1364       IF ( debug_output_timestep )  CALL debug_message( 'radiation_control', 'start' )
    13621365
    13631366
     
    13771380       END SELECT
    13781381
    1379        IF ( debug_output )  CALL debug_message( 'radiation_control', 'end' )
     1382       IF ( debug_output_timestep )  CALL debug_message( 'radiation_control', 'end' )
    13801383
    13811384    END SUBROUTINE radiation_control
     
    51115114
    51125115
    5113      IF ( debug_output )  CALL debug_message( 'radiation_interaction', 'start' )
     5116     IF ( debug_output_timestep )  CALL debug_message( 'radiation_interaction', 'start' )
    51145117
    51155118     IF ( plant_canopy )  THEN
     
    58575860           (emissivity_urb*sigma_sb * area_hor) )**0.25_wp
    58585861
    5859      IF ( debug_output )  CALL debug_message( 'radiation_interaction', 'end' )
     5862     IF ( debug_output_timestep )  CALL debug_message( 'radiation_interaction', 'end' )
    58605863
    58615864
Note: See TracChangeset for help on using the changeset viewer.