Ignore:
Timestamp:
Apr 11, 2014 5:15:14 PM (10 years ago)
Author:
hoffmann
Message:

new Lagrangian particle structure integrated

File:
1 edited

Legend:

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

    r1321 r1359  
    2020! Current revisions:
    2121! -----------------
    22 !
     22! New particle structure integrated.
    2323!
    2424! Former revisions:
     
    4747!------------------------------------------------------------------------------!
    4848
     49    USE indices,                                                               &
     50        ONLY:  nxl, nxr, nys, nyn, nzb, nzt
     51
    4952    USE kinds
    5053   
     
    5558    IMPLICIT NONE
    5659
    57     INTEGER(iwp) ::  n   !:
     60    INTEGER(iwp) ::  ip   !:
     61    INTEGER(iwp) ::  jp   !:
     62    INTEGER(iwp) ::  kp   !:
     63    INTEGER(iwp) ::  n    !:
    5864
    5965!
    6066!-- Here the user-defined actions follow
    61 !    DO  n = 1, number_of_initial_particles
    62 !    ENDDO
     67!     DO  ip = nxl, nxr
     68!        DO  jp = nys, nyn
     69!           DO  kp = nzb+1, nzt
     70!              number_of_particles = prt_count(kp,jp,ip)
     71!              particles => grid_particles(kp,jp,ip)%particles(1:number_of_particles)
     72!              IF ( number_of_particles <= 0 )  CYCLE
     73!              DO  n = 1, number_of_particles
     74!
     75!              ENDDO
     76!           ENDDO
     77!        ENDDO
     78!     ENDDO
     79   
    6380
    6481 END SUBROUTINE user_lpm_set_attributes
Note: See TracChangeset for help on using the changeset viewer.