INTERFACE:
module ncdf_3d_bdyDESCRIPTION:
USES:
use netcdf
use domain, only: imin,imax,jmin,jmax,kmax,ioff,joff
use domain, only: nsbv,NWB,NNB,NEB,NSB,bdy_index
use domain, only: wi,wfj,wlj,nj,nfi,nli,ei,efj,elj,sj,sfi,sli
use domain, only: H
use m2d, only: dtm
use variables_3d, only: hn
use bdy_3d, only: T_bdy,S_bdy
use time, only: string_to_julsecs,time_diff,add_secs
use time, only: julianday,secondsofday,juln,secsn
use time, only: write_time_string,timestr
IMPLICIT NONE
private
public :: init_3d_bdy_ncdf,do_3d_bdy_ncdf
!PRIVATE DATA MEMBERS:
integer :: ncid
integer :: time_id,temp_id,salt_id
integer :: start(4),edges(4)
integer :: zax_dim,zax_len,zax_pos
integer :: time_dim,time_len,time_pos
logical :: climatology=.false.
logical :: from_3d_fields
REALTYPE :: offset
REAL_4B, allocatable :: bdy_times(:),wrk(:)
REAL_4B, allocatable, dimension(:) :: zlev
REALTYPE, allocatable, dimension(:,:) :: T_old, T_new
REAL_4B, allocatable, dimension(:,:) :: T_wrk
REALTYPE, allocatable, dimension(:,:) :: S_old, S_new
REAL_4B, allocatable, dimension(:,:) :: S_wrk
REALTYPE, allocatable, dimension(:,:,:) :: T_bdy_clim,S_bdy_clim
REVISION HISTORY:
Original author(s): Karsten Bolding & Hans Burchard