SURFEX v8.1
General documentation of Surfex
write_diag_naturen.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 ! #########
6 SUBROUTINE write_diag_nature_n (DTCO, DUO, U, IM, NDST, HPROGRAM,HWRITE)
7 ! ###############################################################################
8 !
9 !!**** *WRITE_DIAG_NATURE_n * - Chooses the surface schemes for diagnostics over
10 !! natural continental parts
11 !!
12 !! PURPOSE
13 !! -------
14 !
15 !!** METHOD
16 !! ------
17 !!
18 !! REFERENCE
19 !! ---------
20 !!
21 !!
22 !! AUTHOR
23 !! ------
24 !! V. Masson
25 !!
26 !! MODIFICATIONS
27 !! -------------
28 !! Original 01/2004
29 !!------------------------------------------------------------------
30 !
31 !
33 USE modd_diag_n, ONLY : diag_options_t
34 USE modd_surf_atm_n, ONLY : surf_atm_t
35 USE modd_surfex_n, ONLY : isba_model_t
36 USE modd_dst_n, ONLY : dst_np_t
37 !
38 USE modd_surf_par, ONLY : xundef
39 !
40 USE modi_write_diag_isba_n
41 !
42 !
43 USE yomhook ,ONLY : lhook, dr_hook
44 USE parkind1 ,ONLY : jprb
45 !
46 IMPLICIT NONE
47 !
48 !* 0.1 declarations of arguments
49 !
50 !
51 TYPE(data_cover_t), INTENT(INOUT) :: DTCO
52 TYPE(diag_options_t), INTENT(INOUT) :: DUO
53 TYPE(surf_atm_t), INTENT(INOUT) :: U
54 TYPE(isba_model_t), INTENT(INOUT) :: IM
55 TYPE(dst_np_t), INTENT(INOUT) :: NDST
56 !
57  CHARACTER(LEN=6), INTENT(IN) :: HPROGRAM ! program calling surf. schemes
58  CHARACTER(LEN=3), INTENT(IN) :: HWRITE ! 'PGD' : only physiographic fields are written
59 REAL(KIND=JPRB) :: ZHOOK_HANDLE
60 ! ! 'ALL' : all fields are written
61 !
62 !
63 !* 0.2 declarations of local variables
64 !
65 !-------------------------------------------------------------------------------------
66 !
67 IF (lhook) CALL dr_hook('WRITE_DIAG_NATURE_N',0,zhook_handle)
68 IF (u%CNATURE=='ISBA ') THEN
69  CALL write_diag_isba_n(dtco, duo, u, im, ndst, hprogram,hwrite)
70 END IF
71 IF (lhook) CALL dr_hook('WRITE_DIAG_NATURE_N',1,zhook_handle)
72 !
73 !-------------------------------------------------------------------------------------
74 !
75 END SUBROUTINE write_diag_nature_n
subroutine write_diag_nature_n(DTCO, DUO, U, IM, NDST, HPROGRAM, HWRITE)
real, parameter xundef
integer, parameter jprb
Definition: parkind1.F90:32
logical lhook
Definition: yomhook.F90:15
subroutine write_diag_isba_n(DTCO, DUO, U, IM, NDST, HPROGRAM, HWRITE)