source: palm/trunk/SOURCE/user_init_urban_surface.f90 @ 4598

Last change on this file since 4598 was 4497, checked in by raasch, 4 years ago

last bugfix deactivated because of compile problems, files re-formatted to follow the PALM coding standard

  • Property svn:keywords set to Id
File size: 2.2 KB
RevLine 
[2007]1!> @file user_init_urban_surface.f90
[4497]2!--------------------------------------------------------------------------------------------------!
[2696]3! This file is part of the PALM model system.
[2007]4!
[4497]5! PALM is free software: you can redistribute it and/or modify it under the terms of the GNU General
6! Public License as published by the Free Software Foundation, either version 3 of the License, or
7! (at your option) any later version.
[2007]8!
[4497]9! PALM is distributed in the hope that it will be useful, but WITHOUT ANY WARRANTY; without even the
10! implied warranty of MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General
11! Public License for more details.
[2007]12!
[4497]13! You should have received a copy of the GNU General Public License along with PALM. If not, see
14! <http://www.gnu.org/licenses/>.
[2007]15!
[4360]16! Copyright 1997-2020 Leibniz Universitaet Hannover
[4497]17!--------------------------------------------------------------------------------------------------!
[2007]18!
[4497]19!
[2007]20! Current revisions:
21! -----------------
[2008]22!
[2233]23!
[2007]24! Former revisions:
25! -----------------
26! $Id: user_init_urban_surface.f90 4497 2020-04-15 10:20:51Z suehring $
[4497]27! file re-formatted to follow the PALM coding standard
28!
29!
30! 4481 2020-03-31 18:55:54Z maronga
[4182]31! Corrected "Former revisions" section
[4497]32!
[4182]33! 3768 2019-02-27 14:35:58Z raasch
[3768]34! unused variables commented out to avoid compiler warnings
[4497]35!
[3768]36! 3655 2019-01-07 16:51:22Z knoop
[2716]37! Corrected "Former revisions" section
[4497]38!
[4182]39! 2007 2016-08-24 15:47:17Z kanani
40! Initial revision
[2007]41!
[4182]42!
[2007]43! Description:
44! ------------
45!> Execution of user-defined actions to initiate the urban surface model
[4497]46!--------------------------------------------------------------------------------------------------!
[2007]47 SUBROUTINE user_init_urban_surface
48
49    USE arrays_3d
[4497]50
51!    USE control_parameters,                                                                        &
[3768]52!        ONLY:  urban_surface
[4497]53
[2007]54    USE indices
[4497]55
[2007]56    USE kinds
57
58    USE urban_surface_mod
[2232]59
[4497]60    USE surface_mod
61
[2007]62    USE user
63
64    IMPLICIT NONE
65
[3768]66!    INTEGER(iwp) ::  i  !< grid index
67!    INTEGER(iwp) ::  j  !< grid index
68!    INTEGER(iwp) ::  m  !< running index on 1D wall-type grid
[2007]69
70!
[2232]71!-- Here the user-defined urban surface initialization actions follow.
72!-- Example: set roughness length at urban surface
73!     DO  m = 1, surf_usm_h%ns
74!        surf_usm_h%z0(m) = 0.1_wp
75!     ENDDO
[2007]76
77
78
79 END SUBROUTINE user_init_urban_surface
80
Note: See TracBrowser for help on using the repository browser.