Difference between revisions of "Cloud convection"

From Geos-chem
Jump to: navigation, search
(Computational bottleneck in the v11-01 convection module)
(Outstanding issues that are not yet resolved)
 
(12 intermediate revisions by the same user not shown)
Line 13: Line 13:
 
== Relaxed Arakawa-Schubert scheme ==
 
== Relaxed Arakawa-Schubert scheme ==
  
This is the convection scheme that GEOS-Chem uses with both GEOS-3 and GEOS-5 meteorology.  The source code for this scheme is located in routine <tt>NFCLDMX</tt> in <tt>convection_mod.f</tt>.
+
This is the convection scheme that GEOS-Chem currently uses with [[GEOS-FP]] and [[MERRA-2]] meteorology.  The source code for this scheme is located in routine <tt>DO_CONVECTION</tt> in <tt>GeosCore/convection_mod.F</tt>.
 
+
== Hack and Zhang-McFarlane schemes ==
+
 
+
This is the convection scheme that GEOS-Chem uses with both GEOS-4 and GCAP meteorology.
+
 
+
=== GEOS-4 ===
+
 
+
The source code for the convection scheme required for GEOS-4 meteorology is contained within the F90 module <tt>fvdas_convect_mod.f</tt>.  The main driver is called <tt>FVDAS_CONVECT</tt>.  This routine calls the following routines:
+
 
+
#<tt>ARCONVTRAN</tt>: Prepares arrays for use by <tt>CONVTRAN</tt>
+
#<tt>CONVTRAN</tt>: Main driver for deep convection (i.e. Zhang/McFarlane scheme)
+
#<tt>HACK_CONV</tt>: Main driver for shallow convection (i.e. Hack scheme)
+
 
+
=== GISS ===
+
 
+
The source code for the convection scheme required for GISS/GCAP meteorology is contained within the F90 module <tt>gcap_convect_mod.f</tt>.  The main driver is called <tt>GCAP_CONVECT</tt>.  This routine calls the following routines:
+
 
+
#<tt>ARCONVTRAN</tt>: Prepares arrays for use by <tt>CONVTRAN</tt>
+
#<tt>CONVTRAN</tt>: Main driver for deep convection (i.e. Zhang/McFarlane scheme)
+
 
+
There is no equivalent routine to <tt>HACK_CONV</tt> for the GCAP meterology.  Instead, <tt>ARCONVTRAN</tt> and <tt>CONVTRAN</tt> are called with entraining mass fluxes, and then again with non-entraining mass fluxes.
+
 
+
--[[User:Bmy|Bob Y.]] 13:11, 19 February 2010 (EST)
+
  
 
== Validation ==
 
== Validation ==
Line 56: Line 33:
  
 
--[[User:Bmy|Bob Y.]] 13:11, 19 February 2010 (EST)
 
--[[User:Bmy|Bob Y.]] 13:11, 19 February 2010 (EST)
 
== Previous issues that are now resolved ==
 
 
=== Resolve very high tracer concentrations in MERRA and GEOS-FP convective scavenging ===
 
 
<span style="color:green">'''''This update was validated with [[GEOS-Chem_v11-01_benchmark_history#v11-01d|1-month benchmark simulation v11-01d]] and [[GEOS-Chem_v11-01_benchmark_history#v11-01d-Run1|1-year benchmark simulation v11-01d-Run1]]. This version was approved on 12 Dec 2015.'''''</span>
 
 
'''''Viral Shah wrote:'''''
 
 
:I am running [[GEOS-Chem v11-01|v10.01]], nested-grid NA full-chemistry w/ SOA simulation with the GEOS-FP met fields, and have found instances of extremely high concentrations of certain tracers that develop all of a sudden. I traced this back to a bug (highlighted in <span style="color:red">RED</span>) in the <tt>DO_MERRA_CONVECTION</tt> (in module <tt>GeosCore/convection_mod.F</tt>) routine at the following:
 
 
                  ! Check if the tracer is an aerosol or not
 
                  IF ( AER == .TRUE. ) THEN
 
 
                    !---------------------------------------------------------
 
                    ! Washout of aerosol tracers
 
                    ! This is modeled as a kinetic process
 
                    !---------------------------------------------------------
 
 
                    <span style="color:red">! Define ALPHA, the fraction of raindrops that
 
                    ! re-evaporate when falling from (I,J,L+1) to (I,J,L)
 
                    ALPHA  = ( REEVAPCN(K) * AD(K)          )
 
    &                      / ( PDOWN(K+1)  * AREA_M2 * 10e+0_fp )
 
 
                    ! ALPHA2 is the fraction of the rained-out aerosols
 
                    ! that gets resuspended in grid box (I,J,L)
 
                    ALPHA2  = 0.5e+0_fp * ALPHA</span>
 
 
