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_advec.f90

    r1321 r1359  
    2020! Current revisions:
    2121! -----------------
    22 !
     22! New particle structure integrated.
    2323!
    2424! Former revisions:
     
    5555    IMPLICIT NONE
    5656
    57     INTEGER(iwp) ::  n   !:
     57    INTEGER(iwp) ::  ip   !:
     58    INTEGER(iwp) ::  jp   !:
     59    INTEGER(iwp) ::  kp   !:
     60    INTEGER(iwp) ::  n    !:
    5861
    5962!
    6063!-- Here the user-defined actions follow
    61 !    DO  n = 1, number_of_initial_particles
    62 !    ENDDO
     64!     DO  ip = nxl, nxr
     65!        DO  jp = nys, nyn
     66!           DO  kp = nzb+1, nzt
     67!              number_of_particles = prt_count(kp,jp,ip)
     68!              particles => grid_particles(kp,jp,ip)%particles(1:number_of_particles)
     69!              IF ( number_of_particles <= 0 )  CYCLE
     70!              DO  n = 1, number_of_particles
     71!
     72!              ENDDO
     73!           ENDDO
     74!        ENDDO
     75!     ENDDO
     76   
    6377
    6478 END SUBROUTINE user_lpm_advec
Note: See TracChangeset for help on using the changeset viewer.