CH_EMIS_FIELD_t Derived Type

type, public :: CH_EMIS_FIELD_t


Contents

Source Code


Components

TypeVisibility AttributesNameInitial
real, public :: XTIME_SIMUL =0.
integer, public :: NTIME_MAX
integer, public :: NEMIS_NBR
character(len=3), public, DIMENSION(:), POINTER:: CEMIS_AREA
character(len=40), public, DIMENSION(:), POINTER:: CEMIS_COMMENT
character(len=40), public, DIMENSION(:), POINTER:: CEMIS_NAME
integer, public, DIMENSION(:), POINTER:: NEMIS_TIME
real, public, DIMENSION(:,:), POINTER:: XEMIS_FIELDS
integer, public :: NEMISPEC_NBR
type(EMISSVAR_T), public, DIMENSION(:), POINTER:: TSEMISS
type(PRONOSVAR_T), public, POINTER:: TSPRONOSLIST

Source Code

TYPE CH_EMIS_FIELD_t
!
  REAL               :: XTIME_SIMUL  = 0.
  INTEGER            :: NTIME_MAX
  INTEGER            :: NEMIS_NBR
!                          ! number of chemical pgd fields chosen by user
  CHARACTER(LEN=3) , DIMENSION(:), POINTER :: CEMIS_AREA
!                          ! areas where chemical pgd fields are defined
!                          ! 'ALL' : everywhere
!                          ! 'SEA' : where sea exists
!                          ! 'LAN' : where land exists
!                          ! 'WAT' : where inland water exists
!                          ! 'NAT' : where natural or agricultural areas exist
!                          ! 'TWN' : where town areas exist
!                          ! 'STR' : where streets are present
!                          ! 'BLD' : where buildings are present
!                          !
  CHARACTER(LEN=40), DIMENSION(:), POINTER :: CEMIS_COMMENT ! comment
  CHARACTER(LEN=40), DIMENSION(:), POINTER :: CEMIS_NAME
!                          ! name of the chemical pgd fields (emitted species)
!
  INTEGER,           DIMENSION(:), POINTER :: NEMIS_TIME   ! emission time
!
  REAL,              DIMENSION(:,:), POINTER:: XEMIS_FIELDS ! emission pgd fields values
!
  INTEGER                                          :: NEMISPEC_NBR ! Number of chemical species
!
  TYPE(EMISSVAR_T),  DIMENSION(:), POINTER :: TSEMISS      ! Offline emission struct array
!
  TYPE(PRONOSVAR_T),               POINTER     :: TSPRONOSLIST ! Head pointer on pronostic
!                                                              variables list
!-------------------------------------------------------------------------------
!
END TYPE CH_EMIS_FIELD_t