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 9939 for NEMO/branches/2018/dev_r9838_ENHANCE04_RK3/src/OCE/OBS – NEMO

Ignore:
Timestamp:
2018-07-13T09:28:50+02:00 (6 years ago)
Author:
gm
Message:

#1911 (ENHANCE-04): RK3 branche phased with MLF@9937 branche

Location:
NEMO/branches/2018/dev_r9838_ENHANCE04_RK3
Files:
2 edited
1 copied

Legend:

Unmodified
Added
Removed
  • NEMO/branches/2018/dev_r9838_ENHANCE04_RK3/src/OCE/OBS/diaobs.F90

    r9656 r9939  
    539539      ENDIF 
    540540 
    541       idaystp = NINT( rday / rdt ) 
     541      idaystp = NINT( rday / rn_Dt ) 
    542542 
    543543      !----------------------------------------------------------------------- 
     
    630630 
    631631      ENDIF 
    632  
     632      ! 
    633633   END SUBROUTINE dia_obs 
     634 
    634635 
    635636   SUBROUTINE dia_obs_wri 
     
    651652      !!        !  15-08  (M. Martin) Combined writing for prof and surf types 
    652653      !!---------------------------------------------------------------------- 
    653       !! * Modules used 
    654654      USE obs_rot_vel          ! Rotation of velocities 
    655655 
    656656      IMPLICIT NONE 
    657657 
    658       !! * Local declarations 
    659658      INTEGER :: jtype                    ! Data set loop variable 
    660659      INTEGER :: jo, jvar, jk 
    661       REAL(wp), DIMENSION(:), ALLOCATABLE :: & 
    662          & zu, & 
    663          & zv 
     660      REAL(wp), DIMENSION(:), ALLOCATABLE ::   zu, zv 
    664661 
    665662      !----------------------------------------------------------------------- 
     
    771768      !!        !  2014-09  (D. Lea) New generic routine now deals with arbitrary initial time of day 
    772769      !!---------------------------------------------------------------------- 
    773       USE phycst, ONLY : &            ! Physical constants 
    774          & rday 
    775       USE dom_oce, ONLY : &           ! Ocean space and time domain variables 
    776          & rdt 
     770      USE phycst , ONLY :   rday    ! Physical constants 
     771      USE dom_oce, ONLY :   rn_Dt   ! Ocean space and time domain variables 
    777772 
    778773      IMPLICIT NONE 
    779774 
    780       !! * Arguments 
    781       REAL(KIND=dp), INTENT(OUT) :: ddobs                        ! Date in YYYYMMDD.HHMMSS 
    782       INTEGER :: kstp 
    783  
    784       !! * Local declarations 
     775      REAL(KIND=dp), INTENT(  out) ::   ddobs   ! Date in YYYYMMDD.HHMMSS 
     776      INTEGER      , INTENT(in   ) ::   kstp 
     777 
    785778      INTEGER :: iyea        ! date - (year, month, day, hour, minute) 
    786779      INTEGER :: imon 
     
    805798      !! Compute number of days + number of hours + min since initial time 
    806799      !!---------------------------------------------------------------------- 
    807       zdayfrc = kstp * rdt / rday 
     800      zdayfrc = kstp * rn_Dt / rday 
    808801      zdayfrc = zdayfrc - aint(zdayfrc) 
    809802      imin = imin + int( zdayfrc * 24 * 60 )  
     
    816809        iday=iday+1 
    817810      END DO  
    818       iday = iday + kstp * rdt / rday  
     811      iday = iday + kstp * rn_Dt / rday  
    819812 
    820813      !----------------------------------------------------------------------- 
     
    842835   END SUBROUTINE calc_date 
    843836 
     837 
    844838   SUBROUTINE ini_date( ddobsini ) 
    845839      !!---------------------------------------------------------------------- 
     
    859853      !!        !  2014-09  (D. Lea) Change to call generic routine calc_date 
    860854      !!---------------------------------------------------------------------- 
    861  
    862855      IMPLICIT NONE 
    863  
    864       !! * Arguments 
    865       REAL(KIND=dp), INTENT(OUT) :: ddobsini                   ! Initial date in YYYYMMDD.HHMMSS 
    866  
     856      ! 
     857      REAL(KIND=dp), INTENT(out) ::   ddobsini   ! Initial date in YYYYMMDD.HHMMSS 
     858      !!---------------------------------------------------------------------- 
     859      ! 
    867860      CALL calc_date( nit000 - 1, ddobsini ) 
    868  
     861      ! 
    869862   END SUBROUTINE ini_date 
     863 
    870864 
    871865   SUBROUTINE fin_date( ddobsfin ) 
     
    10111005    END SUBROUTINE obs_setinterpopts 
    10121006 
     1007   !!====================================================================== 
    10131008END MODULE diaobs 
  • NEMO/branches/2018/dev_r9838_ENHANCE04_RK3/src/OCE/OBS/obs_prep.F90

    r9598 r9939  
    610610      !!        !  2010-05  (D. Lea) Fix in leap year calculation for NEMO vn3.2 
    611611      !!---------------------------------------------------------------------- 
    612       !! * Modules used 
    613       USE dom_oce, ONLY : &  ! Geographical information 
    614          & rdt 
    615       USE phycst, ONLY : &   ! Physical constants 
    616          & rday,  &              
    617          & rmmss, &              
    618          & rhhmm                         
    619       !! * Arguments 
     612      USE dom_oce, ONLY :   rn_Dt                ! Geographical information 
     613      USE phycst , ONLY :   rday, rmmss, rhhmm   ! Physical constants 
     614 
    620615      INTEGER, INTENT(IN) :: kcycle     ! Current cycle 
    621616      INTEGER, INTENT(IN) :: kyea0      ! Initial date coordinates 
     
    632627         & kobshou,  & 
    633628         & kobsmin 
    634       INTEGER, DIMENSION(kobsno), INTENT(INOUT) :: & 
    635          & kobsqc           ! Quality control flag 
    636       INTEGER, DIMENSION(kobsno), INTENT(OUT) :: & 
    637          & kobsstp          ! Number of time steps up to the  
    638                             ! observation time 
    639  
    640       !! * Local declarations 
     629      INTEGER, DIMENSION(kobsno), INTENT(inout) ::   kobsqc    ! Quality control flag 
     630      INTEGER, DIMENSION(kobsno), INTENT(  out) ::   kobsstp   ! Number of time steps up to the observation time 
     631      ! 
    641632      INTEGER :: jyea 
    642633      INTEGER :: jmon 
     
    661652 
    662653      ! Intialize the number of time steps per day 
    663       idaystp = NINT( rday / rdt ) 
     654      idaystp = NINT( rday / rn_Dt ) 
    664655 
    665656      !--------------------------------------------------------------------- 
     
    731722 
    732723         ! Add in the number of time steps to the observation minute 
    733          zminstp = rmmss / rdt 
     724         zminstp = rmmss / rn_Dt 
    734725         zhoustp = rhhmm * zminstp 
    735726 
Note: See TracChangeset for help on using the changeset viewer.