ESCOMP / CTSM

Community Terrestrial Systems Model (includes the Community Land Model of CESM)
http://www.cesm.ucar.edu/models/cesm2.0/land/
Other
304 stars 307 forks source link

Receive surface ozone in CLM #134

Closed ekluzek closed 1 year ago

ekluzek commented 6 years ago

Erik Kluzek < erik > - 2016-03-04 16:03:57 -0700 Bugzilla Id: 2294 Bugzilla CC: dll, rfisher,

These are the changes from Danica to add Ozone from atm in CLM. These are based off of clm4_5_1_r104. There are also changes in cime needed for datm and driver, that are documented in cime issue: 389 and 390.

[erik@yslogin3 clm4_5_1_r104_Fire_O3_spinupFinal]$ diff -cwb /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/main/atm2lndType.F90  SourceMods/src.clm/
*** /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/main/atm2lndType.F90 2015-02-18 15:49:02.749875754 -0700
--- SourceMods/src.clm/atm2lndType.F90  2015-05-12 13:44:46.565581000 -0600
***************
*** 51,56 ****
--- 51,57 ----
       real(r8), pointer :: forc_solai_grc                (:,:) => null() ! diffuse radiation (numrad) (vis=forc_solsd, nir=forc_solld)
       real(r8), pointer :: forc_solar_grc                (:)   => null() ! incident solar radiation
       real(r8), pointer :: forc_ndep_grc                 (:)   => null() ! nitrogen deposition rate (gN/m2/s)
+      real(r8), pointer :: forc_ozone_grc                (:)   => null() ! ozone concentration 
       real(r8), pointer :: forc_pc13o2_grc               (:)   => null() ! C13O2 partial pressure (Pa)
       real(r8), pointer :: forc_po2_grc                  (:)   => null() ! O2 partial pressure (Pa)
       real(r8), pointer :: forc_aer_grc                  (:,:) => null() ! aerosol deposition array
***************
*** 167,172 ****
--- 168,174 ----
      allocate(this%forc_solai_grc                (begg:endg,numrad)) ; this%forc_solai_grc                (:,:) = ival
      allocate(this%forc_solar_grc                (begg:endg))        ; this%forc_solar_grc                (:)   = ival
      allocate(this%forc_ndep_grc                 (begg:endg))        ; this%forc_ndep_grc                 (:)   = ival
+     allocate(this%forc_ozone_grc                (begg:endg))        ; this%forc_ozone_grc                (:)   = ival
      allocate(this%forc_pc13o2_grc               (begg:endg))        ; this%forc_pc13o2_grc               (:)   = ival
      allocate(this%forc_po2_grc                  (begg:endg))        ; this%forc_po2_grc                  (:)   = ival
      allocate(this%forc_aer_grc                  (begg:endg,14))     ; this%forc_aer_grc                  (:,:) = ival
***************
*** 271,276 ****
--- 273,283 ----
           avgflag='A', long_name='atmospheric incident solar radiation', &
           ptr_lnd=this%forc_solar_grc)

