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 1601 for trunk/NEMO/OPA_SRC/SBC/sbcblk_core.F90 – NEMO

Ignore:
Timestamp:
2009-08-11T12:09:19+02:00 (15 years ago)
Author:
ctlod
Message:

Doctor naming of OPA namelist variables , see ticket: #526

File:
1 edited

Legend:

Unmodified
Added
Removed
  • trunk/NEMO/OPA_SRC/SBC/sbcblk_core.F90

    r1482 r1601  
    5454   TYPE(FLD), ALLOCATABLE, DIMENSION(:) ::   sf   ! structure of input fields (file informations, fields read) 
    5555          
    56    !! * CORE bulk parameters 
     56   !                                             !!! CORE bulk parameters 
    5757   REAL(wp), PARAMETER ::   rhoa =    1.22        ! air density 
    5858   REAL(wp), PARAMETER ::   cpa  = 1000.5         ! specific heat of air 
     
    6262   REAL(wp), PARAMETER ::   Cice =    1.63e-3     ! transfer coefficient over ice 
    6363 
    64    LOGICAL  ::   ln_2m = .FALSE.                  !: logical flag for height of air temp. and hum 
    65    REAL(wp) ::   alpha_precip=1.                  !: multiplication factor for precipitation 
     64   !                                !!* Namelist namsbc_core : CORE bulk parameters 
     65   LOGICAL  ::   ln_2m = .FALSE.     ! logical flag for height of air temp. and hum 
     66   REAL(wp) ::   rn_pfac = 1.        ! multiplication factor for precipitation 
    6667 
    6768   !! * Substitutions 
     
    115116      TYPE(FLD_N) ::   sn_wndi, sn_wndj, sn_humi, sn_qsr       ! informations about the fields to be read 
    116117      TYPE(FLD_N) ::   sn_qlw , sn_tair, sn_prec, sn_snow      !   "                                 " 
    117       NAMELIST/namsbc_core/ cn_dir, ln_2m, alpha_precip, sn_wndi, sn_wndj, sn_humi, sn_qsr,   & 
    118          &                                               sn_qlw , sn_tair, sn_prec, sn_snow 
     118      NAMELIST/namsbc_core/ cn_dir, ln_2m, rn_pfac, sn_wndi, sn_wndj, sn_humi, sn_qsr,   & 
     119         &                                                sn_qlw , sn_tair, sn_prec, sn_snow 
    119120      !!--------------------------------------------------------------------- 
    120121 
     
    124125         ! set file information (default values) 
    125126         cn_dir = './'       ! directory in which the model is executed 
    126  
     127         ! 
    127128         ! (NB: frequency positive => hours, negative => months) 
    128129         !            !    file     ! frequency !  variable  ! time intep !  clim   ! 'yearly' or ! weights  ! rotation   ! 
     
    136137         sn_prec = FLD_N( 'precip'  ,    -1.    ,  'precip'  ,  .true.    , .false. ,   'yearly'  , ''       , ''         ) 
    137138         sn_snow = FLD_N( 'snow'    ,    -1.    ,  'snow'    ,  .true.    , .false. ,   'yearly'  , ''       , ''         ) 
    138  
     139         ! 
    139140         REWIND( numnam )                    ! ... read in namlist namsbc_core 
    140141         READ  ( numnam, namsbc_core ) 
    141  
     142         ! 
    142143         ! store namelist information in an array 
    143144         slf_i(jp_wndi) = sn_wndi   ;   slf_i(jp_wndj) = sn_wndj 
     
    145146         slf_i(jp_tair) = sn_tair   ;   slf_i(jp_humi) = sn_humi 
    146147         slf_i(jp_prec) = sn_prec   ;   slf_i(jp_snow) = sn_snow 
    147           
     148         ! 
    148149         ! set sf structure 
    149150         ALLOCATE( sf(jpfld), STAT=ierror ) 
     
    151152            CALL ctl_stop( 'sbc_blk_core: unable to allocate sf structure' )   ;   RETURN 
    152153         ENDIF 
    153  
    154154         DO ifpr= 1, jpfld 
    155155            ALLOCATE( sf(ifpr)%fnow(jpi,jpj) ) 
    156156            ALLOCATE( sf(ifpr)%fdta(jpi,jpj,2) ) 
    157157         END DO 
    158  
     158         ! 
    159159         ! fill sf with slf_i and control print 
    160160         CALL fld_fill( sf, slf_i, cn_dir, 'sbc_blk_core', 'flux formulattion for ocean surface boundary condition', 'namsbc_core' ) 
    161161         ! 
    162162      ENDIF 
    163  
    164163 
    165164      CALL fld_read( kt, nn_fsbc, sf )                   ! input fields provided at the current time-step 
     
    327326      qns(:,:) = zqlw(:,:) - zqsb(:,:) - zqla(:,:)      ! Downward Non Solar flux 
    328327!CDIR COLLAPSE 
    329       emp (:,:) = zevap(:,:) - sf(jp_prec)%fnow(:,:) * alpha_precip * tmask(:,:,1) 
     328      emp (:,:) = zevap(:,:) - sf(jp_prec)%fnow(:,:) * rn_pfac * tmask(:,:,1) 
    330329!CDIR COLLAPSE 
    331330      emps(:,:) = emp(:,:) 
     
    533532        
    534533!CDIR COLLAPSE 
    535       p_tpr(:,:) = sf(jp_prec)%fnow(:,:) * alpha_precip      ! total precipitation [kg/m2/s] 
    536 !CDIR COLLAPSE 
    537       p_spr(:,:) = sf(jp_snow)%fnow(:,:) * alpha_precip      ! solid precipitation [kg/m2/s] 
    538       CALL iom_put( 'snowpre', p_spr )                       ! Snow precipitation  
     534      p_tpr(:,:) = sf(jp_prec)%fnow(:,:) * rn_pfac      ! total precipitation [kg/m2/s] 
     535!CDIR COLLAPSE 
     536      p_spr(:,:) = sf(jp_snow)%fnow(:,:) * rn_pfac      ! solid precipitation [kg/m2/s] 
     537      CALL iom_put( 'snowpre', p_spr )                  ! Snow precipitation  
    539538      ! 
    540539      IF(ln_ctl) THEN 
Note: See TracChangeset for help on using the changeset viewer.