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

Diff of /MITgcm/pkg/diagnostics/diag_vegtile_fill.F

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

revision 1.3 by molod, Fri Feb 18 16:20:26 2005 UTC revision 1.10 by jmc, Thu Apr 2 18:52:27 2009 UTC
# Line 6  C $Name$ Line 6  C $Name$
6  CBOP  CBOP
7  C     !ROUTINE: DIAG_VEGTILE_FILL  C     !ROUTINE: DIAG_VEGTILE_FILL
8  C     !INTERFACE:  C     !INTERFACE:
9        SUBROUTINE DIAG_VEGTILE_FILL (field,indx,chfr,ib,numpts,npeice,        SUBROUTINE DIAG_VEGTILE_FILL(
10       . check, chardiag, kLev, nLevs, bi, bj, myThid)       &                field,indx,chfr,ib,numpts,npeice,
11         &                check, chardiag, kLev, nLevs, bi, bj, myThid )
12  C     !DESCRIPTION:  C     !DESCRIPTION:
13  C***********************************************************************  C***********************************************************************
14  C Increment the diagnostics array with a vegetation tile space field  C Increment the diagnostics array with a vegetation tile space field
# Line 23  C     == Global variables === Line 24  C     == Global variables ===
24    
25  C     !INPUT PARAMETERS:  C     !INPUT PARAMETERS:
26  C***********************************************************************  C***********************************************************************
27  C   field  - array to be mapped to grid space [ib,levs] and added to qdiag  C   field    :: array to be mapped to grid space [ib,levs] and added to qdiag
28  C   indx   - array of horizontal indeces of grid points to convert to  C   indx     :: array of horizontal indices of grid points to convert to
29  C            tile space[numpts]  C               tile space[numpts]
30  C   chfr   - fractional area covered by the tile [ib]  C   chfr     :: fractional area covered by the tile [ib]
31  C   ib     - inner dimension of source array AND number of points in  C   ib       :: inner dimension of source array and number of points in
32  C            array a that need to be pasted  C               array a that need to be pasted
33  C   numpts - total number of points which were stripped  C   numpts   :: total number of points which were stripped
34  C   npeice - the current strip number to be filled  C   npeice   :: the current strip number to be filled
35  C   check  - logical to check for undefined values  C   check    :: logical to check for undefined values
36  C   chardiag ... Character expression for diag to fill  C   chardiag :: Character expression for diag to fill
37  C   kLev   ..... Integer flag for vertical levels:  C   kLev     :: Integer flag for vertical levels:
38  C                > 0 (any integer): WHICH single level to increment  C                > 0 (any integer): which single level to increment
39  C                0,-1 to increment "nLevs" levels in qdiag:  C                0,-1 to increment "nLevs" levels in qdiag:
40  C                 0 : fill-in in the same order as the input array  C                  0 : fill-in in the same order as the input array
41  C                -1 : fill-in in reverse order.  C                 -1 : fill-in in reverse order.
42  C   nLevs ...... indicates Number of levels of the input field array  C   nLevs    :: indicates Number of levels of the input field array
43  C   bi    ...... X-direction tile number  C   bi       :: X-direction tile number
44  C   bj    ...... Y-direction tile number  C   bj       :: Y-direction tile number
45  C   myThid     ::  my thread Id number  C   myThid   :: my thread Id number
 C  
 c IMPORTANT NOTE:  
 c  
 c This routine will result in roundoff differences if called from  
 c within a parallel region.  
