conv_mod Module


*** SUBROUTINE CONVECT * *** VERSION 4.3c *** 20 May, 2002 *** Kerry Emanuel ***




Variables

Type Visibility Attributes Name Initial
real, public, allocatable, dimension(:,:) :: pconv
real, public, allocatable, dimension(:,:) :: phconv
real, public, allocatable, dimension(:,:) :: dpr
real, public, allocatable, dimension(:,:) :: pconv_hpa
real, public, allocatable, dimension(:,:) :: phconv_hpa
real, public, allocatable, dimension(:,:) :: sub
real, public, allocatable, dimension(:,:) :: tconv
real, public, allocatable, dimension(:,:) :: qconv
real, public, allocatable, dimension(:,:) :: qsconv
real, public, allocatable, dimension(:,:,:) :: fmass
real, public, allocatable, dimension(:,:,:) :: fmassfrac
real, public, allocatable, dimension(:,:,:) :: cbaseflux
real, public, allocatable, dimension(:,:,:,:) :: cbasefluxn
real, public, allocatable, dimension(:,:), save :: uvzlev
real, public, allocatable, dimension(:,:) :: wsub
real, public :: psconv
real, public :: tt2conv
real, public :: td2conv
integer, public :: nconvlev
integer, public :: nconvtop

Subroutines

public subroutine alloc_convect()

Arguments

None

public subroutine dealloc_convect()

Arguments

None

public subroutine set_conv_top()

Read more…

Arguments

None

public subroutine convmix(itime)

handles all the calculations related to convective mixing Petra Seibert, Bernd C. Krueger, Feb 2001 nested grids included, Bernd C. Krueger, May 2001

Read more…

Arguments

Type IntentOptional Attributes Name
integer :: itime

public subroutine calcmatrix(lconv, delt, cbmf, ithread)

This subroutine calculates the matrix describing convective * redistribution of mass in a grid column, using the subroutine * convect43c.f provided by Kerry Emanuel. * * Petra Seibert, Bernd C. Krueger, 2000-2001 * *

Read more…

Arguments

Type IntentOptional Attributes Name
logical :: lconv
real :: delt
real :: cbmf
integer, intent(in) :: ithread

public subroutine redist(itime, ipart, ktop, ipconv, ithread)

Do the redistribution of particles due to convection This subroutine is called for each particle which is assigned a new vertical position randomly, based on the convective redistribution matrix

Read more…

Arguments

Type IntentOptional Attributes Name
integer :: itime
integer :: ipart
integer :: ktop
integer :: ipconv
integer, intent(in) :: ithread

public subroutine CONVECT(nd, nl, delt, iflag, precip, wd, tprime, qprime, cbmf, ithread)

T: Array of absolute temperature (K) of dimension ND, with first index corresponding to lowest model level. Note that this array will be altered by the subroutine if dry convective adjustment occurs and if IPBL is not equal to 0.

Read more…

Arguments

Type IntentOptional Attributes Name
integer :: nd
integer :: nl
real :: delt
integer :: iflag
real :: precip
real :: wd
real :: tprime
real :: qprime
real :: cbmf
integer, intent(in) :: ithread

public subroutine TLIFT(GZ, icb, nk, TVP, TPK, CLW, nd, nl, kk, ithread)

Arguments

Type IntentOptional Attributes Name
real :: GZ(ND)
integer :: icb
integer :: nk
real :: TVP(ND)
real :: TPK(ND)
real :: CLW(ND)
integer :: nd
integer :: nl
integer :: kk
integer, intent(in) :: ithread