/[lmdze]/trunk/dyn3d/dynetat0.f
ViewVC logotype

Diff of /trunk/dyn3d/dynetat0.f

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

trunk/Sources/dyn3d/dynetat0.f revision 139 by guez, Tue May 26 17:46:03 2015 UTC trunk/dyn3d/dynetat0.f revision 265 by guez, Tue Mar 20 09:35:59 2018 UTC
# Line 1  Line 1 
1  module dynetat0_m  module dynetat0_m
2    
3    use dimens_m, only: iim, jjm    use dimensions, only: iim, jjm
4    
5    IMPLICIT NONE    IMPLICIT NONE
6    
# Line 27  module dynetat0_m Line 27  module dynetat0_m
27    ! de la zone totale)    ! de la zone totale)
28    
29    real taux, tauy    real taux, tauy
30    ! raideur de la transition de l'int\'erieur à l'ext\'erieur du zoom    ! raideur de la transition de l'int\'erieur \`a l'ext\'erieur du zoom
31        
32    real rlatu(jjm + 1)    real rlatu(jjm + 1)
33    ! (latitudes of points of the "scalar" and "u" grid, in rad)    ! latitudes of points of the "scalar" and "u" grid, in rad
34    
35    real rlatv(jjm)    real rlatv(jjm)
36    ! (latitudes of points of the "v" grid, in rad, in decreasing order)    ! latitudes of points of the "v" grid, in rad, in decreasing order
37    
38    real rlonu(iim + 1) ! longitudes of points of the "u" grid, in rad    real rlonu(iim + 1) ! longitudes of points of the "u" grid, in rad
39    
40    real rlonv(iim + 1)    real rlonv(iim + 1)
41    ! (longitudes of points of the "scalar" and "v" grid, in rad)    ! longitudes of points of the "scalar" and "v" grid, in rad
42    
43    real xprimu(iim + 1), xprimv(iim + 1)    real xprimu(iim + 1), xprimv(iim + 1)
44    ! xprimu et xprimv sont respectivement les valeurs de dx / dX aux    ! 2 pi / iim * (derivative of the longitudinal zoom function)(rlon[uv])
   ! points u et v.  
45    
46    REAL xprimm025(iim + 1), xprimp025(iim + 1)    REAL xprimm025(iim + 1), xprimp025(iim + 1)
47    REAL rlatu1(jjm), rlatu2(jjm), yprimu1(jjm), yprimu2(jjm)    REAL rlatu1(jjm), rlatu2(jjm), yprimu1(jjm), yprimu2(jjm)
48      REAL ang0, etot0, ptot0, ztot0, stot0
49    
50    save    save
51    
# Line 59  contains Line 59  contains
59    
60      use comconst, only: dtvr      use comconst, only: dtvr
61      use conf_gcm_m, only: raz_date      use conf_gcm_m, only: raz_date
62      use dimens_m, only: iim, jjm, llm, nqmx      use dimensions, only: iim, jjm, llm, nqmx
63      use disvert_m, only: pa      use disvert_m, only: pa
     use ener, only: etot0, ang0, ptot0, stot0, ztot0  
64      use iniadvtrac_m, only: tname      use iniadvtrac_m, only: tname
65      use netcdf, only: NF90_NOWRITE, NF90_NOERR      use netcdf, only: NF90_NOWRITE, NF90_NOERR
66      use netcdf95, only: NF95_GET_VAR, nf95_open, nf95_inq_varid, NF95_CLOSE, &      use netcdf95, only: NF95_GET_VAR, nf95_open, nf95_inq_varid, NF95_CLOSE, &
# Line 80  contains Line 79  contains
79    
80      ! Local variables:      ! Local variables:
81      INTEGER iq      INTEGER iq
82      REAL, pointer:: tab_cntrl(:) ! tableau des param\`etres du run      REAL, allocatable:: tab_cntrl(:) ! tableau des param\`etres du run
83      INTEGER ierr, ncid, varid      INTEGER ierr, ncid, varid
84    
85      namelist /dynetat0_nml/ day_ref, annee_ref      namelist /dynetat0_nml/ day_ref, annee_ref
# Line 149  contains Line 148  contains
148    
149      print *, "day_ini = ", day_ini      print *, "day_ini = ", day_ini
150    
     deallocate(tab_cntrl) ! pointer  
   
151      call NF95_INQ_VARID (ncid, "rlonu", varid)      call NF95_INQ_VARID (ncid, "rlonu", varid)
152      call NF95_GET_VAR(ncid, varid, rlonu)      call NF95_GET_VAR(ncid, varid, rlonu)
153    
# Line 187  contains Line 184  contains
184      CALL nf95_inq_varid(ncid, 'yprimu2', varid)      CALL nf95_inq_varid(ncid, 'yprimu2', varid)
185      CALL nf95_get_var(ncid, varid, yprimu2)      CALL nf95_get_var(ncid, varid, yprimu2)
186    
187      call NF95_INQ_VARID (ncid, "phisinit", varid)      call NF95_INQ_VARID (ncid, "phis", varid)
188      call NF95_GET_VAR(ncid, varid, phis)      call NF95_GET_VAR(ncid, varid, phis)
189    
190      call NF95_INQ_VARID (ncid, "ucov", varid)      call NF95_INQ_VARID (ncid, "ucov", varid)
# Line 201  contains Line 198  contains
198    
199      DO iq = 1, nqmx      DO iq = 1, nqmx
200         call NF95_INQ_VARID(ncid, tname(iq), varid, ierr)         call NF95_INQ_VARID(ncid, tname(iq), varid, ierr)
201         IF (ierr /= NF90_NOERR) THEN         IF (ierr == NF90_NOERR) THEN
202              call NF95_GET_VAR(ncid, varid, q(:, :, :, iq))
203           ELSE
204            PRINT *, 'dynetat0: "' // tname(iq) // '" not found, ' // &            PRINT *, 'dynetat0: "' // tname(iq) // '" not found, ' // &
205                 "setting it to zero..."                 "setting it to zero..."
206            q(:, :, :, iq) = 0.            q(:, :, :, iq) = 0.
        ELSE  
           call NF95_GET_VAR(ncid, varid, q(:, :, :, iq))  
207         ENDIF         ENDIF
208      ENDDO      ENDDO
209    

Legend:
Removed from v.139  
changed lines
  Added in v.265

  ViewVC Help
Powered by ViewVC 1.1.21