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/lpm_extend_tails.f90

    r1360 r1682  
    1  SUBROUTINE lpm_extend_tails
    2 
     1!> @file lpm_extend_tails.f90
    32!--------------------------------------------------------------------------------!
    43! This file is part of PALM.
     
    2019! Current revisions:
    2120! ------------------
    22 !
     21! Code annotations made doxygen readable
    2322!
    2423! Former revisions:
     
    4645! Description:
    4746! ------------
    48 ! Add the current particle positions to the particle tails.
     47!> Add the current particle positions to the particle tails.
    4948!------------------------------------------------------------------------------!
     49 SUBROUTINE lpm_extend_tails
     50 
    5051
    5152    USE control_parameters,                                                    &
     
    6162    IMPLICIT NONE
    6263
    63     INTEGER(iwp) ::  i       !:
    64     INTEGER(iwp) ::  n       !:
    65     INTEGER(iwp) ::  nn      !:
     64    INTEGER(iwp) ::  i       !<
     65    INTEGER(iwp) ::  n       !<
     66    INTEGER(iwp) ::  nn      !<
    6667
    67     REAL(wp) ::  distance    !:
     68    REAL(wp) ::  distance    !<
    6869
    6970
Note: See TracChangeset for help on using the changeset viewer.