Ignore:
Timestamp:
Mar 7, 2019 8:43:54 AM (5 years ago)
Author:
raasch
Message:

unused variables removed

File:
1 edited

Legend:

Unmodified
Added
Removed
  • palm/trunk/SOURCE/surface_layer_fluxes_mod.f90

    r3745 r3787  
    2626! -----------------
    2727! $Id$
     28! unused variables removed
     29!
     30! 3745 2019-02-15 18:57:56Z suehring
    2831! Bugfix, missing calculation of 10cm temperature at vertical building walls,
    2932! required for indoor model
     
    297300    INTEGER(iwp) ::  k              !< loop index z direction
    298301    INTEGER(iwp) ::  l              !< loop index for surf type
    299     INTEGER(iwp) ::  li_bnd  = 7500 !< Lookup table index of the last time step
    300302
    301303    INTEGER(iwp), PARAMETER ::  num_steps = 15000  !< number of steps in the lookup table
     
    308310    LOGICAL      ::  surf_vertical     !< Flag indicating vertical surfaces
    309311
    310     REAL(wp), DIMENSION(0:num_steps-1) :: rib_tab,  & !< Lookup table bulk Richardson number
    311                                           ol_tab      !< Lookup table values of L
    312 
    313312    REAL(wp)     ::  e_s,               & !< Saturation water vapor pressure
    314313                     ol_max = 1.0E6_wp, & !< Maximum Obukhov length
    315                      rib_max,           & !< Maximum Richardson number in lookup table
    316                      rib_min,           & !< Minimum Richardson number in lookup table
    317314                     z_mo                 !< Height of the constant flux layer where MOST is assumed
    318315
     
    726723       IMPLICIT NONE
    727724
    728        INTEGER(iwp) :: li,         & !< Index for loop to create lookup table
    729                        num_steps_n   !< Number of non-stretched zeta steps
    730 
    731        LOGICAL :: terminate_run_l = .FALSE.    !< Flag to terminate run (global)
    732 
    733        REAL(wp), PARAMETER ::  zeta_stretch = -10.0_wp !< Start of stretching in the free convection limit
    734                                
    735        REAL(wp), DIMENSION(:), ALLOCATABLE :: zeta_tmp
    736 
    737 
    738        REAL(wp) :: zeta_step,            & !< Increment of zeta
    739                    regr      = 1.01_wp,  & !< Stretching factor of zeta_step in the free convection limit
    740                    regr_old  = 1.0E9_wp, & !< Stretching factor of last iteration step
    741                    z0h_min   = 0.0_wp,   & !< Minimum value of z0h to create table
    742                    z0_min    = 0.0_wp      !< Minimum value of z0 to create table
    743 
    744725
    745726       CALL location_message( 'initializing surface layer', .FALSE. )
    746 
    747727
    748728!
     
    1015995
    1016996       INTEGER(iwp) ::  iter    !< Newton iteration step
    1017        INTEGER(iwp) ::  li      !< look index
    1018997       INTEGER(iwp) ::  m       !< loop variable over all horizontal wall elements
    1019998
     
    20161995       IMPLICIT NONE
    20171996
    2018        CHARACTER (LEN = *), INTENT(IN)       :: z_char          !< string identifier to identify z level
    2019        INTEGER(iwp)                          :: i, j, k, l, m   !< running indices
     1997       CHARACTER (LEN = *), INTENT(IN)       :: z_char       !< string identifier to identify z level
     1998       INTEGER(iwp)                          :: i, j, k, m   !< running indices
    20201999
    20212000       
Note: See TracChangeset for help on using the changeset viewer.