Ignore:
Timestamp:
Apr 16, 2019 4:17:02 PM (5 years ago)
Author:
suehring
Message:

Set green-fraction on buildings to zero for now, in order to avoid crashes in the green-heat model

File:
1 edited

Legend:

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

    r3896 r3901  
    2828! -----------------
    2929! $Id$
     30! Workaround - set green fraction to zero ( green-heat model crashes ).
     31!
     32! 3896 2019-04-15 10:10:17Z suehring
     33!
     34!
     35! 3896 2019-04-15 10:10:17Z suehring
    3036! Bugfix, wrong index used for accessing building_pars from PIDS
    3137!
     
    50315037          ENDDO
    50325038       ENDDO
     5039!
     5040!--    Just a work-around: Set green fraction on roof to zero (in favor of
     5041!--    wall fraction). The green-heat model crashes due to some unknown reason.
     5042!--    To be removed later. 
     5043       DO  m = 1, surf_usm_h%ns
     5044          IF ( surf_usm_h%frac(ind_pav_green,m) > 0.0_wp )  THEN
     5045             surf_usm_h%frac(ind_pav_green,m) = 0.0_wp
     5046             surf_usm_h%frac(ind_veg_wall,m)  = 1.0_wp
     5047          ENDIF
     5048       ENDDO
    50335049
    50345050!
     
    56165632!> Green and substrate model as part of the urban surface model. The model predicts ground
    56175633!> temperatures.
     5634!>
     5635!> Important: gree-heat model crashes due to unknown reason. Green fraction
     5636!> is thus set to zero (in favor of wall fraction).
    56185637!------------------------------------------------------------------------------!
    56195638    SUBROUTINE usm_green_heat_model
     
    56485667        !$OMP DO SCHEDULE (STATIC)
    56495668        DO  m = 1, surf_usm_h%ns
    5650 
    56515669           IF (surf_usm_h%frac(ind_pav_green,m) > 0.0_wp) THEN
    56525670!
Note: See TracChangeset for help on using the changeset viewer.