46  C***********************************************************************  C***********************************************************************
47        CHARACTER*8 chardiag        CHARACTER*8 chardiag
48        INTEGER kLev, nLevs, bi, bj        INTEGER kLev, nLevs, bi, bj
49        INTEGER myThid        INTEGER myThid
50        integer ib,numpts,npeice        INTEGER ib,numpts,npeice
51        integer indx(numpts)        INTEGER indx(numpts)
52        _RL field(ib,nlevs), chfr(ib)        _RL field(ib,nlevs), chfr(ib)
53        logical check        LOGICAL check
54  CEOP  CEOP
55    
56  C     !LOCAL VARIABLES:  C     !LOCAL VARIABLES:
57  C ===============  C ===============
58        INTEGER m, n        INTEGER m, n
59        INTEGER ndiagnum, ipointer        INTEGER ndiagnum, ipointer
60        INTEGER k, kFirst, kLast        INTEGER k, kFirst, kLast
61        INTEGER kd, kd0, ksgn, kStore        INTEGER kd, kd0, ksgn, kStore
62        CHARACTER*(MAX_LEN_MBUF) msgBuf        CHARACTER*(MAX_LEN_MBUF) msgBuf
63        integer i,offset,Lena,newindx,jindx        INTEGER offset, Lena
64        _RL undef,getcon        INTEGER ivt, ij, i
65          _RL undef
66          INTEGER iSp, ndId, j,l
67          INTEGER region2fill(0:nRegions)
68          _RL     scaleFact
69          _RL     gridField(sNx*sNy,nlevs), gridFrac(sNx*sNy)
70    
71    #ifdef ALLOW_FIZHI
72          _RL   getcon
73          EXTERNAL getcon
74    #endif
75    
76  C Run through list of active diagnostics to make sure  C Run through list of active diagnostics to make sure
77  C we are trying to fill a valid diagnostic  C we are trying to fill a valid diagnostic
78    
79          undef = UNSET_RL
80    #ifdef ALLOW_FIZHI
81          IF ( check ) undef = getcon('UNDEF')
82    #endif
83        ndiagnum = 0        ndiagnum = 0
84        ipointer = 0        ipointer = 0
85        DO n=1,nlists        DO n=1,nlists
86         DO m=1,nActive(n)         DO m=1,nActive(n)
87          IF ( chardiag.EQ.flds(m,n) ) THEN          IF ( chardiag.EQ.flds(m,n) .AND. idiag(m,n).GT.0 ) THEN
88           ndiagnum = jdiag(m,n)           ndiagnum = jdiag(m,n)
89           IF (ndiag(ndiagnum).GE.0) ipointer = idiag(ndiagnum)           ipointer = idiag(m,n)
90          ENDIF           IF ( ndiagnum.NE.0 .AND. ndiag(ipointer,1,1).GE.0 ) THEN
91         ENDDO  C--   do the filling: start here:
92        ENDDO  
93              IF ( (ABS(kLev).LE.1) .AND. (npeice.EQ.1) ) THEN
94  C If-sequence to see if we are a valid and an active diagnostic  C Increment the counter for the diagnostic
95                ndiag(ipointer,bi,bj) = ndiag(ipointer,bi,bj) + 1
96              ENDIF
97    
98        IF ( ndiagnum.NE.0 .AND. ipointer.NE.0 ) THEN            offset = ib*(npeice-1)
99              Lena   = MIN(ib,numpts-offset)
 C Increment the counter for the diagnostic (if we are at bi=bj=myThid=1)  
        _BEGIN_MASTER(myThid)  
        IF((bi.EQ.1).AND.(bj.EQ.1).AND.(ABS(kLev).LE.1)  
      .         .AND.(npeice.eq.1))  
      .                     ndiag(ndiagnum) = ndiag(ndiagnum) + 1  
        _END_MASTER(myThid)  
   
        offset = ib*(npeice-1)  
        Lena    = min(ib,numpts-offset)  
        offset = offset+1  
