OCEAN_t Derived Type

type, public :: OCEAN_t


Contents

Source Code


Components

TypeVisibility AttributesNameInitial
logical, public :: LMERCATOR
logical, public :: LCURRENT
logical, public :: LPROGSST
integer, public :: NTIME_COUPLING
integer, public :: NOCTCOUNT
real, public :: XOCEAN_TSTEP
real, public, POINTER, DIMENSION(:,:):: XSEAT
real, public, POINTER, DIMENSION(:,:):: XSEAS
real, public, POINTER, DIMENSION(:,:):: XSEAU
real, public, POINTER, DIMENSION(:,:):: XSEAV
real, public, POINTER, DIMENSION(:,:):: XSEAE
real, public, POINTER, DIMENSION(:,:):: XSEABATH
real, public, POINTER, DIMENSION(:):: XSEAHMO
real, public, POINTER, DIMENSION(:,:):: XLE
real, public, POINTER, DIMENSION(:,:):: XLK
real, public, POINTER, DIMENSION(:,:):: XKMEL
real, public, POINTER, DIMENSION(:,:):: XKMELM
real, public, POINTER, DIMENSION(:):: XSEATEND
real, public, POINTER, DIMENSION(:,:):: XDTFSOL
real, public, POINTER, DIMENSION(:):: XDTFNSOL

Source Code

TYPE OCEAN_t
!
!
!   Switche for interactive coupling with oceanic model
LOGICAL:: LMERCATOR   !set to .true. to initialize oceanic var. from Mercator
LOGICAL:: LCURRENT    !set to .true. to make initialize ocean state with current      
LOGICAL:: LPROGSST    !set to .true. to make SST evolve with tendance
INTEGER:: NTIME_COUPLING! coupling time frequency 
INTEGER:: NOCTCOUNT   !oceanic model counter
REAL :: XOCEAN_TSTEP       ! time step of the oceanic 1D model
!
! General surface: 
!
REAL, POINTER, DIMENSION(:,:) :: XSEAT  ! oceanic temperature profiles 
REAL, POINTER, DIMENSION(:,:) :: XSEAS  ! oceanic salinity profiles 
REAL, POINTER, DIMENSION(:,:) :: XSEAU  ! oceanic zonal current profiles 
REAL, POINTER, DIMENSION(:,:) :: XSEAV  ! oceanic meridian current profiles 
REAL, POINTER, DIMENSION(:,:) :: XSEAE  ! oceanic kinetic turbulent energy profiles (^(1/2))
REAL, POINTER, DIMENSION(:,:) :: XSEABATH !bathymetry indice
                                          !=1 for free sea water
                                          !=0 for sea-bed
REAL, POINTER, DIMENSION(:) ::   XSEAHMO! oceanic mixing lengths
!
REAL, POINTER, DIMENSION(:,:) :: XLE,XLK! oceanic mixing lengths
REAL, POINTER, DIMENSION(:,:) :: XKMEL,XKMELM  ! oceanic mixing coefficients
!
REAL, POINTER, DIMENSION(:) ::   XSEATEND! SST tendance
!
REAL, POINTER, DIMENSION(:,:) ::   XDTFSOL ! Temp tendancy due to solar flux
REAL, POINTER, DIMENSION(:)   ::   XDTFNSOL! -------------------- non solar flux
!
END TYPE OCEAN_t