tpm_ctl.F90 Source File


This file depends on

sourcefile~~tpm_ctl.f90~2~~EfferentGraph sourcefile~tpm_ctl.f90~2 tpm_ctl.F90 sourcefile~sharedmem_mod.f90 sharedmem_mod.F90 sourcefile~tpm_ctl.f90~2->sourcefile~sharedmem_mod.f90

Source Code

! (C) Copyright 2000- ECMWF.
! (C) Copyright 2000- Meteo-France.
! 
! This software is licensed under the terms of the Apache Licence Version 2.0
! which can be obtained at http://www.apache.org/licenses/LICENSE-2.0.
! In applying this licence, ECMWF does not waive the privileges and immunities
! granted to it by virtue of its status as an intergovernmental organisation
! nor does it submit to any jurisdiction.
!

MODULE TPM_CTL

USE, INTRINSIC :: iso_c_binding, ONLY:  C_PTR, C_NULL_PTR
USE SHAREDMEM_MOD ,ONLY : SHAREDMEM
IMPLICIT NONE

SAVE


TYPE CTL_TYPE

LOGICAL :: LREAD_LEGPOL = .FALSE.
LOGICAL :: LWRITE_LEGPOL = .FALSE.
CHARACTER(LEN=256) :: CLEGPOLFNAME='legpol_file'
CHARACTER(LEN=4) :: CIO_TYPE='file'
TYPE(SHAREDMEM) :: STORAGE

END TYPE CTL_TYPE


TYPE(CTL_TYPE),ALLOCATABLE,TARGET :: CTL_RESOL(:)
TYPE(CTL_TYPE),POINTER     :: C


END MODULE TPM_CTL