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 11460 for branches – NEMO

Changeset 11460 for branches


Ignore:
Timestamp:
2019-08-20T11:41:01+02:00 (5 years ago)
Author:
mattmartin
Message:

Minor changes.

Location:
branches/UKMO/dev_r5518_obs_oper_update_addclim/NEMOGCM/NEMO/OPA_SRC/OBS
Files:
4 edited

Legend:

Unmodified
Added
Removed
  • branches/UKMO/dev_r5518_obs_oper_update_addclim/NEMOGCM/NEMO/OPA_SRC/OBS/diaobs.F90

    r11455 r11460  
    3333   USE mpp_map                  ! MPP mapping 
    3434   USE lib_mpp                  ! For ctl_warn/stop 
    35    USE dtatsd                   ! For climatological temperature & salinity 
    36    USE tradmp                   ! "" 
     35   USE tradmp                   ! For climatological temperature & salinity 
    3736 
    3837   IMPLICIT NONE 
     
    420419         WRITE(numout,*) '             Daily average types                             nn_profdavtypes = ', nn_profdavtypes 
    421420         WRITE(numout,*) '             Logical switch for night-time SST obs               ln_sstnight = ', ln_sstnight 
    422          WRITE(numout,*) '             Logical switch for writing climat. at ob locs    ln_output_clim = ', ln_output_clim 
     421         WRITE(numout,*) '             Logical switch for writing climat. at obs points ln_output_clim = ', ln_output_clim 
    423422      ENDIF 
    424423      !----------------------------------------------------------------------- 
     
    938937         & jp_spm 
    939938#endif 
    940       USE tradmp, ONLY: & 
    941          & tclim, & 
    942          & sclim 
    943939 
    944940      IMPLICIT NONE 
     
    12301226               IF ( ln_output_clim ) zsurfclim(:,:) = tclim(:,:,1) 
    12311227            CASE('sla') 
    1232                zsurfvar(:,:)  = sshn(:,:) 
     1228               zsurfvar(:,:) = sshn(:,:) 
    12331229            CASE('sss') 
    12341230               zsurfvar(:,:) = tsn(:,:,1,jp_sal) 
  • branches/UKMO/dev_r5518_obs_oper_update_addclim/NEMOGCM/NEMO/OPA_SRC/OBS/obs_oper.F90

    r11456 r11460  
    413413               iend = prodatqc%npvend(jobs,kvar)  
    414414               inum_obs = iend - ista + 1  
    415                ALLOCATE( interp_corner(2,2,inum_obs),      & 
    416                   &      iv_indic(inum_obs) )  
     415               ALLOCATE(interp_corner(2,2,inum_obs), iv_indic(inum_obs))  
    417416               IF ( prodatqc%lclim ) ALLOCATE( interp_corner_clim(2,2,inum_obs) )                   
    418417               DO iin=1,2   
     
    858857            IF ( surfdataqc%lclim ) THEN   
    859858               CALL obs_avg_h2d( 1, 1, imaxifp, imaxjfp, & 
    860                   &              zweig, zsurftmp(:,:,iobs),  zclm ) 
     859                  &              zweig, zclim(:,:,iobs),  zclm ) 
    861860            ENDIF 
    862861 
  • branches/UKMO/dev_r5518_obs_oper_update_addclim/NEMOGCM/NEMO/OPA_SRC/OBS/obs_readmdt.F90

    r11449 r11460  
    3737   REAL(wp), PUBLIC :: rn_mdtcorr   = 1.61_wp  ! User specified MDT correction 
    3838   REAL(wp), PUBLIC :: rn_mdtcutoff = 65.0_wp  ! MDT cutoff for computed correction 
    39    REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:) ::  mdt_fld    !: Mean Dynamic Topography on the model grid 
    4039    
    4140   !!---------------------------------------------------------------------- 
     
    9392      CALL iom_get ( nummdt, jpdom_data, 'sossheig', z_mdt(:,:), 1 ) 
    9493      CALL iom_close(nummdt)                 ! Close the file 
    95        
    96       ! Set the MDT gridded field to be the one read in directly with no adjustments 
    97       ALLOCATE( mdt_fld(jpi,jpj) ) 
    98       mdt_fld(:,:) = z_mdt(:,:) 
    99        
     94            
    10095      ! Read in the fill value 
    10196      zinfill = 0.0 
  • branches/UKMO/dev_r5518_obs_oper_update_addclim/NEMOGCM/NEMO/OPA_SRC/OBS/obs_write.F90

    r11455 r11460  
    100100 
    101101 
    102       ! Set up number of additional variables to be ouput: 
    103       ! Hx, CLIM, ... 
    104102      iadd_clm = 0  
    105103      IF ( profdata%lclim ) iadd_clm = 1 
     
    137135         fbdata%cobunit(1)    = 'Degrees centigrade' 
    138136         fbdata%cobunit(2)    = 'PSU' 
    139           
    140137         fbdata%cextname(1)   = 'TEMP' 
    141138         fbdata%cextlong(1)   = 'Insitu temperature' 
    142139         fbdata%cextunit(1)   = 'Degrees centigrade' 
    143           
    144140         fbdata%caddlong(1,1) = 'Model interpolated potential temperature' 
    145141         fbdata%caddlong(1,2) = 'Model interpolated practical salinity' 
Note: See TracChangeset for help on using the changeset viewer.