/[MITgcm]/MITgcm/pkg/diagnostics/diagstats_mnc_out.F
ViewVC logotype

Annotation of /MITgcm/pkg/diagnostics/diagstats_mnc_out.F

Parent Directory Parent Directory | Revision Log Revision Log | View Revision Graph Revision Graph


Revision 1.7 - (hide annotations) (download)
Tue Nov 1 01:53:13 2005 UTC (18 years, 6 months ago) by jmc
Branch: MAIN
CVS Tags: checkpoint58l_post, checkpoint58e_post, mitgcm_mapl_00, checkpoint58u_post, checkpoint58w_post, checkpoint58r_post, checkpoint57y_post, checkpoint58n_post, checkpoint58x_post, checkpoint58t_post, checkpoint58h_post, checkpoint57y_pre, checkpoint58q_post, checkpoint58j_post, checkpoint59e, checkpoint59d, checkpoint59g, checkpoint59f, checkpoint59a, checkpoint59c, checkpoint59b, checkpoint59m, checkpoint59l, checkpoint59i, checkpoint59h, checkpoint59k, checkpoint59j, checkpoint59, checkpoint58, checkpoint58f_post, checkpoint57x_post, checkpoint58d_post, checkpoint58c_post, checkpoint57w_post, checkpoint58a_post, checkpoint58i_post, checkpoint58g_post, checkpoint58o_post, checkpoint57z_post, checkpoint58y_post, checkpoint58k_post, checkpoint58v_post, checkpoint58s_post, checkpoint58p_post, checkpoint58b_post, checkpoint58m_post
Changes since 1.6: +17 -19 lines
always write double-precision to file (fix for the case where fflags is no set)