:Here, the value of <tt>ALPHA</tt>, which should be less than or equal to 1, is sometimes much higher than 1, and for the attached example was >10^5. Since <tt>ALPHA</tt> is used to calculate resuspension of precipitating mass from above, these high values of <tt>ALPHA</tt> lead to a gain in tracer mass at the lower levels in excess of what is coming from above. I suggest we replace the <span style="color:red">RED</span> code with the following piece of code in <span style="color:green">GREEN</span> which is used elsewhere in the <tt>DO_MERRA_CONVECTION</tt> routine.
 
 
                      ! %%%% CASE 1 %%%%
 
                      ! Partial re-evaporation. Less precip is leaving
 
                      ! the grid box then entered from above.
 
                      IF ( PDOWN(K+1) > PDOWN(K) .AND.
 
    &                    PDOWN(K)  > TINYNUM        ) THEN
 
 
                        <span style="color:green">! Define ALPHA, the fraction of raindrops that
 
                        ! re-evaporate when falling from grid box
 
                        ! (I,J,L+1) to (I,J,L)
 
                        ALPHA = ( REEVAPCN(K) * AD(K)          )
 
    &                        / ( PDOWN(K+1)  * AREA_M2 * 10e+0_fp  ) 
 
 
                        ! For safety
 
                        ALPHA = MIN( ALPHA, 1e+0_fp )
 
 
                        ! ALPHA2 is the fraction of the rained-out aerosols
 
                        ! that gets resuspended in grid box (I,J,L)
 
                        ALPHA2  = 0.5e+0_fp * ALPHA</span>
 
 
                      ENDIF
 
 
                      ! %%%% CASE 2 %%%%
 
                      ! Total re-evaporation. Precip entered from above,
 
                      ! but no precip is leaving grid box (ALPHA = 2 so
 
                      ! that  ALPHA2 = 1)
 
                      IF ( PDOWN(K) < TINYNUM ) THEN
 
                        ALPHA2 = 1e+0_fp
 
                      ENDIF
 
 
:A second bug I noticed is in the lines in <span style="color:red">RED</span> right below the first one. The current code is as follows:
 
 
                    ! GAINED is the rained out aerosol coming down from
 
                    ! grid box (I,J,L+1) that will evaporate and re-enter
 
                    ! the atmosphere in the gas phase in grid box (I,J,L).
 
                    GAINED  = T0_SUM * ALPHA2
 
 
                    ! Amount of aerosol lost to washout in grid box
 
                    <span style="color:red">WETLOSS = Q(K,IC) * BMASS(K) / TCVV  *
 
    &                        WASHFRAC - GAINED</span>
 
 
                    ! LOST is the rained out aerosol coming down from
 
                    ! grid box (I,J,L+1) that will remain in the liquid
 
                    ! phase in grid box (I,J,L) and will NOT re-evaporate.
 
                    LOST    = T0_SUM - GAINED
 
 
                    ! Update tracer concentration (V. Shah, mps, 5/20/15)
 
                    Q(K,IC) = Q(K,IC) - WETLOSS * TCVV / BMASS(K)
 
 
:In this case, the amount of tracer <tt>GAINED</tt> is (mistakenly) not added to <tt>Q</tt> before <tt>WETLOSS</tt> is calculated. The fix for the bold faced line should be as follows:
 
 
                    <span style="color:green">WETLOSS = ( Q(K,IC) * BMASS(K) / TCVV  + GAINED ) *
 
    &                        WASHFRAC - GAINED</span>
 
 
 
