*=*=*=*= vdif_cd.html =*=*=*=*
SUBROUTINE vdif_cd

SUBROUTINE vdif_cd


      SUBROUTINE vdif_cd( ngrid,pz0,pg,pz,pu,pv,pts,ph,pcdv,pcdh)
      IMPLICIT NONE
c=======================================================================
c
c   Subject: computation of the surface drag coefficient using the
c   -------  approch developed by Loui for ECMWF.
c
c   Author: Frederic Hourdin  15 /10 /93
c   -------
c
c   Arguments:
c   ----------
c
c   inputs:
c   ------
c     ngrid            size of the horizontal grid
c     pg               gravity (m s -2)
c     pz(ngrid)        height of the first atmospheric layer
c     pu(ngrid)        u component of the wind in that layer
c     pv(ngrid)        v component of the wind in that layer
c     pts(ngrid)       surfacte temperature
c     ph(ngrid)        potential temperature T*(p/ps)^kappa
c
c   outputs:
c   --------
c     pcdv(ngrid)      Cd for the wind
c     pcdh(ngrid)      Cd for potential temperature
c
c=======================================================================
c
c-----------------------------------------------------------------------
c   Declarations:
c   -------------

c   Arguments:
c   ----------

      INTEGER ngrid
      REAL pz0
      REAL pg,pz(ngrid)
      REAL pu(ngrid),pv(ngrid)
      REAL pts(ngrid),ph(ngrid)
      REAL pcdv(ngrid),pcdh(ngrid)

c   Local:
c   ------

      INTEGER ig

      REAL zu2,z1,zri,zcd0,zz

      REAL karman,b,c,d,c2b,c3bc,c3b,umin2
      LOGICAL firstcal
      DATA karman,b,c,d,umin2/.4,5.,5.,5.,1.e-12/
      DATA firstcal/.true./
      SAVE b,c,d,karman,c2b,c3bc,c3b,firstcal,umin2

c-----------------------------------------------------------------------
c   couche de surface:
c   ------------------

c     DO ig=1,ngrid
c        zu2=pu(ig)*pu(ig)+pv(ig)*pv(ig)+umin2
c        pcdv(ig)=pz0*(1.+sqrt(zu2))
c        pcdh(ig)=pcdv(ig)
c     ENDDO
c     RETURN
c
c      IF (firstcal) THEN
c         c2b=2.*b
c         c3bc=3.*b*c
c         c3b=3.*b
c         firstcal=.false.
c      ENDIF
c
c!!!! WARNING, verifier la formule originale de Louis!
c      DO ig=1,ngrid
c         zu2=pu(ig)*pu(ig)+pv(ig)*pv(ig)+umin2
c         zri=pg*pz(ig)*(ph(ig)-pts(ig))/(ph(ig)*zu2)
c._.
c            zri=0.E+0
c._.
c         z1=1.+pz(ig)/pz0
c         zcd0=karman/log(z1)
c._.         zcd0=zcd0*zcd0*sqrt(zu2)
c         zcd0=zcd0*zcd0
c         IF(zri.LT.0.) THEN
c._.            z1=b*zri/(1.+c3bc*zcd0*sqrt(-z1*zri))
c            z1=b*zri/(1.+c3bc*zcd0*sqrt(-z1*zri*zu2))
c            pcdv(ig)=zcd0*(1.-2.*z1)
c            pcdh(ig)=zcd0*(1.-3.*z1)
c         ELSE
c            zz=sqrt(1.+d*zri)
c            pcdv(ig)=zcd0/(1.+c2b*zri/zz)
c            pcdh(ig)=zcd0/(1.+c3b*zri*zz)
c         ENDIF
c      ENDDO


c On calcule un VRAI cdrag tout bete
      DO ig=1,ngrid
         z1=1.E+0 + pz(ig)/pz0
         zcd0=karman/log(z1)
         zcd0=zcd0*zcd0
         pcdv(ig)=zcd0
         pcdh(ig)=zcd0
c        write(*,*) 'MOMO pz(',ig,'): ',pz(ig)
      ENDDO


c-----------------------------------------------------------------------

      RETURN
      END