mo_hdiff.f90

      MODULE mo_hdiff
      
        USE mo_parameters
      
   5:   IMPLICIT NONE
      
        ! ---------------------------------------------------------------
        !
        ! module *mo_hdiff* - coefficients for horizontal diffusion.
  10:   !
        ! ---------------------------------------------------------------
      
        REAL    :: dampth
        REAL    :: difvo           !  coefficient for vorticity.
  15:   REAL    :: difd            !  coefficient for divergence.
        REAL    :: dift            !  coefficient for temperature.
        REAL, ALLOCATABLE    :: diftcor(:) !  correction profile for temperature
        REAL    :: cdrag           !  drag coefficient in seconds
                                   !  or -(drag coefficent) in days
  20:   REAL    :: enstdif         !  *factor by which stratospheric
                                   !  horizontal diffusion is increased from one
                                   !  level to next level above.
        INTEGER :: nlvstd1         !  *last (uppermost) layer at which
                                   !  stratospheric horizontal diffusion is
  25:                              !  enhanced.
        INTEGER :: nlvstd2         !  *first (lowest) layer at which
                                   !  stratospheric horizontal diffusion is
                                   !  enhanced.
        LOGICAL :: ldiahdf         !  .true. for statistics of horizontal diffusion
  30:   LOGICAL :: ldrag           !  .true. to apply drag to upper 2 levels
      
      END MODULE mo_hdiff


Info Section
uses: mo_parameters
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.