Ignore:
Timestamp:
Mar 20, 2014 8:40:49 AM (10 years ago)
Author:
raasch
Message:

ONLY-attribute added to USE-statements,
kind-parameters added to all INTEGER and REAL declaration statements,
kinds are defined in new module kinds,
old module precision_kind is removed,
revision history before 2012 removed,
comment fields (!:) to be used for variable explanations added to all variable declaration statements

File:
1 edited

Legend:

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

    r1310 r1320  
    2020! Current revisions:
    2121! ------------------
    22 !
     22! ONLY-attribute added to USE-statements,
    2323!
    2424! Former revisions:
     
    3232! all actions concerning leapfrog scheme removed
    3333!
    34 ! 673 2011-01-18 16:19:48Z suehring
    35 ! No pressure term during time integration (tsc(4)=0.0).
    36 !
    37 ! RCS Log replace by Id keyword, revision history cleaned up
    38 !
    39 ! Revision 1.2  2005/03/26 21:17:06  raasch
    40 ! No pressure term for Runge-Kutta-schemes (tsc(4)=0.0)
    41 !
    4234! Revision 1.1  2004/01/28 15:34:47  raasch
    4335! Initial revision
     
    5042!------------------------------------------------------------------------------!
    5143
    52     USE control_parameters
     44    USE control_parameters,                                                    &
     45        ONLY:  intermediate_timestep_count, timestep_scheme, tsc
    5346
    5447    IMPLICIT NONE
Note: See TracChangeset for help on using the changeset viewer.