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

(lint) Fix obsolete boolean operators

Location:
LMDZ6/branches/Amaury_dev/libf/dyn3d
Files:
19 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/abort_gcm.F

    r4619 r5082  
    4747      write(lunout,*) 'Stopping in ', modname
    4848      write(lunout,*) 'Reason = ',message
    49       if (ierr .eq. 0) then
     49      if (ierr == 0) then
    5050        write(lunout,*) 'Everything is cool'
    5151        stop
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/advtrac.F90

    r4143 r5082  
    289289               END DO
    290290            END DO
    291             IF(CFLmaxz.GE.1) WRITE(*,*) 'WARNING vertical','CFLmaxz=', CFLmaxz
     291            IF(CFLmaxz>=1) WRITE(*,*) 'WARNING vertical','CFLmaxz=', CFLmaxz
    292292            !----------------------------------------------------------------
    293293            !     Ss-prg interface LMDZ.4->PPM3d (ss-prg de Lin)
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/bilan_dyn.F

    r4470 r5082  
    2626c====================================================================
    2727c
    28 c   Sous-programme consacre à des diagnostics dynamiques de base
     28c   Sous-programme consacre des diagnostics dynamiques de base
    2929c
    3030c
     
    8989      real ww
    9090
    91 c   variables dynamiques intermédiaires
     91c   variables dynamiques intermdiaires
    9292      REAL vcont(iip1,jjm,llm),ucont(iip1,jjp1,llm)
    9393      REAL ang(iip1,jjp1,llm),unat(iip1,jjp1,llm)
     
    9797      REAL bern(iip1,jjp1,llm)
    9898
    99 c   champ contenant les scalaires advectés.
     99c   champ contenant les scalaires advects.
    100100      real Q(iip1,jjp1,llm,nQ)
    101101   
    102 c   champs cumulés
     102c   champs cumuls
    103103      real ps_cum(iip1,jjp1)
    104104      real masse_cum(iip1,jjp1,llm)
     
    180180c   ncum est la frequence de stokage en pas de temps
    181181        ncum=dt_cum/dt_app
    182         if (abs(ncum*dt_app-dt_cum).gt.1.e-5*dt_app) then
     182        if (abs(ncum*dt_app-dt_cum)>1.e-5*dt_app) then
    183183           WRITE(lunout,*)
    184184     .            'Pb : le pas de cumule doit etre multiple du pas'
     
    188188        endif
    189189
    190         if (i_sortie.eq.1) then
     190        if (i_sortie==1) then
    191191         file='dynzon'
    192192         call inigrads(ifile,1
     
    239239      do iQ=1,nQ
    240240         do itr=1,ntr
    241             if(itr.eq.1) then
     241            if(itr==1) then
    242242               znom(itr,iQ)=nom(iQ)
    243243               znoml(itr,iQ)=nom(iQ)
     
    308308c   ----------------------------
    309309
    310 c   énergie cinétique
     310c   �nergie cin�tique
    311311      ucont(:,:,:)=0
    312312      CALL covcont(llm,ucov,vcov,ucont,vcont)
    313313      CALL enercin(vcov,ucov,vcont,ucont,ecin)
    314314
    315 c   moment cinétique
     315c   moment cintique
    316316      do l=1,llm
    317317         ang(:,:,l)=ucov(:,:,l)+constang(:,:)
     
    332332c=====================================================================
    333333c
    334       if(icum.EQ.0) then
     334      if(icum==0) then
    335335         ps_cum=0.
    336336         masse_cum=0.
     
    373373      enddo
    374374
    375 c    flux méridien
     375c    flux mridien
    376376c    -------------
    377377      do iQ=1,nQ
     
    413413c   PAS DE TEMPS D'ECRITURE
    414414c=====================================================================
    415       if (icum.eq.ncum) then
     415      if (icum==ncum) then
    416416c=====================================================================
    417417
     
    440440 
    441441c=====================================================================
    442 c   Transport méridien
     442c   Transport mridien
    443443c=====================================================================
    444444
     
    534534c     print*,'4OK'
    535535c   sorties proprement dites
    536       if (i_sortie.eq.1) then
     536      if (i_sortie==1) then
    537537      do iQ=1,nQ
    538538         do itr=1,ntr
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/caladvtrac.F

    r2597 r5082  
    5151c
    5252! Earth-specific stuff for the first 2 tracers (water)
    53       if (planet_type.eq."earth") then
     53      if (planet_type=="earth") then
    5454C initialisation
    5555! CRisi: il faut gérer tous les traceurs si on veut pouvoir faire des
     
    7070c
    7171
    72       IF( iapptrac.EQ.iapp_tracvl ) THEN
    73         if (planet_type.eq."earth") then
     72      IF( iapptrac==iapp_tracvl ) THEN
     73        if (planet_type=="earth") then
    7474! Earth-specific treatment for the first 2 tracers (water)
    7575c
     
    108108        endif ! of if (planet_type.eq."earth")
    109109      ELSE
    110         if (planet_type.eq."earth") then
     110        if (planet_type=="earth") then
    111111! Earth-specific treatment for the first 2 tracers (water)
    112112          dq(:,:,1:nqtot)=0.
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/caldyn.F

    r2600 r5082  
    124124      DO l = 1, llm
    125125         DO ij = 1, ip1jm, iip1
    126            IF( dv(ij,l).NE.dv(ij+iim,l) )  THEN
     126           IF( dv(ij,l)/=dv(ij+iim,l) )  THEN
    127127!         PRINT *,'!!!ATTENTION!!! probleme de periodicite sur vcov', 
    128128!    ,   ' dans caldyn'
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/conf_gcm.F90

    r4996 r5082  
    419419     CALL getin('clat',clatt)
    420420
    421      IF( ABS(clat - clatt).GE. 0.001 )  THEN
     421     IF( ABS(clat - clatt)>= 0.001 )  THEN
    422422        write(lunout,*)'conf_gcm: La valeur de clat passee par run.def', &
    423423             ' est differente de celle lue sur le fichier  start '
     
    433433     CALL getin('grossismx',grossismxx)
    434434
    435      IF( ABS(grossismx - grossismxx).GE. 0.001 )  THEN
     435     IF( ABS(grossismx - grossismxx)>= 0.001 )  THEN
    436436        write(lunout,*)'conf_gcm: La valeur de grossismx passee par ', &
    437437             'run.def est differente de celle lue sur le fichier  start '
     
    447447     CALL getin('grossismy',grossismyy)
    448448
    449      IF( ABS(grossismy - grossismyy).GE. 0.001 )  THEN
     449     IF( ABS(grossismy - grossismyy)>= 0.001 )  THEN
    450450        write(lunout,*)'conf_gcm: La valeur de grossismy passee par ', &
    451451             'run.def est differente de celle lue sur le fichier  start '
     
    453453     ENDIF
    454454
    455      IF( grossismx.LT.1. )  THEN
     455     IF( grossismx<1. )  THEN
    456456        write(lunout,*) &
    457457             'conf_gcm: ***  ATTENTION !! grossismx < 1 .   *** '
     
    461461     ENDIF
    462462
    463      IF( grossismy.LT.1. )  THEN
     463     IF( grossismy<1. )  THEN
    464464        write(lunout,*) &
    465465             'conf_gcm: ***  ATTENTION !! grossismy < 1 .   *** '
     
    506506
    507507     IF( fxyhypb )  THEN
    508         IF( ABS(dzoomx - dzoomxx).GE. 0.001 )  THEN
     508        IF( ABS(dzoomx - dzoomxx)>= 0.001 )  THEN
    509509           write(lunout,*)'conf_gcm: La valeur de dzoomx passee par ', &
    510510                'run.def est differente de celle lue sur le fichier  start '
     
    522522
    523523     IF( fxyhypb )  THEN
    524         IF( ABS(dzoomy - dzoomyy).GE. 0.001 )  THEN
     524        IF( ABS(dzoomy - dzoomyy)>= 0.001 )  THEN
    525525           write(lunout,*)'conf_gcm: La valeur de dzoomy passee par ', &
    526526                'run.def est differente de celle lue sur le fichier  start '
     
    537537
    538538     IF( fxyhypb )  THEN
    539         IF( ABS(taux - tauxx).GE. 0.001 )  THEN
     539        IF( ABS(taux - tauxx)>= 0.001 )  THEN
    540540           write(lunout,*)'conf_gcm: La valeur de taux passee par ', &
    541541                'run.def est differente de celle lue sur le fichier  start '
     
    552552
    553553     IF( fxyhypb )  THEN
    554         IF( ABS(tauy - tauyy).GE. 0.001 )  THEN
     554        IF( ABS(tauy - tauyy)>= 0.001 )  THEN
    555555           write(lunout,*)'conf_gcm: La valeur de tauy passee par ', &
    556556                'run.def est differente de celle lue sur le fichier  start '
     
    715715     CALL getin('grossismy',grossismy)
    716716
    717      IF( grossismx.LT.1. )  THEN
     717     IF( grossismx<1. )  THEN
    718718        write(lunout,*) &
    719719             'conf_gcm: ***  ATTENTION !! grossismx < 1 .   *** '
     
    723723     ENDIF
    724724
    725      IF( grossismy.LT.1. )  THEN
     725     IF( grossismy<1. )  THEN
    726726        write(lunout,*) 'conf_gcm: ***ATTENTION !! grossismy < 1 . *** '
    727727        CALL abort_gcm("conf_gcm","stopped",1)
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/fluxstokenc.F

    r2601 r5082  
    7979
    8080
    81       IF(iadvtr.EQ.0) THEN
     81      IF(iadvtr==0) THEN
    8282         phic(:,:)=0
    8383         tetac(:,:)=0
     
    9999
    100100c   selection de la masse instantannee des mailles avant le transport.
    101       IF(iadvtr.EQ.0) THEN
     101      IF(iadvtr==0) THEN
    102102         CALL SCOPY(ip1jmp1*llm,masse,1,massem,1)
    103103      ENDIF
     
    107107
    108108c   Test pour savoir si on advecte a ce pas de temps
    109       IF ( iadvtr.EQ.istdyn ) THEN
     109      IF ( iadvtr==istdyn ) THEN
    110110c    normalisation
    111111      DO l=1,llm
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/friction.F

    r2597 r5082  
    5353        ! set friction type
    5454        call getin("friction_type",friction_type)
    55         if ((friction_type.lt.0).or.(friction_type.gt.1)) then
     55        if ((friction_type<0).or.(friction_type>1)) then
    5656          abort_message="wrong friction type"
    5757          write(lunout,*)'Friction: wrong friction type',friction_type
     
    6161      ENDIF
    6262
    63       if (friction_type.eq.0) then
     63      if (friction_type==0) then
    6464c   calcul des composantes au carre du vent naturel
    6565      do j=1,jjp1
     
    124124      endif ! of if (friction_type.eq.0)
    125125
    126       if (friction_type.eq.1) then
     126      if (friction_type==1) then
    127127        do l=1,llm
    128128          ucov(:,:,l)=ucov(:,:,l)*(1.-pdt*kfrict(l))
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/gcm.F90

    r4619 r5082  
    216216     ! we still need to run iniacademic to initialize some
    217217     ! constants & fields, if we run the 'newtonian' or 'SW' cases:
    218      if (iflag_phys.ne.1) then
     218     if (iflag_phys/=1) then
    219219        CALL iniacademic(vcov,ucov,teta,q,masse,ps,phis,time_0)
    220220     endif
     
    250250  !  on recalcule eventuellement le pas de temps
    251251
    252   IF(MOD(day_step,iperiod).NE.0) THEN
     252  IF(MOD(day_step,iperiod)/=0) THEN
    253253     abort_message =  &
    254254          'Il faut choisir un nb de pas par jour multiple de iperiod'
     
    256256  ENDIF
    257257
    258   IF(MOD(day_step,iphysiq).NE.0) THEN
     258  IF(MOD(day_step,iphysiq)/=0) THEN
    259259     abort_message =  &
    260260          'Il faut choisir un nb de pas par jour multiple de iphysiq'
     
    263263
    264264  zdtvr    = daysec/REAL(day_step)
    265   IF(dtvr.NE.zdtvr) THEN
     265  IF(dtvr/=zdtvr) THEN
    266266     WRITE(lunout,*) &
    267267          'WARNING!!! changement de pas de temps',dtvr,'>',zdtvr
     
    290290     write(lunout,*) &
    291291          'GCM: On reinitialise a la date lue dans gcm.def'
    292   ELSE IF (annee_ref .ne. anneeref .or. day_ref .ne. dayref) THEN
     292  ELSE IF (annee_ref /= anneeref .or. day_ref /= dayref) THEN
    293293     write(lunout,*) &
    294294          'GCM: Attention les dates initiales lues dans le fichier'
     
    350350
    351351
    352   if (iflag_phys.eq.1) then
     352  if (iflag_phys==1) then
    353353     ! these initialisations have already been done (via iniacademic)
    354354     ! if running in SW or Newtonian mode
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/groupe.F

    r4470 r5082  
    5151      if (firstcall) then
    5252         if (groupe_ok) then
    53             if(mod(iim,2**ngroup).ne.0)         
     53            if(mod(iim,2**ngroup)/=0)
    5454     &        CALL abort_gcm('groupe','probleme du nombre de point',1)
    5555         endif
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/iniinterp_horiz.F

    r1907 r5082  
    116116      do jj = 1,jmn+1
    117117       do j=1, jmo+1
    118           if((cn(jj).lt.d(j)).and.(dn(jj).gt.c(j)))then
     118          if((cn(jj)<d(j)).and.(dn(jj)>c(j)))then
    119119              do ii=1,imn + 1
    120120                do i=1, imo +1
    121                     if (  ((an(ii).lt.b(i)).and.(bn(ii).gt.a(i)))
    122      &        .or. ((an(ii).lt.b(i)-2*pi).and.(bn(ii).gt.a(i)-2*pi)
    123      &             .and.(b(i)-2*pi.lt.-pi) )
    124      &        .or. ((an(ii).lt.b(i)+2*pi).and.(bn(ii).gt.a(i)+2*pi)
    125      &             .and.(a(i)+2*pi.gt.pi) )
     121                    if (  ((an(ii)<b(i)).and.(bn(ii)>a(i)))
     122     &        .or. ((an(ii)<b(i)-2*pi).and.(bn(ii)>a(i)-2*pi)
     123     &             .and.(b(i)-2*pi<-pi) )
     124     &        .or. ((an(ii)<b(i)+2*pi).and.(bn(ii)>a(i)+2*pi)
     125     &             .and.(a(i)+2*pi>pi) )
    126126     &                     )then
    127127                      ktotal = ktotal +1
     
    133133                      dd = min(d(j), dn(jj))
    134134                      cc = cn(jj)
    135                       if (cc.lt. c(j))cc=c(j)
    136                       if((an(ii).lt.b(i)-2*pi).and.
    137      &                  (bn(ii).gt.a(i)-2*pi)) then
     135                      if (cc< c(j))cc=c(j)
     136                      if((an(ii)<b(i)-2*pi).and.
     137     &                  (bn(ii)>a(i)-2*pi)) then
    138138                          bb = min(b(i)-2*pi,bn(ii))
    139139                          aa = an(ii)
    140                           if (aa.lt.a(i)-2*pi) aa=a(i)-2*pi
    141                       else if((an(ii).lt.b(i)+2*pi).and.
    142      &                       (bn(ii).gt.a(i)+2*pi)) then
     140                          if (aa<a(i)-2*pi) aa=a(i)-2*pi
     141                      else if((an(ii)<b(i)+2*pi).and.
     142     &                       (bn(ii)>a(i)+2*pi)) then
    143143                          bb = min(b(i)+2*pi,bn(ii))
    144144                          aa = an(ii)
    145                           if (aa.lt.a(i)+2*pi) aa=a(i)+2*pi
     145                          if (aa<a(i)+2*pi) aa=a(i)+2*pi
    146146                      else
    147147                          bb = min(b(i),bn(ii))
    148148                          aa = an(ii)
    149                           if (aa.lt.a(i)) aa=a(i)
     149                          if (aa<a(i)) aa=a(i)
    150150                      end if
    151151                      intersec(ktotal)=(bb-aa)*(sin(dd)-sin(cc))
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/integrd.F

    r2603 r5082  
    9898c
    9999      DO ij = 1,ip1jmp1
    100         IF( ps(ij).LT.0. ) THEN
     100        IF( ps(ij)<0. ) THEN
    101101         write(lunout,*) "integrd: negative surface pressure ",ps(ij)
    102102         write(lunout,*) " at node ij =", ij
     
    204204c$$$      ENDIF
    205205
    206       if (planet_type.eq."earth") then
     206      if (planet_type=="earth") then
    207207! Earth-specific treatment of first 2 tracers (water)
    208208        DO l = 1, llm
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/qminimum.F

    r5001 r5082  
    6565      DO k = 1, llm
    6666        DO i = 1, ip1jmp1
    67           if (seuil_liq - q(i,k,iq_liq) .gt. 0.d0 ) then
     67          if (seuil_liq - q(i,k,iq_liq) > 0.d0 ) then
    6868
    6969            if (niso > 0) zx_defau_diag(i,k,2)=AMAX1
     
    8282ccc      zx_abc = dpres(k) / dpres(k-1)
    8383        DO i = 1, ip1jmp1
    84           if ( seuil_vap - q(i,k,iq_vap) .gt. 0.d0 ) then
     84          if ( seuil_vap - q(i,k,iq_vap) > 0.d0 ) then
    8585
    8686            if (niso > 0) zx_defau_diag(i,k,1)
     
    104104      ENDDO
    105105      pompe = SSUM(ip1jmp1,zx_pump,1)
    106       IF (imprim.LE.500 .AND. pompe.GT.0.0) THEN
     106      IF (imprim<=500 .AND. pompe>0.0) THEN
    107107         WRITE(6,'(1x,"ATT!:on pompe de l eau au sol",e15.7)') pompe
    108108         DO i = 1, ip1jmp1
    109             IF (zx_pump(i).GT.0.0) THEN
     109            IF (zx_pump(i)>0.0) THEN
    110110               imprim = imprim + 1
    111111               PRINT*,'QMINIMUM:  en ',i,zx_pump(i)
     
    124124      ! génant
    125125      DO i = 1,ip1jmp1
    126         if (zx_pump(i).gt.0.0) then
     126        if (zx_pump(i)>0.0) then
    127127          q_follow(i,1,1)=q_follow(i,1,1)+zx_pump(i)
    128128        endif !if (zx_pump(i).gt.0.0) then
     
    133133      do k=2,llm
    134134        DO i = 1,ip1jmp1
    135           if (zx_defau_diag(i,k,1).gt.0.0) then             
     135          if (zx_defau_diag(i,k,1)>0.0) then
    136136              ! on ajoute la vapeur en k             
    137137              do ixt=1,ntiso
     
    165165        do k=1,llm
    166166        DO i = 1,ip1jmp1
    167           if (zx_defau_diag(i,k,2).gt.0.0) then
     167          if (zx_defau_diag(i,k,2)>0.0) then
    168168
    169169              ! on ajoute eau liquide en k en k             
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/tetaleveli1j.F

    r1907 r5082  
    5757c=====================================================================
    5858      if (lnew) then
    59 c   on réinitialise les réindicages et les poids
     59c   on r�initialise les r�indicages et les poids
    6060c=====================================================================
    6161
     
    6767      DO 130 i = 1, ilon
    6868cIM      IF ( ABS(pres-pgcm(i,ilev) ) .LT.
    69          IF ( ABS(pres-pgcm(i,ilev) ) .GT.
     69         IF ( ABS(pres-pgcm(i,ilev) ) >
    7070     .        ABS(pres-pgcm(i,1)) ) THEN
    7171            lt(i) = ilev     ! 2
     
    8383            ptop = pgcm(i,k+1)
    8484cIM         IF (ptop.LE.pres .AND. pbot.GE.pres) THEN
    85             IF (ptop.GE.pres .AND. pbot.LE.pres) THEN
     85            IF (ptop>=pres .AND. pbot<=pres) THEN
    8686               lt(i) = k+1
    8787               lb(i) = k
     
    9696c
    9797c ...   Modif . P. Le Van    ( 20/01/98) ....
    98 c       Modif Frédéric Hourdin (3/01/02)
     98c       Modif Fr�d�ric Hourdin (3/01/02)
    9999
    100         IF(pgcm(i,lb(i)).EQ.0.OR.
    101      $     pgcm(i,lt(i)).EQ.0.) THEN
     100        IF(pgcm(i,lb(i))==0.OR.
     101     $     pgcm(i,lt(i))==0.) THEN
    102102c
    103103        PRINT*,'i,lb,lt,2pgcm,pres',i,lb(i),
     
    128128      do i = 1, ilon
    129129cIM      if (pgcm(i,1).LT.pres) THEN
    130          if (pgcm(i,1).GT.pres) THEN
     130         if (pgcm(i,1)>pres) THEN
    131131c           Qpres(i)=1e33
    132132            Qpres(i)=1e+20
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/tetaleveli1j1.F

    r1907 r5082  
    5757c=====================================================================
    5858      if (lnew) then
    59 c   on réinitialise les réindicages et les poids
     59c   on r�initialise les r�indicages et les poids
    6060c=====================================================================
    6161
     
    6767      DO 130 i = 1, ilon
    6868cIM      IF ( ABS(pres-pgcm(i,ilev) ) .LT.
    69          IF ( ABS(pres-pgcm(i,ilev) ) .GT.
     69         IF ( ABS(pres-pgcm(i,ilev) ) >
    7070     .        ABS(pres-pgcm(i,1)) ) THEN
    7171            lt(i) = ilev     ! 2
     
    8383            ptop = pgcm(i,k+1)
    8484cIM         IF (ptop.LE.pres .AND. pbot.GE.pres) THEN
    85             IF (ptop.GE.pres .AND. pbot.LE.pres) THEN
     85            IF (ptop>=pres .AND. pbot<=pres) THEN
    8686               lt(i) = k+1
    8787               lb(i) = k
     
    9696c
    9797c ...   Modif . P. Le Van    ( 20/01/98) ....
    98 c       Modif Frédéric Hourdin (3/01/02)
     98c       Modif Fr�d�ric Hourdin (3/01/02)
    9999
    100         IF(pgcm(i,lb(i)).EQ.0.OR.
    101      $     pgcm(i,lt(i)).EQ.0.) THEN
     100        IF(pgcm(i,lb(i))==0.OR.
     101     $     pgcm(i,lt(i))==0.) THEN
    102102c
    103103        PRINT*,'i,lb,lt,2pgcm,pres',i,lb(i),
     
    128128      do i = 1, ilon
    129129cIM      if (pgcm(i,1).LT.pres) THEN
    130          if (pgcm(i,1).GT.pres) THEN
     130         if (pgcm(i,1)>pres) THEN
    131131c           Qpres(i)=1e33
    132132            Qpres(i)=1e+20
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/top_bound.F

    r2600 r5082  
    2727c   ------
    2828c
    29 c   Dissipation linéaire (ex top_bound de la physique)
     29c   Dissipation linaire (ex top_bound de la physique)
    3030c
    3131c=======================================================================
     
    8080      INTEGER j,l
    8181     
    82       if (iflag_top_bound.eq.0) return
     82      if (iflag_top_bound==0) return
    8383
    8484      if (first) then
    85          if (iflag_top_bound.eq.1) then
     85         if (iflag_top_bound==1) then
    8686! sponge quenching over the topmost 4 atmospheric layers
    8787             lambda(:)=0.
     
    9090             lambda(llm-2)=tau_top_bound/4.
    9191             lambda(llm-3)=tau_top_bound/8.
    92          else if (iflag_top_bound.eq.2) then
     92         else if (iflag_top_bound==2) then
    9393! sponge quenching over topmost layers down to pressures which are
    9494! higher than 100 times the topmost layer pressure
     
    105105         write(lunout,*)'p (Pa)  z(km)  tau(s)   1./tau (Hz)'
    106106         do l=1,llm
    107            if (rdamp(l).ne.0.) then
     107           if (rdamp(l)/=0.) then
    108108             write(lunout,'(6(1pe12.4,1x))')
    109109     &        presnivs(l),log(preff/presnivs(l))*scaleheight,
     
    117117
    118118      ! compute zonal average of vcov and u
    119       if (mode_top_bound.ge.2) then
     119      if (mode_top_bound>=2) then
    120120       do l=1,llm
    121121        do j=1,jjm
     
    149149
    150150      ! compute zonal average of potential temperature, if necessary
    151       if (mode_top_bound.ge.3) then
     151      if (mode_top_bound>=3) then
    152152       do l=1,llm
    153153        do j=2,jjm ! excluding poles
     
    163163      endif ! of if (mode_top_bound.ge.3)
    164164
    165       if (mode_top_bound.ge.1) then
     165      if (mode_top_bound>=1) then
    166166       ! Apply sponge quenching on vcov:
    167167       do l=1,llm
     
    185185      endif ! of if (mode_top_bound.ge.1)
    186186
    187       if (mode_top_bound.ge.3) then
     187      if (mode_top_bound>=3) then
    188188       ! Apply sponge quenching on teta:
    189189       do l=1,llm
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/vlsplt.F

    r4470 r5082  
    174174
    175175
    176       IF (pente_max.gt.-1.e-5) THEN
     176      IF (pente_max>-1.e-5) THEN
    177177c       IF (pente_max.gt.10) THEN
    178178
     
    214214     ,         cvmgp(dxqu(ij-1)+dxqu(ij),0.,dxqu(ij-1)*dxqu(ij))
    215215#else
    216                IF(dxqu(ij-1)*dxqu(ij).gt.0) THEN
     216               IF(dxqu(ij-1)*dxqu(ij)>0) THEN
    217217                  dxq(ij,l)=dxqu(ij-1)+dxqu(ij)
    218218               ELSE
     
    245245               zz(ij)=dxqu(ij-1)*dxqu(ij)
    246246               zz(ij)=zz(ij)+zz(ij)
    247                IF(zz(ij).gt.0) THEN
     247               IF(zz(ij)>0) THEN
    248248                  dxq(ij,l)=zz(ij)/(dxqu(ij-1)+dxqu(ij))
    249249               ELSE
     
    297297       DO ij=iip2,ip1jm-1
    298298c       print*,'masse(',ij,')=',masse(ij,l,iq)
    299           IF (u_m(ij,l).gt.0.) THEN
     299          IF (u_m(ij,l)>0.) THEN
    300300             zdum(ij,l)=1.-u_m(ij,l)/masse(ij,l,iq)
    301301             u_mq(ij,l)=u_m(ij,l)*(q(ij,l,iq)+0.5*zdum(ij,l)*dxq(ij,l))
     
    314314      DO l=1,llm
    315315         DO ij=iip2,ip1jm-1
    316             IF(zdum(ij,l).lt.0) THEN
     316            IF(zdum(ij,l)<0) THEN
    317317               iadvplus(ij,l)=1
    318318               u_mq(ij,l)=0.
     
    344344      ENDDO
    345345
    346       IF(n0.gt.0) THEN
     346      IF(n0>0) THEN
    347347      if (prt_level > 2) PRINT *,
    348348     $        'Nombre de points pour lesquels on advect plus que le'
     
    350350
    351351         DO l=1,llm
    352             IF(nl(l).gt.0) THEN
     352            IF(nl(l)>0) THEN
    353353               iju=0
    354354c   indicage des mailles concernees par le traitement special
    355355               DO ij=iip2,ip1jm
    356                   IF(iadvplus(ij,l).eq.1.and.mod(ij,iip1).ne.0) THEN
     356                  IF(iadvplus(ij,l)==1.and.mod(ij,iip1)/=0) THEN
    357357                     iju=iju+1
    358358                     indu(iju)=ij
     
    368368                  zu_m=u_m(ij,l)
    369369                  u_mq(ij,l)=0.
    370                   IF(zu_m.gt.0.) THEN
     370                  IF(zu_m>0.) THEN
    371371                     ijq=ij
    372372                     i=ijq-(j-1)*iip1
    373373c   accumulation pour les mailles completements advectees
    374                      do while(zu_m.gt.masse(ijq,l,iq))
     374                     do while(zu_m>masse(ijq,l,iq))
    375375                        u_mq(ij,l)=u_mq(ij,l)+q(ijq,l,iq)
    376376     &                          *masse(ijq,l,iq)
     
    387387                     i=ijq-(j-1)*iip1
    388388c   accumulation pour les mailles completements advectees
    389                      do while(-zu_m.gt.masse(ijq,l,iq))
     389                     do while(-zu_m>masse(ijq,l,iq))
    390390                        u_mq(ij,l)=u_mq(ij,l)-q(ijq,l,iq)
    391391     &                          *masse(ijq,l,iq)
     
    426426            !Mvals: veiller a ce qu'on n'ait pas de denominateur nul
    427427            masseq(ij,l,iq2)=max(masse(ij,l,iq)*q(ij,l,iq),min_qMass)
    428             if (q(ij,l,iq).gt.min_qParent) then
     428            if (q(ij,l,iq)>min_qParent) then
    429429              Ratio(ij,l,iq2)=q(ij,l,iq2)/q(ij,l,iq)
    430430            else
     
    624624      fs=1.
    625625      DO ij=1,iim
    626          IF(pente_max*adyqv(ij).lt.abs(dyq(ij,l))) THEN
     626         IF(pente_max*adyqv(ij)<abs(dyq(ij,l))) THEN
    627627            fn=min(pente_max*adyqv(ij)/abs(dyq(ij,l)),fn)
    628628         ENDIF
    629       IF(pente_max*adyqv(ij+ip1jm-iip1).lt.abs(dyq(ij+ip1jm,l))) THEN
     629      IF(pente_max*adyqv(ij+ip1jm-iip1)<abs(dyq(ij+ip1jm,l))) THEN
    630630         fs=min(pente_max*adyqv(ij+ip1jm-iip1)/abs(dyq(ij+ip1jm,l)),fs)
    631631         ENDIF
     
    711711
    712712      DO ij=iip2,ip1jm
    713          IF(dyqv(ij)*dyqv(ij-iip1).gt.0.) THEN
     713         IF(dyqv(ij)*dyqv(ij-iip1)>0.) THEN
    714714            dyq(ij,l)=sign(min(abs(dyq(ij,l)),dyqmax(ij)),dyq(ij,l))
    715715         ELSE
     
    723723      DO l=1,llm
    724724       DO ij=1,ip1jm
    725           IF(masse_adv_v(ij,l).gt.0) THEN
     725          IF(masse_adv_v(ij,l)>0) THEN
    726726              qbyv(ij,l)=q(ij+iip1,l,iq)+dyq(ij+iip1,l)*
    727727     ,                   0.5*(1.-masse_adv_v(ij,l)
     
    750750            !MVals: veiller a ce qu'on n'ait pas de denominateur nul
    751751            masseq(ij,l,iq2)=max(masse(ij,l,iq)*q(ij,l,iq),min_qMass)
    752             if (q(ij,l,iq).gt.min_qParent) then
     752            if (q(ij,l,iq)>min_qParent) then
    753753              Ratio(ij,l,iq2)=q(ij,l,iq2)/q(ij,l,iq)
    754754            else
     
    917917     ,      cvmgp(dzqw(ij,l)+dzqw(ij,l+1),0.,dzqw(ij,l)*dzqw(ij,l+1))
    918918#else
    919             IF(dzqw(ij,l)*dzqw(ij,l+1).gt.0.) THEN
     919            IF(dzqw(ij,l)*dzqw(ij,l+1)>0.) THEN
    920920                dzq(ij,l)=0.5*(dzqw(ij,l)+dzqw(ij,l+1))
    921921            ELSE
     
    948948       DO l = 1,llm-1
    949949         do  ij = 1,ip1jmp1
    950           IF(w(ij,l+1).gt.0.) THEN
     950          IF(w(ij,l+1)>0.) THEN
    951951             sigw=w(ij,l+1)/masse(ij,l+1,iq)
    952952             wq(ij,l+1)=w(ij,l+1)*(q(ij,l+1,iq)
     
    975975            !MVals: veiller a ce qu'on n'ait pas de denominateur nul
    976976            masseq(ij,l,iq2)=max(masse(ij,l,iq)*q(ij,l,iq),min_qMass)
    977             if (q(ij,l,iq).gt.min_qParent) then
     977            if (q(ij,l,iq)>min_qParent) then
    978978              Ratio(ij,l,iq2)=q(ij,l,iq2)/q(ij,l,iq)
    979979            else
     
    10741074      zqmax=zq(ijlmax,lmax)
    10751075
    1076        if(zqmin.lt.qmin)
     1076       if(zqmin<qmin)
    10771077c     s     write(*,9999) comment,
    10781078     s     write(*,*) comment,
    10791079     s     imin,jmin,lmin,zqmin,zzq(imin,jmin,lmin)
    1080        if(zqmax.gt.qmax)
     1080       if(zqmax>qmax)
    10811081c     s     write(*,9999) comment,
    10821082     s     write(*,*) comment,
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/vlspltqs.F

    r4996 r5082  
    242242
    243243
    244       IF (pente_max.gt.-1.e-5) THEN
     244      IF (pente_max>-1.e-5) THEN
    245245c     IF (pente_max.gt.10) THEN
    246246
     
    282282     ,         cvmgp(dxqu(ij-1)+dxqu(ij),0.,dxqu(ij-1)*dxqu(ij))
    283283#else
    284                IF(dxqu(ij-1)*dxqu(ij).gt.0) THEN
     284               IF(dxqu(ij-1)*dxqu(ij)>0) THEN
    285285                  dxq(ij,l)=dxqu(ij-1)+dxqu(ij)
    286286               ELSE
     
    312312               zz(ij)=dxqu(ij-1)*dxqu(ij)
    313313               zz(ij)=zz(ij)+zz(ij)
    314                IF(zz(ij).gt.0) THEN
     314               IF(zz(ij)>0) THEN
    315315                  dxq(ij,l)=zz(ij)/(dxqu(ij-1)+dxqu(ij))
    316316               ELSE
     
    362362      DO l=1,llm
    363363       DO ij=iip2,ip1jm-1
    364           IF (u_m(ij,l).gt.0.) THEN
     364          IF (u_m(ij,l)>0.) THEN
    365365             zdum(ij,l)=1.-u_m(ij,l)/masse(ij,l,iq)
    366366             u_mq(ij,l)=u_m(ij,l)*
     
    380380      DO l=1,llm
    381381         DO ij=iip2,ip1jm-1
    382             IF(zdum(ij,l).lt.0) THEN
     382            IF(zdum(ij,l)<0) THEN
    383383               iadvplus(ij,l)=1
    384384               u_mq(ij,l)=0.
     
    411411      ENDDO
    412412
    413       IF(n0.gt.0) THEN
     413      IF(n0>0) THEN
    414414ccc      PRINT*,'Nombre de points pour lesquels on advect plus que le'
    415415ccc     &       ,'contenu de la maille : ',n0
    416416
    417417         DO l=1,llm
    418             IF(nl(l).gt.0) THEN
     418            IF(nl(l)>0) THEN
    419419               iju=0
    420420c   indicage des mailles concernees par le traitement special
    421421               DO ij=iip2,ip1jm
    422                   IF(iadvplus(ij,l).eq.1.and.mod(ij,iip1).ne.0) THEN
     422                  IF(iadvplus(ij,l)==1.and.mod(ij,iip1)/=0) THEN
    423423                     iju=iju+1
    424424                     indu(iju)=ij
     
    434434                  zu_m=u_m(ij,l)
    435435                  u_mq(ij,l)=0.
    436                   IF(zu_m.gt.0.) THEN
     436                  IF(zu_m>0.) THEN
    437437                     ijq=ij
    438438                     i=ijq-(j-1)*iip1
    439439c   accumulation pour les mailles completements advectees
    440                      do while(zu_m.gt.masse(ijq,l,iq))
     440                     do while(zu_m>masse(ijq,l,iq))
    441441                        u_mq(ij,l)=u_mq(ij,l)+q(ijq,l,iq)
    442442     &                          *masse(ijq,l,iq)
     
    453453                     i=ijq-(j-1)*iip1
    454454c   accumulation pour les mailles completements advectees
    455                      do while(-zu_m.gt.masse(ijq,l,iq))
     455                     do while(-zu_m>masse(ijq,l,iq))
    456456                        u_mq(ij,l)=u_mq(ij,l)-q(ijq,l,iq)
    457457     &                          *masse(ijq,l,iq)
     
    681681      fs=1.
    682682      DO ij=1,iim
    683          IF(pente_max*adyqv(ij).lt.abs(dyq(ij,l))) THEN
     683         IF(pente_max*adyqv(ij)<abs(dyq(ij,l))) THEN
    684684            fn=min(pente_max*adyqv(ij)/abs(dyq(ij,l)),fn)
    685685         ENDIF
    686       IF(pente_max*adyqv(ij+ip1jm-iip1).lt.abs(dyq(ij+ip1jm,l))) THEN
     686      IF(pente_max*adyqv(ij+ip1jm-iip1)<abs(dyq(ij+ip1jm,l))) THEN
    687687         fs=min(pente_max*adyqv(ij+ip1jm-iip1)/abs(dyq(ij+ip1jm,l)),fs)
    688688         ENDIF
     
    763763
    764764      DO ij=iip2,ip1jm
    765          IF(dyqv(ij)*dyqv(ij-iip1).gt.0.) THEN
     765         IF(dyqv(ij)*dyqv(ij-iip1)>0.) THEN
    766766            dyq(ij,l)=sign(min(abs(dyq(ij,l)),dyqmax(ij)),dyq(ij,l))
    767767         ELSE
     
    774774      DO l=1,llm
    775775       DO ij=1,ip1jm
    776          IF( masse_adv_v(ij,l).GT.0. ) THEN
     776         IF( masse_adv_v(ij,l)>0. ) THEN
    777777           qbyv(ij,l)= MIN( qsat(ij+iip1,l), q(ij+iip1,l,iq )  +
    778778     ,      dyq(ij+iip1,l)*0.5*(1.-masse_adv_v(ij,l)
  • LMDZ6/branches/Amaury_dev/libf/dyn3d/wrgrads.F

    r4470 r5082  
    4646
    4747      if(firsttime(if)) then
    48          if(name.eq.var(1,if)) then
     48         if(name==var(1,if)) then
    4949            firsttime(if)=.false.
    5050            ivar(if)=1
     
    6868      else
    6969         ivar(if)=mod(ivar(if),nvar(if))+1
    70          if (ivar(if).eq.nvar(if)) then
     70         if (ivar(if)==nvar(if)) then
    7171            writectl=.true.
    7272            itime(if)=itime(if)+1
    7373         endif
    7474
    75          if(var(ivar(if),if).ne.name) then
     75         if(var(ivar(if),if)/=name) then
    7676           print*,'Il faut stoker la meme succession de champs a chaque'
    7777           print*,'pas de temps'
Note: See TracChangeset for help on using the changeset viewer.