Ignore:
Timestamp:
Apr 11, 2019 11:29:34 AM (5 years ago)
Author:
kanani
Message:

restructure/add location/debug messages

File:
1 edited

Legend:

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

    r3881 r3885  
    2626! -----------------
    2727! $Id$
     28! Changes related to global restructuring of location messages and introduction
     29! of additional debug messages
     30!
     31! 3881 2019-04-10 09:31:22Z suehring
    2832! Assure that Obukhov length does not become zero
    2933!
     
    273277        ONLY:  air_chemistry, cloud_droplets,                                  &
    274278               constant_heatflux, constant_scalarflux,                         &
    275                constant_waterflux, coupling_mode, do_output_at_2m, humidity,   &
     279               constant_waterflux, coupling_mode,                              &
     280               debug_output, debug_string,                                     &
     281               do_output_at_2m, humidity,                                      &
    276282               ibc_e_b, ibc_pt_b, indoor_model, initializing_actions,          &
    277283               intermediate_timestep_count, intermediate_timestep_count_max,   &
     
    356362
    357363       IMPLICIT NONE
     364
     365
     366       IF ( debug_output )  CALL debug_message( 'surface_layer_fluxes', 'start' )
    358367
    359368       surf_vertical = .FALSE. !< flag indicating vertically orientated surface elements
     
    716725       ENDDO
    717726       mom_tke = .FALSE.
    718  
     727
     728       IF ( debug_output )  CALL debug_message( 'surface_layer_fluxes', 'end' )
    719729
    720730    END SUBROUTINE surface_layer_fluxes
     
    733743
    734744
    735        CALL location_message( 'initializing surface layer', .FALSE. )
     745       CALL location_message( 'initializing surface layer', 'start' )
    736746
    737747!
     
    744754       ENDIF
    745755
    746        CALL location_message( 'finished', .TRUE. )
     756       CALL location_message( 'initializing surface layer', 'finished' )
    747757
    748758    END SUBROUTINE init_surface_layer_fluxes
Note: See TracChangeset for help on using the changeset viewer.