Changeset c0884a8 in flexpart.git for src/convmix.f90


Ignore:
Timestamp:
Jul 20, 2018, 2:40:39 PM (6 years ago)
Author:
pesei <petra seibert at univie ac at>
Branches:
univie
Children:
7ca2ef4
Parents:
f251e57
Message:

replace CTBTO code for checking type of GRIB

File:
1 edited

Legend:

Unmodified
Added
Removed
  • src/convmix.f90

    r6ecb30a rc0884a8  
    2020!**********************************************************************
    2121
    22 subroutine convmix(itime,metdata_format)
     22subroutine convmix(itime,id_centre)
    2323  !                     i
    2424  !**************************************************************
     
    3939  !   Unified ECMWF and GFS builds                                             
    4040  !   Marian Harustak, 12.5.2017                                             
    41   !     - Merged convmix and convmix_gfs into one routine using if-then           
     41  !     - Merged convmix and convmix_gfs into one routine using if-then     
    4242  !       for meteo-type dependent code                                       
     43  !                                                                         
     44  !  Petra Seibert, 2018-06-26: simplified version met data format detection
     45  !                                                                         
    4346  !**************************************************************
    4447
     
    4750  use com_mod
    4851  use conv_mod
    49   use class_gribfile
     52  use check_gribfile_mod
    5053
    5154  implicit none
     
    5558  integer :: jy, kpart, ktop, ngrid,kz
    5659  integer :: igrid(maxpart), ipoint(maxpart), igridn(maxpart,maxnests)
    57   integer :: metdata_format
     60  integer :: id_centre
    5861
    5962  ! itime [s]                 current time
     
    116119
    117120    ngrid=0
    118     if (metdata_format.eq.GRIBFILE_CENTRE_ECMWF) then
     121    if (id_centre.eq.icg_id_ecmwf) then
    119122    do j=numbnests,1,-1
    120123      if ( x.gt.xln(j)+eps .and. x.lt.xrn(j)-eps .and. &
     
    189192      td2conv=(td2(ix,jy,1,mind1)*dt2+td2(ix,jy,1,mind2)*dt1)*dtt
    190193!!$      do kz=1,nconvlev+1      !old
    191       if (metdata_format.eq.GRIBFILE_CENTRE_ECMWF) then
     194      if (id_centre.eq.icg_id_ecmwf) then
    192195        do kz=1,nuvz-1           !bugfix
    193196        tconv(kz)=(tth(ix,jy,kz+1,mind1)*dt2+ &
     
    208211
    209212  ! Calculate translocation matrix
    210       call calcmatrix(lconv,delt,cbaseflux(ix,jy),metdata_format)
     213      call calcmatrix(lconv,delt,cbaseflux(ix,jy),id_centre)
    211214      igrold = igr
    212215      ktop = 0
     
    285288  ! calculate translocation matrix
    286289  !*******************************
    287         call calcmatrix(lconv,delt,cbasefluxn(ix,jy,inest),metdata_format)
     290        call calcmatrix(lconv,delt,cbasefluxn(ix,jy,inest),id_centre)
    288291        igrold = igr
    289292        ktop = 0
Note: See TracChangeset for help on using the changeset viewer.
hosted by ZAMG