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.
Changeset 10160 for utils/tools/NESTING/src/agrif_readwrite.f90 – NEMO

Ignore:
Timestamp:
2018-09-28T16:21:53+02:00 (6 years ago)
Author:
clem
Message:

forgotten commits on nesting tool

File:
1 edited

Legend:

Unmodified
Added
Removed
  • utils/tools/NESTING/src/agrif_readwrite.f90

    r10093 r10160  
    502502     REAL*8 ,              DIMENSION(N)     ::   e3t_1d, e3w_1d, gdept_1d 
    503503     REAL*8 , ALLOCATABLE, DIMENSION(:,:)   ::   ff_t, ff_f 
    504      INTEGER, ALLOCATABLE, DIMENSION(:,:)   ::   bottom_level, top_level 
     504     INTEGER, ALLOCATABLE, DIMENSION(:,:)   ::   bottom_level, top_level, zbathy 
    505505     REAL*8 , ALLOCATABLE, DIMENSION(:,:,:) ::   e3t_0, e3u_0, e3v_0, e3f_0, e3w_0, e3uw_0, e3vw_0 
    506506     ! 
     
    511511     ! allocate needed arrays for domain_cfg 
    512512     ALLOCATE( ff_t(nx,ny), ff_f(nx,ny) ) 
    513      ALLOCATE( bottom_level(nx,ny), top_level(nx,ny) ) 
     513     ALLOCATE( bottom_level(nx,ny), top_level(nx,ny), zbathy(nx,ny) ) 
    514514     ALLOCATE( e3t_0(nx,ny,N), e3u_0 (nx,ny,N), e3v_0 (nx,ny,N), e3f_0(nx,ny,N),  & 
    515515        &      e3w_0(nx,ny,N), e3uw_0(nx,ny,N), e3vw_0(nx,ny,N) ) 
     
    567567     top_level(  nx,1:ny) = 0 
    568568 
     569     zbathy(:,:) = Grid%bathy_meter 
     570     zbathy(1:nx,1   ) = 0. 
     571     zbathy(1:nx,  ny) = 0. 
     572     zbathy(1   ,1:ny) = 0. 
     573     zbathy(  nx,1:ny) = 0.      
     574      
    569575     ! ------------------- 
    570576     ! write domain_cfg.nc 
     
    629635     CALL write_ncdf_var('bottom_level',dimnames(1:2),name,bottom_level,'integer') 
    630636     CALL write_ncdf_var('top_level'   ,dimnames(1:2),name,top_level   ,'integer') 
    631  
    632      CALL write_ncdf_var('bathy_meter' ,dimnames(1:2),name,Grid%bathy_meter,'float') 
     637     CALL write_ncdf_var('bathy_meter' ,dimnames(1:2),name,zbathy      ,'float') 
    633638 
    634639     ! some attributes       
     
    660665     ! 
    661666     DEALLOCATE( ff_t, ff_f ) 
    662      DEALLOCATE( bottom_level, top_level ) 
     667     DEALLOCATE( bottom_level, top_level, zbathy ) 
    663668     DEALLOCATE( e3t_0, e3u_0, e3v_0, e3f_0, e3w_0, e3uw_0, e3vw_0 ) 
    664669     !       
Note: See TracChangeset for help on using the changeset viewer.