Ignore:
Timestamp:
Mar 11, 2007 11:50:04 AM (17 years ago)
Author:
raasch
Message:

preliminary update of further changes, running

File:
1 edited

Legend:

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

    r57 r60  
    55! -----------------
    66! New routine user_init_3d_model which allows the initial setting of all 3d
    7 ! arrays under control of the user,
     7! arrays under control of the user, new routine user_advec_particles,
    88! routine user_statistics now has one argument (sr),
    99! sample for generating time series quantities added
     
    521521
    522522 END SUBROUTINE user_init_particles
     523
     524
     525
     526 SUBROUTINE user_advec_particles
     527
     528!------------------------------------------------------------------------------!
     529!
     530! Description:
     531! ------------
     532! Modification of initial particles by the user.
     533!------------------------------------------------------------------------------!
     534
     535    USE particle_attributes
     536    USE user
     537
     538    IMPLICIT NONE
     539
     540    INTEGER ::  n
     541
     542!
     543!-- Here the user-defined actions follow
     544!    DO  n = 1, number_of_initial_particles
     545!    ENDDO
     546
     547 END SUBROUTINE user_advec_particles
    523548
    524549
Note: See TracChangeset for help on using the changeset viewer.