mo_param_switches.f90

      MODULE mo_param_switches
      
        IMPLICIT NONE
      
   5:   !
        ! ----------------------------------------------------------------
        !
        ! module *mo_param_switches* switches related to the parameterisations of
        !                            diabatic processes except for radiation.
  10:   !
        ! ----------------------------------------------------------------
      
        LOGICAL :: lphys    !   *true for parameterisation of diabatic processes.
        LOGICAL :: lvdiff   !   *true for vertical diffusion.
  15:   LOGICAL :: lcond    !   *true for large scale condensation scheme.
        LOGICAL :: lsurf    !   *true for surface exchanges.
        LOGICAL :: lconv    !   *true to allow convection
        LOGICAL :: lgwdrag  !   *true for gravity wave drag scheme
        LOGICAL :: lice     !   *true for sea-ice temperature calculation
  20: 
        INTEGER :: ndiapfr  !   *frequency of physics budgets.
                            !   if(nradfr.gt.0):rad every *nradfr* time step.
                            !   if(nradfr.lt.0):rad every *-nradfr* hours.
      
  25: 
      END MODULE mo_param_switches


Info Section
back to top
ECHAM 4 vf90 (C) 1998 Max-Planck-Institut für Meteorologie, Hamburg
Wed Nov 24 01:25:21 CST 1999

HTML derived from FORTRAN source by f2html.pl v0.3 (C) 1997,98 Beroud Jean-Marc.