New URL for NEMO forge!   http://forge.nemo-ocean.eu

Since March 2022 along with NEMO 4.2 release, the code development moved to a self-hosted GitLab.
This present forge is now archived and remained online for history.
diawri.F90 in NEMO/trunk/src/OCE/DIA – NEMO

source: NEMO/trunk/src/OCE/DIA/diawri.F90 @ 12649

Last change on this file since 12649 was 12649, checked in by smasson, 4 years ago

trunk: clean and unique 3rd dimension in iom_rstput, see #2432

  • Property svn:keywords set to Id
File size: 55.4 KB
RevLine 
[3]1MODULE diawri
2   !!======================================================================
3   !!                     ***  MODULE  diawri  ***
4   !! Ocean diagnostics :  write ocean output files
5   !!=====================================================================
[2528]6   !! History :  OPA  ! 1991-03  (M.-A. Foujols)  Original code
7   !!            4.0  ! 1991-11  (G. Madec)
8   !!                 ! 1992-06  (M. Imbard)  correction restart file
9   !!                 ! 1992-07  (M. Imbard)  split into diawri and rstwri
10   !!                 ! 1993-03  (M. Imbard)  suppress writibm
11   !!                 ! 1998-01  (C. Levy)  NETCDF format using ioipsl INTERFACE
12   !!                 ! 1999-02  (E. Guilyardi)  name of netCDF files + variables
13   !!            8.2  ! 2000-06  (M. Imbard)  Original code (diabort.F)
14   !!   NEMO     1.0  ! 2002-06  (A.Bozec, E. Durand)  Original code (diainit.F)
15   !!             -   ! 2002-09  (G. Madec)  F90: Free form and module
16   !!             -   ! 2002-12  (G. Madec)  merge of diabort and diainit, F90
17   !!                 ! 2005-11  (V. Garnier) Surface pressure gradient organization
18   !!            3.2  ! 2008-11  (B. Lemaire) creation from old diawri
[5836]19   !!            3.7  ! 2014-01  (G. Madec) remove eddy induced velocity from no-IOM output
20   !!                 !                     change name of output variables in dia_wri_state
[2528]21   !!----------------------------------------------------------------------
[3]22
23   !!----------------------------------------------------------------------
[2528]24   !!   dia_wri       : create the standart output files
25   !!   dia_wri_state : create an output NetCDF file for a single instantaeous ocean state and forcing fields
26   !!----------------------------------------------------------------------
[9019]27   USE oce            ! ocean dynamics and tracers
[12377]28   USE isf_oce
29   USE isfcpl
30   USE abl            ! abl variables in case ln_abl = .true.
[9019]31   USE dom_oce        ! ocean space and time domain
32   USE phycst         ! physical constants
33   USE dianam         ! build name of file (routine)
34   USE diahth         ! thermocline diagnostics
35   USE dynadv   , ONLY: ln_dynadv_vec
36   USE icb_oce        ! Icebergs
37   USE icbdia         ! Iceberg budgets
38   USE ldftra         ! lateral physics: eddy diffusivity coef.
39   USE ldfdyn         ! lateral physics: eddy viscosity   coef.
40   USE sbc_oce        ! Surface boundary condition: ocean fields
41   USE sbc_ice        ! Surface boundary condition: ice fields
42   USE sbcssr         ! restoring term toward SST/SSS climatology
43   USE sbcwave        ! wave parameters
44   USE wet_dry        ! wetting and drying
45   USE zdf_oce        ! ocean vertical physics
46   USE zdfdrg         ! ocean vertical physics: top/bottom friction
47   USE zdfmxl         ! mixed layer
[6140]48   !
[9019]49   USE lbclnk         ! ocean lateral boundary conditions (or mpp link)
50   USE in_out_manager ! I/O manager
51   USE dia25h         ! 25h Mean output
52   USE iom            !
53   USE ioipsl         !
[5463]54
[9570]55#if defined key_si3
[10425]56   USE ice 
[9019]57   USE icewri 
[1482]58#endif
[2715]59   USE lib_mpp         ! MPP library
[3294]60   USE timing          ! preformance summary
[12377]61   USE diu_bulk        ! diurnal warm layer
62   USE diu_coolskin    ! Cool skin
[2528]63
[3]64   IMPLICIT NONE
65   PRIVATE
66
[2528]67   PUBLIC   dia_wri                 ! routines called by step.F90
68   PUBLIC   dia_wri_state
[2715]69   PUBLIC   dia_wri_alloc           ! Called by nemogcm module
[12377]70#if ! defined key_iomput   
71   PUBLIC   dia_wri_alloc_abl       ! Called by sbcabl  module (if ln_abl = .true.)
72#endif
[2528]73   INTEGER ::   nid_T, nz_T, nh_T, ndim_T, ndim_hT   ! grid_T file
[3609]74   INTEGER ::          nb_T              , ndim_bT   ! grid_T file
[2528]75   INTEGER ::   nid_U, nz_U, nh_U, ndim_U, ndim_hU   ! grid_U file
76   INTEGER ::   nid_V, nz_V, nh_V, ndim_V, ndim_hV   ! grid_V file
77   INTEGER ::   nid_W, nz_W, nh_W                    ! grid_W file
[12377]78   INTEGER ::   nid_A, nz_A, nh_A, ndim_A, ndim_hA   ! grid_ABL file   
[2528]79   INTEGER ::   ndex(1)                              ! ???
[2715]80   INTEGER, SAVE, ALLOCATABLE, DIMENSION(:) :: ndex_hT, ndex_hU, ndex_hV
[12377]81   INTEGER, SAVE, ALLOCATABLE, DIMENSION(:) :: ndex_hA, ndex_A ! ABL
[2715]82   INTEGER, SAVE, ALLOCATABLE, DIMENSION(:) :: ndex_T, ndex_U, ndex_V
[3609]83   INTEGER, SAVE, ALLOCATABLE, DIMENSION(:) :: ndex_bT
[3]84
85   !! * Substitutions
[12377]86#  include "do_loop_substitute.h90"
[3]87   !!----------------------------------------------------------------------
[9598]88   !! NEMO/OCE 4.0 , NEMO Consortium (2018)
[5217]89   !! $Id$
[10068]90   !! Software governed by the CeCILL license (see ./LICENSE)
[3]91   !!----------------------------------------------------------------------
92CONTAINS
93
[6140]94#if defined key_iomput
[3]95   !!----------------------------------------------------------------------
[2528]96   !!   'key_iomput'                                        use IOM library
97   !!----------------------------------------------------------------------
[9652]98   INTEGER FUNCTION dia_wri_alloc()
99      !
100      dia_wri_alloc = 0
101      !
102   END FUNCTION dia_wri_alloc
[2715]103
[9652]104   
[12377]105   SUBROUTINE dia_wri( kt, Kmm )
[1482]106      !!---------------------------------------------------------------------
107      !!                  ***  ROUTINE dia_wri  ***
108      !!                   
109      !! ** Purpose :   Standard output of opa: dynamics and tracer fields
110      !!      NETCDF format is used by default
111      !!
112      !! ** Method  :  use iom_put
113      !!----------------------------------------------------------------------
114      INTEGER, INTENT( in ) ::   kt      ! ocean time-step index
[12377]115      INTEGER, INTENT( in ) ::   Kmm     ! ocean time level index
[1756]116      !!
[9019]117      INTEGER ::   ji, jj, jk       ! dummy loop indices
118      INTEGER ::   ikbot            ! local integer
119      REAL(wp)::   zztmp , zztmpx   ! local scalar
120      REAL(wp)::   zztmp2, zztmpy   !   -      -
121      REAL(wp), DIMENSION(jpi,jpj)     ::   z2d   ! 2D workspace
122      REAL(wp), DIMENSION(jpi,jpj,jpk) ::   z3d   ! 3D workspace
[1482]123      !!----------------------------------------------------------------------
124      !
[9124]125      IF( ln_timing )   CALL timing_start('dia_wri')
[3294]126      !
[1482]127      ! Output the initial state and forcings
128      IF( ninist == 1 ) THEN                       
[12377]129         CALL dia_wri_state( Kmm, 'output.init' )
[1482]130         ninist = 0
131      ENDIF
[3]132
[6351]133      ! Output of initial vertical scale factor
134      CALL iom_put("e3t_0", e3t_0(:,:,:) )
[10114]135      CALL iom_put("e3u_0", e3u_0(:,:,:) )
136      CALL iom_put("e3v_0", e3v_0(:,:,:) )
[6351]137      !
[12377]138      CALL iom_put( "e3t" , e3t(:,:,:,Kmm) )
139      CALL iom_put( "e3u" , e3u(:,:,:,Kmm) )
140      CALL iom_put( "e3v" , e3v(:,:,:,Kmm) )
141      CALL iom_put( "e3w" , e3w(:,:,:,Kmm) )
[6351]142      IF( iom_use("e3tdef") )   &
[12377]143         CALL iom_put( "e3tdef"  , ( ( e3t(:,:,:,Kmm) - e3t_0(:,:,:) ) / e3t_0(:,:,:) * 100 * tmask(:,:,:) ) ** 2 )
[5461]144
[9023]145      IF( ll_wd ) THEN
[12377]146         CALL iom_put( "ssh" , (ssh(:,:,Kmm)+ssh_ref)*tmask(:,:,1) )   ! sea surface height (brought back to the reference used for wetting and drying)
[9023]147      ELSE
[12377]148         CALL iom_put( "ssh" , ssh(:,:,Kmm) )              ! sea surface height
[9023]149      ENDIF
150
[7646]151      IF( iom_use("wetdep") )   &                  ! wet depth
[12377]152         CALL iom_put( "wetdep" , ht_0(:,:) + ssh(:,:,Kmm) )
[5107]153     
[12377]154      CALL iom_put( "toce", ts(:,:,:,jp_tem,Kmm) )    ! 3D temperature
155      CALL iom_put(  "sst", ts(:,:,1,jp_tem,Kmm) )    ! surface temperature
[5107]156      IF ( iom_use("sbt") ) THEN
[12377]157         DO_2D_11_11
158            ikbot = mbkt(ji,jj)
159            z2d(ji,jj) = ts(ji,jj,ikbot,jp_tem,Kmm)
160         END_2D
[5107]161         CALL iom_put( "sbt", z2d )                ! bottom temperature
162      ENDIF
163     
[12377]164      CALL iom_put( "soce", ts(:,:,:,jp_sal,Kmm) )    ! 3D salinity
165      CALL iom_put(  "sss", ts(:,:,1,jp_sal,Kmm) )    ! surface salinity
[5107]166      IF ( iom_use("sbs") ) THEN
[12377]167         DO_2D_11_11
168            ikbot = mbkt(ji,jj)
169            z2d(ji,jj) = ts(ji,jj,ikbot,jp_sal,Kmm)
170         END_2D
[5107]171         CALL iom_put( "sbs", z2d )                ! bottom salinity
172      ENDIF
[5463]173
174      IF ( iom_use("taubot") ) THEN                ! bottom stress
[12489]175         zztmp = rho0 * 0.25
[7753]176         z2d(:,:) = 0._wp
[12377]177         DO_2D_00_00
178            zztmp2 = (  ( rCdU_bot(ji+1,jj)+rCdU_bot(ji  ,jj) ) * uu(ji  ,jj,mbku(ji  ,jj),Kmm)  )**2   &
179               &   + (  ( rCdU_bot(ji  ,jj)+rCdU_bot(ji-1,jj) ) * uu(ji-1,jj,mbku(ji-1,jj),Kmm)  )**2   &
180               &   + (  ( rCdU_bot(ji,jj+1)+rCdU_bot(ji,jj  ) ) * vv(ji,jj  ,mbkv(ji,jj  ),Kmm)  )**2   &
181               &   + (  ( rCdU_bot(ji,jj  )+rCdU_bot(ji,jj-1) ) * vv(ji,jj-1,mbkv(ji,jj-1),Kmm)  )**2
182            z2d(ji,jj) = zztmp * SQRT( zztmp2 ) * tmask(ji,jj,1) 
183            !
184         END_2D
[10425]185         CALL lbc_lnk( 'diawri', z2d, 'T', 1. )
[5463]186         CALL iom_put( "taubot", z2d )           
187      ENDIF
[5107]188         
[12377]189      CALL iom_put( "uoce", uu(:,:,:,Kmm) )            ! 3D i-current
190      CALL iom_put(  "ssu", uu(:,:,1,Kmm) )            ! surface i-current
[5107]191      IF ( iom_use("sbu") ) THEN
[12377]192         DO_2D_11_11
193            ikbot = mbku(ji,jj)
194            z2d(ji,jj) = uu(ji,jj,ikbot,Kmm)
195         END_2D
[5107]196         CALL iom_put( "sbu", z2d )                ! bottom i-current
197      ENDIF
198     
[12377]199      CALL iom_put( "voce", vv(:,:,:,Kmm) )            ! 3D j-current
200      CALL iom_put(  "ssv", vv(:,:,1,Kmm) )            ! surface j-current
[5107]201      IF ( iom_use("sbv") ) THEN
[12377]202         DO_2D_11_11
203            ikbot = mbkv(ji,jj)
204            z2d(ji,jj) = vv(ji,jj,ikbot,Kmm)
205         END_2D
[5107]206         CALL iom_put( "sbv", z2d )                ! bottom j-current
[4990]207      ENDIF
[1482]208
[12377]209      IF( ln_zad_Aimp ) ww = ww + wi               ! Recombine explicit and implicit parts of vertical velocity for diagnostic output
[11418]210      !
[12377]211      CALL iom_put( "woce", ww )                   ! vertical velocity
[5461]212      IF( iom_use('w_masstr') .OR. iom_use('w_masstr2') ) THEN   ! vertical mass transport & its square value
213         ! Caution: in the VVL case, it only correponds to the baroclinic mass transport.
[12489]214         z2d(:,:) = rho0 * e1e2t(:,:)
[5461]215         DO jk = 1, jpk
[12377]216            z3d(:,:,jk) = ww(:,:,jk) * z2d(:,:)
[5461]217         END DO
218         CALL iom_put( "w_masstr" , z3d ) 
219         IF( iom_use('w_masstr2') )   CALL iom_put( "w_masstr2", z3d(:,:,:) * z3d(:,:,:) )
220      ENDIF
[11418]221      !
[12377]222      IF( ln_zad_Aimp ) ww = ww - wi               ! Remove implicit part of vertical velocity that was added for diagnostic output
[5461]223
[9019]224      CALL iom_put( "avt" , avt )                  ! T vert. eddy diff. coef.
225      CALL iom_put( "avs" , avs )                  ! S vert. eddy diff. coef.
226      CALL iom_put( "avm" , avm )                  ! T vert. eddy visc. coef.
[5107]227
[9019]228      IF( iom_use('logavt') )   CALL iom_put( "logavt", LOG( MAX( 1.e-20_wp, avt(:,:,:) ) ) )
229      IF( iom_use('logavs') )   CALL iom_put( "logavs", LOG( MAX( 1.e-20_wp, avs(:,:,:) ) ) )
[6351]230
[5107]231      IF ( iom_use("sstgrad") .OR. iom_use("sstgrad2") ) THEN
[12377]232         DO_2D_00_00
233            zztmp  = ts(ji,jj,1,jp_tem,Kmm)
234            zztmpx = ( ts(ji+1,jj,1,jp_tem,Kmm) - zztmp ) * r1_e1u(ji,jj) + ( zztmp - ts(ji-1,jj  ,1,jp_tem,Kmm) ) * r1_e1u(ji-1,jj)
235            zztmpy = ( ts(ji,jj+1,1,jp_tem,Kmm) - zztmp ) * r1_e2v(ji,jj) + ( zztmp - ts(ji  ,jj-1,1,jp_tem,Kmm) ) * r1_e2v(ji,jj-1)
236            z2d(ji,jj) = 0.25 * ( zztmpx * zztmpx + zztmpy * zztmpy )   &
237               &              * umask(ji,jj,1) * umask(ji-1,jj,1) * vmask(ji,jj,1) * umask(ji,jj-1,1)
238         END_2D
[10425]239         CALL lbc_lnk( 'diawri', z2d, 'T', 1. )
[9019]240         CALL iom_put( "sstgrad2",  z2d )          ! square of module of sst gradient
[7753]241         z2d(:,:) = SQRT( z2d(:,:) )
[9019]242         CALL iom_put( "sstgrad" ,  z2d )          ! module of sst gradient
[4990]243      ENDIF
244         
[9019]245      ! heat and salt contents
[4990]246      IF( iom_use("heatc") ) THEN
[7753]247         z2d(:,:)  = 0._wp 
[12377]248         DO_3D_11_11( 1, jpkm1 )
249            z2d(ji,jj) = z2d(ji,jj) + e3t(ji,jj,jk,Kmm) * ts(ji,jj,jk,jp_tem,Kmm) * tmask(ji,jj,jk)
250         END_3D
[12489]251         CALL iom_put( "heatc", rho0_rcp * z2d )   ! vertically integrated heat content (J/m2)
[4990]252      ENDIF
253
254      IF( iom_use("saltc") ) THEN
[7753]255         z2d(:,:)  = 0._wp 
[12377]256         DO_3D_11_11( 1, jpkm1 )
257            z2d(ji,jj) = z2d(ji,jj) + e3t(ji,jj,jk,Kmm) * ts(ji,jj,jk,jp_sal,Kmm) * tmask(ji,jj,jk)
258         END_3D
[12489]259         CALL iom_put( "saltc", rho0 * z2d )          ! vertically integrated salt content (PSU*kg/m2)
[4990]260      ENDIF
[4840]261      !
[4990]262      IF ( iom_use("eken") ) THEN
[9399]263         z3d(:,:,jpk) = 0._wp 
[12377]264         DO_3D_00_00( 1, jpkm1 )
265            zztmp  = 0.25_wp * r1_e1e2t(ji,jj) / e3t(ji,jj,jk,Kmm)
266            z3d(ji,jj,jk) = zztmp * (  uu(ji-1,jj,jk,Kmm)**2 * e2u(ji-1,jj) * e3u(ji-1,jj,jk,Kmm)   &
267               &                     + uu(ji  ,jj,jk,Kmm)**2 * e2u(ji  ,jj) * e3u(ji  ,jj,jk,Kmm)   &
268               &                     + vv(ji,jj-1,jk,Kmm)**2 * e1v(ji,jj-1) * e3v(ji,jj-1,jk,Kmm)   &
269               &                     + vv(ji,jj  ,jk,Kmm)**2 * e1v(ji,jj  ) * e3v(ji,jj  ,jk,Kmm)   )
270         END_3D
[10425]271         CALL lbc_lnk( 'diawri', z3d, 'T', 1. )
[9019]272         CALL iom_put( "eken", z3d )                 ! kinetic energy
[4990]273      ENDIF
[6351]274      !
[12377]275      CALL iom_put( "hdiv", hdiv )                  ! Horizontal divergence
[6351]276      !
[7646]277      IF( iom_use("u_masstr") .OR. iom_use("u_masstr_vint") .OR. iom_use("u_heattr") .OR. iom_use("u_salttr") ) THEN
[7753]278         z3d(:,:,jpk) = 0.e0
279         z2d(:,:) = 0.e0
[1756]280         DO jk = 1, jpkm1
[12489]281            z3d(:,:,jk) = rho0 * uu(:,:,jk,Kmm) * e2u(:,:) * e3u(:,:,jk,Kmm) * umask(:,:,jk)
[7753]282            z2d(:,:) = z2d(:,:) + z3d(:,:,jk)
[1756]283         END DO
[9019]284         CALL iom_put( "u_masstr"     , z3d )         ! mass transport in i-direction
285         CALL iom_put( "u_masstr_vint", z2d )         ! mass transport in i-direction vertical sum
[4990]286      ENDIF
287     
288      IF( iom_use("u_heattr") ) THEN
[9019]289         z2d(:,:) = 0._wp 
[12377]290         DO_3D_00_00( 1, jpkm1 )
291            z2d(ji,jj) = z2d(ji,jj) + z3d(ji,jj,jk) * ( ts(ji,jj,jk,jp_tem,Kmm) + ts(ji+1,jj,jk,jp_tem,Kmm) )
292         END_3D
[10425]293         CALL lbc_lnk( 'diawri', z2d, 'U', -1. )
[9019]294         CALL iom_put( "u_heattr", 0.5*rcp * z2d )    ! heat transport in i-direction
[4990]295      ENDIF
[4761]296
[4990]297      IF( iom_use("u_salttr") ) THEN
[7753]298         z2d(:,:) = 0.e0 
[12377]299         DO_3D_00_00( 1, jpkm1 )
300            z2d(ji,jj) = z2d(ji,jj) + z3d(ji,jj,jk) * ( ts(ji,jj,jk,jp_sal,Kmm) + ts(ji+1,jj,jk,jp_sal,Kmm) )
301         END_3D
[10425]302         CALL lbc_lnk( 'diawri', z2d, 'U', -1. )
[9019]303         CALL iom_put( "u_salttr", 0.5 * z2d )        ! heat transport in i-direction
[4990]304      ENDIF
[4761]305
[4990]306     
307      IF( iom_use("v_masstr") .OR. iom_use("v_heattr") .OR. iom_use("v_salttr") ) THEN
[7753]308         z3d(:,:,jpk) = 0.e0
[1756]309         DO jk = 1, jpkm1
[12489]310            z3d(:,:,jk) = rho0 * vv(:,:,jk,Kmm) * e1v(:,:) * e3v(:,:,jk,Kmm) * vmask(:,:,jk)
[1756]311         END DO
[9019]312         CALL iom_put( "v_masstr", z3d )              ! mass transport in j-direction
[4990]313      ENDIF
314     
315      IF( iom_use("v_heattr") ) THEN
[7753]316         z2d(:,:) = 0.e0 
[12377]317         DO_3D_00_00( 1, jpkm1 )
318            z2d(ji,jj) = z2d(ji,jj) + z3d(ji,jj,jk) * ( ts(ji,jj,jk,jp_tem,Kmm) + ts(ji,jj+1,jk,jp_tem,Kmm) )
319         END_3D
[10425]320         CALL lbc_lnk( 'diawri', z2d, 'V', -1. )
[9019]321         CALL iom_put( "v_heattr", 0.5*rcp * z2d )    !  heat transport in j-direction
[4990]322      ENDIF
[4761]323
[4990]324      IF( iom_use("v_salttr") ) THEN
[9019]325         z2d(:,:) = 0._wp 
[12377]326         DO_3D_00_00( 1, jpkm1 )
327            z2d(ji,jj) = z2d(ji,jj) + z3d(ji,jj,jk) * ( ts(ji,jj,jk,jp_sal,Kmm) + ts(ji,jj+1,jk,jp_sal,Kmm) )
328         END_3D
[10425]329         CALL lbc_lnk( 'diawri', z2d, 'V', -1. )
[9019]330         CALL iom_put( "v_salttr", 0.5 * z2d )        !  heat transport in j-direction
[1756]331      ENDIF
[7646]332
333      IF( iom_use("tosmint") ) THEN
[9019]334         z2d(:,:) = 0._wp
[12377]335         DO_3D_00_00( 1, jpkm1 )
336            z2d(ji,jj) = z2d(ji,jj) + e3t(ji,jj,jk,Kmm) *  ts(ji,jj,jk,jp_tem,Kmm)
337         END_3D
[10425]338         CALL lbc_lnk( 'diawri', z2d, 'T', -1. )
[12489]339         CALL iom_put( "tosmint", rho0 * z2d )        ! Vertical integral of temperature
[7646]340      ENDIF
341      IF( iom_use("somint") ) THEN
[7753]342         z2d(:,:)=0._wp
[12377]343         DO_3D_00_00( 1, jpkm1 )
344            z2d(ji,jj) = z2d(ji,jj) + e3t(ji,jj,jk,Kmm) * ts(ji,jj,jk,jp_sal,Kmm)
345         END_3D
[10425]346         CALL lbc_lnk( 'diawri', z2d, 'T', -1. )
[12489]347         CALL iom_put( "somint", rho0 * z2d )         ! Vertical integral of salinity
[7646]348      ENDIF
349
[9019]350      CALL iom_put( "bn2", rn2 )                      ! Brunt-Vaisala buoyancy frequency (N^2)
[2528]351      !
[12377]352     
353      IF (ln_dia25h)   CALL dia_25h( kt, Kmm )        ! 25h averaging
[6140]354
[9124]355      IF( ln_timing )   CALL timing_stop('dia_wri')
[3294]356      !
[1482]357   END SUBROUTINE dia_wri
358
359#else
[2528]360   !!----------------------------------------------------------------------
361   !!   Default option                                  use IOIPSL  library
362   !!----------------------------------------------------------------------
363
[9652]364   INTEGER FUNCTION dia_wri_alloc()
365      !!----------------------------------------------------------------------
366      INTEGER, DIMENSION(2) :: ierr
367      !!----------------------------------------------------------------------
[12493]368      IF( nn_write == -1 ) THEN
369         dia_wri_alloc = 0
370      ELSE   
371         ierr = 0
372         ALLOCATE( ndex_hT(jpi*jpj) , ndex_T(jpi*jpj*jpk) ,     &
373            &      ndex_hU(jpi*jpj) , ndex_U(jpi*jpj*jpk) ,     &
374            &      ndex_hV(jpi*jpj) , ndex_V(jpi*jpj*jpk) , STAT=ierr(1) )
[9652]375         !
[12493]376         dia_wri_alloc = MAXVAL(ierr)
377         CALL mpp_sum( 'diawri', dia_wri_alloc )
378         !
379      ENDIF
[9652]380      !
381   END FUNCTION dia_wri_alloc
[12377]382 
383   INTEGER FUNCTION dia_wri_alloc_abl()
384      !!----------------------------------------------------------------------
385     ALLOCATE(   ndex_hA(jpi*jpj), ndex_A (jpi*jpj*jpkam1), STAT=dia_wri_alloc_abl)
386      CALL mpp_sum( 'diawri', dia_wri_alloc_abl )
387      !
388   END FUNCTION dia_wri_alloc_abl
[9652]389
390   
[12377]391   SUBROUTINE dia_wri( kt, Kmm )
[3]392      !!---------------------------------------------------------------------
393      !!                  ***  ROUTINE dia_wri  ***
394      !!                   
395      !! ** Purpose :   Standard output of opa: dynamics and tracer fields
396      !!      NETCDF format is used by default
397      !!
398      !! ** Method  :   At the beginning of the first time step (nit000),
399      !!      define all the NETCDF files and fields
400      !!      At each time step call histdef to compute the mean if ncessary
[11536]401      !!      Each nn_write time step, output the instantaneous or mean fields
[3]402      !!----------------------------------------------------------------------
[5836]403      INTEGER, INTENT( in ) ::   kt   ! ocean time-step index
[12377]404      INTEGER, INTENT( in ) ::   Kmm  ! ocean time level index
[5836]405      !
[2528]406      LOGICAL ::   ll_print = .FALSE.                        ! =T print and flush numout
407      CHARACTER (len=40) ::   clhstnam, clop, clmx           ! local names
408      INTEGER  ::   inum = 11                                ! temporary logical unit
[3294]409      INTEGER  ::   ji, jj, jk                               ! dummy loop indices
410      INTEGER  ::   ierr                                     ! error code return from allocation
[2528]411      INTEGER  ::   iimi, iima, ipk, it, itmod, ijmi, ijma   ! local integers
[12377]412      INTEGER  ::   ipka                                     ! ABL
[3609]413      INTEGER  ::   jn, ierror                               ! local integers
[6140]414      REAL(wp) ::   zsto, zout, zmax, zjulian                ! local scalars
[5836]415      !
[9019]416      REAL(wp), DIMENSION(jpi,jpj)   :: zw2d       ! 2D workspace
417      REAL(wp), DIMENSION(jpi,jpj,jpk) :: zw3d       ! 3D workspace
[12377]418      REAL(wp), DIMENSION(:,:,:), ALLOCATABLE :: zw3d_abl   ! ABL 3D workspace
[3]419      !!----------------------------------------------------------------------
[1482]420      !
[9019]421      IF( ninist == 1 ) THEN     !==  Output the initial state and forcings  ==!
[12377]422         CALL dia_wri_state( Kmm, 'output.init' )
[1482]423         ninist = 0
424      ENDIF
425      !
[11536]426      IF( nn_write == -1 )   RETURN   ! we will never do any output
427      !
428      IF( ln_timing )   CALL timing_start('dia_wri')
429      !
[3]430      ! 0. Initialisation
431      ! -----------------
[632]432
[9019]433      ll_print = .FALSE.                  ! local variable for debugging
[3]434      ll_print = ll_print .AND. lwp
435
436      ! Define frequency of output and means
[5566]437      clop = "x"         ! no use of the mask value (require less cpu time and otherwise the model crashes)
[3]438#if defined key_diainstant
[12489]439      zsto = nn_write * rn_Dt
[1312]440      clop = "inst("//TRIM(clop)//")"
[3]441#else
[12489]442      zsto=rn_Dt
[1312]443      clop = "ave("//TRIM(clop)//")"
[3]444#endif
[12489]445      zout = nn_write * rn_Dt
446      zmax = ( nitend - nit000 + 1 ) * rn_Dt
[3]447
448      ! Define indices of the horizontal output zoom and vertical limit storage
449      iimi = 1      ;      iima = jpi
450      ijmi = 1      ;      ijma = jpj
451      ipk = jpk
[12377]452      IF(ln_abl) ipka = jpkam1
[3]453
454      ! define time axis
[1334]455      it = kt
456      itmod = kt - nit000 + 1
[3]457
458
459      ! 1. Define NETCDF files and fields at beginning of first time step
460      ! -----------------------------------------------------------------
461
462      IF( kt == nit000 ) THEN
463
464         ! Define the NETCDF files (one per grid)
[632]465
[3]466         ! Compute julian date from starting date of the run
[12489]467         CALL ymds2ju( nyear, nmonth, nday, rn_Dt, zjulian )
[1309]468         zjulian = zjulian - adatrj   !   set calendar origin to the beginning of the experiment
[3]469         IF(lwp)WRITE(numout,*)
470         IF(lwp)WRITE(numout,*) 'Date 0 used :', nit000, ' YEAR ', nyear,   &
471            &                    ' MONTH ', nmonth, ' DAY ', nday, 'Julian day : ', zjulian
472         IF(lwp)WRITE(numout,*) ' indexes of zoom = ', iimi, iima, ijmi, ijma,   &
473                                 ' limit storage in depth = ', ipk
474
475         ! WRITE root name in date.file for use by postpro
[1581]476         IF(lwp) THEN
[11536]477            CALL dia_nam( clhstnam, nn_write,' ' )
[1581]478            CALL ctl_opn( inum, 'date.file', 'REPLACE', 'FORMATTED', 'SEQUENTIAL', -1, numout, lwp, narea )
[895]479            WRITE(inum,*) clhstnam
480            CLOSE(inum)
481         ENDIF
[632]482
[3]483         ! Define the T grid FILE ( nid_T )
[632]484
[11536]485         CALL dia_nam( clhstnam, nn_write, 'grid_T' )
[3]486         IF(lwp) WRITE(numout,*) " Name of NETCDF file ", clhstnam    ! filename
487         CALL histbeg( clhstnam, jpi, glamt, jpj, gphit,           &  ! Horizontal grid: glamt and gphit
488            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       &
[12489]489            &          nit000-1, zjulian, rn_Dt, nh_T, nid_T, domain_id=nidom, snc4chunks=snc4set )
[3]490         CALL histvert( nid_T, "deptht", "Vertical T levels",      &  ! Vertical grid: gdept
[4292]491            &           "m", ipk, gdept_1d, nz_T, "down" )
[3]492         !                                                            ! Index of ocean points
493         CALL wheneq( jpi*jpj*ipk, tmask, 1, 1., ndex_T , ndim_T  )      ! volume
494         CALL wheneq( jpi*jpj    , tmask, 1, 1., ndex_hT, ndim_hT )      ! surface
[3609]495         !
496         IF( ln_icebergs ) THEN
497            !
498            !! allocation cant go in dia_wri_alloc because ln_icebergs is only set after
499            !! that routine is called from nemogcm, so do it here immediately before its needed
500            ALLOCATE( ndex_bT(jpi*jpj*nclasses), STAT=ierror )
[10425]501            CALL mpp_sum( 'diawri', ierror )
[3609]502            IF( ierror /= 0 ) THEN
503               CALL ctl_stop('dia_wri: failed to allocate iceberg diagnostic array')
504               RETURN
505            ENDIF
506            !
507            !! iceberg vertical coordinate is class number
508            CALL histvert( nid_T, "class", "Iceberg class",      &  ! Vertical grid: class
509               &           "number", nclasses, class_num, nb_T )
510            !
511            !! each class just needs the surface index pattern
512            ndim_bT = 3
513            DO jn = 1,nclasses
514               ndex_bT((jn-1)*jpi*jpj+1:jn*jpi*jpj) = ndex_hT(1:jpi*jpj)
515            ENDDO
516            !
517         ENDIF
[3]518
519         ! Define the U grid FILE ( nid_U )
520
[11536]521         CALL dia_nam( clhstnam, nn_write, 'grid_U' )
[3]522         IF(lwp) WRITE(numout,*) " Name of NETCDF file ", clhstnam    ! filename
523         CALL histbeg( clhstnam, jpi, glamu, jpj, gphiu,           &  ! Horizontal grid: glamu and gphiu
524            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       &
[12489]525            &          nit000-1, zjulian, rn_Dt, nh_U, nid_U, domain_id=nidom, snc4chunks=snc4set )
[3]526         CALL histvert( nid_U, "depthu", "Vertical U levels",      &  ! Vertical grid: gdept
[4292]527            &           "m", ipk, gdept_1d, nz_U, "down" )
[3]528         !                                                            ! Index of ocean points
529         CALL wheneq( jpi*jpj*ipk, umask, 1, 1., ndex_U , ndim_U  )      ! volume
530         CALL wheneq( jpi*jpj    , umask, 1, 1., ndex_hU, ndim_hU )      ! surface
531
532         ! Define the V grid FILE ( nid_V )
533
[11536]534         CALL dia_nam( clhstnam, nn_write, 'grid_V' )                   ! filename
[3]535         IF(lwp) WRITE(numout,*) " Name of NETCDF file ", clhstnam
536         CALL histbeg( clhstnam, jpi, glamv, jpj, gphiv,           &  ! Horizontal grid: glamv and gphiv
537            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       &
[12489]538            &          nit000-1, zjulian, rn_Dt, nh_V, nid_V, domain_id=nidom, snc4chunks=snc4set )
[3]539         CALL histvert( nid_V, "depthv", "Vertical V levels",      &  ! Vertical grid : gdept
[4292]540            &          "m", ipk, gdept_1d, nz_V, "down" )
[3]541         !                                                            ! Index of ocean points
542         CALL wheneq( jpi*jpj*ipk, vmask, 1, 1., ndex_V , ndim_V  )      ! volume
543         CALL wheneq( jpi*jpj    , vmask, 1, 1., ndex_hV, ndim_hV )      ! surface
544
545         ! Define the W grid FILE ( nid_W )
546
[11536]547         CALL dia_nam( clhstnam, nn_write, 'grid_W' )                   ! filename
[3]548         IF(lwp) WRITE(numout,*) " Name of NETCDF file ", clhstnam
549         CALL histbeg( clhstnam, jpi, glamt, jpj, gphit,           &  ! Horizontal grid: glamt and gphit
550            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       &
[12489]551            &          nit000-1, zjulian, rn_Dt, nh_W, nid_W, domain_id=nidom, snc4chunks=snc4set )
[3]552         CALL histvert( nid_W, "depthw", "Vertical W levels",      &  ! Vertical grid: gdepw
[4292]553            &          "m", ipk, gdepw_1d, nz_W, "down" )
[3]554
[12377]555         IF( ln_abl ) THEN 
556         ! Define the ABL grid FILE ( nid_A )
557            CALL dia_nam( clhstnam, nn_write, 'grid_ABL' )
558            IF(lwp) WRITE(numout,*) " Name of NETCDF file ", clhstnam    ! filename
559            CALL histbeg( clhstnam, jpi, glamt, jpj, gphit,           &  ! Horizontal grid: glamt and gphit
560               &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       &
[12489]561               &          nit000-1, zjulian, rn_Dt, nh_A, nid_A, domain_id=nidom, snc4chunks=snc4set )
[12377]562            CALL histvert( nid_A, "ght_abl", "Vertical T levels",      &  ! Vertical grid: gdept
563               &           "m", ipka, ght_abl(2:jpka), nz_A, "up" )
564            !                                                            ! Index of ocean points
565         ALLOCATE( zw3d_abl(jpi,jpj,ipka) ) 
566         zw3d_abl(:,:,:) = 1._wp 
567         CALL wheneq( jpi*jpj*ipka, zw3d_abl, 1, 1., ndex_A , ndim_A  )      ! volume
568            CALL wheneq( jpi*jpj     , zw3d_abl, 1, 1., ndex_hA, ndim_hA )      ! surface
569         DEALLOCATE(zw3d_abl)
570         ENDIF
[632]571
[3]572         ! Declare all the output fields as NETCDF variables
573
574         !                                                                                      !!! nid_T : 3D
575         CALL histdef( nid_T, "votemper", "Temperature"                        , "C"      ,   &  ! tn
576            &          jpi, jpj, nh_T, ipk, 1, ipk, nz_T, 32, clop, zsto, zout )
577         CALL histdef( nid_T, "vosaline", "Salinity"                           , "PSU"    ,   &  ! sn
578            &          jpi, jpj, nh_T, ipk, 1, ipk, nz_T, 32, clop, zsto, zout )
[6140]579         IF(  .NOT.ln_linssh  ) THEN
[12377]580            CALL histdef( nid_T, "vovvle3t", "Level thickness"                    , "m"      ,&  ! e3t(:,:,:,Kmm)
[4292]581            &             jpi, jpj, nh_T, ipk, 1, ipk, nz_T, 32, clop, zsto, zout )
[12377]582            CALL histdef( nid_T, "vovvldep", "T point depth"                      , "m"      ,&  ! e3t(:,:,:,Kmm)
[4292]583            &             jpi, jpj, nh_T, ipk, 1, ipk, nz_T, 32, clop, zsto, zout )
[12377]584            CALL histdef( nid_T, "vovvldef", "Squared level deformation"          , "%^2"    ,&  ! e3t(:,:,:,Kmm)
[4292]585            &             jpi, jpj, nh_T, ipk, 1, ipk, nz_T, 32, clop, zsto, zout )
586         ENDIF
[3]587         !                                                                                      !!! nid_T : 2D
588         CALL histdef( nid_T, "sosstsst", "Sea Surface temperature"            , "C"      ,   &  ! sst
589            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
590         CALL histdef( nid_T, "sosaline", "Sea Surface Salinity"               , "PSU"    ,   &  ! sss
591            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[359]592         CALL histdef( nid_T, "sossheig", "Sea Surface Height"                 , "m"      ,   &  ! ssh
[3]593            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[2528]594         CALL histdef( nid_T, "sowaflup", "Net Upward Water Flux"              , "Kg/m2/s",   &  ! (emp-rnf)
[3]595            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[4570]596         CALL histdef( nid_T, "sorunoff", "River runoffs"                      , "Kg/m2/s",   &  ! runoffs
597            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[3625]598         CALL histdef( nid_T, "sosfldow", "downward salt flux"                 , "PSU/m2/s",  &  ! sfx
[3]599            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[6140]600         IF(  ln_linssh  ) THEN
[12377]601            CALL histdef( nid_T, "sosst_cd", "Concentration/Dilution term on temperature"     &  ! emp * ts(:,:,1,jp_tem,Kmm)
[3625]602            &                                                                  , "KgC/m2/s",  &  ! sosst_cd
[4292]603            &             jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[12377]604            CALL histdef( nid_T, "sosss_cd", "Concentration/Dilution term on salinity"        &  ! emp * ts(:,:,1,jp_sal,Kmm)
[3625]605            &                                                                  , "KgPSU/m2/s",&  ! sosss_cd
[4292]606            &             jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
607         ENDIF
[888]608         CALL histdef( nid_T, "sohefldo", "Net Downward Heat Flux"             , "W/m2"   ,   &  ! qns + qsr
[3]609            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
610         CALL histdef( nid_T, "soshfldo", "Shortwave Radiation"                , "W/m2"   ,   &  ! qsr
611            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[1585]612         CALL histdef( nid_T, "somixhgt", "Turbocline Depth"                   , "m"      ,   &  ! hmld
613            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[3]614         CALL histdef( nid_T, "somxl010", "Mixed Layer Depth 0.01"             , "m"      ,   &  ! hmlp
615            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[1037]616         CALL histdef( nid_T, "soicecov", "Ice fraction"                       , "[0,1]"  ,   &  ! fr_i
[3]617            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[1649]618         CALL histdef( nid_T, "sowindsp", "wind speed at 10m"                  , "m/s"    ,   &  ! wndm
619            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[12377]620         !
621         IF( ln_abl ) THEN
622            CALL histdef( nid_A, "t_abl", "Potential Temperature"     , "K"        ,       &  ! t_abl
623               &          jpi, jpj, nh_A, ipka, 1, ipka, nz_A, 32, clop, zsto, zout )
624            CALL histdef( nid_A, "q_abl", "Humidity"                  , "kg/kg"    ,       &  ! q_abl
625               &          jpi, jpj, nh_A, ipka, 1, ipka, nz_A, 32, clop, zsto, zout ) 
626            CALL histdef( nid_A, "u_abl", "Atmospheric U-wind   "     , "m/s"        ,     &  ! u_abl
627               &          jpi, jpj, nh_A, ipka, 1, ipka, nz_A, 32, clop, zsto, zout )
628            CALL histdef( nid_A, "v_abl", "Atmospheric V-wind   "     , "m/s"    ,         &  ! v_abl
629               &          jpi, jpj, nh_A, ipka, 1, ipka, nz_A, 32, clop, zsto, zout ) 
630            CALL histdef( nid_A, "tke_abl", "Atmospheric TKE   "     , "m2/s2"    ,        &  ! tke_abl
631               &          jpi, jpj, nh_A, ipka, 1, ipka, nz_A, 32, clop, zsto, zout ) 
632            CALL histdef( nid_A, "avm_abl", "Atmospheric turbulent viscosity", "m2/s"   ,  &  ! avm_abl
633               &          jpi, jpj, nh_A, ipka, 1, ipka, nz_A, 32, clop, zsto, zout ) 
634            CALL histdef( nid_A, "avt_abl", "Atmospheric turbulent diffusivity", "m2/s2",  &  ! avt_abl
635               &          jpi, jpj, nh_A, ipka, 1, ipka, nz_A, 32, clop, zsto, zout ) 
636            CALL histdef( nid_A, "pblh", "Atmospheric boundary layer height "  , "m",      &  ! pblh
637               &          jpi, jpj, nh_A,  1  , 1, 1   , -99 , 32, clop, zsto, zout )                 
638#if defined key_si3
639            CALL histdef( nid_A, "oce_frac", "Fraction of open ocean"  , " ",      &  ! ato_i
640               &          jpi, jpj, nh_A,  1  , 1, 1   , -99 , 32, clop, zsto, zout )
641#endif
642            CALL histend( nid_A, snc4chunks=snc4set )
643         ENDIF
644         !
[3609]645         IF( ln_icebergs ) THEN
646            CALL histdef( nid_T, "calving"             , "calving mass input"                       , "kg/s"   , &
647               &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
648            CALL histdef( nid_T, "calving_heat"        , "calving heat flux"                        , "XXXX"   , &
649               &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
650            CALL histdef( nid_T, "berg_floating_melt"  , "Melt rate of icebergs + bits"             , "kg/m2/s", &
651               &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
652            CALL histdef( nid_T, "berg_stored_ice"     , "Accumulated ice mass by class"            , "kg"     , &
653               &          jpi, jpj, nh_T, nclasses  , 1, nclasses  , nb_T , 32, clop, zsto, zout )
654            IF( ln_bergdia ) THEN
655               CALL histdef( nid_T, "berg_melt"           , "Melt rate of icebergs"                    , "kg/m2/s", &
656                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
657               CALL histdef( nid_T, "berg_buoy_melt"      , "Buoyancy component of iceberg melt rate"  , "kg/m2/s", &
658                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
659               CALL histdef( nid_T, "berg_eros_melt"      , "Erosion component of iceberg melt rate"   , "kg/m2/s", &
660                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
661               CALL histdef( nid_T, "berg_conv_melt"      , "Convective component of iceberg melt rate", "kg/m2/s", &
662                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
663               CALL histdef( nid_T, "berg_virtual_area"   , "Virtual coverage by icebergs"             , "m2"     , &
664                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
665               CALL histdef( nid_T, "bits_src"           , "Mass source of bergy bits"                , "kg/m2/s", &
666                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
667               CALL histdef( nid_T, "bits_melt"          , "Melt rate of bergy bits"                  , "kg/m2/s", &
668                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
669               CALL histdef( nid_T, "bits_mass"          , "Bergy bit density field"                  , "kg/m2"  , &
670                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
671               CALL histdef( nid_T, "berg_mass"           , "Iceberg density field"                    , "kg/m2"  , &
672                  &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
673               CALL histdef( nid_T, "berg_real_calving"   , "Calving into iceberg class"               , "kg/s"   , &
674                  &          jpi, jpj, nh_T, nclasses  , 1, nclasses  , nb_T , 32, clop, zsto, zout )
675            ENDIF
676         ENDIF
677
[11536]678         IF( ln_ssr ) THEN
[4990]679            CALL histdef( nid_T, "sohefldp", "Surface Heat Flux: Damping"         , "W/m2"   ,   &  ! qrp
680               &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
681            CALL histdef( nid_T, "sowafldp", "Surface Water Flux: Damping"        , "Kg/m2/s",   &  ! erp
682               &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
683            CALL histdef( nid_T, "sosafldp", "Surface salt flux: damping"         , "Kg/m2/s",   &  ! erp * sn
684               &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
685         ENDIF
[11536]686       
[3]687         clmx ="l_max(only(x))"    ! max index on a period
[5836]688!         CALL histdef( nid_T, "sobowlin", "Bowl Index"                         , "W-point",   &  ! bowl INDEX
689!            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clmx, zsto, zout )
[3]690#if defined key_diahth
691         CALL histdef( nid_T, "sothedep", "Thermocline Depth"                  , "m"      ,   & ! hth
692            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
693         CALL histdef( nid_T, "so20chgt", "Depth of 20C isotherm"              , "m"      ,   & ! hd20
694            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
695         CALL histdef( nid_T, "so28chgt", "Depth of 28C isotherm"              , "m"      ,   & ! hd28
696            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
[7646]697         CALL histdef( nid_T, "sohtc300", "Heat content 300 m"                 , "J/m2"   ,   & ! htc3
[3]698            &          jpi, jpj, nh_T, 1  , 1, 1  , -99 , 32, clop, zsto, zout )
699#endif
700
[2528]701         CALL histend( nid_T, snc4chunks=snc4set )
[3]702
703         !                                                                                      !!! nid_U : 3D
[12377]704         CALL histdef( nid_U, "vozocrtx", "Zonal Current"                      , "m/s"    ,   &  ! uu(:,:,:,Kmm)
[3]705            &          jpi, jpj, nh_U, ipk, 1, ipk, nz_U, 32, clop, zsto, zout )
[7646]706         IF( ln_wave .AND. ln_sdw) THEN
707            CALL histdef( nid_U, "sdzocrtx", "Stokes Drift Zonal Current"         , "m/s"    ,   &  ! usd
708               &          jpi, jpj, nh_U, ipk, 1, ipk, nz_U, 32, clop, zsto, zout )
709         ENDIF
[3]710         !                                                                                      !!! nid_U : 2D
[888]711         CALL histdef( nid_U, "sozotaux", "Wind Stress along i-axis"           , "N/m2"   ,   &  ! utau
[3]712            &          jpi, jpj, nh_U, 1  , 1, 1  , - 99, 32, clop, zsto, zout )
713
[2528]714         CALL histend( nid_U, snc4chunks=snc4set )
[3]715
716         !                                                                                      !!! nid_V : 3D
[12377]717         CALL histdef( nid_V, "vomecrty", "Meridional Current"                 , "m/s"    ,   &  ! vv(:,:,:,Kmm)
[3]718            &          jpi, jpj, nh_V, ipk, 1, ipk, nz_V, 32, clop, zsto, zout )
[7646]719         IF( ln_wave .AND. ln_sdw) THEN
720            CALL histdef( nid_V, "sdmecrty", "Stokes Drift Meridional Current"    , "m/s"    ,   &  ! vsd
721               &          jpi, jpj, nh_V, ipk, 1, ipk, nz_V, 32, clop, zsto, zout )
722         ENDIF
[3]723         !                                                                                      !!! nid_V : 2D
[888]724         CALL histdef( nid_V, "sometauy", "Wind Stress along j-axis"           , "N/m2"   ,   &  ! vtau
[3]725            &          jpi, jpj, nh_V, 1  , 1, 1  , - 99, 32, clop, zsto, zout )
726
[2528]727         CALL histend( nid_V, snc4chunks=snc4set )
[3]728
729         !                                                                                      !!! nid_W : 3D
[12377]730         CALL histdef( nid_W, "vovecrtz", "Vertical Velocity"                  , "m/s"    ,   &  ! ww
[3]731            &          jpi, jpj, nh_W, ipk, 1, ipk, nz_W, 32, clop, zsto, zout )
732         CALL histdef( nid_W, "votkeavt", "Vertical Eddy Diffusivity"          , "m2/s"   ,   &  ! avt
733            &          jpi, jpj, nh_W, ipk, 1, ipk, nz_W, 32, clop, zsto, zout )
[9019]734         CALL histdef( nid_W, "votkeavm", "Vertical Eddy Viscosity"             , "m2/s"  ,   &  ! avm
[255]735            &          jpi, jpj, nh_W, ipk, 1, ipk, nz_W, 32, clop, zsto, zout )
736
[9019]737         IF( ln_zdfddm ) THEN
[3]738            CALL histdef( nid_W,"voddmavs","Salt Vertical Eddy Diffusivity"    , "m2/s"   ,   &  ! avs
739               &          jpi, jpj, nh_W, ipk, 1, ipk, nz_W, 32, clop, zsto, zout )
740         ENDIF
[7646]741         
742         IF( ln_wave .AND. ln_sdw) THEN
743            CALL histdef( nid_W, "sdvecrtz", "Stokes Drift Vertical Current"   , "m/s"    ,   &  ! wsd
744               &          jpi, jpj, nh_W, ipk, 1, ipk, nz_W, 32, clop, zsto, zout )
745         ENDIF
[3]746         !                                                                                      !!! nid_W : 2D
[2528]747         CALL histend( nid_W, snc4chunks=snc4set )
[3]748
749         IF(lwp) WRITE(numout,*)
750         IF(lwp) WRITE(numout,*) 'End of NetCDF Initialization'
751         IF(ll_print) CALL FLUSH(numout )
752
753      ENDIF
754
755      ! 2. Start writing data
756      ! ---------------------
757
[4292]758      ! ndex(1) est utilise ssi l'avant dernier argument est different de
[3]759      ! la taille du tableau en sortie. Dans ce cas , l'avant dernier argument
760      ! donne le nombre d'elements, et ndex la liste des indices a sortir
761
[11536]762      IF( lwp .AND. MOD( itmod, nn_write ) == 0 ) THEN
[3]763         WRITE(numout,*) 'dia_wri : write model outputs in NetCDF files at ', kt, 'time-step'
764         WRITE(numout,*) '~~~~~~ '
765      ENDIF
766
[6140]767      IF( .NOT.ln_linssh ) THEN
[12377]768         CALL histwrite( nid_T, "votemper", it, ts(:,:,:,jp_tem,Kmm) * e3t(:,:,:,Kmm) , ndim_T , ndex_T  )   ! heat content
769         CALL histwrite( nid_T, "vosaline", it, ts(:,:,:,jp_sal,Kmm) * e3t(:,:,:,Kmm) , ndim_T , ndex_T  )   ! salt content
770         CALL histwrite( nid_T, "sosstsst", it, ts(:,:,1,jp_tem,Kmm) * e3t(:,:,1,Kmm) , ndim_hT, ndex_hT )   ! sea surface heat content
771         CALL histwrite( nid_T, "sosaline", it, ts(:,:,1,jp_sal,Kmm) * e3t(:,:,1,Kmm) , ndim_hT, ndex_hT )   ! sea surface salinity content
[4292]772      ELSE
[12377]773         CALL histwrite( nid_T, "votemper", it, ts(:,:,:,jp_tem,Kmm) , ndim_T , ndex_T  )   ! temperature
774         CALL histwrite( nid_T, "vosaline", it, ts(:,:,:,jp_sal,Kmm) , ndim_T , ndex_T  )   ! salinity
775         CALL histwrite( nid_T, "sosstsst", it, ts(:,:,1,jp_tem,Kmm) , ndim_hT, ndex_hT )   ! sea surface temperature
776         CALL histwrite( nid_T, "sosaline", it, ts(:,:,1,jp_sal,Kmm) , ndim_hT, ndex_hT )   ! sea surface salinity
[4292]777      ENDIF
[6140]778      IF( .NOT.ln_linssh ) THEN
[12377]779         zw3d(:,:,:) = ( ( e3t(:,:,:,Kmm) - e3t_0(:,:,:) ) / e3t_0(:,:,:) * 100 * tmask(:,:,:) ) ** 2
780         CALL histwrite( nid_T, "vovvle3t", it, e3t (:,:,:,Kmm) , ndim_T , ndex_T  )   ! level thickness
781         CALL histwrite( nid_T, "vovvldep", it, gdept(:,:,:,Kmm) , ndim_T , ndex_T  )   ! t-point depth
[4292]782         CALL histwrite( nid_T, "vovvldef", it, zw3d             , ndim_T , ndex_T  )   ! level thickness deformation
783      ENDIF
[12377]784      CALL histwrite( nid_T, "sossheig", it, ssh(:,:,Kmm)          , ndim_hT, ndex_hT )   ! sea surface height
[2528]785      CALL histwrite( nid_T, "sowaflup", it, ( emp-rnf )   , ndim_hT, ndex_hT )   ! upward water flux
[4570]786      CALL histwrite( nid_T, "sorunoff", it, rnf           , ndim_hT, ndex_hT )   ! river runoffs
[3625]787      CALL histwrite( nid_T, "sosfldow", it, sfx           , ndim_hT, ndex_hT )   ! downward salt flux
788                                                                                  ! (includes virtual salt flux beneath ice
789                                                                                  ! in linear free surface case)
[6140]790      IF( ln_linssh ) THEN
[12377]791         zw2d(:,:) = emp (:,:) * ts(:,:,1,jp_tem,Kmm)
[4292]792         CALL histwrite( nid_T, "sosst_cd", it, zw2d, ndim_hT, ndex_hT )          ! c/d term on sst
[12377]793         zw2d(:,:) = emp (:,:) * ts(:,:,1,jp_sal,Kmm)
[4292]794         CALL histwrite( nid_T, "sosss_cd", it, zw2d, ndim_hT, ndex_hT )          ! c/d term on sss
795      ENDIF
[888]796      CALL histwrite( nid_T, "sohefldo", it, qns + qsr     , ndim_hT, ndex_hT )   ! total heat flux
[3]797      CALL histwrite( nid_T, "soshfldo", it, qsr           , ndim_hT, ndex_hT )   ! solar heat flux
[1585]798      CALL histwrite( nid_T, "somixhgt", it, hmld          , ndim_hT, ndex_hT )   ! turbocline depth
[3]799      CALL histwrite( nid_T, "somxl010", it, hmlp          , ndim_hT, ndex_hT )   ! mixed layer depth
[1037]800      CALL histwrite( nid_T, "soicecov", it, fr_i          , ndim_hT, ndex_hT )   ! ice fraction   
[1649]801      CALL histwrite( nid_T, "sowindsp", it, wndm          , ndim_hT, ndex_hT )   ! wind speed   
[12377]802      !
803      IF( ln_abl ) THEN
804         ALLOCATE( zw3d_abl(jpi,jpj,jpka) )
805         IF( ln_mskland )   THEN
806            DO jk=1,jpka
807               zw3d_abl(:,:,jk) = tmask(:,:,1)
808            END DO       
809         ELSE
810            zw3d_abl(:,:,:) = 1._wp     
811         ENDIF       
812         CALL histwrite( nid_A,  "pblh"   , it, pblh(:,:)                  *zw3d_abl(:,:,1     ), ndim_hA, ndex_hA )   ! pblh
813         CALL histwrite( nid_A,  "u_abl"  , it, u_abl   (:,:,2:jpka,nt_n  )*zw3d_abl(:,:,2:jpka), ndim_A , ndex_A  )   ! u_abl
814         CALL histwrite( nid_A,  "v_abl"  , it, v_abl   (:,:,2:jpka,nt_n  )*zw3d_abl(:,:,2:jpka), ndim_A , ndex_A  )   ! v_abl
815         CALL histwrite( nid_A,  "t_abl"  , it, tq_abl  (:,:,2:jpka,nt_n,1)*zw3d_abl(:,:,2:jpka), ndim_A , ndex_A  )   ! t_abl
816         CALL histwrite( nid_A,  "q_abl"  , it, tq_abl  (:,:,2:jpka,nt_n,2)*zw3d_abl(:,:,2:jpka), ndim_A , ndex_A  )   ! q_abl       
817         CALL histwrite( nid_A,  "tke_abl", it, tke_abl (:,:,2:jpka,nt_n  )*zw3d_abl(:,:,2:jpka), ndim_A , ndex_A  )   ! tke_abl
818         CALL histwrite( nid_A,  "avm_abl", it, avm_abl (:,:,2:jpka       )*zw3d_abl(:,:,2:jpka), ndim_A , ndex_A  )   ! avm_abl
819         CALL histwrite( nid_A,  "avt_abl", it, avt_abl (:,:,2:jpka       )*zw3d_abl(:,:,2:jpka), ndim_A , ndex_A  )   ! avt_abl
820#if defined key_si3
821         CALL histwrite( nid_A,  "oce_frac"   , it, ato_i(:,:)                                  , ndim_hA, ndex_hA )   ! ato_i
822#endif
823         DEALLOCATE(zw3d_abl)
824      ENDIF
825      !
[3609]826      IF( ln_icebergs ) THEN
827         !
828         CALL histwrite( nid_T, "calving"             , it, berg_grid%calving      , ndim_hT, ndex_hT ) 
829         CALL histwrite( nid_T, "calving_heat"        , it, berg_grid%calving_hflx , ndim_hT, ndex_hT )         
830         CALL histwrite( nid_T, "berg_floating_melt"  , it, berg_grid%floating_melt, ndim_hT, ndex_hT ) 
831         !
832         CALL histwrite( nid_T, "berg_stored_ice"     , it, berg_grid%stored_ice   , ndim_bT, ndex_bT )
833         !
834         IF( ln_bergdia ) THEN
835            CALL histwrite( nid_T, "berg_melt"           , it, berg_melt        , ndim_hT, ndex_hT   ) 
836            CALL histwrite( nid_T, "berg_buoy_melt"      , it, buoy_melt        , ndim_hT, ndex_hT   ) 
837            CALL histwrite( nid_T, "berg_eros_melt"      , it, eros_melt        , ndim_hT, ndex_hT   ) 
838            CALL histwrite( nid_T, "berg_conv_melt"      , it, conv_melt        , ndim_hT, ndex_hT   ) 
839            CALL histwrite( nid_T, "berg_virtual_area"   , it, virtual_area     , ndim_hT, ndex_hT   ) 
840            CALL histwrite( nid_T, "bits_src"            , it, bits_src         , ndim_hT, ndex_hT   ) 
841            CALL histwrite( nid_T, "bits_melt"           , it, bits_melt        , ndim_hT, ndex_hT   ) 
842            CALL histwrite( nid_T, "bits_mass"           , it, bits_mass        , ndim_hT, ndex_hT   ) 
843            CALL histwrite( nid_T, "berg_mass"           , it, berg_mass        , ndim_hT, ndex_hT   ) 
844            !
845            CALL histwrite( nid_T, "berg_real_calving"   , it, real_calving     , ndim_bT, ndex_bT   )
846         ENDIF
847      ENDIF
848
[11536]849      IF( ln_ssr ) THEN
[4990]850         CALL histwrite( nid_T, "sohefldp", it, qrp           , ndim_hT, ndex_hT )   ! heat flux damping
851         CALL histwrite( nid_T, "sowafldp", it, erp           , ndim_hT, ndex_hT )   ! freshwater flux damping
[12377]852         zw2d(:,:) = erp(:,:) * ts(:,:,1,jp_sal,Kmm) * tmask(:,:,1)
[4990]853         CALL histwrite( nid_T, "sosafldp", it, zw2d          , ndim_hT, ndex_hT )   ! salt flux damping
854      ENDIF
855!      zw2d(:,:) = FLOAT( nmln(:,:) ) * tmask(:,:,1)
856!      CALL histwrite( nid_T, "sobowlin", it, zw2d          , ndim_hT, ndex_hT )   ! ???
[3]857
858#if defined key_diahth
859      CALL histwrite( nid_T, "sothedep", it, hth           , ndim_hT, ndex_hT )   ! depth of the thermocline
860      CALL histwrite( nid_T, "so20chgt", it, hd20          , ndim_hT, ndex_hT )   ! depth of the 20 isotherm
861      CALL histwrite( nid_T, "so28chgt", it, hd28          , ndim_hT, ndex_hT )   ! depth of the 28 isotherm
862      CALL histwrite( nid_T, "sohtc300", it, htc3          , ndim_hT, ndex_hT )   ! first 300m heaat content
863#endif
[888]864
[12377]865      CALL histwrite( nid_U, "vozocrtx", it, uu(:,:,:,Kmm)            , ndim_U , ndex_U )    ! i-current
[888]866      CALL histwrite( nid_U, "sozotaux", it, utau          , ndim_hU, ndex_hU )   ! i-wind stress
[3]867
[12377]868      CALL histwrite( nid_V, "vomecrty", it, vv(:,:,:,Kmm)            , ndim_V , ndex_V  )   ! j-current
[888]869      CALL histwrite( nid_V, "sometauy", it, vtau          , ndim_hV, ndex_hV )   ! j-wind stress
[3]870
[11418]871      IF( ln_zad_Aimp ) THEN
[12377]872         CALL histwrite( nid_W, "vovecrtz", it, ww + wi     , ndim_T, ndex_T )    ! vert. current
[11418]873      ELSE
[12377]874         CALL histwrite( nid_W, "vovecrtz", it, ww          , ndim_T, ndex_T )    ! vert. current
[11418]875      ENDIF
[3]876      CALL histwrite( nid_W, "votkeavt", it, avt            , ndim_T, ndex_T )    ! T vert. eddy diff. coef.
[9019]877      CALL histwrite( nid_W, "votkeavm", it, avm            , ndim_T, ndex_T )    ! T vert. eddy visc. coef.
878      IF( ln_zdfddm ) THEN
879         CALL histwrite( nid_W, "voddmavs", it, avs         , ndim_T, ndex_T )    ! S vert. eddy diff. coef.
[3]880      ENDIF
881
[7646]882      IF( ln_wave .AND. ln_sdw ) THEN
[9019]883         CALL histwrite( nid_U, "sdzocrtx", it, usd         , ndim_U , ndex_U )    ! i-StokesDrift-current
884         CALL histwrite( nid_V, "sdmecrty", it, vsd         , ndim_V , ndex_V )    ! j-StokesDrift-current
885         CALL histwrite( nid_W, "sdvecrtz", it, wsd         , ndim_T , ndex_T )    ! StokesDrift vert. current
[7646]886      ENDIF
887
[1318]888      ! 3. Close all files
889      ! ---------------------------------------
[1561]890      IF( kt == nitend ) THEN
[3]891         CALL histclo( nid_T )
892         CALL histclo( nid_U )
893         CALL histclo( nid_V )
894         CALL histclo( nid_W )
[12377]895         IF(ln_abl) CALL histclo( nid_A )
[3]896      ENDIF
[2528]897      !
[9124]898      IF( ln_timing )   CALL timing_stop('dia_wri')
[3294]899      !
[3]900   END SUBROUTINE dia_wri
[1567]901#endif
902
[12377]903   SUBROUTINE dia_wri_state( Kmm, cdfile_name )
[3]904      !!---------------------------------------------------------------------
905      !!                 ***  ROUTINE dia_wri_state  ***
906      !!       
907      !! ** Purpose :   create a NetCDF file named cdfile_name which contains
908      !!      the instantaneous ocean state and forcing fields.
909      !!        Used to find errors in the initial state or save the last
910      !!      ocean state in case of abnormal end of a simulation
911      !!
912      !! ** Method  :   NetCDF files using ioipsl
913      !!      File 'output.init.nc'  is created if ninist = 1 (namelist)
914      !!      File 'output.abort.nc' is created in case of abnormal job end
915      !!----------------------------------------------------------------------
[12377]916      INTEGER           , INTENT( in ) ::   Kmm              ! time level index
[1334]917      CHARACTER (len=* ), INTENT( in ) ::   cdfile_name      ! name of the file created
[10425]918      !!
[12377]919      INTEGER :: inum, jk
[3]920      !!----------------------------------------------------------------------
[3294]921      !
[648]922      IF(lwp) WRITE(numout,*)
923      IF(lwp) WRITE(numout,*) 'dia_wri_state : single instantaneous ocean state'
924      IF(lwp) WRITE(numout,*) '~~~~~~~~~~~~~   and forcing fields file created '
[10425]925      IF(lwp) WRITE(numout,*) '                and named :', cdfile_name, '...nc'
[12649]926      !
927      CALL iom_open( TRIM(cdfile_name), inum, ldwrt = .TRUE. )
928      !
[12377]929      CALL iom_rstput( 0, 0, inum, 'votemper', ts(:,:,:,jp_tem,Kmm) )    ! now temperature
930      CALL iom_rstput( 0, 0, inum, 'vosaline', ts(:,:,:,jp_sal,Kmm) )    ! now salinity
931      CALL iom_rstput( 0, 0, inum, 'sossheig', ssh(:,:,Kmm)              )    ! sea surface height
932      CALL iom_rstput( 0, 0, inum, 'vozocrtx', uu(:,:,:,Kmm)                )    ! now i-velocity
933      CALL iom_rstput( 0, 0, inum, 'vomecrty', vv(:,:,:,Kmm)                )    ! now j-velocity
[11418]934      IF( ln_zad_Aimp ) THEN
[12377]935         CALL iom_rstput( 0, 0, inum, 'vovecrtz', ww + wi        )    ! now k-velocity
[11418]936      ELSE
[12377]937         CALL iom_rstput( 0, 0, inum, 'vovecrtz', ww             )    ! now k-velocity
[11418]938      ENDIF
[12377]939      CALL iom_rstput( 0, 0, inum, 'risfdep', risfdep            )    ! now k-velocity
940      CALL iom_rstput( 0, 0, inum, 'ht'     , ht                 )    ! now water column height
[12649]941      !
[12377]942      IF ( ln_isf ) THEN
943         IF (ln_isfcav_mlt) THEN
944            CALL iom_rstput( 0, 0, inum, 'fwfisf_cav', fwfisf_cav          )    ! now k-velocity
945            CALL iom_rstput( 0, 0, inum, 'rhisf_cav_tbl', rhisf_tbl_cav    )    ! now k-velocity
946            CALL iom_rstput( 0, 0, inum, 'rfrac_cav_tbl', rfrac_tbl_cav    )    ! now k-velocity
[12649]947            CALL iom_rstput( 0, 0, inum, 'misfkb_cav', REAL(misfkb_cav,wp) )    ! now k-velocity
948            CALL iom_rstput( 0, 0, inum, 'misfkt_cav', REAL(misfkt_cav,wp) )    ! now k-velocity
949            CALL iom_rstput( 0, 0, inum, 'mskisf_cav', REAL(mskisf_cav,wp), ktype = jp_i1 )
[12377]950         END IF
951         IF (ln_isfpar_mlt) THEN
[12649]952            CALL iom_rstput( 0, 0, inum, 'isfmsk_par', REAL(mskisf_par,wp) )    ! now k-velocity
[12377]953            CALL iom_rstput( 0, 0, inum, 'fwfisf_par', fwfisf_par          )    ! now k-velocity
954            CALL iom_rstput( 0, 0, inum, 'rhisf_par_tbl', rhisf_tbl_par    )    ! now k-velocity
955            CALL iom_rstput( 0, 0, inum, 'rfrac_par_tbl', rfrac_tbl_par    )    ! now k-velocity
[12649]956            CALL iom_rstput( 0, 0, inum, 'misfkb_par', REAL(misfkb_par,wp) )    ! now k-velocity
957            CALL iom_rstput( 0, 0, inum, 'misfkt_par', REAL(misfkt_par,wp) )    ! now k-velocity
958            CALL iom_rstput( 0, 0, inum, 'mskisf_par', REAL(mskisf_par,wp), ktype = jp_i1 )
[12377]959         END IF
960      END IF
[12649]961      !
[7646]962      IF( ALLOCATED(ahtu) ) THEN
[10425]963         CALL iom_rstput( 0, 0, inum,  'ahtu', ahtu              )    ! aht at u-point
964         CALL iom_rstput( 0, 0, inum,  'ahtv', ahtv              )    ! aht at v-point
[7646]965      ENDIF
966      IF( ALLOCATED(ahmt) ) THEN
[10425]967         CALL iom_rstput( 0, 0, inum,  'ahmt', ahmt              )    ! ahmt at u-point
968         CALL iom_rstput( 0, 0, inum,  'ahmf', ahmf              )    ! ahmf at v-point
[7646]969      ENDIF
[10425]970      CALL iom_rstput( 0, 0, inum, 'sowaflup', emp - rnf         )    ! freshwater budget
971      CALL iom_rstput( 0, 0, inum, 'sohefldo', qsr + qns         )    ! total heat flux
972      CALL iom_rstput( 0, 0, inum, 'soshfldo', qsr               )    ! solar heat flux
973      CALL iom_rstput( 0, 0, inum, 'soicecov', fr_i              )    ! ice fraction
974      CALL iom_rstput( 0, 0, inum, 'sozotaux', utau              )    ! i-wind stress
975      CALL iom_rstput( 0, 0, inum, 'sometauy', vtau              )    ! j-wind stress
[6140]976      IF(  .NOT.ln_linssh  ) THEN             
[12377]977         CALL iom_rstput( 0, 0, inum, 'vovvldep', gdept(:,:,:,Kmm)        )    !  T-cell depth
978         CALL iom_rstput( 0, 0, inum, 'vovvle3t', e3t(:,:,:,Kmm)          )    !  T-cell thickness 
[10425]979      END IF
[7646]980      IF( ln_wave .AND. ln_sdw ) THEN
[10425]981         CALL iom_rstput( 0, 0, inum, 'sdzocrtx', usd            )    ! now StokesDrift i-velocity
982         CALL iom_rstput( 0, 0, inum, 'sdmecrty', vsd            )    ! now StokesDrift j-velocity
983         CALL iom_rstput( 0, 0, inum, 'sdvecrtz', wsd            )    ! now StokesDrift k-velocity
[7646]984      ENDIF
[12377]985      IF ( ln_abl ) THEN
986         CALL iom_rstput ( 0, 0, inum, "uz1_abl",   u_abl(:,:,2,nt_a  ) )   ! now first level i-wind
987         CALL iom_rstput ( 0, 0, inum, "vz1_abl",   v_abl(:,:,2,nt_a  ) )   ! now first level j-wind
988         CALL iom_rstput ( 0, 0, inum, "tz1_abl",  tq_abl(:,:,2,nt_a,1) )   ! now first level temperature
989         CALL iom_rstput ( 0, 0, inum, "qz1_abl",  tq_abl(:,:,2,nt_a,2) )   ! now first level humidity
990      ENDIF
[12649]991      !
992      CALL iom_close( inum )
993      !
[10425]994#if defined key_si3
995      IF( nn_ice == 2 ) THEN   ! condition needed in case agrif + ice-model but no-ice in child grid
[12649]996         CALL iom_open( TRIM(cdfile_name)//'_ice', inum, ldwrt = .TRUE., kdlev = jpl, cdcomp = 'ICE' )
[10425]997         CALL ice_wri_state( inum )
[12649]998         CALL iom_close( inum )
[1561]999      ENDIF
1000#endif
[12649]1001
[3]1002   END SUBROUTINE dia_wri_state
[6140]1003
[3]1004   !!======================================================================
1005END MODULE diawri
Note: See TracBrowser for help on using the repository browser.