:This will be consistent with the code (below) for the 'non-aerosol' case
 
 
                    ! MASS_WASH is the total amount of non-aerosol tracer
 
                    ! that is available for washout in grid box (I,J,L).
 
                    ! It consists of the mass in the precipitating
 
                    ! part of box (I,J,L), plus the previously rained-out
 
                    ! tracer coming down from grid box (I,J,L+1).
 
                    ! (Eq. 15, Jacob et al, 2000).
 
                    MASS_WASH = ( F_WASHOUT * Q(K,IC) ) * BMASS(K) /
 
    &                          TCVV + T0_SUM
 
 
                    ! WETLOSS is the amount of tracer mass in
 
                    ! grid box (I,J,L) that is lost to washout.
 
                    ! (Eq. 16, Jacob et al, 2000)
 
                    WETLOSS    = MASS_WASH * WASHFRAC - T0_SUM
 
 
--[[User:Melissa Payer|Melissa Sulprizio]] ([[User talk:Melissa Payer|talk]]) 16:43, 14 September 2015 (UTC)
 
 
=== Fixed bug in DO_MERRA_CONVECTION affecting mass conservation ===
 
 
<span style="color:green">'''''These updates were validated in the 1-month benchmark simulation [[GEOS-Chem v11-01 benchmark history#v11-01a|v11-01a]], which was approved on 07 Jul 2015.'''''</span>
 
 
Mass conservation tests validating the change in tracer units within cloud convection revealed a discrepancy in mass conservation between using GEOS-5 and GEOS-FP. Comparison of subroutine <tt>DO_MERRA_CONVECTION</tt>, the convection routine used for GEOS-FP, and subroutine <tt>NFCLDMX</tt>, the convection routine used for GEOS-5, showed that a calculation in <tt>DO_MERRA_CONVECTION</tt> was incorrectly outside of the internal timestep loop.
 
 
In <tt>DO_MERRA_CONVECTION</tt>, the quantity <tt>QB</tt>, the average mixing ratio in the column below the cloud base, is calculated in two steps:
 
 
#the numerator of <tt>QB</tt> is calculated by summing the tracer concentrations weighted by pressure and assigned to variable <tt>QB_NUM</tt>
 
#<tt>QB</tt> is calculated by dividing <tt>QB_NUM</tt> by the pressure difference across all levels below the cloud base.
 
 
While tracer concentrations were updated every internal timestep, <tt>QB_NUM</tt> was calculated prior to the timestep loop and therefore was not updated with the adjusted concentrations. As a result, mass was only conserved during the first internal timestep.
 
 
To correct this problem, we made these modifications in subroutine <tt>DO_MERRA_CONVECTION</tt>, located in module <tt>GeosCore/convection_mod.F</tt>:
 
 
#Change the declaration of <tt>QB_NUM</tt> from an array to a scalar.
 
#Move the initialization and calculation of <tt>QB_NUM</tt> to within the timestep loop just prior to the calculation of <tt>QB</tt>. Change <tt>QB_NUM</tt> from an array to a scalar as follows:
 
    ! Calculate QB_NUM, the numerator for QB. QB is the
 
    ! weighted average mixing ratio below the cloud base.
 
    ! QB_NUM is equal to the grid box tracer concentrations
 
    ! [kg/kg total air] weighted by the adjacent level pressure
 
    ! differences and summed over all levels up to just
 
    ! below the cloud base (ewl, 6/22/15)         
 
    QB_NUM  = 0e+0_fp 
 
    DO K  = 1, CLDBASE-1
 
        QB_NUM = QB_NUM + Q(K,IC) * DELP(K)
 
    ENDDO
 
 
    ! Compute QB, the weighted avg mixing ratio below
 
    ! the cloud base [kg/kg total air]
 
    QB = QB_NUM / ( PEDGE(1) - PEDGE(CLDBASE) )
 
 
