Changeset 6985a98 in flexpart.git for src/drydepokernel.f90


Ignore:
Timestamp:
May 8, 2017, 5:28:32 PM (7 years ago)
Author:
Sabine <sabine.eckhardt@…>
Branches:
master, 10.4.1_pesei, GFS_025, bugfixes+enhancements, dev, release-10, release-10.4.1, scaling-bug, univie
Children:
2bec33e
Parents:
d9f0585 (diff), d1a8707 (diff)
Note: this is a merge changeset, the changes displayed below correspond to the merge itself.
Use the (diff) links above to see all the changes relative to each parent.
Message:

compiles after merge scavenging into test dev

File:
1 edited

Legend:

Unmodified
Added
Removed
  • src/drydepokernel.f90

    r4c64400 r6985a98  
    102102   if ((abs(deposit(ks)).gt.0).and.DRYDEPSPEC(ks)) then
    103103
    104    if ((ix.ge.0).and.(jy.ge.0).and.(ix.le.numxgrid-1).and. &
     104    if (.not.usekernel) then
     105       drygridunc(ix,jy,ks,kp,nunc,nage)= &
     106           drygridunc(ix,jy,ks,kp,nunc,nage)+deposit(ks)
     107    else
     108      if ((ix.ge.0).and.(jy.ge.0).and.(ix.le.numxgrid-1).and. &
    105109        (jy.le.numygrid-1)) then
    106      w=wx*wy
    107      drygridunc(ix,jy,ks,kp,nunc,nage)= &
    108           drygridunc(ix,jy,ks,kp,nunc,nage)+deposit(ks)*w
    109      continue
    110    endif
     110        w=wx*wy
     111        drygridunc(ix,jy,ks,kp,nunc,nage)= &
     112           drygridunc(ix,jy,ks,kp,nunc,nage)+deposit(ks)*w
     113     endif
    111114
    112   if ((ixp.ge.0).and.(jyp.ge.0).and.(ixp.le.numxgrid-1).and. &
     115    if ((ixp.ge.0).and.(jyp.ge.0).and.(ixp.le.numxgrid-1).and. &
    113116       (jyp.le.numygrid-1)) then
    114117    w=(1.-wx)*(1.-wy)
    115118      drygridunc(ixp,jyp,ks,kp,nunc,nage)= &
    116119           drygridunc(ixp,jyp,ks,kp,nunc,nage)+deposit(ks)*w
    117   endif
     120    endif
    118121
    119   if ((ixp.ge.0).and.(jy.ge.0).and.(ixp.le.numxgrid-1).and. &
     122    if ((ixp.ge.0).and.(jy.ge.0).and.(ixp.le.numxgrid-1).and. &
    120123       (jy.le.numygrid-1)) then
    121     w=(1.-wx)*wy
     124      w=(1.-wx)*wy
    122125      drygridunc(ixp,jy,ks,kp,nunc,nage)= &
    123126           drygridunc(ixp,jy,ks,kp,nunc,nage)+deposit(ks)*w
    124   endif
     127    endif
    125128
    126   if ((ix.ge.0).and.(jyp.ge.0).and.(ix.le.numxgrid-1).and. &
     129    if ((ix.ge.0).and.(jyp.ge.0).and.(ix.le.numxgrid-1).and. &
    127130       (jyp.le.numygrid-1)) then
    128     w=wx*(1.-wy)
     131      w=wx*(1.-wy)
    129132      drygridunc(ix,jyp,ks,kp,nunc,nage)= &
    130133           drygridunc(ix,jyp,ks,kp,nunc,nage)+deposit(ks)*w
    131   endif
     134    endif
    132135
    133   endif
     136    endif ! kernel
     137    endif ! deposit>0
    134138
    135139  end do
Note: See TracChangeset for help on using the changeset viewer.
hosted by ZAMG