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 5282 for branches/2015/dev_r5056_CMCC4_simplification/NEMOGCM/NEMO/OPA_SRC/TRD – NEMO

Ignore:
Timestamp:
2015-05-18T17:19:50+02:00 (9 years ago)
Author:
diovino
Message:

Dev. branch CMCC4_simplification ticket #1456

Location:
branches/2015/dev_r5056_CMCC4_simplification/NEMOGCM/NEMO/OPA_SRC/TRD
Files:
4 edited

Legend:

Unmodified
Added
Removed
  • branches/2015/dev_r5056_CMCC4_simplification/NEMOGCM/NEMO/OPA_SRC/TRD/trdmxl.F90

    r4990 r5282  
    3232   USE ioipsl          ! NetCDF library 
    3333   USE lbclnk          ! ocean lateral boundary conditions (or mpp link) 
    34    USE diadimg         ! dimg direct access file format output 
    3534   USE trdmxl_rst      ! restart for diagnosing the ML trends 
    3635   USE prtctl          ! Print control 
     
    298297      !!  
    299298      !! ** Purpose :  Compute and cumulate the mixed layer trends over an analysis 
    300       !!               period, and write NetCDF (or dimg) outputs. 
     299      !!               period, and write NetCDF outputs. 
    301300      !! 
    302301      !! ** Method/usage : 
     
    349348      REAL(wp), POINTER, DIMENSION(:,:  ) ::  ztmltot2, zsmltot2, ztmlres2, zsmlres2, ztmlatf2, zsmlatf2, ztmltrdm2, zsmltrdm2   
    350349      REAL(wp), POINTER, DIMENSION(:,:,:) ::  ztmltrd2, zsmltrd2   ! only needed for mean diagnostics 
    351 #if defined key_dimgout 
    352       INTEGER ::  iyear,imon,iday 
    353       CHARACTER(LEN=80) :: cltext, clmode 
    354 #endif 
    355350      !!---------------------------------------------------------------------- 
    356351   
     
    801796      END IF 
    802797 
    803       IF( nn_cla == 1 )   CALL ctl_warn( '      You set n_cla = 1. Note that the Mixed-Layer diagnostics  ',   & 
    804          &                               '      are not exact along the corresponding straits.            ') 
    805  
    806798      !                                   ! allocate trdmxl arrays 
    807799      IF( trd_mxl_alloc()    /= 0 )   CALL ctl_stop( 'STOP', 'trd_mxl_init : unable to allocate trdmxl     arrays' ) 
  • branches/2015/dev_r5056_CMCC4_simplification/NEMOGCM/NEMO/OPA_SRC/TRD/trdmxl_rst.F90

    r4990 r5282  
    5959            WRITE(numout,*) 
    6060            SELECT CASE ( jprstlib ) 
    61             CASE ( jprstdimg )   ;   WRITE(numout,*) '             open ocean restart_mxl binary file: '//clname 
    6261            CASE DEFAULT         ;   WRITE(numout,*) '             open ocean restart_mxl NetCDF file: '//clname 
    6362            END SELECT 
     
    140139         WRITE(numout,*) ' ~~~~~~~~~~~~~~~~' 
    141140      ENDIF 
    142       IF ( jprstlib == jprstdimg ) THEN 
    143          ! eventually read netcdf file (monobloc)  for restarting on different number of processors 
    144          ! if {cn_trdrst_in}.nc exists, then set jlibalt to jpnf90 
    145          INQUIRE( FILE = TRIM(cn_trdrst_in)//'.nc', EXIST = llok ) 
    146          IF ( llok ) THEN   ;   jlibalt = jpnf90    
    147          ELSE               ;   jlibalt = jprstlib    
    148          ENDIF 
    149       ENDIF 
    150141 
    151142      CALL iom_open( cn_trdrst_in, inum, kiolib = jlibalt )  
  • branches/2015/dev_r5056_CMCC4_simplification/NEMOGCM/NEMO/OPA_SRC/TRD/trdtra.F90

    r4990 r5282  
    3636   PUBLIC   trd_tra   ! called by all tra_... modules 
    3737 
    38    REAL(wp) ::   r2dt   ! time-step, = 2 rdttra except at nit000 (=rdttra) if neuler=0 
     38!   REAL(wp) ::   r2dt   ! time-step, = 2 rdt except at nit000 (=rdt) if neuler=0 
    3939 
    4040   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   trdtx, trdty, trdt   ! use to store the temperature trends 
     
    227227      !!---------------------------------------------------------------------- 
    228228 
    229       IF( neuler == 0 .AND. kt == nit000    ) THEN   ;   r2dt =      rdt      ! = rdtra (restart with Euler time stepping) 
    230       ELSEIF(               kt <= nit000 + 1) THEN   ;   r2dt = 2. * rdt      ! = 2 rdttra (leapfrog) 
     229      IF( neuler == 0 .AND. kt == nit000    ) THEN   ;   r2dt =      rdt      ! = rdt (restart with Euler time stepping) 
     230      ELSEIF(               kt <= nit000 + 1) THEN   ;   r2dt = 2. * rdt      ! = 2 rdt (leapfrog) 
    231231      ENDIF 
    232232 
  • branches/2015/dev_r5056_CMCC4_simplification/NEMOGCM/NEMO/OPA_SRC/TRD/trdvor.F90

    r4990 r5282  
    8585      !!  
    8686      !! ** Purpose :  computation of cumulated trends over analysis period 
    87       !!               and make outputs (NetCDF or DIMG format) 
     87      !!               and make outputs (NetCDF format) 
    8888      !!---------------------------------------------------------------------- 
    8989      REAL(wp), DIMENSION(:,:,:), INTENT(inout) ::   putrd, pvtrd   ! U and V trends  
     
    318318      !!  
    319319      !! ** Purpose :  computation of cumulated trends over analysis period 
    320       !!               and make outputs (NetCDF or DIMG format) 
     320      !!               and make outputs (NetCDF format) 
    321321      !!---------------------------------------------------------------------- 
    322322      INTEGER                   , INTENT(in   ) ::   kt             ! time step 
Note: See TracChangeset for help on using the changeset viewer.