SURFEX  V8_0
Surfex V8_0 release
 All Classes Files Functions Variables
put_zs_sean.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 ! ######spl
6  SUBROUTINE put_zs_sea_n (S, &
7  hprogram,ki,pzs)
8 ! ###########################################
9 !
10 !!**** *PUT_ZS_SURF_ATM_n* - routine to modify nature oropgraphy using atmospheric
11 ! model orography
12 !!
13 !! PURPOSE
14 !! -------
15 !!
16 !!** METHOD
17 !! ------
18 !!
19 !! EXTERNAL
20 !! --------
21 !!
22 !!
23 !! IMPLICIT ARGUMENTS
24 !! ------------------
25 !!
26 !! REFERENCE
27 !! ---------
28 !!
29 !!
30 !! AUTHOR
31 !! ------
32 !! P. Le Moigne *Meteo France*
33 !!
34 !! MODIFICATIONS
35 !! -------------
36 !! Original 05/2007
37 !-------------------------------------------------------------------------------
38 !
39 !* 0. DECLARATIONS
40 ! ------------
41 !
42 !
43 USE modd_seaflux_n, ONLY : seaflux_t
44 !
45 USE modi_get_luout
46 !
47 !
48 !
49 USE yomhook ,ONLY : lhook, dr_hook
50 USE parkind1 ,ONLY : jprb
51 !
52 IMPLICIT NONE
53 !
54 !* 0.1 Declarations of arguments
55 ! -------------------------
56 !
57 !
58 TYPE(seaflux_t), INTENT(INOUT) :: s
59 !
60  CHARACTER(LEN=6), INTENT(IN) :: hprogram
61 INTEGER, INTENT(IN) :: ki ! horizontal dim. of cover
62 REAL, DIMENSION(KI), INTENT(IN) :: pzs ! orography
63 !
64 !
65 !* 0.2 Declarations of local variables
66 ! -------------------------------
67 !
68 INTEGER :: iluout
69 REAL(KIND=JPRB) :: zhook_handle
70 !
71 
72 !-------------------------------------------------------------------------------
73 IF (lhook) CALL dr_hook('PUT_ZS_SEA_N',0,zhook_handle)
74  CALL get_luout(hprogram,iluout)
75 !-------------------------------------------------------------------------------
76 !
77 IF ( SIZE(pzs) /= SIZE(s%XZS) ) THEN
78  WRITE(iluout,*) 'try to get ZS field from atmospheric model, but size is not correct'
79  WRITE(iluout,*) 'size of field expected by the atmospheric model (PZS) :', SIZE(pzs)
80  WRITE(iluout,*) 'size of field over sea (XZS) :', SIZE(s%XZS)
81  stop
82 ELSE
83  s%XZS = pzs
84 END IF
85 IF (lhook) CALL dr_hook('PUT_ZS_SEA_N',1,zhook_handle)
86 !
87 !==============================================================================
88 !
89 END SUBROUTINE put_zs_sea_n
subroutine put_zs_sea_n(S, HPROGRAM, KI, PZS)
Definition: put_zs_sean.F90:6
subroutine get_luout(HPROGRAM, KLUOUT)
Definition: get_luout.F90:6