+     this%forc_ozone_grc(begg:endg) = spval
+     call hist_addfld1d (fname='OZONE', units='mol/mol',  &
+          avgflag='A', long_name='ozone concentration', &
+          ptr_lnd=this%forc_ozone_grc)    
+ 
      this%forc_pco2_grc(begg:endg) = spval
      call hist_addfld1d (fname='PCO2', units='Pa',  &
           avgflag='A', long_name='atmospheric partial pressure of CO2', &
[erik@yslogin3 clm4_5_1_r104_Fire_O3_spinupFinal]$ diff -cwb /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/OzoneBaseMod.F90  SourceMods/src.clm/
*** /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/OzoneBaseMod.F90  2015-02-18 15:49:08.658344475 -0700
--- SourceMods/src.clm/OzoneBaseMod.F90 2015-05-12 13:44:46.650799000 -0600
***************
*** 61,67 ****
       end subroutine Restart_interface

       subroutine CalcOzoneStress_interface(this, bounds, num_exposedvegp, filter_exposedvegp, &
!           forc_pbot, forc_th, rssun, rssha, rb, ram, tlai)
         use decompMod    , only : bounds_type
         use shr_kind_mod , only : r8 => shr_kind_r8
         import :: ozone_base_type
--- 61,67 ----
       end subroutine Restart_interface

       subroutine CalcOzoneStress_interface(this, bounds, num_exposedvegp, filter_exposedvegp, &
!           forc_ozone, forc_pbot, forc_th, rssun, rssha, rb, ram, tlai)
         use decompMod    , only : bounds_type
         use shr_kind_mod , only : r8 => shr_kind_r8
         import :: ozone_base_type
***************
*** 71,76 ****
--- 71,77 ----
         integer  , intent(in) :: num_exposedvegp           ! number of points in filter_exposedvegp
         integer  , intent(in) :: filter_exposedvegp(:)     ! patch filter for non-snow-covered veg
         real(r8) , intent(in) :: forc_pbot( bounds%begc: ) ! atmospheric pressure (Pa)
+        real(r8) , intent(in) :: forc_ozone( bounds%begg: )! ozone concentration 
         real(r8) , intent(in) :: forc_th( bounds%begc: )   ! atmospheric potential temperature (K)
         real(r8) , intent(in) :: rssun( bounds%begp: )     ! leaf stomatal resistance, sunlit leaves (s/m)
         real(r8) , intent(in) :: rssha( bounds%begp: )     ! leaf stomatal resistance, shaded leaves (s/m)
[erik@yslogin3 clm4_5_1_r104_Fire_O3_spinupFinal]$ diff -cwb /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/OzoneMod.F90  SourceMods/src.clm/
*** /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/OzoneMod.F90  2015-02-18 15:49:08.662545401 -0700
--- SourceMods/src.clm/OzoneMod.F90 2015-05-12 13:44:46.664578000 -0600
***************
*** 30,35 ****
--- 30,37 ----
       ! Private data members
       real(r8), pointer :: o3uptakesha_patch(:) ! ozone dose, shaded leaves (mmol O3/m^2)
       real(r8), pointer :: o3uptakesun_patch(:) ! ozone dose, sunlit leaves (mmol O3/m^2)
+ ! can delete after checking that ozone = o3test
+      real(r8), pointer :: forc_ozone(:)        ! ozone concentration (mol/mol) 

       ! NOTE(wjs, 2014-09-29) tlai_old_patch really belongs alongside tlai_patch in
       ! CanopyStateType.  But there are problems with any way I can think to implement
***************
*** 72,78 ****

    ! TODO(wjs, 2014-09-29) This parameter will eventually become a spatially-varying
    ! value, obtained from ATM
!   real(r8), parameter :: forc_ozone = 100._r8 * 1.e-9_r8  ! ozone partial pressure [mol/mol]

    ! TODO(wjs, 2014-09-29) The following parameters should eventually be moved to the
    ! params file. Parameters differentiated on veg type should be put on the params file
--- 74,80 ----

    ! TODO(wjs, 2014-09-29) This parameter will eventually become a spatially-varying
    ! value, obtained from ATM
! !  real(r8), parameter :: forc_ozone = 100._r8 * 1.e-9_r8  ! ozone partial pressure [mol/mol]

    ! TODO(wjs, 2014-09-29) The following parameters should eventually be moved to the
    ! params file. Parameters differentiated on veg type should be put on the params file
***************
*** 186,191 ****
--- 188,195 ----

      allocate(this%o3uptakesha_patch(begp:endp)) ; this%o3uptakesha_patch(:) = nan
      allocate(this%o3uptakesun_patch(begp:endp)) ; this%o3uptakesun_patch(:) = nan
+ !delete later
+     allocate(this%forc_ozone(bounds%begg:bounds%endg))        ; this%forc_ozone(:) = nan
      allocate(this%tlai_old_patch(begp:endp))    ; this%tlai_old_patch(:) = nan

    end subroutine InitAllocate
***************
*** 222,227 ****
--- 226,238 ----
           avgflag='A', long_name='total ozone flux into shaded leaves', &
           ptr_patch=this%o3uptakesha_patch)

+ ! delete later
+ !    this%forc_ozone(bounds%begg:bounds%endg) = spval
+ !    call hist_addfld1d (fname='O3_TEST', units='mol/mol', &
+ !         avgflag='A', long_name='ozone concentration', &
+ !         ptr_lnd=this%forc_ozone)
+ 
+ 
    end subroutine InitHistory

    !-----------------------------------------------------------------------
