mo_semi_impl.f90

      MODULE mo_semi_impl
      
        USE mo_parameters
      
   5:   IMPLICIT NONE
      
        ! ---------------------------------------------------------------
        !
        ! module *mo_semi_impl* - quantities needed for the semi-implicit scheme
  10:   !
        ! ---------------------------------------------------------------
      
        REAL :: betadt       !  =0 : explicit scheme(for *d*,*t*,*alps*).
                             !  =1.:semi implicit scheme.
  15:   REAL :: betazq       !  =0 : explicit scheme(for *v0*,*q*).
                             !  =1.:semi implicit scheme.
        REAL :: apr          !  *reference surface pressure for semi-implicit scheme.
        REAL :: tr           !  *reference temperature for semi-implicit scheme.
        REAL :: ulat         !  *latitudeof maximum !u!+!v! (real winds).
  20:   REAL :: uvmax        !  *max(!u!+!v!) (real winds).
        REAL :: ulm          !  *linearization wind profile on the latitude
                             !  and at the level of maximum !u!+!v!.
        REAL :: vcrit        !  *critical velocity above which
                             !  horizontal diffusion is enhanced for
  25:                        !  t63 with dt=20min.
        REAL :: vcheck       !  threshold value for check of high windspeed
        REAL :: hdamp        !  *damping factor for strong
                             !  stratospheric damping.
        REAL, ALLOCATABLE :: vmax(:)
  30: 
        INTEGER :: nulev     !  *level of maximum !u!+!v! (real winds).
      
      END MODULE mo_semi_impl


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.