source: trunk/LMDZ.GENERIC/libf/phystd/writediagspecVI.F @ 1157

Last change on this file since 1157 was 993, checked in by emillour, 11 years ago

Generic GCM:

  • Some more cleanup in dynamics:
    • Moved "start2archive" (and auxilliary routines) to phystd
    • removed unused (obsolete) testharm.F , para_netcdf.h , readhead_NC.F , angtot.h from dyn3d
    • removed obsolete addit.F (and change corresponding lines in gcm)
    • remove unused "description.h" (and many places where it was "included")

EM

File size: 9.8 KB
Line 
1      subroutine writediagspecVI(ngrid,nom,titre,unite,dimpx,px)
2
3!  Ecriture de variables diagnostiques au choix dans la physique
4!  dans un fichier NetCDF nomme  'diagfi'. Ces variables peuvent etre
5!  3d (ex : temperature), 2d (ex : temperature de surface), ou
6!  0d (pour un scalaire qui ne depend que du temps : ex : la longitude
7!  solaire)
8!  Dans la version 2000, la periode d'ecriture est celle de
9!  "ecritphy " regle dans le fichier de controle de run :  run.def
10!
11!    writediagfi peut etre appele de n'importe quelle subroutine
12!    de la physique, plusieurs fois. L'initialisation et la creation du
13!    fichier se fait au tout premier appel.
14!
15! WARNING : les variables dynamique (u,v,t,q,ps)
16!  sauvees par writediagfi avec une
17! date donnee sont legerement differentes que dans le fichier histoire car
18! on ne leur a pas encore ajoute de la dissipation et de la physique !!!
19! IL est  RECOMMANDE d'ajouter les tendance physique a ces variables
20! avant l'ecriture dans diagfi (cf. physiq.F)
21
22!
23!  parametres (input) :
24!  ----------
25!      ngrid : nombres de point ou est calcule la physique
26!                (ngrid = 2+(jjm-1)*iim - 1/jjm)
27!                 (= nlon ou klon dans la physique terrestre)
28!     
29!      unit : unite logique du fichier de sortie (toujours la meme)
30!      nom  : nom de la variable a sortir (chaine de caracteres)
31!      titre: titre de la variable (chaine de caracteres)
32!      unite : unite de la variable (chaine de caracteres)
33!      px : variable a sortir (real 0, 2, ou 3d)
34!      dimpx : dimension de px : 0, 2, ou 3 dimensions
35!
36!=================================================================
37!
38!      This is a modified version that accepts spectrally varying input
39!      RW (2010)
40!
41!=================================================================
42 
43! Addition by RW (2010) to allow OSR to be saved in .nc format
44      use radinc_h, only : L_NSPECTV
45!      USE surfdat_h
46#ifdef CPP_PARA
47      use mod_phys_lmdz_para, only : is_mpi_root, is_master, gather
48      use mod_grid_phy_lmdz, only : klon_glo, Grid1Dto2D_glo
49#endif
50
51      implicit none
52
53! Commons
54#include "dimensions.h"
55#include "dimphys.h"
56#include "paramet.h"
57#include "control.h"
58#include "comvert.h"
59#include "comgeom.h"
60#include "netcdf.inc"
61#include "temps.h"
62#include "callkeys.h"
63
64! Arguments on input:
65      integer ngrid
66      character (len=*) :: nom,titre,unite
67      integer dimpx
68      real px(ngrid,L_NSPECTV)
69
70! Local variables:
71
72!      real dx3(iip1,jjp1,llm) ! to store a 3D data set
73!      real dx2(iip1,jjp1)     ! to store a 2D (surface) data set
74!      real dx0
75
76      real date
77
78!      REAL phis(ip1jmp1)
79
80      integer irythme
81      integer ierr
82      integer iq
83      integer i,j,l,zmax , ig0
84
85      integer zitau
86      character firstnom*20
87      SAVE firstnom
88      SAVE zitau
89      SAVE date
90      data firstnom /'1234567890'/
91      data zitau /0/
92
93! Ajouts
94      integer, save :: ntime=0
95      integer :: idim,varid
96      integer :: nid
97      character (len =50):: fichnom
98      integer, dimension(4) :: id
99      integer, dimension(4) :: edges,corner
100
101! added by RDW for OSR output
102       real dx3(iip1,jjp1,L_NSPECTV) ! to store the data set
103
104#ifdef CPP_PARA
105! Added to work in parallel mode
106      real dx3_glop(klon_glo,L_NSPECTV)
107      real dx3_glo(iim,jjp1,L_NSPECTV) ! to store a global 3D data set
108#else
109      logical,parameter :: is_master=.true.
110      logical,parameter :: is_mpi_root=.true.
111#endif
112
113!***************************************************************
114!Sortie des variables au rythme voulu
115
116      irythme = int(ecritphy)*iradia ! sortie au rythme de ecritphy
117!EM+JL if the spetra need to be output more frequently, need to define a ecritSpec...
118!     irythme = iphysiq  ! sortie a tous les pas physique
119
120!***************************************************************
121
122! Initialisation of 'firstnom' and create/open the "diagfi.nc" NetCDF file
123! ------------------------------------------------------------------------
124! (Au tout premier appel de la subroutine durant le run.)
125
126      fichnom="diagspecVI.nc"
127
128      if (firstnom.eq.'1234567890') then ! .true. for the very first call
129      !  to this subroutine; now set 'firstnom'
130         firstnom = nom
131         ! just to be sure, check that firstnom is large enough to hold nom
132         if (len_trim(firstnom).lt.len_trim(nom)) then
133           write(*,*) "writediagfi: Error !!!"
134           write(*,*) "   firstnom string not long enough!!"
135           write(*,*) "   increase its size to at least ",len_trim(nom)
136           stop
137         endif
138
139         ! Create the NetCDF file
140         if (is_master) then
141         ierr = NF_CREATE(fichnom, NF_CLOBBER, nid)
142         ! Define the 'Time' dimension
143         ierr = nf_def_dim(nid,"Time",NF_UNLIMITED,idim)
144         ! Define the 'Time' variable
145#ifdef NC_DOUBLE
146         ierr = NF_DEF_VAR (nid, "Time", NF_DOUBLE, 1, idim,varid)
147#else
148         ierr = NF_DEF_VAR (nid, "Time", NF_FLOAT, 1, idim,varid)
149#endif
150         ! Add a long_name attribute
151         ierr = NF_PUT_ATT_TEXT (nid, varid, "long_name",
152     .          4,"Time")
153         ! Add a units attribute
154         ierr = NF_PUT_ATT_TEXT(nid, varid,'units',29,
155     .          "days since 0000-00-0 00:00:00")
156         ! Switch out of NetCDF Define mode
157         ierr = NF_ENDDEF(nid)
158
159         ! write "header" of file (longitudes, latitudes, geopotential, ...)
160!         call gr_fi_dyn(1,ngrid,iip1,jjp1,phisfi,phis)
161!         call iniwrite(nid,day_ini,phis)
162         call iniwrite_specVI(nid,day_ini)
163         endif ! of if (is_master)
164
165         zitau = -1 ! initialize zitau
166      else
167         if (is_master) then
168           ! Open the NetCDF file
169           ierr = NF_OPEN(fichnom,NF_WRITE,nid)
170         endif
171      endif ! if (firstnom.eq.'1234567890')
172
173! Increment time index 'zitau' if it is the "firstcall" (at given time level)
174! to writediagfi
175!------------------------------------------------------------------------
176      if (nom.eq.firstnom) then
177          zitau = zitau + iphysiq
178      end if
179
180!--------------------------------------------------------
181! Write the variables to output file if it's time to do so
182!--------------------------------------------------------
183
184      if ( MOD(zitau+1,irythme) .eq.0.) then
185
186! Compute/write/extend 'Time' coordinate (date given in days)
187! (done every "first call" (at given time level) to writediagfi)
188! Note: date is incremented as 1 step ahead of physics time
189!       (like the 'histoire' outputs)
190!--------------------------------------------------------
191
192        if (nom.eq.firstnom) then
193
194        ! We have identified a "first call" (at given date)
195           ntime=ntime+1 ! increment # of stored time steps
196           ! compute corresponding date (in days and fractions thereof)
197           date= float (zitau +1)/float (day_step)
198
199           if (is_master) then
200             ! Get NetCDF ID of 'Time' variable
201             ierr= NF_INQ_VARID(nid,"Time",varid)
202
203             ! Write (append) the new date to the 'Time' array
204#ifdef NC_DOUBLE
205             ierr= NF_PUT_VARA_DOUBLE(nid,varid,ntime,1,date)
206#else
207             ierr= NF_PUT_VARA_REAL(nid,varid,ntime,1,date)
208#endif
209             if (ierr.ne.NF_NOERR) then
210              write(*,*) "***** PUT_VAR matter in writediagspec_nc"
211              write(*,*) "***** with time"
212              write(*,*) 'ierr=', ierr   
213c             call abort
214             endif
215
216             write(6,*)'WRITEDIAGSPEC: date= ', date
217           endif ! of if (is_master)
218        end if ! of if (nom.eq.firstnom)
219
220
221 
222!Case of a 3D variable
223!---------------------
224        if (dimpx.eq.3) then
225
226!         A. Recast (copy) variable from physics grid to dynamics grid
227#ifdef CPP_PARA
228  ! gather field on a "global" (without redundant longitude) array
229          call Gather(px,dx3_glop)
230!$OMP MASTER
231          if (is_mpi_root) then
232            call Grid1Dto2D_glo(dx3_glop,dx3_glo)
233            ! copy dx3_glo() to dx3(:) and add redundant longitude
234            dx3(1:iim,:,:)=dx3_glo(1:iim,:,:)
235            dx3(iip1,:,:)=dx3(1,:,:)
236          endif
237!$OMP END MASTER
238!$OMP BARRIER
239#else
240           DO l=1,L_NSPECTV
241             DO i=1,iip1
242                dx3(i,1,l)=px(1,l)
243                dx3(i,jjp1,l)=px(ngrid,l)
244             ENDDO
245             DO j=2,jjm
246                ig0= 1+(j-2)*iim
247                DO i=1,iim
248                   dx3(i,j,l)=px(ig0+i,l)
249                ENDDO
250                dx3(iip1,j,l)=dx3(1,j,l)
251             ENDDO
252           ENDDO
253#endif
254
255!         B. Write (append) the variable to the NetCDF file
256          if (is_master) then
257
258! name of the variable
259           ierr= NF_INQ_VARID(nid,nom,varid)
260           if (ierr /= NF_NOERR) then
261! corresponding dimensions
262              ierr= NF_INQ_DIMID(nid,"longitude",id(1))
263              ierr= NF_INQ_DIMID(nid,"latitude",id(2))
264              ierr= NF_INQ_DIMID(nid,"VI Wavenumber",id(3))
265              ierr= NF_INQ_DIMID(nid,"Time",id(4))
266
267! Create the variable if it doesn't exist yet
268
269              write (*,*) "=========================="
270              write (*,*) "DIAGSPEC: creating variable ",nom
271              call def_var(nid,nom,titre,unite,4,id,varid,ierr)
272
273           endif
274
275           corner(1)=1
276           corner(2)=1
277           corner(3)=1
278           corner(4)=ntime
279
280           edges(1)=iip1
281           edges(2)=jjp1
282           edges(3)=L_NSPECTV
283           edges(4)=1
284#ifdef NC_DOUBLE
285           ierr= NF_PUT_VARA_DOUBLE(nid,varid,corner,edges,dx3)
286#else
287           ierr= NF_PUT_VARA_REAL(nid,varid,corner,edges,dx3)
288#endif
289
290           if (ierr.ne.NF_NOERR) then
291              write(*,*) "***** PUT_VAR problem in writediagspec"
292              write(*,*) "***** with ",nom
293              write(*,*) 'ierr=', ierr
294             call abort
295           endif
296
297          endif ! of if (is_master)
298
299        endif ! of if (dimpx.eq.3)
300
301      endif ! of if ( MOD(zitau+1,irythme) .eq.0.)
302
303      ! Close the NetCDF file
304      if (is_master) then
305        ierr= NF_CLOSE(nid)
306      endif
307
308      end
Note: See TracBrowser for help on using the repository browser.