***************
*** 316,328 ****

    !-----------------------------------------------------------------------
    subroutine CalcOzoneStress(this, bounds, num_exposedvegp, filter_exposedvegp, &
!        forc_pbot, forc_th, rssun, rssha, rb, ram, tlai)
      !
      ! !DESCRIPTION:
      ! Calculate ozone stress.
      !
      ! !USES:
      use PatchType            , only : patch                
      !
      ! !ARGUMENTS:
      class(ozone_type)      , intent(inout) :: this
--- 327,340 ----

    !-----------------------------------------------------------------------
    subroutine CalcOzoneStress(this, bounds, num_exposedvegp, filter_exposedvegp, &
!        forc_ozone, forc_pbot, forc_th, rssun, rssha, rb, ram, tlai)
      !
      ! !DESCRIPTION:
      ! Calculate ozone stress.
      !
      ! !USES:
      use PatchType            , only : patch                
+ !    use clm_varctl           , only : iulog
      !
      ! !ARGUMENTS:
      class(ozone_type)      , intent(inout) :: this
***************
*** 331,336 ****
--- 343,349 ----
      integer  , intent(in) :: filter_exposedvegp(:)     ! patch filter for non-snow-covered veg
      real(r8) , intent(in) :: forc_pbot( bounds%begc: ) ! atmospheric pressure (Pa)
      real(r8) , intent(in) :: forc_th( bounds%begc: )   ! atmospheric potential temperature (K)
+     real(r8) , intent(in) :: forc_ozone( bounds%begg: )! ozone concentration 
      real(r8) , intent(in) :: rssun( bounds%begp: )     ! leaf stomatal resistance, sunlit leaves (s/m)
      real(r8) , intent(in) :: rssha( bounds%begp: )     ! leaf stomatal resistance, shaded leaves (s/m)
      real(r8) , intent(in) :: rb( bounds%begp: )        ! boundary layer resistance (s/m)
***************
*** 341,346 ****
--- 354,360 ----
      integer  :: fp             ! filter index
      integer  :: p              ! patch index
      integer  :: c              ! column index
+     integer  :: g              ! gridcell index

      character(len=*), parameter :: subname = 'CalcOzoneStress'
      !-----------------------------------------------------------------------
