Ignore:
Timestamp:
Jul 19, 2024, 5:41:58 PM (4 months ago)
Author:
abarral
Message:

(lint) Fix obsolete boolean operators

File:
1 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/phylmd/cvltr.F90

    r4046 r5082  
    4949  REAL,DIMENSION(klon,klev,klev),INTENT(IN) :: sij        ! fraction dair de lenv
    5050  REAL,DIMENSION(klon,klev),INTENT(IN)      :: wght_cvfd  ! weights of the layers feeding convection
    51   REAL,DIMENSION(klon,klev,klev),INTENT(IN) :: elij       ! contenu en eau condensée spécifique/conc deau condensée massique
     51  REAL,DIMENSION(klon,klev,klev),INTENT(IN) :: elij       ! contenu en eau condens�e sp�cifique/conc deau condens�e massique
    5252  REAL,DIMENSION(klon,klev,klev),INTENT(IN) :: epmlmMm    ! eau condensee precipitee dans mel masse dair sat
    5353  REAL,DIMENSION(klon,klev),INTENT(IN)      :: eplaMm    ! eau condensee precipitee dans aa masse dair sat
    5454
    55   REAL,DIMENSION(klon,klev),INTENT(IN)      :: clw        ! contenu en eau condensée dans lasc adiab
     55  REAL,DIMENSION(klon,klev),INTENT(IN)      :: clw        ! contenu en eau condense dans lasc adiab
    5656  REAL,DIMENSION(klon),INTENT(IN)           :: sigd
    5757  INTEGER,DIMENSION(klon),INTENT(IN)        :: icb,inb
     
    8080
    8181! RomP ! les variables sont nettoyees des valeurs aberrantes
    82   REAL,DIMENSION(klon,klev)         :: Pa, Pm  ! pluie AA et mélanges, var temporaire
     82  REAL,DIMENSION(klon,klev)         :: Pa, Pm  ! pluie AA et mlanges, var temporaire
    8383  REAL,DIMENSION(klon,klev)         :: pmflxs,pmflxr ! pmflxrIN,pmflxsIN sans valeur aberante
    8484  REAL,DIMENSION(klon,klev)         :: mp            ! flux de masse
     
    155155! On prend la moyenne des precip entre le niveau i+1 et i
    156156! I=3/4* (P(1+1)+P(i))/2 / (sigd*r*rho_l)
    157 !  1000kg/m3= densité de l'eau
     157!  1000kg/m3= densit de l'eau
    158158! 0.75e-3 = 3/4 /1000
    159 ! Par la suite, I est tout le temps multiplié par sig_d pour avoir l'impaction sur la surface de la maille
    160 ! on le néglige ici pour simplifier le code
     159! Par la suite, I est tout le temps multipli par sig_d pour avoir l'impaction sur la surface de la maille
     160! on le nglige ici pour simplifier le code
    161161  do j=1,klev-1
    162162   do i=1,klon
     
    201201  END DO
    202202
    203 ! suppression des valeurs très faibles (~1e-320)
     203! suppression des valeurs trs faibles (~1e-320)
    204204! multiplication de levaporation pour lavoir par unite de temps
    205205! et par unite de surface de la maille
     
    207207  DO j=1,klev
    208208   DO i=1,klon
    209     if(ev(i,j).lt.1.e-16) then
     209    if(ev(i,j)<1.e-16) then
    210210     evap(i,j)=0.
    211211    else
     
    217217  DO j=1,klev
    218218   DO i=1,klon
    219    if(j.lt.klev) then
    220     if(epIN(i,j).lt.1.e-32) then
     219   if(j<klev) then
     220    if(epIN(i,j)<1.e-32) then
    221221     ep(i,j)=0.
    222222    else
     
    226226    ep(i,j)=epmax
    227227   endif
    228     if(mpIN(i,j).lt.1.e-32) then
     228    if(mpIN(i,j)<1.e-32) then
    229229     mp(i,j)=0.
    230230    else
    231231     mp(i,j)=mpIN(i,j)
    232232    endif
    233     if(pmflxsIN(i,j).lt.1.e-32) then
     233    if(pmflxsIN(i,j)<1.e-32) then
    234234     pmflxs(i,j)=0.
    235235    else
    236236     pmflxs(i,j)=pmflxsIN(i,j)
    237237    endif
    238     if(pmflxrIN(i,j).lt.1.e-32) then
     238    if(pmflxrIN(i,j)<1.e-32) then
    239239     pmflxr(i,j)=0.
    240240    else
    241241     pmflxr(i,j)=pmflxrIN(i,j)
    242242    endif
    243     if(wdtrainA(i,j).lt.1.e-32) then
     243    if(wdtrainA(i,j)<1.e-32) then
    244244     Pa(i,j)=0.
    245245    else
    246246     Pa(i,j)=wdtrainA(i,j)
    247247    endif
    248     if(wdtrainM(i,j).lt.1.e-32) then
     248    if(wdtrainM(i,j)<1.e-32) then
    249249     Pm(i,j)=0.
    250250    else
     
    257257  DO j = klev-1,1,-1
    258258   DO i = 1,klon
    259      NO_precip(i,j) = (pmflxr(i,j+1)+pmflxs(i,j+1)).lt.1.e-10&
    260                     .and.Pa(i,j).lt.1.e-10.and.Pm(i,j).lt.1.e-10
     259     NO_precip(i,j) = (pmflxr(i,j+1)+pmflxs(i,j+1))<1.e-10&
     260                    .and.Pa(i,j)<1.e-10.and.Pm(i,j)<1.e-10
    261261   END DO
    262262  END DO
     
    285285     DO j=k-1,1,-1
    286286        DO i=1,klon
    287            if(mp(i,j+1).gt.1.e-10) then
     287           if(mp(i,j+1)>1.e-10) then
    288288              zmd(i,j,k)=zmd(i,j+1,k)*min(1.,mp(i,j)/mp(i,j+1)) !det ~ mk(j)=mk(j+1)*mp(i,j)/mp(i,j+1)
    289289           ENDif
     
    302302     DO j=1,klev-1
    303303        DO i=1,klon
    304         if(mp(i,j+1).gt.1.e-10) then
     304        if(mp(i,j+1)>1.e-10) then
    305305          qTrdi(i,j+1,it)=qTrdi(i,j+1,it)+(zmd(i,j+1,k)/mp(i,j+1))*tr(i,k,it)
    306306        else
     
    397397  DO j=1,klev
    398398     DO i=1,klon
    399         if(j.ge.icb(i).and.j.le.inb(i)) then
    400           if(clw(i,j).gt.1.e-16) then
     399        if(j>=icb(i).and.j<=inb(i)) then
     400          if(clw(i,j)>1.e-16) then
    401401           qPa(i,j,it)=ccntrAA_coef*tr(i,1,it)/clw(i,j)
    402402          else
     
    413413      DO k=1,j-1
    414414        DO i=1,klon
    415         if(k.ge.icb(i).and.k.le.inb(i).and.&
    416            j.le.inb(i)) then
    417             if(elij(i,k,j).gt.1.e-16) then
     415        if(k>=icb(i).and.k<=inb(i).and.&
     416           j<=inb(i)) then
     417            if(elij(i,k,j)>1.e-16) then
    418418             qMeltmp(i,j,it)=((1-ep(i,k))*ccntrAA_coef*tr(i,1,it)&
    419419                         *(1.-sij(i,k,j))  +ccntrENV_coef&
     
    431431     DO j=1,klev
    432432        DO i=1,klon
    433           if(Mint(i,j).gt.1.e-16) then
     433          if(Mint(i,j)>1.e-16) then
    434434           qMel(i,j,it)=qpmMint(i,j,it)/Mint(i,j)
    435435          else
     
    442442   DO j=klev-1,1,-1
    443443    DO i=1,klon
    444      if(mp(i,j+1).gt.mp(i,j).and.mp(i,j+1).gt.1.e-10) then  ! detrainement
     444     if(mp(i,j+1)>mp(i,j).and.mp(i,j+1)>1.e-10) then  ! detrainement
    445445       kappa(i,j)=((pmflxr(i,j+1)+pmflxs(i,j+1)+Pa(i,j)+Pm(i,j))*&
    446446                (-mp(i,j+1)-imp(i,j)/RG*dxpres(i,j))&
    447447                + (imp(i,j)/RG*dxpres(i,j))*(evap(i,j)/RG*dxpres(i,j)))
    448448             
    449      elseif(mp(i,j).gt.mp(i,j+1).and.mp(i,j).gt.1.e-10) then! entrainement
    450        if(j.eq.1) then
     449     elseif(mp(i,j)>mp(i,j+1).and.mp(i,j)>1.e-10) then! entrainement
     450       if(j==1) then
    451451        kappa(i,j)=((pmflxr(i,j+1)+pmflxs(i,j+1)+Pa(i,j)+Pm(i,j))*&
    452452                 (-mp(i,2)-imp(i,j)/RG*dxpres(i,j))&
     
    465465  DO j=klev-1,1,-1
    466466   DO i=1,klon
    467     if (abs(kappa(i,j)).lt.1.e-25) then    !si denominateur nul (il peut y avoir des mp!=0)
     467    if (abs(kappa(i,j))<1.e-25) then    !si denominateur nul (il peut y avoir des mp!=0)
    468468     kappa(i,j)=1.
    469      if(j.eq.1) then
    470        qDi(i,j,it)=qDi(i,j+1,it) !orig tr(i,j,it)   ! mp(1)=0 donc tout vient de la couche supérieure
    471      elseif(mp(i,j+1).gt.mp(i,j).and.mp(i,j+1).gt.1.e-10) then
     469     if(j==1) then
     470       qDi(i,j,it)=qDi(i,j+1,it) !orig tr(i,j,it)   ! mp(1)=0 donc tout vient de la couche suprieure
     471     elseif(mp(i,j+1)>mp(i,j).and.mp(i,j+1)>1.e-10) then
    472472       qDi(i,j,it)=qDi(i,j+1,it)
    473      elseif(mp(i,j).gt.mp(i,j+1).and.mp(i,j).gt.1.e-10) then! entrainement
     473     elseif(mp(i,j)>mp(i,j+1).and.mp(i,j)>1.e-10) then! entrainement
    474474       qDi(i,j,it)=(-mp(i,j+1)*(qDi(i,j+1,it)-tr(i,j,it))-mp(i,j)*tr(i,j,it))/(-mp(i,j))
    475475     else  ! si  mp (i)=0 et mp(j+1)=0
     
    490490!!jyg  (20130119) correction pour le sommet du nuage
    491491!!     if(j.ge.inb(i)) then       !au-dessus du nuage, sommet inclu
    492      if(j.gt.inb(i)) then       !au-dessus du nuage
     492     if(j>inb(i)) then       !au-dessus du nuage
    493493       qDi(i,j,it)=tr(i,j,it)   ! pas de descente => environnement = descente insaturee
    494494       qPr(i,j,it)=0.
    495495
    496496!  vvv premiere couche du modele ou mp(1)=0  ! det tout le temps  vvv
    497      elseif(j.eq.1) then
    498       if(mp(i,2).gt.1.e-10) then !mp(2) non nul -> detrainement (car mp(1) = 0) !ent pas possible
     497     elseif(j==1) then
     498      if(mp(i,2)>1.e-10) then !mp(2) non nul -> detrainement (car mp(1) = 0) !ent pas possible
    499499       if(NO_precip(i,j)) then !pas de precip en (i)
    500500        qDi(i,j,it)=qDi(i,j+1,it)
     
    530530     else
    531531!------------------------------------------------------------- detrainement
    532       if(mp(i,j+1).gt.mp(i,j).and.mp(i,j+1).gt.1.e-10) then !mp(i,j).gt.1.e-10) then
     532      if(mp(i,j+1)>mp(i,j).and.mp(i,j+1)>1.e-10) then !mp(i,j).gt.1.e-10) then
    533533         if(NO_precip(i,j)) then
    534534          qDi(i,j,it)=qDi(i,j+1,it)
     
    548548         endif !precip
    549549!------------------------------------------------------------- entrainement
    550       elseif(mp(i,j).gt.mp(i,j+1).and.mp(i,j).gt.1.e-10) then
     550      elseif(mp(i,j)>mp(i,j+1).and.mp(i,j)>1.e-10) then
    551551         if(NO_precip(i,j)) then
    552552          qDi(i,j,it)=(-mp(i,j+1)*(qDi(i,j+1,it)-tr(i,j,it))-mp(i,j)*tr(i,j,it))/(-mp(i,j))
     
    614614               -zmfdam(i,k,it)*ccntrAA_coef
    615615! lessivage courants insatures
    616    if(k.le.inb(i).and.k.gt.1) then   ! tendances dans le nuage
     616   if(k<=inb(i).and.k>1) then   ! tendances dans le nuage
    617617!------------------------------------------------------------- detrainement
    618       if(mp(i,k+1).gt.mp(i,k).and.mp(i,k+1).gt.1.e-10) then
     618      if(mp(i,k+1)>mp(i,k).and.mp(i,k+1)>1.e-10) then
    619619        uscavtrac= (-mp(i,k)+mp(i,k+1))*(qDi(i,k,it)-tr(i,k,it))&
    620620                   + mp(i,k)*(tr(i,k-1,it)-tr(i,k,it))
     
    625625!                    'mp',mp(i,k)
    626626!------------------------------------------------------------- entrainement
    627       elseif(mp(i,k).gt.mp(i,k+1).and.mp(i,k).gt.1.e-10) then
     627      elseif(mp(i,k)>mp(i,k+1).and.mp(i,k)>1.e-10) then
    628628         uscavtrac= mp(i,k)*(tr(i,k-1,it)-tr(i,k,it))
    629629!
     
    641641      endif  ! mp/det/ent
    642642!------------------------------------------------------------- premiere couche
    643    elseif(k.eq.1) then  !                                      mp(1)=0.
    644       if(mp(i,2).gt.1.e-10) then  !detrainement
     643   elseif(k==1) then  !                                      mp(1)=0.
     644      if(mp(i,2)>1.e-10) then  !detrainement
    645645         uscavtrac= (-0.+mp(i,2))*(qDi(i,k,it)-tr(i,k,it)) !&
    646646!                   + mp(i,2)*(0.-tr(i,k,it))
Note: See TracChangeset for help on using the changeset viewer.