1 jmc 1.7 C $Header: /u/gcmpack/MITgcm/pkg/diagnostics/diagstats_mnc_out.F,v 1.6 2005/08/25 21:55:54 jmc Exp $
2 edhill 1.1 C $Name: $
3    
4     #include "DIAG_OPTIONS.h"
5    
6     C---+----1----+----2----+----3----+----4----+----5----+----6----+----7-|--+----|
7     CBOP 0
8     C !ROUTINE: DIAGSTATS_MNC_OUT
9    
10     C !INTERFACE:
11     SUBROUTINE DIAGSTATS_MNC_OUT(
12     I statGlob, nLev, ndId,
13 edhill 1.2 I mId, listId, myTime, myIter, myThid )
14 edhill 1.1
15     C !DESCRIPTION:
16     C Write Global statistics to a netCDF file
17    
18     C !USES:
19     IMPLICIT NONE
20     #include "SIZE.h"
21     #include "EEPARAMS.h"
22     #include "EESUPPORT.h"
23     #include "PARAMS.h"
24     #include "GRID.h"
25     #include "DIAGNOSTICS_SIZE.h"
26     #include "DIAGNOSTICS.h"
27    
28     #ifdef ALLOW_FIZHI
29     #include "fizhi_SIZE.h"
30     #else
31     INTEGER Nrphys
32     PARAMETER (Nrphys=0)
33     #endif
34    
35     C !INPUT PARAMETERS:
36     C statGlob :: AVERAGED DIAGNOSTIC QUANTITY
37     C nLev :: 2nd Dimension (max Nb of levels) of statGlob array
38     C ndId :: diagnostic Id number (in diagnostics long list)
39     C mId :: field rank in list "listId"
40     C listId :: current output Stream list
41     C myIter :: current Iteration Number
42     C myTime :: current time of simulation (s)
43     C myThid :: my thread Id number
44     INTEGER nLev
45 edhill 1.2 _RL statGlob(0:nStats,0:nLev,0:nRegions)
46     _RL myTime
47 edhill 1.1 INTEGER ndId, mId, listId
48 edhill 1.2 INTEGER myIter, myThid
49 edhill 1.1 CEOP
50    
51     C !LOCAL VARIABLES:
52 jmc 1.6 #ifdef ALLOW_MNC
53 edhill 1.1 INTEGER im, ix, iv, ist
54     PARAMETER ( iv = nStats - 2 , im = nStats - 1 , ix = nStats )
55     INTEGER i, j, k
56     CHARACTER*(MAX_LEN_MBUF) tnam
57     CHARACTER*(3) stat_typ(5)
58     INTEGER ILNBLNK
59     EXTERNAL ILNBLNK
60     INTEGER ii, ilen
61     CHARACTER*(MAX_LEN_FNAM) diag_mnc_bn
62     INTEGER CW_DIMS, NLEN
63     PARAMETER ( CW_DIMS = 10 )
64     PARAMETER ( NLEN = 80 )
65     INTEGER dim(CW_DIMS), ib(CW_DIMS), ie(CW_DIMS)
66     CHARACTER*(NLEN) dn(CW_DIMS)
67     CHARACTER*(NLEN) d_cw_gname
68     CHARACTER*(NLEN) d_cw_gname0
69     CHARACTER*(NLEN) dn_blnk
70 jmc 1.6 #ifdef DIAGST_MNC_NEEDSWORK
71     CHARACTER*(5) ctmp
72 edhill 1.1 _RS ztmp(Nr+Nrphys)
73 jmc 1.6 #endif
74 edhill 1.1 _RL stmp(Nr+Nrphys+1,nRegions+1)
75     #endif /* ALLOW_MNC */
76    
77     C---+----1----+----2----+----3----+----4----+----5----+----6----+----7-|--+----|
78    
79     #ifdef ALLOW_MNC
80    
81     _BEGIN_MASTER( myThid)
82    
83     stat_typ(1) = 'vol'
84     stat_typ(2) = 'ave'
85     stat_typ(3) = 'std'
86     stat_typ(4) = 'min'
87     stat_typ(5) = 'max'
88    
89     #ifdef ALLOW_USE_MPI
90     IF ( diagSt_MNC .AND. mpiMyId.EQ.0 ) THEN
91     #else
92     IF ( diagSt_MNC ) THEN
93     #endif
94    
95     DO i = 1,MAX_LEN_FNAM
96     diag_mnc_bn(i:i) = ' '
97     ENDDO
98     DO i = 1,NLEN
99     dn_blnk(i:i) = ' '
100     ENDDO
101     ilen = ILNBLNK(diagSt_Fname(listId))
102     WRITE(diag_mnc_bn, '(a)') diagSt_Fname(listId)(1:ilen)
103    
104     IF (mId .EQ. 1) THEN
105     C Update the record dimension by writing the iteration number
106     CALL MNC_CW_SET_UDIM(diag_mnc_bn, -1, myThid)
107 edhill 1.5 CALL MNC_CW_RL_W_S('D',diag_mnc_bn,1,1,'T',myTime,myThid)
108 edhill 1.1 CALL MNC_CW_SET_UDIM(diag_mnc_bn, 0, myThid)
109 edhill 1.5 CALL MNC_CW_I_W_S('I',diag_mnc_bn,1,1,'iter',myIter,myThid)
110 edhill 1.1 ENDIF
111    
112     #ifdef DIAGST_MNC_NEEDSWORK
113     C This is turned off for the time being but it should eventually
114     C be re-worked and turned on so that coordinate dimensions are
115     C supplied along with the data. Unfortunately, the current
116     C diagnostics system has **NO** way of telling us whether a
117     C quantity is defined on a typical vertical grid (eg. the dynamics
118     C grid), a gridalt--style grid, or a single-level field that has
119     C no specified vertical location.
120    
121     dn(1)(1:NLEN) = dn_blnk(1:NLEN)
122     WRITE(dn(1),'(a,i6.6)') 'Zmd', kdiag(ndId)
123     dim(1) = kdiag(ndId)
124     ib(1) = 1
125     ie(1) = kdiag(ndId)
126    
127     CALL MNC_CW_ADD_GNAME('diag_levels', 1,
128     & dim, dn, ib, ie, myThid)
129     CALL MNC_CW_ADD_VNAME('diag_levels', 'diag_levels',
130     & 0,0, myThid)
131     CALL MNC_CW_ADD_VATTR_TEXT('diag_levels','description',
132     & 'Idicies of vertical levels within the source arrays',
133     & myThid)
134    
135 edhill 1.5 CALL MNC_CW_RL_W('D',diag_mnc_bn,1,1,
136 edhill 1.1 & 'diag_levels', levs(1,listId), myThid)
137    
138     CALL MNC_CW_DEL_VNAME('diag_levels', myThid)
139     CALL MNC_CW_DEL_GNAME('diag_levels', myThid)
140    
141     C Now define: Zmdxxxxxx, Zudxxxxxx, Zldxxxxxx
142     ctmp(1:5) = 'mul '
143     DO i = 1,3
144     dn(1)(1:NLEN) = dn_blnk(1:NLEN)
145     WRITE(dn(1),'(3a,i6.6)') 'Z',ctmp(i:i),'d',nlevels(listId)
146     CALL MNC_CW_ADD_GNAME(dn(1), 1, dim, dn, ib, ie, myThid)
147     CALL MNC_CW_ADD_VNAME(dn(1), dn(1), 0,0, myThid)
148    
149     C The following three ztmp() loops should eventually be modified
150     C to reflect the fractional nature of levs(j,l) -- they should
151     C do something like:
152     C ztmp(j) = rC(INT(FLOOR(levs(j,l))))
153     C + ( rC(INT(FLOOR(levs(j,l))))
154     C + rC(INT(CEIL(levs(j,l)))) )
155     C / ( levs(j,l) - FLOOR(levs(j,l)) )
156     C for averaged levels.
157     IF (i .EQ. 1) THEN
158     DO j = 1,nlevels(listId)
159     ztmp(j) = rC(NINT(levs(j,listId)))
160     ENDDO
161     CALL MNC_CW_ADD_VATTR_TEXT(dn(1),'description',
162     & 'Dimensional coordinate value at the mid point',
163     & myThid)
164     ELSEIF (i .EQ. 2) THEN
165     DO j = 1,nlevels(listId)
166     ztmp(j) = rF(NINT(levs(j,listId)) + 1)
167     ENDDO
168     CALL MNC_CW_ADD_VATTR_TEXT(dn(1),'description',
169     & 'Dimensional coordinate value at the upper point',
170     & myThid)
171     ELSEIF (i .EQ. 3) THEN
172     DO j = 1,nlevels(listId)
173     ztmp(j) = rF(NINT(levs(j,listId)))
174     ENDDO
175     CALL MNC_CW_ADD_VATTR_TEXT(dn(1),'description',
176     & 'Dimensional coordinate value at the lower point',
177     & myThid)
178     ENDIF
179 edhill 1.5 CALL MNC_CW_RS_W('D',diag_mnc_bn,1,1, dn(1), ztmp, myThid)
180 edhill 1.1 CALL MNC_CW_DEL_VNAME(dn(1), myThid)
181     CALL MNC_CW_DEL_GNAME(dn(1), myThid)
182     ENDDO
183     #endif /* DIAGST_MNC_NEEDSWORK */
184    
185     DO ii = 1,CW_DIMS
186     d_cw_gname(1:NLEN) = dn_blnk(1:NLEN)
187     dn(ii)(1:NLEN) = dn_blnk(1:NLEN)
188     ENDDO
189    
190     C Z is special since it varies
191 edhill 1.3 WRITE(dn(1),'(a,i6.6)') 'Zd', kdiag(ndId)
192 edhill 1.1 IF ( (gdiag(ndId)(10:10) .EQ. 'R')
193     & .AND. (gdiag(ndId)(9:9) .EQ. 'M') ) THEN
194 edhill 1.3 WRITE(dn(1),'(a,i6.6)') 'Zmd', kdiag(ndId)
195 edhill 1.1 ENDIF
196     IF ( (gdiag(ndId)(10:10) .EQ. 'R')
197     & .AND. (gdiag(ndId)(9:9) .EQ. 'L') ) THEN
198 edhill 1.3 WRITE(dn(1),'(a,i6.6)') 'Zld', kdiag(ndId)
199 edhill 1.1 ENDIF
200     IF ( (gdiag(ndId)(10:10) .EQ. 'R')
201     & .AND. (gdiag(ndId)(9:9) .EQ. 'U') ) THEN
202 edhill 1.3 WRITE(dn(1),'(a,i6.6)') 'Zud', kdiag(ndId)
203 edhill 1.1 ENDIF
204     dim(1) = Nr+Nrphys+1
205     ib(1) = 1
206     ie(1) = kdiag(ndId)
207    
208     C "region" dimension
209     dim(2) = nRegions + 1
210     ib(2) = 1
211     dn(2)(1:6) = 'region'
212     ie(2) = nRegions + 1
213    
214     C Time dimension
215     dn(3)(1:1) = 'T'
216     dim(3) = -1
217     ib(3) = 1
218     ie(3) = 1
219    
220     C Note that the "d_cw_gname" variable is a hack that hides a
221     C subtlety within MNC. Basically, each MNC-wrapped file is
222     C caching its own concept of what each "grid name" (that is, a
223     C dimension group name) means. So one cannot re-use the same
224     C "grid" name for different collections of dimensions within a
225     C given file. By appending the "ndId" values to each name, we
226     C guarantee uniqueness within each MNC-produced file.
227    
228     WRITE(d_cw_gname,'(a7,i6.6)') 'dst_cw_', ndId
229     CALL MNC_CW_ADD_GNAME(d_cw_gname, 3,
230     & dim, dn, ib, ie, myThid)
231    
232     WRITE(dn(1),'(a3)') 'Zd0'
233     ie(1) = 1
234     WRITE(d_cw_gname0,'(a9,i6.6)') 'dst_cw_0_', ndId
235     CALL MNC_CW_ADD_GNAME(d_cw_gname0, 3,
236     & dim, dn, ib, ie, myThid)
237    
238     DO ist = 0,nStats
239    
240     DO i = 1,MAX_LEN_FNAM
241     tnam(i:i) = ' '
242     ENDDO
243    
244 jmc 1.4 c IF ( kdiag(ndId) .GT. 1 ) THEN
245 edhill 1.1
246     ilen = ILNBLNK(cdiag(ndId))
247 jmc 1.4 WRITE(tnam,'(a,a1,a3)')
248     & cdiag(ndId)(1:ilen),'_',stat_typ(ist+1)
249 edhill 1.1
250     CALL MNC_CW_ADD_VNAME(tnam, d_cw_gname0,
251     & 0,0, myThid)
252     CALL MNC_CW_ADD_VATTR_TEXT(tnam,'description',
253     & tdiag(ndId),myThid)
254     CALL MNC_CW_ADD_VATTR_TEXT(tnam,'units',
255     & udiag(ndId),myThid)
256    
257     C Copy the data into a temporary with the necessary shape
258     DO j = 0,nRegions
259     stmp(1,j+1) = statGlob(ist,0,j)
260     ENDDO
261    
262 jmc 1.7 C-jmc: fflags is not for Statistics-Diagnostics, can be unset, and since
263     C- size of the output file will not be an issue here: Always write real*8
264     c IF ((fflags(listId)(1:1) .EQ. ' ')
265     c & .OR. (fflags(listId)(1:1) .EQ. 'R')) THEN
266     c
267     c CALL MNC_CW_RL_W('R',diag_mnc_bn,1,1,
268     c & tnam, stmp, myThid)
269     c
270     c ELSEIF (fflags(listId)(1:1) .EQ. 'D') THEN
271 edhill 1.1
272 edhill 1.5 CALL MNC_CW_RL_W('D',diag_mnc_bn,1,1,
273 edhill 1.1 & tnam, stmp, myThid)
274    
275 jmc 1.7 c else
276     c write(0,*) myIter, ndId, listId
277     c write(0,'(3A)') '>',cdiag(ndId),'<'
278     c write(0,'(3A)') '>',fflags(listId),'<'
279     c STOP ' in DIAGSTATS_MNC_OUT'
280     c ENDIF
281 edhill 1.1
282     CALL MNC_CW_DEL_VNAME(tnam, myThid)
283    
284 jmc 1.4 c ENDIF
285    
286     IF ( kdiag(ndId) .GT. 1 ) THEN
287    
288     ilen = ILNBLNK(cdiag(ndId))
289     WRITE(tnam,'(a,a4,a3)')
290     & cdiag(ndId)(1:ilen),'_lv_',stat_typ(ist+1)
291    
292     CALL MNC_CW_ADD_VNAME(tnam, d_cw_gname,
293     & 0,0, myThid)
294     CALL MNC_CW_ADD_VATTR_TEXT(tnam,'description',
295     & tdiag(ndId),myThid)
296     CALL MNC_CW_ADD_VATTR_TEXT(tnam,'units',
297     & udiag(ndId),myThid)
298    
299     C Copy the data into a temporary with the necessary shape
300     DO j = 0,nRegions
301     DO k = 1,kdiag(ndId)
302     stmp(k,j+1) = statGlob(ist,k,j)
303     ENDDO
304     ENDDO
305    
306 jmc 1.7 C-jmc: Always write real*8 (size of the output file will not be an issue here)
307 edhill 1.5 CALL MNC_CW_RL_W('D',diag_mnc_bn,1,1,
308 jmc 1.4 & tnam, stmp, myThid)
309    
310     CALL MNC_CW_DEL_VNAME(tnam, myThid)
311    
312 edhill 1.1 ENDIF
313 jmc 1.4
314 edhill 1.1 ENDDO
315    
316     CALL MNC_CW_DEL_GNAME(d_cw_gname, myThid)
317     CALL MNC_CW_DEL_GNAME(d_cw_gname0, myThid)
318    
319     ENDIF
320    
321     _END_MASTER( myThid )
322    
323     #endif /* ALLOW_MNC */
324    
325     RETURN
326     END
327     C---+----1----+----2----+----3----+----4----+----5----+----6----+----7-|--+----|

  ViewVC Help
Powered by ViewVC 1.1.22