***************
*** 348,353 ****
--- 362,368 ----
      ! Enforce expected array sizes
      SHR_ASSERT_ALL((ubound(forc_pbot) == (/bounds%endc/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(forc_th) == (/bounds%endc/)), errMsg(__FILE__, __LINE__))
+     SHR_ASSERT_ALL((ubound(forc_ozone) == (/bounds%endg/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(rssun) == (/bounds%endp/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(rssha) == (/bounds%endp/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(rb) == (/bounds%endp/)), errMsg(__FILE__, __LINE__))
***************
*** 367,389 ****
      do fp = 1, num_exposedvegp
         p = filter_exposedvegp(fp)
         c = patch%column(p)

         ! Ozone stress for shaded leaves
         call CalcOzoneStressOnePoint( &
!             forc_ozone=forc_ozone, forc_pbot=forc_pbot(c), forc_th=forc_th(c), &
              rs=rssha(p), rb=rb(p), ram=ram(p), &
              tlai=tlai(p), tlai_old=tlai_old(p), pft_type=patch%itype(p), &
              o3uptake=o3uptakesha(p), o3coefv=o3coefvsha(p), o3coefg=o3coefgsha(p))

         ! Ozone stress for sunlit leaves
         call CalcOzoneStressOnePoint( &
!             forc_ozone=forc_ozone, forc_pbot=forc_pbot(c), forc_th=forc_th(c), &
              rs=rssun(p), rb=rb(p), ram=ram(p), &
              tlai=tlai(p), tlai_old=tlai_old(p), pft_type=patch%itype(p), &
              o3uptake=o3uptakesun(p), o3coefv=o3coefvsun(p), o3coefg=o3coefgsun(p))

         tlai_old(p) = tlai(p)

      end do

      end associate
--- 382,409 ----
      do fp = 1, num_exposedvegp
         p = filter_exposedvegp(fp)
         c = patch%column(p)
+        g = patch%gridcell(p)
+ ! delete later
+        this%forc_ozone(g) = forc_ozone(g)

         ! Ozone stress for shaded leaves
         call CalcOzoneStressOnePoint( &
!             forc_ozone=forc_ozone(g), forc_pbot=forc_pbot(c), forc_th=forc_th(c), &
              rs=rssha(p), rb=rb(p), ram=ram(p), &
              tlai=tlai(p), tlai_old=tlai_old(p), pft_type=patch%itype(p), &
              o3uptake=o3uptakesha(p), o3coefv=o3coefvsha(p), o3coefg=o3coefgsha(p))

         ! Ozone stress for sunlit leaves
         call CalcOzoneStressOnePoint( &
!             forc_ozone=forc_ozone(g), forc_pbot=forc_pbot(c), forc_th=forc_th(c), &
              rs=rssun(p), rb=rb(p), ram=ram(p), &
              tlai=tlai(p), tlai_old=tlai_old(p), pft_type=patch%itype(p), &
              o3uptake=o3uptakesun(p), o3coefv=o3coefvsun(p), o3coefg=o3coefgsun(p))

         tlai_old(p) = tlai(p)

+ !       write(iulog,*) '[O3] = ',g,forc_ozone(g),o3uptakesun(p),o3uptakesha(p),rssun(p)
+ 
      end do

      end associate
[erik@yslogin3 clm4_5_1_r104_Fire_O3_spinupFinal]$ diff -cwb /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/OzoneOffMod.F90  SourceMods/src.clm/
*** /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/OzoneOffMod.F90   2015-02-18 15:49:08.604774935 -0700
--- SourceMods/src.clm/OzoneOffMod.F90  2015-05-12 13:44:46.685219000 -0600
***************
*** 78,84 ****
    end subroutine Restart

    subroutine CalcOzoneStress(this, bounds, num_exposedvegp, filter_exposedvegp, &
!           forc_pbot, forc_th, rssun, rssha, rb, ram, tlai)

      class(ozone_off_type) , intent(inout) :: this
      type(bounds_type)      , intent(in)    :: bounds
--- 78,84 ----
    end subroutine Restart

    subroutine CalcOzoneStress(this, bounds, num_exposedvegp, filter_exposedvegp, &
!           forc_ozone, forc_pbot, forc_th, rssun, rssha, rb, ram, tlai)

      class(ozone_off_type) , intent(inout) :: this
      type(bounds_type)      , intent(in)    :: bounds
***************
*** 86,91 ****
--- 86,92 ----
      integer  , intent(in) :: filter_exposedvegp(:)     ! patch filter for non-snow-covered veg
      real(r8) , intent(in) :: forc_pbot( bounds%begc: ) ! atmospheric pressure (Pa)
      real(r8) , intent(in) :: forc_th( bounds%begc: )   ! atmospheric potential temperature (K)
+     real(r8) , intent(in) :: forc_ozone( bounds%begg: )! ozone concentration
      real(r8) , intent(in) :: rssun( bounds%begp: )     ! leaf stomatal resistance, sunlit leaves (s/m)
      real(r8) , intent(in) :: rssha( bounds%begp: )     ! leaf stomatal resistance, shaded leaves (s/m)
      real(r8) , intent(in) :: rb( bounds%begp: )        ! boundary layer resistance (s/m)
***************
*** 96,101 ****
--- 97,103 ----
      ! ozone-off can pick up problems with the call to this routine)
      SHR_ASSERT_ALL((ubound(forc_pbot) == (/bounds%endc/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(forc_th) == (/bounds%endc/)), errMsg(__FILE__, __LINE__))
+     SHR_ASSERT_ALL((ubound(forc_ozone) == (/bounds%endg/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(rssun) == (/bounds%endp/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(rssha) == (/bounds%endp/)), errMsg(__FILE__, __LINE__))
      SHR_ASSERT_ALL((ubound(rb) == (/bounds%endp/)), errMsg(__FILE__, __LINE__))

[erik@yslogin3 clm4_5_1_r104_Fire_O3_spinupFinal]$ diff -cwb /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/CanopyFluxesMod.F90  SourceMods/src.clm/
*** /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/biogeophys/CanopyFluxesMod.F90   2015-02-18 15:49:08.646431176 -0700
--- SourceMods/src.clm/CanopyFluxesMod.F90  2015-05-12 13:44:46.590002000 -0600
***************
*** 293,298 ****
--- 293,299 ----
           forc_q                 => atm2lnd_inst%forc_q_downscaled_col           , & ! Input:  [real(r8) (:)   ]  atmospheric specific humidity (kg/kg)                                 
           forc_pbot              => atm2lnd_inst%forc_pbot_downscaled_col        , & ! Input:  [real(r8) (:)   ]  atmospheric pressure (Pa)                                             
           forc_th                => atm2lnd_inst%forc_th_downscaled_col          , & ! Input:  [real(r8) (:)   ]  atmospheric potential temperature (Kelvin)                            
+          forc_ozone             => atm2lnd_inst%forc_ozone_grc                  , & ! Input:  [real(r8) (:)   ]  ozone concentration (mol/mol) 
           forc_rho               => atm2lnd_inst%forc_rho_downscaled_col         , & ! Input:  [real(r8) (:)   ]  density (kg/m**3)                                                     
           forc_t                 => atm2lnd_inst%forc_t_downscaled_col           , & ! Input:  [real(r8) (:)   ]  atmospheric temperature (Kelvin)                                      
           forc_u                 => atm2lnd_inst%forc_u_grc                      , & ! Input:  [real(r8) (:)   ]  atmospheric wind speed in east direction (m/s)                        
***************
*** 1145,1150 ****
--- 1146,1152 ----
             bounds, fn, filterp, &
             forc_pbot = atm2lnd_inst%forc_pbot_downscaled_col(bounds%begc:bounds%endc), &
             forc_th   = atm2lnd_inst%forc_th_downscaled_col(bounds%begc:bounds%endc), &
+            forc_ozone= atm2lnd_inst%forc_ozone_grc(bounds%begg:bounds%endg), &
             rssun     = photosyns_inst%rssun_patch(bounds%begp:bounds%endp), &
             rssha     = photosyns_inst%rssha_patch(bounds%begp:bounds%endp), &
             rb        = frictionvel_inst%rb1_patch(bounds%begp:bounds%endp),       
[erik@yslogin3 clm4_5_1_r104_Fire_O3_spinupFinal]$ diff -cwb /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/cpl/clm_cpl_indices.F90  SourceMods/src.clm/
*** /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/cpl/clm_cpl_indices.F90  2015-02-18 15:49:11.260046207 -0700
--- SourceMods/src.clm/clm_cpl_indices.F90  2015-05-12 13:44:46.606482000 -0600
***************
*** 98,103 ****
--- 98,104 ----
    integer, public ::index_x2l_Faxa_dstdry2    ! flux: Size 2 dust -- dry deposition
    integer, public ::index_x2l_Faxa_dstdry3    ! flux: Size 3 dust -- dry deposition
    integer, public ::index_x2l_Faxa_dstdry4    ! flux: Size 4 dust -- dry deposition
+   integer, public ::index_x2l_Faxa_ozone

    integer, public ::index_x2l_Flrr_flood      ! rtm->lnd rof (flood) flux
    integer, public ::index_x2l_Flrr_volr      ! rtm->lnd rof volr
***************
*** 225,230 ****
--- 226,232 ----
      index_x2l_Flrr_volr     = mct_avect_indexra(x2l,'Flrr_volr')

      index_x2l_Faxa_lwdn     = mct_avect_indexra(x2l,'Faxa_lwdn')
+     index_x2l_Faxa_ozone    = mct_avect_indexra(x2l,'Faxa_ozone')
      index_x2l_Faxa_rainc    = mct_avect_indexra(x2l,'Faxa_rainc')
      index_x2l_Faxa_rainl    = mct_avect_indexra(x2l,'Faxa_rainl')
      index_x2l_Faxa_snowc    = mct_avect_indexra(x2l,'Faxa_snowc')      
[erik@yslogin3 clm4_5_1_r104_Fire_O3_spinupFinal]$ diff -cwb /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/cpl/lnd_import_export.F90  SourceMods/src.clm/
*** /glade/p/work/dll/clm4_5_1_r104/models/lnd/clm/src/cpl/lnd_import_export.F90    2015-02-18 15:49:11.261632747 -0700
--- SourceMods/src.clm/lnd_import_export.F90    2015-05-12 13:44:46.642144000 -0600
***************
*** 119,124 ****
--- 119,125 ----
         atm2lnd_inst%forc_pbot_not_downscaled_grc(g)  = x2l(index_x2l_Sa_pbot,i)      ! ptcmxy  Atm state Pa
         atm2lnd_inst%forc_t_not_downscaled_grc(g)     = x2l(index_x2l_Sa_tbot,i)      ! forc_txy  Atm state K
         atm2lnd_inst%forc_lwrad_not_downscaled_grc(g) = x2l(index_x2l_Faxa_lwdn,i)    ! flwdsxy Atm flux  W/m^2
+        atm2lnd_inst%forc_ozone_grc(g)                = x2l(index_x2l_Faxa_ozone,i)

         forc_rainc                                    = x2l(index_x2l_Faxa_rainc,i)   ! mm/s
         forc_rainl                                    = x2l(index_x2l_Faxa_rainl,i)   ! mm/s
ekluzek commented 6 years ago

Erik Kluzek < erik > - 2016-03-14 12:17:12 -0600

I added some extra print statements to see what was going on...

 227: CH4 Conservation Error in CH4Mod during diffusion, nstep, c, errch4 (mol /m^2.timestep)         266      201020                       NaN
 227: sat, lake =            0 F
 227: ch4_surf_aere, ch4_surf_ebul, ch3_surf_diff, dtime    0.0000000000000000        0.0000000000000000                            NaN   1800.0000000000000     
 227: conc_ch4                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN
 227: conc_ch4_bef   3.8328039302938165E-005   2.9561403443981704E-005   2.6359916480942497E-005   2.4435337229353914E-005   2.3147560124220125E-005   2.2404625980298573E-005   2.0924944088661782E-005   1.9404767558147072E-005   1.7936954369688352E-005   1.5384162504878149E-005   1.2893399328101690E-005   1.0338822482775341E-005   7.8572942037786159E-006   5.4572021687422612E-006   3.3105790076109817E-006   1.7007514334411750E-006   7.1782467412185338E-007   2.4280145167977517E-007   6.5108239992595754E-008   1.5836061520245128E-008
 227: ch4_prod_depth   0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000     
 227: ch4_oxid_depth                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN
 227: ch4_aere_depth   0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000     
 227: epsilon_t-1                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN
 227: conc_ch4_rel                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN
 227: watsat  0.69094611637956804       0.55403635758411096       0.51465038107298955       0.49052449073912030       0.47792207960252064       0.47616899096880327       0.46805018132178999       0.46283752477255785       0.46283752477255785       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997     
 227: k_h_cc                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN
 227: h2osoi_vol_min  0.69094611637956804       0.55403635758411096       0.51465038107298955       0.49052449073912030       0.47792207960252064       0.47616899096880327       0.46805018132178999       0.46283752477255785       0.46283752477255785       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997       0.45245999999999997     
 227: liqfrac   1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000        1.0000000000000000     
 227: t_soisno   0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000        0.0000000000000000                            NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN                       NaN
 227: t_grnd                       NaN
 227: Latdeg,Londeg=   53.286844012453230        57.510967220423055     
 227: ENDRUN: ERROR: CH4 Conservation Error in CH4Mod during diffusionERROR in /glade/scratch/erik/cesm1_5_alpha06c/components/clm/src/biogeochem/ch4Mod.F90 at line 3598                                                                                                                                                                                                                                                                                                                                                                                                                             
 227: ERROR: Unknown error submitted to shr_sys_abort.
 227:#0  0x2BA8AEE26B57
 227:#1  0x159F44D in __shr_sys_mod_MOD_shr_sys_backtrace
 227:#2  0x159F7A6 in __shr_sys_mod_MOD_shr_sys_abort
 227:#3  0xDDB8AA in __abortutils_MOD_endrun_vanilla
 227:#4  0x1093399 in __ch4mod_MOD_ch4_tran at ch4Mod.F90:0
 227:#5  0x10A3E8C in __ch4mod_MOD_ch4
 227:#6  0xDE160C in __clm_driver_MOD_clm_drv._omp_fn.3 at clm_driver.F90:0
 227:#7  0x2BA8AF3BB96E
 227:#8  0xDE26DB in __clm_driver_MOD_clm_drv
 227:#9  0xDD770B in __lnd_comp_mct_MOD_lnd_run_mct
 227:#10  0x41E585 in __component_mod_MOD_component_run
 227:#11  0x40C91A in __cesm_comp_mod_MOD_cesm_run
billsacks commented 4 years ago

See also #270, of which this is one piece.

billsacks commented 1 year ago

This was done by @adrifoster in #1837