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

(lint) Fix obsolete boolean operators

Location:
LMDZ6/branches/Amaury_dev/libf/dyn3d_common
Files:
23 edited

Legend:

Unmodified
Added
Removed
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/advn.F

    r4593 r5082  
    170170c   calcul des pentes en u:
    171171c   -----------------------
    172       if (mode.eq.0) then
     172      if (mode==0) then
    173173         do l=1,llm
    174174            do ij=1,ip1jm
     
    211211         enddo
    212212         do ij=iip2+1,ip1jm
    213             extremum(ij)=dxqu(ij)*dxqu(ij-1).le.0.
     213            extremum(ij)=dxqu(ij)*dxqu(ij-1)<=0.
    214214         enddo
    215215         do ij=iip1+iip1,ip1jm,iip1
     
    285285      data mode/1/
    286286
    287       if (mode.eq.0) then
     287      if (mode==0) then
    288288         do l=1,llm
    289289            do ij=1,ip1jmp1
     
    307307
    308308         do ij=iip2,ip1jm
    309             extremum(ij)=dyqv(ij)*dyqv(ij-iip1).le.0.
     309            extremum(ij)=dyqv(ij)*dyqv(ij-iip1)<=0.
    310310         enddo
    311311
     
    385385c   -----------------------
    386386
    387       if (mode.eq.0) then
     387      if (mode==0) then
    388388         do l=1,llm
    389389            do ij=1,ip1jmp1
     
    410410      do l=2,llm-1
    411411         do ij=1,ip1jmp1
    412             extremum(ij,l)=dzqw(ij,l)*dzqw(ij,l+1).le.0.
     412            extremum(ij,l)=dzqw(ij,l)*dzqw(ij,l+1)<=0.
    413413         enddo
    414414      enddo
     
    525525c                 qg(ij,l)=q(ij,l)
    526526c              endif
    527                if(abs(zdq).gt.prec) then
     527               if(abs(zdq)>prec) then
    528528                  zsigd(ij,l)=(q(ij,l)-qg(ij,l))/zdq
    529529                  zsigg(ij,l)=1.-zsigd(ij,l)
     
    548548       do l=1,llm
    549549       do ij=iip2,ip1jm-1
    550           if (u_m(ij,l).ge.0.) then
     550          if (u_m(ij,l)>=0.) then
    551551             zsigp=zsigd(ij,l)
    552552             zsigm=zsigg(ij,l)
     
    564564          endif
    565565          zu=abs(u_m(ij,l))
    566           ladvplus(ij,l)=zu.gt.zm
     566          ladvplus(ij,l)=zu>zm
    567567          zsig=zu/zm
    568           if(zsig.eq.0.) zsigp=0.1
    569           if (mode.eq.1) then
    570              if (zsig.le.zsigp) then
     568          if(zsig==0.) zsigp=0.1
     569          if (mode==1) then
     570             if (zsig<=zsigp) then
    571571                 u_mq(ij,l)=u_m(ij,l)*zqp
    572              else if (mode.eq.1) then
     572             else if (mode==1) then
    573573                 u_mq(ij,l)=
    574574     s           sign(zm,u_m(ij,l))*(zsigp*zqp+(zsig-zsigp)*zqm)
    575575             endif
    576576          else
    577              if (zsig.le.zsigp) then
     577             if (zsig<=zsigp) then
    578578                 u_mq(ij,l)=u_m(ij,l)*(zqp-0.5*zsig/zsigp*(zqp-zq))
    579579             else
     
    613613      enddo
    614614
    615       if(n0.gt.1) then
     615      if(n0>1) then
    616616      IF (prt_level > 9) WRITE(lunout,*)
    617617     & 'Nombre de points pour lesquels on advect plus que le'
     
    619619
    620620         do l=1,llm
    621             if(nl(l).gt.0) then
     621            if(nl(l)>0) then
    622622               iju=0
    623623c   indicage des mailles concernees par le traitement special
    624624               do ij=iip2,ip1jm
    625                   if(ladvplus(ij,l).and.mod(ij,iip1).ne.0) then
     625                  if(ladvplus(ij,l).and.mod(ij,iip1)/=0) then
    626626                     iju=iju+1
    627627                     indu(iju)=ij
     
    637637                  zu_m=u_m(ij,l)
    638638                  u_mq(ij,l)=0.
    639                   if(zu_m.gt.0.) then
     639                  if(zu_m>0.) then
    640640                     ijq=ij
    641641                     i=ijq-(j-1)*iip1
    642642c   accumulation pour les mailles completements advectees
    643                      do while(zu_m.gt.masse(ijq,l))
     643                     do while(zu_m>masse(ijq,l))
    644644                        u_mq(ij,l)=u_mq(ij,l)+q(ijq,l)*masse(ijq,l)
    645645                        zu_m=zu_m-masse(ijq,l)
     
    650650c   ajout de la maille non completement advectee
    651651             zsig=zu_m/masse(ijq,l)
    652              if(zsig.le.zsigd(ijq,l)) then
     652             if(zsig<=zsigd(ijq,l)) then
    653653                u_mq(ij,l)=u_mq(ij,l)+zu_m*(qd(ijq,l)
    654654     s          -0.5*zsig/zsigd(ijq,l)*(qd(ijq,l)-q(ijq,l)))
     
    657657c         goto 8888
    658658                zz=0.5*(zsig-zsigd(ijq,l))/zsigg(ijq,l)
    659                 if(.not.(zz.gt.0..and.zz.le.0.5)) then
     659                if(.not.(zz>0..and.zz<=0.5)) then
    660660                     WRITE(lunout,*)'probleme2 au point ij=',ij,
    661661     s               '  l=',l
     
    671671                     i=ijq-(j-1)*iip1
    672672c   accumulation pour les mailles completements advectees
    673                      do while(-zu_m.gt.masse(ijq,l))
     673                     do while(-zu_m>masse(ijq,l))
    674674                        u_mq(ij,l)=u_mq(ij,l)-q(ijq,l)*masse(ijq,l)
    675675                        zu_m=zu_m+masse(ijq,l)
     
    680680c 2eme MODIF SPECIFIQUE
    681681             zsig=-zu_m/masse(ij+1,l)
    682              if(zsig.le.zsigg(ijq,l)) then
     682             if(zsig<=zsigg(ijq,l)) then
    683683                u_mq(ij,l)=u_mq(ij,l)+zu_m*(qg(ijq,l)
    684684     s          -0.5*zsig/zsigg(ijq,l)*(qg(ijq,l)-q(ijq,l)))
     
    687687c           goto 9999
    688688                zz=0.5*(zsig-zsigg(ijq,l))/zsigd(ijq,l)
    689                 if(.not.(zz.gt.0..and.zz.le.0.5)) then
     689                if(.not.(zz>0..and.zz<=0.5)) then
    690690                     WRITE(lunout,*)'probleme22 au point ij=',ij
    691691     s               ,'  l=',l
     
    786786c                 qs(ij,l)=q(ij,l)
    787787c              endif
    788                if(abs(zdq).gt.prec) then
     788               if(abs(zdq)>prec) then
    789789                  zsign(ij)=(q(ij,l)-qs(ij,l))/zdq
    790790                  zsigs(ij)=1.-zsign(ij)
     
    804804
    805805       do ij=1,ip1jm
    806           if (v_m(ij,l).ge.0.) then
     806          if (v_m(ij,l)>=0.) then
    807807             zsigp=zsign(ij+iip1)
    808808             zsigm=zsigs(ij+iip1)
     
    820820          endif
    821821          zsig=abs(v_m(ij,l))/zm
    822           if(zsig.eq.0.) zsigp=0.1
    823           if (zsig.le.zsigp) then
     822          if(zsig==0.) zsigp=0.1
     823          if (zsig<=zsigp) then
    824824              v_mq(ij,l)=v_m(ij,l)*(zqp-0.5*zsig/zsigp*(zqp-zq))
    825825          else
     
    918918c              endif
    919919
    920                if(abs(zdq).gt.prec) then
     920               if(abs(zdq)>prec) then
    921921                  zsigb(ij,l)=(q(ij,l)-qh(ij,l))/zdq
    922922                  zsigh(ij,l)=1.-zsigb(ij,l)
     
    933933       do l=2,llm
    934934       do ij=1,ip1jmp1
    935           if (w_m(ij,l).ge.0.) then
     935          if (w_m(ij,l)>=0.) then
    936936             zsigp=zsigb(ij,l)
    937937             zsigm=zsigh(ij,l)
     
    949949          endif
    950950          zsig=abs(w_m(ij,l))/zm
    951           if(zsig.eq.0.) zsigp=0.1
    952           if (zsig.le.zsigp) then
     951          if(zsig==0.) zsigp=0.1
     952          if (zsig<=zsigp) then
    953953              w_mq(ij,l)=w_m(ij,l)*(zqp-0.5*zsig/zsigp*(zqp-zq))
    954954          else
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/coordij.F

    r2598 r5082  
    2828
    2929      DO i=1,iim+1
    30          IF (rlonu(i).GT.zlon) THEN
     30         IF (rlonu(i)>zlon) THEN
    3131            ilon=i
    3232            GOTO 10
     
    3737      j=0
    3838      DO j=1,jjm
    39          IF(rlatv(j).LT.zlat) THEN
     39         IF(rlatv(j)<zlat) THEN
    4040            jlat=j
    4141            GOTO 20
     
    4343      ENDDO
    444420    CONTINUE
    45       IF(j.EQ.0) j=jjm+1
     45      IF(j==0) j=jjm+1
    4646
    4747      RETURN
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/diagedyn.F

    r4593 r5082  
    279279C     ===================================
    280280C
    281       IF ( (idiag2.gt.0) .and. (pas(idiag2) .ne. 0) ) THEN
     281      IF ( (idiag2>0) .and. (pas(idiag2) /= 0) ) THEN
    282282        d_h_vcol  = (h_vcol_tot - h_vcol_pre(idiag2) )/dtime
    283283        d_h_dair = (h_dair_tot- h_dair_pre(idiag2))/dtime
     
    303303      ENDIF
    304304C
    305       IF (iprt.ge.2) THEN
     305      IF (iprt>=2) THEN
    306306        WRITE(6,9000) tit,pas(idiag),d_qt,d_qw,d_ql,d_qs
    307307 9000   format('Dyn3d. Watter Mass Budget (kg/m2/s)',A15
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/disvert_noterre.F

    r2603 r5082  
    2424c
    2525c=======================================================================
    26 c    Discretisation verticale en coordonnée hybride (ou sigma)
     26c    Discretisation verticale en coordonne hybride (ou sigma)
    2727c
    2828c=======================================================================
     
    6666         open(99,file="esasig.def",status='old',form='formatted',
    6767     s   iostat=ierr2)
    68          if(ierr2.ne.0) then
     68         if(ierr2/=0) then
    6969              close(99)
    7070              open(99,file="z2sig.def",status='old',form='formatted',
     
    7676c   ----------------------------------------
    7777
    78       IF(ierr2.eq.0) then
     78      IF(ierr2==0) then
    7979
    8080c        Lecture de esasig.def :
     
    114114         s( llm )  = 1.
    115115         s(llm-1) = quoi
    116          IF( llm.gt.2 )  THEN
     116         IF( llm>2 )  THEN
    117117            DO  ll = 2, llm-1
    118118               l         = llm+1 - ll
     
    131131c   ----------------------------------------
    132132
    133       ELSE IF(ierr4.eq.0) then
     133      ELSE IF(ierr4==0) then
    134134         write(lunout,*)'****************************'
    135135         write(lunout,*)'Reading z2sig.def'
     
    208208c     Calcul au milieu des couches :
    209209c     WARNING : le choix de placer le milieu des couches au niveau de
    210 c     pression intermédiaire est arbitraire et pourrait etre modifié.
     210c     pression interm�diaire est arbitraire et pourrait etre modifi�.
    211211c     Le calcul du niveau pour la derniere couche
    212212c     (on met la meme distance (en log pression)  entre P(llm)
    213213c     et P(llm -1) qu'entre P(llm-1) et P(llm-2) ) est
    214 c     Specifique.  Ce choix est spécifié ici ET dans exner_milieu.F
     214c     Specifique.  Ce choix est sp�cifi� ici ET dans exner_milieu.F
    215215
    216216      DO l = 1, llm-1
     
    284284c     L'objectif est de calculer newsig telle que
    285285c       (1 -pa/preff)*exp(1-1./newsig**2)+(pa/preff)*newsig = sig
    286 c     Cela ne se résoud pas analytiquement:
    287 c     => on résoud par iterration bourrine
     286c     Cela ne se rsoud pas analytiquement:
     287c     => on rsoud par iterration bourrine
    288288c     ----------------------------------------------
    289289c     Information  : where exp(1-1./x**2) become << x
     
    307307      x1=0
    308308      x2=1
    309       if (sig.ge.1) then
     309      if (sig>=1) then
    310310            newsig= sig
    311       else if (sig*preff/pa.ge.0.25) then
     311      else if (sig*preff/pa>=0.25) then
    312312        DO J=1,9999  ! nombre d''iteration max
    313313          F=((1 -pa/preff)*exp(1-1./newsig**2)+(pa/preff)*newsig)/sig
    314314c         write(0,*) J, ' newsig =', newsig, ' F= ', F
    315           if (F.gt.1) then
     315          if (F>1) then
    316316              X2 = newsig
    317317              newsig=(X1+newsig)*0.5
     
    320320              newsig=(X2+newsig)*0.5
    321321          end if
    322 c         Test : on arete lorsque on approxime sig à moins de 0.01 m près
     322c         Test : on arete lorsque on approxime sig � moins de 0.01 m pr�s
    323323c         (en pseudo altitude) :
    324           IF(abs(10.*log(F)).LT.1.E-5) goto 999
     324          IF(abs(10.*log(F))<1.E-5) goto 999
    325325        END DO
    326326       else   !    if (sig*preff/pa.le.0.25) then
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/dump2d.F

    r1952 r5082  
    2222      DO j=1,jm
    2323         DO i=1,im
    24             IF(z(i,j).GT.zllm) THEN
     24            IF(z(i,j)>zllm) THEN
    2525               illm=i
    2626               jllm=j
    2727               zllm=z(i,j)
    2828            ENDIF
    29             IF(z(i,j).LT.zmin) THEN
     29            IF(z(i,j)<zmin) THEN
    3030               imin=i
    3131               jmin=j
     
    3838      PRINT*,'MAX: ',zllm
    3939
    40       IF(zllm.GT.zmin) THEN
     40      IF(zllm>zmin) THEN
    4141       DO j=1,jm
    4242        WRITE(*,'(600i1)') (NINT(10.*(z(i,j)-zmin)/(zllm-zmin)),i=1,im)
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/exner_hyb_m.F90

    r2600 r5082  
    5858    if (firstcall) then
    5959       ! sanity checks for Shallow Water case (1 vertical layer)
    60        if (llm.eq.1) then
    61           if (kappa.ne.1) then
     60       if (llm==1) then
     61          if (kappa/=1) then
    6262             call abort_gcm(modname, &
    6363                  "kappa!=1 , but running in Shallow Water mode!!",42)
    6464          endif
    65           if (cpp.ne.r) then
     65          if (cpp/=r) then
    6666             call abort_gcm(modname, &
    6767                  "cpp!=r , but running in Shallow Water mode!!",42)
     
    7373
    7474    ! Specific behaviour for Shallow Water (1 vertical layer) case:
    75     if (llm.eq.1) then
     75    if (llm==1) then
    7676
    7777       ! Compute pks(:),pk(:),pkf(:)
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/exner_milieu_m.F90

    r2600 r5082  
    5555    if (firstcall) then
    5656       ! sanity checks for Shallow Water case (1 vertical layer)
    57        if (llm.eq.1) then
    58           if (kappa.ne.1) then
     57       if (llm==1) then
     58          if (kappa/=1) then
    5959             call abort_gcm(modname, &
    6060                  "kappa!=1 , but running in Shallow Water mode!!",42)
    6161          endif
    62           if (cpp.ne.r) then
     62          if (cpp/=r) then
    6363             call abort_gcm(modname, &
    6464                  "cpp!=r , but running in Shallow Water mode!!",42)
     
    7070
    7171    ! Specific behaviour for Shallow Water (1 vertical layer) case:
    72     if (llm.eq.1) then
     72    if (llm==1) then
    7373
    7474       ! Compute pks(:),pk(:),pkf(:)
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/gr_int_dyn.F

    r1945 r5082  
    3434      do j = 1, jp1
    3535        do i = 1, iim
    36           if (j .eq. 1) then
     36          if (j == 1) then
    3737            champdyn(i, j) = polenord
    38           else if (j .eq. jp1) then
     38          else if (j == jp1) then
    3939            champdyn(i, j) = polesud
    4040          else
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/gradiv2.F

    r4593 r5082  
    4949      CALL    divergf( klevel, gdx,   gdy , div )
    5050
    51       IF( ld.GT.1 )   THEN
     51      IF( ld>1 )   THEN
    5252
    5353        CALL laplacien ( klevel, div,  div     )
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/heavyside.F

    r1945 r5082  
    1212       REAL(KIND=8) heavyside , a
    1313
    14        IF ( a.LE.0. )  THEN
     14       IF ( a<=0. )  THEN
    1515         heavyside = 0.
    1616       ELSE
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/infotrac.F90

    r5003 r5082  
    175175
    176176   lerr=strParse(type_trac, '|', types_trac, n=nt)
    177    IF (nt .GT. 1) THEN
    178       IF (nt .GT. 2) CALL abort_gcm(modname, 'you need to modify type_trac, this version is not supported by lmdz', 1)
    179       if (nt .EQ. 2) type_trac=types_trac(2)
     177   IF (nt > 1) THEN
     178      IF (nt > 2) CALL abort_gcm(modname, 'you need to modify type_trac, this version is not supported by lmdz', 1)
     179      if (nt == 2) type_trac=types_trac(2)
    180180   ENDIF
    181181
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/inidissip.F90

    r2603 r5082  
    7676  CALL minmax(iip1*jjp1,zh,zhmin,zhmax )
    7777
    78   IF ( zhmin .GE. zhmax  )     THEN
     78  IF ( zhmin >= zhmax  )     THEN
    7979     write(lunout,*)'  Inidissip  zh min max  ',zhmin,zhmax
    8080     abort_message='probleme generateur alleatoire dans inidissip'
     
    122122
    123123     DO    l = 1, 50
    124         IF(ii.EQ.1) THEN
     124        IF(ii==1) THEN
    125125           !cccc             CALL covcont( 1,zu,zv,zu,zv )
    126126           IF(lstardis) THEN
     
    142142     end DO
    143143
    144      IF ( ii.EQ.1 ) THEN
     144     IF ( ii==1 ) THEN
    145145        IF(lstardis) THEN
    146146           cdivu  = 1./zllm
     
    201201     tetah(l)      = zvert(l)/tetatemp
    202202
    203      IF( tetamin.GT. (1./tetaudiv(l)) ) tetamin = 1./ tetaudiv(l)
    204      IF( tetamin.GT. (1./tetaurot(l)) ) tetamin = 1./ tetaurot(l)
    205      IF( tetamin.GT. (1./   tetah(l)) ) tetamin = 1./    tetah(l)
     203     IF( tetamin> (1./tetaudiv(l)) ) tetamin = 1./ tetaudiv(l)
     204     IF( tetamin> (1./tetaurot(l)) ) tetamin = 1./ tetaurot(l)
     205     IF( tetamin> (1./   tetah(l)) ) tetamin = 1./    tetah(l)
    206206  ENDDO
    207207
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/inigeom.F

    r2603 r5082  
    170170c
    171171c
    172       IF( nitergdiv.NE.2 ) THEN
     172      IF( nitergdiv/=2 ) THEN
    173173        gamdi_gdiv = coefdis/ ( REAL(nitergdiv) -2. )
    174174      ELSE
    175175        gamdi_gdiv = 0.
    176176      ENDIF
    177       IF( nitergrot.NE.2 ) THEN
     177      IF( nitergrot/=2 ) THEN
    178178        gamdi_grot = coefdis/ ( REAL(nitergrot) -2. )
    179179      ELSE
    180180        gamdi_grot = 0.
    181181      ENDIF
    182       IF( niterh.NE.2 ) THEN
     182      IF( niterh/=2 ) THEN
    183183        gamdi_h = coefdis/ ( REAL(niterh) -2. )
    184184      ELSE
     
    230230        x1  = x1 - f/df
    231231        xdm = ABS( x1- xo1 )
    232         IF( xdm.LE.eps )GO TO 11
     232        IF( xdm<=eps )GO TO 11
    233233        xo1 = x1
    234234 10     CONTINUE
     
    247247        y1   = y1 -f/df
    248248        ydm  = ABS(y1-yo1)
    249         IF(ydm.LE.eps) GO TO 17
     249        IF(ydm<=eps) GO TO 17
    250250        yo1  = y1
    251251 15     CONTINUE
     
    410410c
    411411
    412       IF ( j .gt. 1 .AND. j .lt. jjp1 )  THEN
     412      IF ( j > 1 .AND. j < jjp1 )  THEN
    413413c
    414414        rlatp    = rlatu2 ( j-1 )
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/inigrads.F

    r4593 r5082  
    3333      unit(9)=46
    3434
    35       if (if.le.nf) stop'verifier les appels a inigrads'
     35      if (if<=nf) stop'verifier les appels a inigrads'
    3636
    3737      print*,'Entree dans inigrads'
     
    5151      do i=1,im
    5252         xd(i,if)=x(i)*fx
    53          if(xd(i,if).lt.xmin) iid(if)=i+1
    54          if(xd(i,if).le.xmax) ifd(if)=i
     53         if(xd(i,if)<xmin) iid(if)=i+1
     54         if(xd(i,if)<=xmax) ifd(if)=i
    5555      enddo
    5656      print*,'On stoke du point ',iid(if),'  a ',ifd(if),' en x'
     
    6161      do j=1,jm
    6262         yd(j,if)=y(j)*fy
    63          if(yd(j,if).gt.ymax) jid(if)=j+1
    64          if(yd(j,if).ge.ymin) jfd(if)=j
     63         if(yd(j,if)>ymax) jid(if)=j+1
     64         if(yd(j,if)>=ymin) jfd(if)=j
    6565      enddo
    6666      print*,'On stoke du point ',jid(if),'  a ',jfd(if),' en y'
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/inter_barxy_m.F90

    r2597 r5082  
    153153
    154154    CALL minmax( imodmax, xxim, chmin, chmax)
    155     IF( chmax.LT.6.50 )   THEN
     155    IF( chmax<6.50 )   THEN
    156156       DO imod = 1, imodmax
    157157          xxim(imod) = xxim(imod) * 180./pi
     
    172172
    173173    CALL minmax( idatmax, xxd, chmin, chmax)
    174     IF( chmax.LT.6.50 )  THEN
     174    IF( chmax<6.50 )  THEN
    175175       DO idat = 1, idatmax
    176176          xxd(idat) = xxd(idat) * 180./pi
     
    213213
    214214    DO idat = 1, idatmax
    215        IF ( xxd( idatmax1- idat ).LT.360.) exit
     215       IF ( xxd( idatmax1- idat )<360.) exit
    216216       id1 = id1 + 1
    217217    ENDDO
    218218
    219219    DO idat = 1, idatmax
    220        IF (xxd(idat).GT.0.) exit
     220       IF (xxd(idat)>0.) exit
    221221       id0 = id0 + 1
    222222    END DO
     
    264264
    265265    do while (imod <= imodmax)
    266        do while (xxim(imod).GT.xxid(idat))
     266       do while (xxim(imod)>xxid(idat))
    267267          dx   = xxid(idat) - x0
    268268          dxm  = dxm + dx
     
    271271          idat = idat + 1
    272272       end do
    273        IF (xxim(imod).LT.xxid(idat)) THEN
     273       IF (xxim(imod)<xxid(idat)) THEN
    274274          dx   = xxim(imod) - x0
    275275          dxm  = dxm + dx
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/iso_verif_dyn.F

    r4325 r5082  
    1313        integer iso_verif_noNaN_nostop
    1414
    15         if ((x.gt.-borne).and.(x.lt.borne)) then
     15        if ((x>-borne).and.(x<borne)) then
    1616                iso_verif_noNAN_nostop=0
    1717        else
     
    4747        iso_verif_egalite_nostop=0
    4848
    49         if (abs(a-b).gt.errmax) then
     49        if (abs(a-b)>errmax) then
    5050          if (abs((a-b)/max(max(abs(b),abs(a)),1e-18))
    51      :            .gt.errmaxrel) then
     51     :            >errmaxrel) then
    5252            write(*,*) 'erreur detectee par iso_verif_egalite:'
    5353            write(*,*) err_msg
     
    8484
    8585        ! verifier que HDO est raisonable
    86          if (q.gt.qmin) then
     86         if (q>qmin) then
    8787             IF(getKey('tnat', tnat, isoName(iso))) THEN
    8888                  err_msg = 'Missing isotopic parameter "tnat"'
     
    9191             END IF
    9292             deltaD=(x/q/tnat-1)*1000
    93              if ((deltaD.gt.deltaDmax).or.(deltaD.lt.deltaDmin)) then
     93             if ((deltaD>deltaDmax).or.(deltaD<deltaDmin)) then
    9494                  write(*,*) 'erreur detectee par iso_verif_aberrant:'
    9595                  write(*,*) err_msg
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/limx.F

    r2603 r5082  
    8484
    8585         do ij=iip2+1,ip1jm
    86             if(     dxqu(ij-1)*dxqu(ij).gt.0.
    87      &         .and. dxq(ij,l)*dxqu(ij).gt.0.) then
     86            if(     dxqu(ij-1)*dxqu(ij)>0.
     87     &         .and. dxq(ij,l)*dxqu(ij)>0.) then
    8888              dxq(ij,l)=
    8989     &         sign(min(abs(dxq(ij,l)),dxqmax(ij)),dxq(ij,l))
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/limz.F

    r2603 r5082  
    7777
    7878         do l=2,llm-1
    79             if(     dzqw(l-1)*dzqw(l).gt.0.
    80      &         .and. dzq(ij,l)*dzqw(l).gt.0.) then
     79            if(     dzqw(l-1)*dzqw(l)>0.
     80     &         .and. dzq(ij,l)*dzqw(l)>0.) then
    8181              dzq(ij,l)=
    8282     &         sign(min(abs(dzq(ij,l)),dzqmax(l)),dzq(ij,l))
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/pentes_ini.F

    r2600 r5082  
    7474c     if (mode.eq.1.or.mode.eq.3) then
    7575c     if (mode.eq.1) then
    76       if (mode.ge.1) then
     76      if (mode>=1) then
    7777        lati=2
    7878        latf=jjm
     
    187187c      enddo
    188188CCC
    189        if(mode.eq.2) then
     189       if(mode==2) then
    190190          do l=1,llm
    191191            s0s=0.
     
    247247      endif
    248248
    249       if (mode.eq.4) then
     249      if (mode==4) then
    250250         do l=1,llm
    251251            do i=1,iip1
     
    261261       call advx( limit,.5*dtvr,pbaru,sm,s0,sx,sy,sz,lati,latf)
    262262c     call minmaxq(zq,1.e33,-1.e33,'avant advy     ')
    263       if (mode.eq.4) then
     263      if (mode==4) then
    264264         do l=1,llm
    265265            do i=1,iip1
     
    282282       call limz(s0,sz,sm,pente_max)
    283283       call advz( limit,dtvr,w,sm,s0,sx,sy,sz )
    284       if (mode.eq.4) then
     284      if (mode==4) then
    285285         do l=1,llm
    286286            do i=1,iip1
     
    306306
    307307c     call minmaxq(zq,1.e33,-1.e33,'avant advx     ')
    308       if (mode.eq.4) then
     308      if (mode==4) then
    309309         do l=1,llm
    310310            do i=1,iip1
     
    346346c Traitements specifiques au pole
    347347
    348       if(mode.ge.1) then
     348      if(mode>=1) then
    349349      DO l=1,llm
    350350c   filtrages aux poles
     
    361361            q( i,jjp1,llm+1-l,0)=qps
    362362         enddo
    363          if(mode.eq.3) then
     363         if(mode==3) then
    364364            dyn1=0.
    365365            dys1=0.
     
    382382            enddo
    383383         endif
    384          if(mode.eq.1) then
     384         if(mode==1) then
    385385c   on filtre les valeurs au bord de la "grande maille pole"
    386386            dyn1=0.
     
    440440             DO j = 1,jjp1
    441441              DO i = 1,iip1
    442                 IF (q(i,j,l,0).lt.0.)  THEN
     442                IF (q(i,j,l,0)<0.)  THEN
    443443c                    PRINT*,'------------ BIP-----------'
    444444c                    PRINT*,'Q0(',i,j,l,')=',q(i,j,l,0)
     
    459459          do j=1,jjp1
    460460           do i=1,iip1
    461              if(q(i,j,l,0).lt.qmin)
     461             if(q(i,j,l,0)<qmin)
    462462     ,       print*,'apres pentes, s0(',i,',',j,',',l,')=',q(i,j,l,0)
    463463           enddo
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/prather.F

    r2600 r5082  
    330330         DO j = 2,jjm
    331331           DO i = 1,iip1
    332          IF (q(i,j,l,0).lt.0.)  THEN
     332         IF (q(i,j,l,0)<0.)  THEN
    333333         PRINT*,'------------ BIP-----------'
    334334         PRINT*,'S0(',i,j,l,')=',q(i,j,l,0),
     
    346346         do j=1,jjp1,jjm
    347347         do i=1,iip1
    348                IF (q(i,j,l,0).lt.0.)  THEN
     348               IF (q(i,j,l,0)<0.)  THEN
    349349               PRINT*,'------------ BIP 2-----------'
    350350         PRINT*,'S0(',i,j,l,')=',q(i,j,l,0)
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/sortvarc.F

    r2622 r5082  
    7979       heure     = ( itau*dtvrs1j-rjour ) * 24.
    8080       imjmp1    = iim * jjp1
    81        IF(ABS(heure - 24.).LE.0.0001 ) heure = 0.
     81       IF(ABS(heure - 24.)<=0.0001 ) heure = 0.
    8282c
    8383       CALL massbarxy ( masse, massebxy )
     
    161161      ! compute relative changes in etot,... (except if 'reference' values
    162162      ! are zero, which can happen when using iniacademic)
    163       if (etot0.ne.0) then
     163      if (etot0/=0) then
    164164        etot= etot/etot0
    165165      else
     
    167167      endif
    168168      rmsv= SQRT(rmsv/ptot)
    169       if (ptot0.ne.0) then
     169      if (ptot0/=0) then
    170170        ptot= ptot/ptot0
    171171      else
    172172        ptot=1.
    173173      endif
    174       if (ztot0.ne.0) then
     174      if (ztot0/=0) then
    175175        ztot= ztot/ztot0
    176176      else
    177177        ztot=1.
    178178      endif
    179       if (stot0.ne.0) then
     179      if (stot0/=0) then
    180180        stot= stot/stot0
    181181      else
    182182        stot=1.
    183183      endif
    184       if (ang0.ne.0) then
     184      if (ang0/=0) then
    185185        ang = ang /ang0
    186186      else
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/test_period.F

    r4593 r5082  
    2727      DO l = 1, llm
    2828         DO ij = 1, ip1jmp1, iip1
    29           IF( ucov(ij,l).NE.ucov(ij+iim,l) )  THEN
     29          IF( ucov(ij,l)/=ucov(ij+iim,l) )  THEN
    3030          PRINT *,'STOP dans test_period car ---  UCOV  ---  n est pas', 
    3131     ,  ' periodique en longitude ! '
     
    3333          STOP
    3434          ENDIF
    35           IF( teta(ij,l).NE.teta(ij+iim,l) )  THEN
     35          IF( teta(ij,l)/=teta(ij+iim,l) )  THEN
    3636          PRINT *,'STOP dans test_period car ---  TETA  ---  n est pas', 
    3737     ,   ' periodique en longitude ! '
     
    4343
    4444         do ij=1,iim
    45           if (teta(ij,l).ne.teta(1,l)
    46      s     .or.teta(ip1jm+ij,l).ne.teta(ip1jm+1,l) ) then
     45          if (teta(ij,l)/=teta(1,l)
     46     s     .or.teta(ip1jm+ij,l)/=teta(ip1jm+1,l) ) then
    4747          PRINT *,'STOP dans test_period car ---  TETA  ---  n est pas', 
    4848     ,  ' constant aux poles ! '
     
    5959      DO l = 1, llm
    6060         DO ij = 1, ip1jm, iip1
    61           IF( vcov(ij,l).NE.vcov(ij+iim,l) )  THEN
     61          IF( vcov(ij,l)/=vcov(ij+iim,l) )  THEN
    6262          PRINT *,'STOP dans test_period car ---  VCOV  ---  n est pas', 
    6363     ,   ' periodique en longitude !'
     
    7373        DO l =1, llm
    7474          DO ij = 1, ip1jmp1, iip1
    75           IF( q(ij,l,nq).NE.q(ij+iim,l,nq) )  THEN
     75          IF( q(ij,l,nq)/=q(ij+iim,l,nq) )  THEN
    7676          PRINT *,'STOP dans test_period car ---  Q  ---  n est pas ', 
    7777     ,   'periodique en longitude !'
     
    8585       DO l = 1, llm
    8686         DO ij = 1, ip1jmp1, iip1
    87           IF( p(ij,l).NE.p(ij+iim,l) )  THEN
     87          IF( p(ij,l)/=p(ij+iim,l) )  THEN
    8888          PRINT *,'STOP dans test_period car ---  P  ---  n est pas', 
    8989     ,    ' periodique en longitude !'
     
    9191          STOP
    9292          ENDIF
    93           IF( phis(ij).NE.phis(ij+iim) )  THEN
     93          IF( phis(ij)/=phis(ij+iim) )  THEN
    9494          PRINT *,'STOP dans test_period car ---  PHIS  ---  n est pas', 
    9595     ,   ' periodique en longitude !  l, IJ = ', l, ij,ij+iim
     
    9999         ENDDO
    100100         do ij=1,iim
    101           if (p(ij,l).ne.p(1,l)
    102      s     .or.p(ip1jm+ij,l).ne.p(ip1jm+1,l) ) then
     101          if (p(ij,l)/=p(1,l)
     102     s     .or.p(ip1jm+ij,l)/=p(ip1jm+1,l) ) then
    103103          PRINT *,'STOP dans test_period car ---  P     ---  n est pas', 
    104104     ,  ' constant aux poles ! '
  • LMDZ6/branches/Amaury_dev/libf/dyn3d_common/ugeostr.F90

    r2597 r5082  
    2929  DO j=1,jjm
    3030
    31      if (abs(sin(rlatv(j))).lt.1.e-4) then
     31     if (abs(sin(rlatv(j)))<1.e-4) then
    3232        zlat=1.e-4
    3333     else
Note: See TracChangeset for help on using the changeset viewer.