With these updates, the mass variance for GEOS-FP within convection is the same order of magnitude as for GEOS-5.  For the case of CO2 with emissions turned off and initial values of 370 ppm globally, the mass fluctuation is a few hundred kg globally over a few days.
 
 
--[[User:Lizzie Lundgren|Lizzie Lundgren]] ([[User talk:Lizzie Lundgren|talk]]) 21:50, 24 June 2015 (UTC)<br>--[[User:Bmy|Bob Y.]] ([[User talk:Bmy|talk]]) 17:55, 7 July 2015 (UTC)
 
 
=== Reduce time spent in routine DO_CONVECTION when using GEOS-FP or MERRA ===
 
 
<span style="color:green">'''''These updates were validated in the 1-month benchmark simulation [[GEOS-Chem v10-01 benchmark history#v10-01c|v10-01c]] and approved on 29 May 2014.'''''</span>
 
 
Using the [http://tau.uoregon.edu Tuning and Analysis Utilities (TAU)], we were able to make the following modifications to routine <tt>DO_CONVECTION</tt> (in module file <tt>GeosCore/convection_mod.F</tt>) that resulted in a speedup in the [[GEOS-FP]]/[[MERRA]] convection module.  We made modifications in the following routines:
 
 
#<tt>DO_CONVECTION</tt> (in module <tt>GeosCore/convection_mod.F</tt>)
 
#*We no longer use objects from <tt>GeosCore/gc_type_mod.F</tt> (i.e. <tt>OPTIONS</tt>, <tt>DIMINFO</tt>, etc.).  These have been largely superseded by the <tt>Input_Opt</tt> object.
 
#*Remove all pointer references to fields of <tt>State_Met</tt> and <tt>State_Chm</tt> from the parallel DO loop.
 
#*Now use the proper # of tracers for APM aerosol microphysics.
 
#*Now declare the parallel DO loop with <tt>!$OMP+PRIVATE</tt>, which results in better load-balancing.
 
#<tt>DO_MERRA_CONVECTION</tt> (in module <tt>GeosCore/convection_mod.F</tt>):
 
#*Now make the following variables local pointer variables instead of arguments:
 
#**<tt>AD, BXHEIGHT, CMFMC, DQRCU, DTRAIN, REEVAPCN, T, Q</tt>.  These point to the corresponding variables in <tt>State_Met</tt> or <tt>State_Chm</tt>.
 
#**<tt>H2O2s, SO2s</tt>: These point to the corresponding arrays in <tt>GeosCore/sulfate_mod.F</tt>.
 
#<tt>COMPUTE_F</tt> (in module <tt>GeosCore/wetscav_mod.F</tt>)
 
#*Now make the F argument of routine COMPUTE_F an assumed-shape array (i.e. <tt>F(:,:,:)</tt> ).  This allows us to pass pointer-valued arguments to
 
#<tt>GeosCore/gc_type_mod.F</tt>:
 
#*This has now been moved to the <tt>obsolete/</tt> subdirectory.
 
 
[[Image:GEOSFP_Conv_Speedup.png]]
 
 
Also note that with this fix, the total CPU time of this run (1-day with GEOS-4x5 met) dropped from 16:l1 to 15:23 (min:sec).  So this fix is making the overall simulation run a little faster for each simulation day.
 
 
--[[User:Bmy|Bob Y.]] 17:09, 30 May 2014 (EDT)
 
 
=== Removed array temporaries in call to FVDAS_CONVECT ===
 
 
<span style="color:green">'''''These updates were validated in the 1-month benchmark simulation [[GEOS-Chem v10-01 benchmark history#v10-01c|v10-01c]] and approved on 29 May 2014.'''''</span>
 
 
The [[GEOS-Chem Unit Tester]] revealed the presence of array temporaries in the call to GEOS-4 convection routine <tt>FVDAS_CONVECT</tt>.  To remove the array temporaries, we made these modifications in subroutine <tt>DO_GEOS4_CONVECT</tt>, located in module <tt>GeosCore/convection_mod.F</tt>:
 
 
(1) Declare the <tt>F</tt> variable with the <tt>TARGET</tt> attribute, as follows:
 
 
#if  defined( APM ) 
 
      INTEGER        :: INDEXSOL(Input_Opt%N_TRACERS+N_APMTRA)
 
      REAL*8, TARGET  :: F      (IIPAR,JJPAR,LLPAR,
 
      &                            Input_Opt%N_TRACERS+N_APMTRA)
 
#else               
 
      INTEGER        :: INDEXSOL(Input_Opt%N_TRACERS)
 
      REAL*8, TARGET  :: F      (IIPAR,JJPAR,LLPAR,
 
      &                            Input_Opt%N_TRACERS)
 
#endif
 
 
(2) Add pointer variables <tt>p_STT</tt> and <tt>p_F</tt>:
 
 
      REAL*8, POINTER :: p_STT  (:,:,:,:)  ! Ptr to STT    (flipped in vert)
 
      REAL*8, POINTER :: p_F    (:,:,:,:)  ! Ptr to F      (flipped in vert)
 
 
(3) Point <tt>p_STT</tt> to the <tt>State_Chm%Tracers</tt> field and flip levels in the vertical.  Likewise, point <tt>p_F</tt> to the <tt>F</tt> array, and also flip in the vertical:
 
 
      ! Point to various fields and flip in vertical.  This avoids
 
      ! array temporaries in the call to FVDAS_CONVECT (bmy, 4/14/14)
 
      p_HKETA  => State_Met%HKETA  (:,:,LLPAR:1:-1  )
 
      ... etc ...
 
      p_STT    => State_Chm%Tracers(:,:,LLPAR:1:-1,:)
 
      p_F      => F                (:,:,LLPAR:1:-1,:)  
 
 
(4) Pass <tt>p_STT</tt> and <tt>p_F</tt> to subroutine <tt>FVDAS_CONVECT</tt>:
 
 
        ! Call the fvDAS convection routines (originally from NCAR!)
 
      CALL FVDAS_CONVECT( TDT, 
 
      &                    N_TOT_TRC,
 
!----------------------------------------------------------------------------
 
! Prior to 4/14/14:
 
! Eliminate an array temporary (bmy, 4/14/14)
 
!    &                    STT  (:,:,LLPAR:1:-1,:),   
 
!----------------------------------------------------------------------------
 
      &                    p_STT,
 
      &                    RPDEL,       
 
      &                    p_HKETA,
 
      &                    p_HKBETA,
 
      &                    p_ZMMU,
 
      &                    p_ZMMD,
 
      &                    p_ZMEU,
 
      &                    DP,   
 
      &                    NSTEP,   
 
!----------------------------------------------------------------------------
 
! Prior to 4/14/14:
 
! Eliminate an array temporary (bmy, 4/14/14)
 
!    &                    F    (:,:,LLPAR:1:-1,:),       
 
!----------------------------------------------------------------------------
 
      &                    p_F,
 
      &                    TCVV, 
 
      &                    INDEXSOL,
 
      &                    State_Met )
 
 
(5) Nullify the pointers <tt>p_STT</tt> and <tt>p_F</tt> at the end of subroutine <tt>DO_GEOS4_CONVECT</tt>:
 
 
      ! Free pointers
 
      NULLIFY( STT,    p_STT,    p_F                    )
 
 
--[[User:Bmy|Bob Y.]] 17:08, 30 May 2014 (EDT)
 
 
=== Fixed minor issues in MERRA cloud convection routine ===
 
 
Jenny Fisher discovered two minor issues in the [[MERRA]] convection routine <tt>DO_MERRA_CONVECTION</tt> (in module  <tt>convection_mod.f</tt>):
 
 
==== ND38 diagnostic issue in routine DO_MERRA_CONVECTION ====
 
 
<span style="color:green">'''''This update was tested in the 1-month benchmark simulation [[GEOS-Chem_v9-01-02_benchmark_history#v9-01-02j|v9-01-02j]] and approved on 16 Aug 2011.'''''</span>
 
 
'''''[mailto:jafisher@fas.harvard.edu Jenny Fisher] wrote]:'''''
 
 
:The bug is in routine <tt>DO_MERRA_CONVECTION</tt>.  When <tt>DIAG38</tt> is first written (around line 2056 in my code, after the comment titled "(3.4) ND38 Diagnostic"), DIAG38 is formed by adding T0 (converted to appropriate units) to the diagnostic each level K. This is correct. However, the second time we add to <tt>DIAG38</tt> (below the cloud base, around line 2245 in my code), we add <tt>T0_SUM</tt> to each level. From what we can tell, <tt>T0_SUM</tt> represents not the washout from each level but instead the total wet scavenging loss, summed over the entire column. So we are effectively double counting in these levels and adding way too much. [Helen Amos and I] think this should instead be adding <tt>WETLOSS</tt>.
 
 
The fix is below:
 
 
                  IF ( OPTIONS%USE_DIAG38 .and. F(K,IC) > 0d0 ) THEN
 
                      DIAG38(K,IC) = DIAG38(K,IC)
 
<span style="color:red">!------------------------------------------------------------------------------
 
! Prior to 8/16/11:
 
! Now use WETLOSS instead of T0_SUM in the ND38 diagnostic below the cloud
 
! base.  WETLOSS is the loss in this level, but T0_SUM is the loss summed
 
! over the entire column.  Using T0_SUM leads us to over-count the tracer
 
! scavenged out of the column. (jaf, hamos, bmy, 8/16/11)
 
!    &                            + ( T0_SUM * AREA_M2 / TCVV_DNS )
 
!------------------------------------------------------------------------------</span>
 
      &                            + ( WETLOSS * AREA_M2 / TCVV_DNS )
 
                  ENDIF
 
 
==== Wrong IF tests used in routine DO_MERRA_CONVECTION ====
 
 
<span style="color:green">'''''This update was tested in the 1-month benchmark simulation [[GEOS-Chem_v9-01-02_benchmark_history#v9-01-02j|v9-01-02j]] and approved on 16 Aug 2011.'''''</span>
 
 
<span style="color:red">'''''NOTE: In [[GEOS-Chem v11-01]] and higher versions, tagged Hg indices are now stored in the species database.'''''</span>
 
 
:Routine <tt>DO_MERRA_CONVECTION</tt> was using tracer flags <tt>IDTHg2</tt> and <tt>IDTHgP</tt> to determine whether routines <tt>ADD_Hg2_WD</tt>, <tt>ADD_HgP_WD</tt>, and <tt>ADD_Hg2_SNOWPACK</tt> should be called.  However, <tt>IDTHg2</tt> and <tt>IDTHgP</tt> aren't ever defined and were set to zero, so these routines were never called even when the correct mercury species were used.
 
 
The fix is to replace these two lines of code
 
 
    IF ( IS_Hg .and. IC == IDT%Hg2 ) THEN
 
    ...
 
    IF ( IS_Hg .and. IC == IDT%HgP ) THEN
 
 
with these:
 
 
    IF ( IS_Hg .and. IS_Hg2( IC ) ) THEN
 
    ...
 
    IF ( IS_Hg .and. IS_HgP( IC ) ) THEN
 
 
--[[User:Bmy|Bob Y.]] 16:47, 16 August 2011 (EDT)<br>--[[User:Bmy|Bob Yantosca]] ([[User talk:Bmy|talk]]) 19:12, 6 May 2016 (UTC)
 
 
== Outstanding issues that are not yet resolved ==
 
 
=== Computational bottleneck in the v11-01 convection module ===
 
 
<span style="color:green">'''''This update was included in [[GEOS-Chem v11-02#v11-02a|v11-02a]] and approved on 12 May 2017.'''''</span>
 
 
After the [[#v11-01 public release|v11-01 public release]] was issued, the [[GCST]] discovered a computational bottleneck in the convection module.  The following DO loop at line 343 of <tt>GeosCore/convection_mod.F</tt> was not parallelized:
 
 
      ! Loop over advected species
 
      DO NA = 1, nAdvect
 
 
          ! Species ID
 
          N = State_Chm%Map_Advect(NA)
 
 
          ! Now point to a 3D slice of the FSOL array
 
          p_FSOL => FSOL(:,:,:,NA)
 
 
          ! Fraction of soluble species
 
          CALL COMPUTE_F( am_I_Root, N, p_FSOL, ISOL(NA),
 
      &                  Input_Opt, State_Met, State_Chm, RC )
 
 
          ! Free pointer memory
 
          p_FSOL => NULL()
 
 
      ENDDO
 
 
The loop was probably left unparallelized due to an former issue that has probably since been resolved. 
 
 
Bob Yantosca profiled the GEOS-Chem v11-01-public code with the TAU performance analyzer, using a 2-model-day simulation with 8 CPUs.  The results are shown below:
 
 
[[Image:V11-01-thread0.png]]
 
 
As you can see, because the <tt>COMPUTE_F</tt> routine was not being called from a parallel loop, the subroutine was only being executed on the master CPU.  This caused a slowdown because the other CPUs were being forced to wait until <tt>COMPUTE_F</tt> finished before the simulation could proceed.
 
 
The solution was to parallelize the DO loop, in order to obtain a better load balancing.  We added the code in GREEN:
 
 
      ! Loop over advected species
 
<span style="color:green">!$OMP PARALLEL DO
 
!$OMP+DEFAULT( SHARED )
 
!$OMP+PRIVATE( NA, N, p_FSOL, RC )</span>
 
      DO NA = 1, nAdvect
 
          ... etc ...
 
      ENDDO
 
<span style="color:green">!$OMP END PARALLEL DO</span>
 
 
Parallellizing the loop indeed removed the bottleneck:
 
 
[[Image:V11-01-thread0-parallelized.png]]
 
 
After parallelizing the loop, the <tt>COMPUTE_F</tt> routine now only spends 14 seconds on the master CPU, instead of ~400 seconds.  This means that the work of calling <tt>COMPUTE_F</tt> is now being efficiently split up among all 8 CPUs.  This should result in a significant speedup.
 
 
The GCST will add this fix as a patch to the v11-01 public release, as well as into the [[GEOS-Chem v11-02#v11-02a|v11-02a]] development stream.  We have performed some timing tests that show the impact of this speedup (as well as the speedup caused by the [[FlexChem#Add_simplified_P.2FL_families_to_KPP|improved P/L diagnostic in KPP]] that will go also into v11-02a).
 
 
{| border=1 cellspacing=0 cellpadding=5
 
|-valign="top" bgcolor="#CCCCCC"
 
!width="125px"|Run name, <br>timesteps,<br>and submitter
 
!width="175px"|Machine or Node<br>and Compiler
 
!width="100px"|CPU vendor
 
!width="150px"|CPU model
 
!width="75px"|Speed [MHz]
 
!width="50px"|# of<br>CPUs
 
!width="85px"|CPU time
 
!width="120px"|Wall time
 
!width="75px|CPU / Wall<br>ratio
 
!width="75px"|% of ideal
 
 
|-valign="top"
 
|v11-01-public<br>(C20T10)<br>Bob Yantosca
 
|regal16.rc.fas.harvard.edu<br>ifort 11.1
 
|GenuineIntel
 
|Intel(R) Xeon(R) CPU E5-2660 0 @ 2.20GHz
 
|2199.915
 
|8
 
|62554.07 s<br>'''17:22:34'''
 
|9355.80 s<br>'''02:35:59'''
 
|6.6861
 
|83.58
 
 
|-valign="top"
 
|v11-02a-P/L<br>(C20T10)<br>Melissa Sulprizio
 
|regal17.rc.fas.harvard.edu<br>ifort 11.1
 
|GenuineIntel
 
|Intel(R) Xeon(R) CPU E5-2660 0 @ 2.20GHz
 
|2199.993
 
|8
 
|55853.62 s<br>'''15:30:54'''
 
|8373.14 s<br>'''02:19:44'''<br><span style="color:red">1.12X faster than v11-01-public</span>
 
|6.6706
 
|83.38
 
 
|-valign="top" bgcolor="#CCFFFF"
 
|v11-02a-P/L+COMPUTE_F<br>(C20T10)<br>Melissa Sulprizio
 
|regal17.rc.fas.harvard.edu<br>ifort 11.1
 
|GenuineIntel
 
|Intel(R) Xeon(R) CPU E5-2660 0 @ 2.20GHz
 
|2199.993
 
|8
 
|55774.58 s<br>'''15:29:35'''
 
|7666.69 s<br>'''02:07:52'''<br><span style="color:blue">1.22X faster than v11-01-public</span>
 
|7.2749
 
|90.94
 
 
|}
 
 
--[[User:Bmy|Bob Yantosca]] ([[User talk:Bmy|talk]]) 19:26, 9 February 2017 (UTC)
 

Latest revision as of 20:46, 13 July 2023

This page describes the cloud convection (aka wet convection) algorithms of GEOS-Chem. We also invite you to read our Wet deposition wiki page, which contains information about the algorithms used for scavenging of soluble tracers.

Overview

From Section 2, paragraph 10 of Wu et al [2007]:

A major difference between the GEOS-3, GEOS-4, and GISS models is the treatment of wet convection. GEOS-3 [and now also GEOS-5, ed.] uses the Relaxed Arakawa-Schubert convection scheme [Moorthi and Suarez, 1992]. GEOS-4 has separate treatments of deep and shallow convection following the schemes developed by Zhang and McFarlane [1995] and Hack [1994]. The convection scheme in the GISS GCM was described by Del Genio and Yao [1993]. Unlike the GEOS models, the GISS GCM allows for condensed water in the atmosphere (i.e., condensed water is not immediately precipitated), resulting in frequent nonprecipitating shallow convection. In the wet deposition scheme, we do not scavenge soluble species from shallow convective updrafts at altitudes lower than 700 hPa in the GISS-driven model, whereas we do in the GEOS-driven model [Liu et al., 2001].

Updraft scavenging of soluble tracers (as applied to both the Relaxed Arakawa and Hack/Zhang-McFarlane schemes in GEOS-Chem) is described in Section 1 of Jacob et al [2000] and in Section 2.3.1 of Liu et al [2001].

--Bob Y. 13:13, 19 February 2010 (EST)

Relaxed Arakawa-Schubert scheme

This is the convection scheme that GEOS-Chem currently uses with GEOS-FP and MERRA-2 meteorology. The source code for this scheme is located in routine DO_CONVECTION in GeosCore/convection_mod.F.

Validation

See Bey et al [2001], Liu et al [2001], and Wu et al [2007].

References

  1. Allen, D.J, R.B. Rood, A.M. Thompson, and R.D. Hidson, Three dimensional 222Rn calculations using assimilated data and a convective mixing algorithm, J. Geophys. Res, 101, 6871-6881, 1986a.
  2. Allen, D.J. et al, Transport induced interannual variability of carbon monoxide using a chemistry and transport model, 101, J. Geophys. Res, 28,655-28-670, 1986b.
  3. Bey I., D. J. Jacob, R. M. Yantosca, J. A. Logan, B. Field, A. M. Fiore, Q. Li, H. Liu, L. J. Mickley, and M. Schultz, Global modeling of tropospheric chemistry with assimilated meteorology: Model description and evaluation, J. Geophys. Res., 106, 23,073-23,096, 2001. PDF
  4. Del Genio, A. D., and M. Yao, Efficient cumulus parameterization for long-term climate studies: The GISS scheme, in The Representation of Cumulus Convection in Numerical Models, Meteorol. Monogr., 46, 181–184, 1993.
  5. Hack, J.J., Parameterization of moist convection in the National Center for Atmospheric Research Community Climate Model (CCM2), <u<J. Geophys. Res.</u>, 99, 5551–5568, 1994.
  6. Jacob, D.J. H. Liu, C.Mari, and R.M. Yantosca, Harvard wet deposition scheme for GMI, Harvard University Atmospheric Chemistry Modeling Group, revised March 2000.
  7. Liu, H., et al. (2001), Constraints from 210Pb and 7Be on wet deposition and transport in a global three-dimensional chemical tracer model driven by assimilated meteorological fields, J. Geophys. Res., 106, 12,109–12,128. PDF
  8. Moorthi, S., and M. J. Suarez, Relaxed Arakawa-Schubert: A parameterization of moist convection for general circulation models, Mon. Weather Rev., 120, 978– 1002, 1992.
  9. Wu, S., L.J. Mickley, D.J. Jacob, J.A. Logan, R.M. Yantosca, and D. Rind, Why are there large differences between models in global budgets of tropospheric ozone?, J. Geophys. Res., 112, D05302, doi:10.1029/2006JD007801, 2007. PDF
  10. Zhang, G. J., and N. A. McFarlane, Sensitivity of climate simulations to the parameterization of cumulus convection in the Canadian Climate Centre general circulation model, Atmos. Ocean, 33(3), 407–446, 1995.

--Bob Y. 13:11, 19 February 2010 (EST)