Changes in src/timemanager.f90 [d1a8707:18adf60] in flexpart.git


Ignore:
File:
1 edited

Legend:

Unmodified
Added
Removed
  • src/timemanager.f90

    rd1a8707 r18adf60  
    105105! integer :: ksp
    106106  integer :: loutnext,loutstart,loutend
    107   integer :: ix,jy,ldeltat,itage,nage,idummy
     107  integer :: ix,jy,ldeltat,itage,nage
    108108  integer :: i_nan=0,ii_nan,total_nan_intl=0  !added by mc to check instability in CBL scheme
    109   real :: outnum,weight,prob_rec(maxspec),prob(maxspec),decfact,wetscav(maxspec)
     109  real :: outnum,weight,prob(maxspec),decfact
    110110  ! real :: uap(maxpart),ucp(maxpart),uzp(maxpart)
    111111  ! real :: us(maxpart),vs(maxpart),ws(maxpart)
     
    114114  real(dep_prec) :: drydeposit(maxspec),wetgridtotalunc,drygridtotalunc
    115115  real :: xold,yold,zold,xmassfract
    116   real :: grfraction(3)
    117116  real, parameter :: e_inv = 1.0/exp(1.0)
    118 
    119117  !double precision xm(maxspec,maxpointspec_act),
    120118  !    +                 xm_depw(maxspec,maxpointspec_act),
     
    147145!CGZ-lifetime: set lifetime to 0
    148146 
    149   if (.not.usekernel) write(*,*) 'Not using the kernel'
    150   if (turboff) write(*,*) 'Turbulence switched off'
    151 
    152147  write(*,46) float(itime)/3600,itime,numpart
    153148
     
    546541        zold=ztra1(j)
    547542
    548    
    549   ! RECEPTOR: dry/wet depovel
    550   !****************************
    551   ! Before the particle is moved
    552   ! the calculation of the scavenged mass shall only be done once after release
    553   ! xscav_frac1 was initialised with a negative value
    554 
    555       if  (DRYBKDEP) then
    556        do ks=1,nspec
    557          if  ((xscav_frac1(j,ks).lt.0)) then
    558             call get_vdep_prob(itime,xtra1(j),ytra1(j),ztra1(j),prob_rec)
    559             if (DRYDEPSPEC(ks)) then        ! dry deposition
    560                xscav_frac1(j,ks)=prob_rec(ks)
    561              else
    562                 xmass1(j,ks)=0.
    563                 xscav_frac1(j,ks)=0.
    564              endif
    565          endif
    566         enddo
    567        endif
    568 
    569        if (WETBKDEP) then
    570        do ks=1,nspec
    571          if  ((xscav_frac1(j,ks).lt.0)) then
    572             call get_wetscav(itime,lsynctime,loutnext,j,ks,grfraction,idummy,idummy,wetscav)
    573             if (wetscav(ks).gt.0) then
    574                 xscav_frac1(j,ks)=wetscav(ks)* &
    575                        (zpoint2(npoint(j))-zpoint1(npoint(j)))*grfraction(1)
    576             else
    577                 xmass1(j,ks)=0.
    578                 xscav_frac1(j,ks)=0.
    579             endif
    580          endif
    581         enddo
    582        endif
    583 
    584543  ! Integrate Lagevin equation for lsynctime seconds
    585544  !*************************************************
    586545
    587         if (verbosity.gt.0) then
    588            if (j.eq.1) then
    589              write (*,*) 'timemanager> call advance'
    590            endif     
    591         endif
    592      
    593546        call advance(itime,npoint(j),idt(j),uap(j),ucp(j),uzp(j), &
    594547             us(j),vs(j),ws(j),nstop,xtra1(j),ytra1(j),ztra1(j),prob, &
    595548             cbt(j))
    596 !        write (*,*) 'advance: ',prob(1),xmass1(j,1),ztra1(j)
    597549
    598550  ! Calculate the gross fluxes across layer interfaces
Note: See TracChangeset for help on using the changeset viewer.
hosted by ZAMG