Ignore:
Timestamp:
Sep 12, 2018 3:02:00 PM (6 years ago)
Author:
raasch
Message:

various changes to avoid compiler warnings (mainly removal of unused variables)

File:
1 edited

Legend:

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

    r3233 r3241  
    2828! -----------------
    2929! $Id$
     30! unused variables removed or commented
     31!
     32! 3233 2018-09-07 13:21:24Z schwenkel
    3033! Adapted for the use of cloud_droplets
    3134!
     
    883886    REAL(wp), DIMENSION(:), ALLOCATABLE            ::  surfoutsw        !< array of total sw radiation outgoing from nonvirtual surfaces surfaces after all reflection
    884887    REAL(wp), DIMENSION(:), ALLOCATABLE            ::  surfoutlw        !< array of total lw radiation outgoing from nonvirtual surfaces surfaces after all reflection
    885     REAL(wp), DIMENSION(:), ALLOCATABLE            ::  surfhf           !< array of total radiation flux incoming to minus outgoing from local surface
    886888    REAL(wp), DIMENSION(:), ALLOCATABLE            ::  surfemitlwl      !< array of emitted lw radiation for local surface used to calculate effective surface temperature for radiation model
    887889
     
    12171219       CHARACTER (LEN=*) ::  dopr_unit !< local value of dopr_unit
    12181220 
    1219        INTEGER(iwp) ::  user_pr_index !<
    12201221       INTEGER(iwp) ::  var_count     !<
    12211222
     
    13751376
    13761377       USE control_parameters,                                                 &
    1377            ONLY: land_surface, message_string, topography, urban_surface
     1378           ONLY: land_surface, message_string, urban_surface
    13781379
    13791380       USE netcdf_data_input_mod,                                              &
     
    14691470
    14701471       INTEGER(iwp) ::  i         !< running index x-direction
    1471        INTEGER(iwp) ::  ind_type  !< running index for subgrid-surface tiles
    14721472       INTEGER(iwp) ::  ioff      !< offset in x between surface element reference grid point in atmosphere and actual surface
    14731473       INTEGER(iwp) ::  j         !< running index y-direction
    14741474       INTEGER(iwp) ::  joff      !< offset in y between surface element reference grid point in atmosphere and actual surface
    14751475       INTEGER(iwp) ::  l         !< running index for orientation of vertical surfaces
    1476        INTEGER(iwp) ::  m         !< running index for surface elements 
     1476       INTEGER(iwp) ::  m         !< running index for surface elements
     1477#if defined( __rrtmg )
     1478       INTEGER(iwp) ::  ind_type  !< running index for subgrid-surface tiles
     1479#endif
    14771480
    14781481!
     
    2732273511 FORMAT (/'    --> Shortwave radiation is disabled.')
    2733273612 FORMAT  ('    Timestep: dt_radiation = ', F6.2, '  s')
    2734 13 FORMAT (/'    Albedo is set individually for each xy-location, according '  &
     273713 FORMAT (/'    Albedo is set individually for each xy-location, according ', &
    27352738                 'to given surface type.')
    27362739
     
    28382841    SUBROUTINE radiation_rrtmg
    28392842
     2843#if defined ( __rrtmg )
    28402844       USE indices,                                                            &
    28412845           ONLY:  nbgp
     
    28472851       IMPLICIT NONE
    28482852
    2849 #if defined ( __rrtmg )
    28502853
    28512854       INTEGER(iwp) ::  i, j, k, l, m, n !< loop indices
     
    44614464
    44624465     IMPLICIT NONE
    4463 
    4464      INTEGER(iwp)                      :: i, j, k, kk, is, js, d, ku, refstep, m, mm, l, ll
    4465      INTEGER(iwp)                      :: nzubl, nzutl, isurf, isurfsrc, isvf, icsf, ipcgb
     4466     INTEGER(iwp)                      :: i, j, k, kk, d, refstep, m, mm, l, ll
     4467     INTEGER(iwp)                      :: isurf, isurfsrc, isvf, icsf, ipcgb
    44664468     INTEGER(iwp)                      :: isd                !< solar direction number
    44674469     INTEGER(iwp)                      :: pc_box_dimshift    !< transform for best accuracy
     
    44774479     REAL(wp), PARAMETER               :: alpha = 0._wp      !< grid rotation (TODO: add to namelist or remove)
    44784480     REAL(wp)                          :: pc_box_area, pc_abs_frac, pc_abs_eff
    4479      REAL(wp)                          ::  count_surfaces    !< number of all surfaces in model domain
    4480      REAL(wp)                          ::  count_surfaces_l  !< number of all surfaces in sub-domain
    4481      REAL(wp)                          ::  pt_surf_urb       !< mean surface temperature of all surfaces in model domain, temporal work-around
    4482      REAL(wp)                          ::  pt_surf_urb_l     !< mean surface temperature of all surfaces in sub-domain, temporal work-around
     4481!     REAL(wp)                          ::  count_surfaces    !< number of all surfaces in model domain
     4482!     REAL(wp)                          ::  count_surfaces_l  !< number of all surfaces in sub-domain
     4483!     REAL(wp)                          ::  pt_surf_urb       !< mean surface temperature of all surfaces in model domain, temporal work-around
     4484!     REAL(wp)                          ::  pt_surf_urb_l     !< mean surface temperature of all surfaces in sub-domain, temporal work-around
    44834485
    44844486     REAL(wp), DIMENSION(0:nsurf_type) :: facearea
     
    44974499     REAL(wp)                          :: area_surfl         !< total area of surfaces in local processor
    44984500     REAL(wp)                          :: area_surf          !< total area of surfaces in all processor
    4499      REAL(wp)                          :: area_horl          !< total horizontal area of domain in local processor
    45004501     REAL(wp)                          :: area_hor           !< total horizontal area of domain in all processor
    45014502
     
    47164717     surfoutlw = surfoutll
    47174718     surfemitlwl = surfoutll
    4718 !        surfhf = surfinsw + surfinlw - surfoutsw - surfoutlw
    47194719
    47204720     IF ( .NOT.  surface_reflections )  THEN
     
    47724772         surfoutsw = surfoutsw + surfoutsl
    47734773         surfoutlw = surfoutlw + surfoutll
    4774 !            surfhf = surfinsw + surfinlw - surfoutsw - surfoutlw
    47754774
    47764775     ENDDO
     
    52155214
    52165215       USE plant_canopy_model_mod,                                             &
    5217            ONLY:  pch_index, pc_heating_rate, lad_s
     5216           ONLY:  pch_index, lad_s
    52185217
    52195218       IMPLICIT NONE
    52205219
    5221        INTEGER(iwp) :: i, j, k, d, l, ir, jr, ids, m
     5220       INTEGER(iwp) :: i, j, k, l, m
    52225221       INTEGER(iwp) :: k_topo     !< vertical index indicating topography top for given (j,i)
    5223        INTEGER(iwp) :: k_topo2    !< vertical index indicating topography top for given (j,i)
    52245222       INTEGER(iwp) :: nzptl, nzubl, nzutl, isurf, ipcgb
    5225        INTEGER(iwp) :: procid
    52265223       REAL(wp)     :: mrl
    52275224
     
    55555552        IMPLICIT NONE
    55565553       
    5557         INTEGER(iwp)                                  :: i, j, k, l, d, ip, jp
     5554        INTEGER(iwp)                                  :: i, j, k, d, ip, jp
    55585555        INTEGER(iwp)                                  :: isvf, ksvf, icsf, kcsf, npcsfl, isvf_surflt, imrtt, imrtf, ipcgb
    5559         INTEGER(iwp)                                  :: sd, td, ioln, iproc
     5556        INTEGER(iwp)                                  :: sd, td
    55605557        INTEGER(iwp)                                  :: iaz, izn      !< azimuth, zenith counters
    55615558        INTEGER(iwp)                                  :: naz, nzn      !< azimuth, zenith num of steps
     
    55815578        REAL(wp)                                      :: transparency, rirrf, sqdist, svfsum
    55825579        INTEGER(iwp)                                  :: isurflt, isurfs, isurflt_prev
    5583         INTEGER(iwp)                                  :: itx, ity, itz
    55845580        INTEGER(idp)                                  :: ray_skip_maxdist, ray_skip_minval !< skipped raytracing counts
    55855581        INTEGER(iwp)                                  :: max_track_len !< maximum 2d track length
    5586         CHARACTER(len=7)                              :: pid_char = ''
    55875582        INTEGER(iwp)                                  :: win_lad, minfo
    55885583        REAL(wp), DIMENSION(:,:,:), POINTER           :: lad_s_rma       !< fortran pointer, but lower bounds are 1
     
    55935588!   
    55945589        INTEGER(iwp), DIMENSION(0:svfnorm_report_num) :: svfnorm_counts
    5595         CHARACTER(200)                                :: msg
     5590!        CHARACTER(200)                                :: msg
    55965591
    55975592!--     calculation of the SVF
     
    62606255        RETURN
    62616256       
    6262 301     WRITE( message_string, * )  &
    6263             'I/O error when processing shape view factors / ',  &
    6264             'plant canopy sink factors / direct irradiance factors.'
    6265         CALL message( 'init_urban_surface', 'PA0502', 2, 2, 0, 6, 0 )
     6257!        WRITE( message_string, * )  &
     6258!            'I/O error when processing shape view factors / ',  &
     6259!            'plant canopy sink factors / direct irradiance factors.'
     6260!        CALL message( 'init_urban_surface', 'PA0502', 2, 2, 0, 6, 0 )
    62666261       
    62676262    END SUBROUTINE radiation_calc_svf
     
    62956290        REAL(wp), INTENT(out)                  :: transparency !< along whole path
    62966291        INTEGER(iwp), INTENT(in)               :: win_lad
    6297         INTEGER(iwp)                           :: i, j, k, d
     6292        INTEGER(iwp)                           :: i, k, d
    62986293        INTEGER(iwp)                           :: seldim       !< dimension to be incremented
    62996294        INTEGER(iwp)                           :: ncsb         !< no of written plant canopy sinkboxes
     
    72697264        INTEGER(iwp)                            :: iread, iwrite
    72707265        TYPE(t_csf), DIMENSION(:), POINTER      :: acsfnew
    7271         CHARACTER(100)                          :: msg
     7266!        CHARACTER(100)                          :: msg
    72727267
    72737268        IF ( newsize == -1 )  THEN
     
    93709365!> Subroutine writes debug information
    93719366!------------------------------------------------------------------------------!
    9372  SUBROUTINE radiation_write_debug_log ( message )
     9367! SUBROUTINE radiation_write_debug_log ( message )
    93739368    !> it writes debug log with time stamp
    9374     CHARACTER(*)  :: message
    9375     CHARACTER(15) :: dtc
    9376     CHARACTER(8)  :: date
    9377     CHARACTER(10) :: time
    9378     CHARACTER(5)  :: zone
    9379     CALL date_and_time(date, time, zone)
    9380     dtc = date(7:8)//','//time(1:2)//':'//time(3:4)//':'//time(5:10)
    9381     WRITE(9,'(2A)') dtc, TRIM(message)
    9382     FLUSH(9)
    9383  END SUBROUTINE radiation_write_debug_log
     9369!    CHARACTER(*)  :: message
     9370!    CHARACTER(15) :: dtc
     9371!    CHARACTER(8)  :: date
     9372!    CHARACTER(10) :: time
     9373!    CHARACTER(5)  :: zone
     9374!    CALL date_and_time(date, time, zone)
     9375!    dtc = date(7:8)//','//time(1:2)//':'//time(3:4)//':'//time(5:10)
     9376!    WRITE(9,'(2A)') dtc, TRIM(message)
     9377!    FLUSH(9)
     9378! END SUBROUTINE radiation_write_debug_log
    93849379
    93859380 END MODULE radiation_model_mod
Note: See TracChangeset for help on using the changeset viewer.