Ignore:
Timestamp:
Oct 7, 2015 11:56:08 PM (9 years ago)
Author:
knoop
Message:

Code annotations made doxygen readable

File:
1 edited

Legend:

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

    r1354 r1682  
    1  SUBROUTINE disturb_heatflux
    2 
     1!> @file disturb_heatflux.f90
    32!--------------------------------------------------------------------------------!
    43! This file is part of PALM.
     
    2019! Current revisions:
    2120! ------------------
    22 !
     21! Code annotations made doxygen readable
    2322!
    2423! Former revisions:
     
    4948! Description:
    5049! ------------
    51 ! Generate random, normally distributed heatflux values and store them as the
    52 ! near-surface heatflux.
    53 ! On parallel computers, too, this random generator is called at all grid points
    54 ! of the total array in order to guarantee the same random distribution of the
    55 ! total array regardless of the number of processors used during the model run.
     50!> Generate random, normally distributed heatflux values and store them as the
     51!> near-surface heatflux.
     52!> On parallel computers, too, this random generator is called at all grid points
     53!> of the total array in order to guarantee the same random distribution of the
     54!> total array regardless of the number of processors used during the model run.
    5655!------------------------------------------------------------------------------!
     56 SUBROUTINE disturb_heatflux
     57 
    5758
    5859    USE arrays_3d,                                                             &
     
    7273    IMPLICIT NONE
    7374
    74     INTEGER(iwp) ::  j  !:
    75     INTEGER(iwp) ::  i  !:
     75    INTEGER(iwp) ::  j  !<
     76    INTEGER(iwp) ::  i  !<
    7677   
    77     REAL(wp) ::  random_gauss  !:
    78     REAL(wp) ::  randomnumber  !:
     78    REAL(wp) ::  random_gauss  !<
     79    REAL(wp) ::  randomnumber  !<
    7980
    8081
Note: See TracChangeset for help on using the changeset viewer.