Ignore:
Timestamp:
Jun 4, 2014 4:04:03 PM (10 years ago)
Author:
suehring
Message:

Bugfixes concerning new particle structure

File:
1 edited

Legend:

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

    r1360 r1416  
    1  SUBROUTINE user_lpm_advec
     1 SUBROUTINE user_lpm_advec( ip, jp, kp )
    22
    33!--------------------------------------------------------------------------------!
     
    2020! Current revisions:
    2121! -----------------
    22 !
     22! Provide template for new particle structure.
     23! Moreover, user_lpm_advec is called for each gridpoint.
    2324!
    2425! Former revisions:
     
    6566!
    6667!-- Here the user-defined actions follow
    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
     68!   number_of_particles = prt_count(kp,jp,ip)
     69!   particles => grid_particles(kp,jp,ip)%particles(1:number_of_particles)
     70!   IF ( number_of_particles <= 0 )  CYCLE
     71!   DO  n = 1, number_of_particles
    7472!
    75 !              ENDDO
    76 !           ENDDO
    77 !        ENDDO
    78 !     ENDDO
    79    
     73!   ENDDO
    8074
    8175 END SUBROUTINE user_lpm_advec
Note: See TracChangeset for help on using the changeset viewer.