100    
101  C-      Which part of field to add : k = 3rd index,  C-      Which part of field to add : k = 3rd index,
102  C         and do the loop >> do k=kFirst,kLast <<  C         and do the loop >> do k=kFirst,kLast <<
103         IF (kLev.LE.0) THEN            IF (kLev.LE.0) THEN
104          kFirst = 1             kFirst = 1
105          kLast  = nLevs             kLast  = nLevs
106         ELSEIF ( nLevs.EQ.1 ) THEN            ELSEIF ( nLevs.EQ.1 ) THEN
107          kFirst = 1             kFirst = 1
108          kLast  = 1             kLast  = 1
109         ELSEIF ( kLev.LE.nLevs ) THEN            ELSEIF ( kLev.LE.nLevs ) THEN
110          kFirst = kLev             kFirst = kLev
111          kLast  = kLev             kLast  = kLev
112         ELSE            ELSE
113          STOP 'ABNORMAL END: S/R DIAGNOSTICS_FILL kLev > nLevs > 0'             STOP 'ABNORMAL END: S/R DIAGNOSTICS_FILL kLev > nLevs > 0'
114         ENDIF            ENDIF
115  C-      Which part of qdiag to update: kd = 3rd index,  C-      Which part of qdiag to update: kd = 3rd index,
116  C         and do the loop >> do k=kFirst,kLast ; kd = kd0 + k*ksgn <<  C         and do the loop >> do k=kFirst,kLast ; kd = kd0 + k*ksgn <<
117         IF ( kLev.EQ.-1 ) THEN            IF ( kLev.EQ.-1 ) THEN
118          ksgn = -1             ksgn = -1
119          kd0 = ipointer + nLevs             kd0 = ipointer + nLevs
120         ELSEIF ( kLev.EQ.0 ) THEN            ELSEIF ( kLev.EQ.0 ) THEN
121          ksgn = 1             ksgn = 1
122          kd0 = ipointer - 1             kd0 = ipointer - 1
123         ELSE            ELSE
124          ksgn = 0             ksgn = 0
125          kd0 = ipointer + kLev - 1             kd0 = ipointer + kLev - 1
126         ENDIF            ENDIF
127    
128  C-      Check for consistency with Nb of levels reserved in storage array  C-      Check for consistency with Nb of levels reserved in storage array
129          kStore = kd0 + MAX(ksgn*kFirst,ksgn*kLast) - ipointer + 1            kStore = kd0 + MAX(ksgn*kFirst,ksgn*kLast) - ipointer + 1
130         IF ( kStore.GT.kdiag(ndiagnum) ) THEN            IF ( kStore.GT.kdiag(ndiagnum) ) THEN
131          _BEGIN_MASTER(myThid)             _BEGIN_MASTER(myThid)
132          WRITE(msgBuf,'(2A,I3,A)') 'DIAGNOSTICS_FILL: ',             WRITE(msgBuf,'(2A,I4,A)') 'DIAGNOSTICS_FILL: ',
133       .     'exceed Nb of levels(=',kdiag(ndiagnum),' ) reserved '       &      'exceed Nb of levels(=',kdiag(ndiagnum),' ) reserved '
134          CALL PRINT_ERROR( msgBuf , myThid )             CALL PRINT_ERROR( msgBuf , myThid )
135          WRITE(msgBuf,'(2A,I4,2A)') 'DIAGNOSTICS_FILL: ',             WRITE(msgBuf,'(2A,I6,2A)') 'DIAGNOSTICS_FILL: ',
136       .     'for Diagnostics #', ndiagnum, ' : ', chardiag       &      'for Diagnostics #', ndiagnum, ' : ', chardiag
137          CALL PRINT_ERROR( msgBuf , myThid )             CALL PRINT_ERROR( msgBuf , myThid )
138          WRITE(msgBuf,'(2A,2I4,I3)') 'calling DIAGNOSTICS_FILL ',             WRITE(msgBuf,'(2A,2I4,I3)') 'calling DIAGNOSTICS_FILL ',
139       .     'with kLev,nLevs=', kLev,nLevs       &      'with kLev,nLevs=', kLev,nLevs
140          CALL PRINT_ERROR( msgBuf , myThid )             CALL PRINT_ERROR( msgBuf , myThid )
141          WRITE(msgBuf,'(2A,I6,A)') 'DIAGNOSTICS_FILL: ',             WRITE(msgBuf,'(2A,I6,A)') 'DIAGNOSTICS_FILL: ',
142       .     '==> trying to store up to ', kStore, ' levels'       &      '==> trying to store up to ', kStore, ' levels'
143          CALL PRINT_ERROR( msgBuf , myThid )             CALL PRINT_ERROR( msgBuf , myThid )
144          STOP 'ABNORMAL END: S/R DIAGNOSTICS_FILL'             STOP 'ABNORMAL END: S/R DIAGNOSTICS_FILL'
145          _END_MASTER(myThid)             _END_MASTER(myThid)
146         ENDIF            ENDIF
147    
148         DO k = kFirst,kLast            DO k = kFirst,kLast
149          kd = kd0 + ksgn*k             kd = kd0 + ksgn*k
150          if( check ) then             IF ( check ) THEN
151           undef = getcon('UNDEF')              DO ivt = 1,Lena
152           do i= 1,Lena               ij = indx(ivt+offset) - 1
153            jindx = 1 + int((indx(i+offset-1)-1)/sNx)               j = 1 + INT(ij/sNx)
154            newindx = indx(i+offset-1)+(jindx-1)*2*Olx+(sNx+2*Olx)*Oly+Olx               i = 1 + MOD(ij,sNx)
155            if(qdiag(newindx,1,kd,bi,bj).eq.undef               IF ( field(ivt,k).EQ.undef ) THEN
156       .                                  .or.field(i,k).eq.undef)then                qdiag(i,j,kd,bi,bj) = undef
157             qdiag(newindx,1,kd,bi,bj) = undef               ELSEIF ( qdiag(i,j,kd,bi,bj).NE.undef ) THEN
158            else                qdiag(i,j,kd,bi,bj) = qdiag(i,j,kd,bi,bj)
159             qdiag(newindx,1,kd,bi,bj)=qdiag(newindx,1,kd,bi,bj)+       &                            + field(ivt,k)*chfr(ivt)
160       .                                             field(i,k)*chfr(i)               ENDIF
161            endif              ENDDO
162           enddo             ELSE
163          else              DO ivt = 1,Lena
164           do i= 1,Lena                ij = indx(ivt+offset) - 1
165            jindx = 1 + int((indx(i+offset-1)-1)/sNx)                j = 1 + INT(ij/sNx)
166            newindx = indx(i+offset-1)+(jindx-1)*2*Olx+(sNx+2*Olx)*Oly+Olx                i = 1 + MOD(ij,sNx)
167            qdiag(newindx,1,kd,bi,bj)=qdiag(newindx,1,kd,bi,bj)+                qdiag(i,j,kd,bi,bj) = qdiag(i,j,kd,bi,bj)
168       .                                             field(i,k)*chfr(i)       &                            + field(ivt,k)*chfr(ivt)
169           enddo              ENDDO
170          endif             ENDIF
171              ENDDO
172    
173    C--   do the filling: ends here.
174             ENDIF
175            ENDIF
176         ENDDO         ENDDO
177          ENDDO
178    
179    C---+----1----+----2----+----3----+----4----+----5----+----6----+----7-|--+----|
180    C--   Global/Regional Statistics :
181          scaleFact = 1. _d 0
182    
183    C Run through list of active statistics-diagnostics to make sure
184    C we are trying to compute & fill a valid diagnostic
185    
186          DO n=1,diagSt_nbLists
187           DO m=1,diagSt_nbActv(n)
188            IF ( chardiag.EQ.diagSt_Flds(m,n) .AND. iSdiag(m,n).GT.0 ) THEN
189             iSp = iSdiag(m,n)
190             IF ( qSdiag(0,0,iSp,bi,bj).GE.0. ) THEN
191               ndId = jSdiag(m,n)
192    C-    Find list of regions to fill:
193               DO j=0,nRegions
194                region2fill(j) = diagSt_region(j,n)
195               ENDDO
196    C-    if this diagnostics appears in several lists (with same freq)
197    C     then add regions from other lists
198               DO l=1,diagSt_nbLists
199                DO k=1,diagSt_nbActv(l)
200                 IF ( iSdiag(k,l).EQ.-iSp ) THEN
201                  DO j=0,nRegions
202                   region2fill(j) = MAX(region2fill(j),diagSt_region(j,l))
203                  ENDDO
204                 ENDIF
205                ENDDO
206               ENDDO
207    
208    C-      Which part of field to add : k = 3rd index,
209    C         and do the loop >> do k=kFirst,kLast <<
210               IF (kLev.LE.0) THEN
211                kFirst = 1
212                kLast  = nLevs
213               ELSE
214                kFirst = 1
215                kLast  = 1
216               ENDIF
217    
218    C-    Fill local array with grid-space field after conversion.
219               offset = ib*(npeice-1)
220               Lena    = MIN(ib,numpts-offset)
221    
222               DO ij = 1,sNx*sNy
223                 gridFrac(ij)= 0.
224               ENDDO
225               DO ivt = 1,Lena
226                 ij = indx(ivt+offset)
227                 gridFrac(ij)=gridFrac(ij)+chfr(ivt)
228               ENDDO
229    
230               DO k = kFirst,kLast
231                DO ij = 1,sNx*sNy
232                 gridField(ij,k)= 0.
233                ENDDO
234                IF ( check ) THEN
235                 DO ivt = 1,Lena
236                  ij = indx(ivt+offset)
237                  IF ( field(ivt,k).EQ.undef ) THEN
238                   gridField(ij,k) = undef
239                  ELSEIF ( gridFrac(ij).GT.0. _d 0 ) THEN
240                   gridField(ij,k) = gridField(ij,k)
241         &                         + field(ivt,k)*chfr(ivt)/gridFrac(ij)
242                  ENDIF
243                 ENDDO
244                ELSE
245                 DO ivt = 1,Lena
246                  ij = indx(ivt+offset)
247                  IF ( gridFrac(ij).GT.0. _d 0 ) THEN
248                   gridField(ij,k) = gridField(ij,k)
249         &                         + field(ivt,k)*chfr(ivt)/gridFrac(ij)
250                  ENDIF
251                 ENDDO
252                ENDIF
253               ENDDO
254    
255    C-    diagnostics is valid and Active: Now do the filling
256               CALL DIAGSTATS_FILL(
257         I              gridField, gridFrac, scaleFact, 1, 1,
258         I              ndId, iSp, region2fill, kLev, nLevs,
259         I              3, bi, bj, myThid )
260             ENDIF
261            ENDIF
262           ENDDO
263          ENDDO
264    
265        ELSE        RETURN
 C     IF (myThid.EQ.1) WRITE(6,1000) chardiag  
       ENDIF  
   
  1000 format(' ',' Warning: Trying to write to diagnostic ',a8,  
      .        ' But it is not a valid (or active) name ')  
       RETURN  
266        END        END

Legend:
Removed from v.1.3  
changed lines
  Added in v.1.10

  ViewVC Help
Powered by ViewVC 1.1.22