SURFEX  V8_0
Surfex V8_0 release
 All Classes Files Functions Variables
modd_ocean_reln.F90
Go to the documentation of this file.
1 !SFX_LIC Copyright 1994-2014 CNRS, Meteo-France and Universite Paul Sabatier
2 !SFX_LIC This is part of the SURFEX software governed by the CeCILL-C licence
3 !SFX_LIC version 1. See LICENSE, CeCILL-C_V1-en.txt and CeCILL-C_V1-fr.txt
4 !SFX_LIC for details. version 1.
5 ! ##################
7 ! ##################
8 !
9 ! Author : P. Peyrille
10 !! Date: 01/2012
11 !!
12 !! declaration of relaxation field, flag for ocean model
13 !
14 USE yomhook ,ONLY : lhook, dr_hook
15 USE parkind1 ,ONLY : jprb
16 !
17 IMPLICIT NONE
18 !
20 !
21  REAL :: XTAU_REL ! Time of relaxation (s)
22 !
23  REAL :: XQCORR ! correction coefficient for surface fluxes (BArnier et al. 1998) typcial val: 100.
24 !
25  LOGICAL :: LREL_CUR ! flag for relxation on current
26  LOGICAL :: LREL_TS ! flag for relaxation on ocean temperature
27  LOGICAL :: LFLUX_NULL ! Flag for testing zero incoming flux at the surface
28 !
29  LOGICAL :: LFLX_CORR ! Flag for flux correction
30  LOGICAL :: LDIAPYCNAL ! Flag for diapycnal mixing activation
31 !
32  REAL, POINTER, DIMENSION(:,:) :: XSEAU_REL ! ref. U current profile (C)
33  REAL, POINTER, DIMENSION(:,:) :: XSEAV_REL ! ref. V current profile (C)
34  REAL, POINTER, DIMENSION(:,:) :: XSEAT_REL ! ref. temperature profile (C)
35  REAL, POINTER, DIMENSION(:,:) :: XSEAS_REL ! ---- salinity ---------- (%)
36 !
37 END TYPE ocean_rel_t
38 !
39 
40 
41  CONTAINS
42 !
43 !
44 
45 
46 !
47 !
48 SUBROUTINE ocean_rel_init(YOCEAN_REL)
49 TYPE(ocean_rel_t), INTENT(INOUT) :: yocean_rel
50 REAL(KIND=JPRB) :: zhook_handle
51 IF (lhook) CALL dr_hook("MODD_OCEAN_REL_N:OCEAN_REL_INIT",0,zhook_handle)
52  nullify(yocean_rel%XSEAT_REL)
53  nullify(yocean_rel%XSEAS_REL)
54  nullify(yocean_rel%XSEAU_REL)
55  nullify(yocean_rel%XSEAV_REL)
56 yocean_rel%XTAU_REL=0.
57 yocean_rel%XQCORR=0.
58 yocean_rel%LREL_CUR=.false.
59 yocean_rel%LREL_TS=.false.
60 yocean_rel%LFLUX_NULL=.false.
61 yocean_rel%LFLX_CORR=.false.
62 yocean_rel%LDIAPYCNAL=.false.
63 !
64 IF (lhook) CALL dr_hook("MODD_OCEAN_REL_N:OCEAN_REL_INIT",1,zhook_handle)
65 END SUBROUTINE ocean_rel_init
66 !
67 !
68 END MODULE modd_ocean_rel_n
subroutine ocean_rel_init(YOCEAN_REL)