knitr::opts_chunk$set(echo = FALSE, message = FALSE, warning = FALSE, tidy = TRUE)
library(knitr)
library(kableExtra)
library(dplyr)

Who and what is WaCSE for? {.unlisted .unnumbered}

The Washington State Department of Agriculture{target="_blank"} developed WaCSE for the Washington State Conservation Commission{target="_blank"} to use in the Sustainable Farms and Fields (SFF) program. Intended users are the Conservation Commission, conservation districts, growers, and anyone interested in reducing agricultural greenhouse gas (GHG) emissions. This interactive tool estimates the reduction of GHG emissions from different conservation practices across Washington’s diverse counties.

What are carbon dioxide equivalents? {.unlisted .unnumbered}

Carbon dioxide equivalent (CO2eq) is a unit used to compare various greenhouse gases based on their relative global warming potential.

What are total greenhouse gases? {.unlisted .unnumbered}

Total greenhouse gases (GHG) are the sum of carbon dioxide, methane, and nitrous oxide in units of CO2eq. Estimates include those associated with soils and woody biomass, but do not include off-site emissions like those from transportation.

What are emission reduction coefficients? {.unlisted .unnumbered}

Emission reduction coefficients were calculated by COMET-Farm, which uses USDA greenhouse gas inventory methods. More information on quantification methods can be found in the COMET-Planner Report.

What are major land resource areas? {.unlisted .unnumbered}

Major Land Resource Areas (MLRA) are defined by the NRCS as regions with similar physiography, climate, soils, biological resources, and land use (USDA-NRCS 2006). The GHG emission reduction estimates were calculated at the spatial scale of these multi-county MLRAs (Swan et al. 2024).

Counties within the same MLRA will have the same estimate, unless the county falls within multiple MLRAs. Visit WSDA's online map{target="_blank"} to identify which county is in which MLRA.

Where do the potential GHG emission reduction values come from? {.unlisted .unnumbered}

Values were determined by the United States Department of Agriculture's Natural Resources Conservation Service (NRCS). NRCS reviewed field studies and applied a sample-based metamodeling approach to calculate potential GHG emission reduction coefficients. These values are derived from county-rectified major land resource areas (Swan et al. 2024).

NRCS and Colorado State University developed two tools to estimate impacts on GHG and soil carbon from conservation practices.

How does WaCSE differ from COMET-Farm and COMET-Planner? {.unlisted .unnumbered}

WaCSE uses the COMET-Planner dataset and provides identical estimates. With WaCSE, however, data can be compared between multiple counties and multiple practices at once. WaCSE provides data in tables and bar graphs that can easily be downloaded in spreadsheets and PDFs. WaCSE also helps the user understand their GHG reduction estimate by providing a calculator to convert the emissions data into equivalents from home energy use, consuming gasoline, charging smartphones, and more!

What do negative values mean? {.unlisted .unnumbered}

Negative values indicate a loss of carbon or increased emissions of GHG (Swan et al. 2024).

Where can I find more information about the NRCS conservation practices? {.unlisted .unnumbered}

For technical guides, review the NRCS conservation practices standards (CPS){target="_blank"}.

References {.unlisted .unnumbered}

Amy Swan, Mark Easter, Adam Chambers, Kevin Brown, Stephen A. Williams, Jeff Creque, John Wick, Keith Paustian. 2024. COMET-Planner Dataset, Version 3.1, Build 2, and COMET-Planner Report: Carbon and Greenhouse Gas Evaluation for NRCS Conservation Practice Planning. A Companion report to COMET-Planner{target="_blank"}. COMET-Planner Report{target="_blank"}.

USDA-NRCS. 2006. Land Resource Regions and Major Land Resource Areas of the United States, the Caribbean, and the Pacific Basin. USDA, Natural Resource Conservation Service, Handbook 296.

Suggested Citation {.unlisted .unnumbered}

When using WaCSE, we appreciate if you include a reference in your publications. To cite the web application, please use:

Ryan JN, Michel L, Gelardi DL. 2025. WaCSE: A shiny web app for comparing climate benefits of agricultural conservation practices. Natural Resources & Agricultural Sciences, Washington Department of Agriculture. https://github.com/WA-Department-of-Agriculture/WaCSE{.uri target="_blank"}.

Source Code and Feedback {.unlisted .unnumbered}

To view the source code, visit the GitHub repository{target="_blank"}.

If you have feedback or would like to report a bug, please submit an issue{target="_blank"} or contact the app developer: Jadey Ryan at jryan\@agr.wa.gov.

\newpage

View your estimated GHG emission reductions {.unlisted .unnumbered}

Table Notes {.unlisted .unnumbered}

\renewcommand{\arraystretch}{1.5}

summary_df <- params$summary |>
  janitor::adorn_totals(fill = "", name = "Totals")


kbl_summary <- kbl(summary_df,
  col.names = c(
    "MLRA",
    "County",
    "Unique Practice Implementations",
    "Total Acres",
    "Total GHG (MT CO2eq/yr)"
  ),
  row.names = FALSE,
  format = "latex",
  caption = "Summary of Estimated Total Greenhouse Gas (GHG) Emission Reductions by County",
  align = "llrrr",
  format.args = list(big.mark = ",", scientific = FALSE, digits = 2),
  booktabs = TRUE,
  longtable = TRUE
) |>
  kable_styling(
    position = "left",
    latex_options = c("HOLD_position", "repeat_header", "striped")
  ) |>
  row_spec(
    row = 0,
    bold = TRUE
  ) |>
  row_spec(dim(summary_df)[1] - 1,
    hline_after = TRUE
  ) |>
  row_spec(dim(summary_df)[1],
    bold = TRUE
  )

kbl_summary

\renewcommand{\arraystretch}{2.5}

options(knitr.kable.NA = "Not estimated")

df <- params$data |>
  dplyr::select(-c(mlra, class)) |>
  janitor::adorn_totals(fill = "", name = "Totals")

kbl_all <- kbl(df,
  col.names = c(
    "County",
    "Practice",
    "Implementation",
    "Acres",
    "Carbon Dioxide",
    "Nitrous Oxide",
    "Methane",
    "Total GHG"
  ),
  row.names = FALSE,
  format = "latex",
  caption = "Estimated Greenhouse Gas (GHG) Emission Reductions",
  align = "lllrrrrr",
  format.args = list(big.mark = ",", scientific = FALSE, digits = 2),
  booktabs = TRUE,
  longtable = TRUE
) |>
  add_header_above(c(" " = 4, "(Metric tonnes CO2eq per year)" = 4),
    italic = TRUE
  ) |>
  kable_styling(
    position = "left",
    latex_options = c("HOLD_position", "repeat_header", "striped")
  ) |>
  row_spec(
    row = 0,
    bold = TRUE
  ) |>
  row_spec(dim(df)[1] - 1,
    hline_after = TRUE
  ) |>
  row_spec(dim(df)[1],
    bold = TRUE
  ) |>
  column_spec(
    column = c(1, 4:8),
    width = "0.8in"
  ) |>
  column_spec(
    column = 2:3,
    width = "1.8in"
  )

kbl_all
include_graphics(params$plot_path)

\newpage

Understand your impact {.unlisted .unnumbered}

The values shown here are your total estimated emissions reductions converted into terms you are more likely familiar with. Assumptions and equations used to calculate these values are provided in the Environmental Protection Agency's (EPA) Greenhouse Gases Equivalencies Calculator{target="_blank"}. Results may differ slightly from those returned by EPA's calculator due to rounding.

total_ghg <- params$data |>
  select(total_ghg_co2) |>
  as.vector() |>
  unlist() |>
  sum()

Your total estimated GHG emission reduction is: r format(total_ghg, big.mark = ",", digits = 2) metric tonnes CO2eq per year. {.unlisted .unnumbered}

\renewcommand{\arraystretch}{1.8}

sys.source(paste0(tempdir(), "/fct_ghgEq.R"), envir = knitr::knit_global())

type <- c("home", "gas", "smartphone", "waste", "trash", "light", "seedling", "forest", "conversion")

description <- c(
  "homes' electricity use for one year",
  "gallons of gas consumed",
  "number of smartphones charged",
  "tons of waste recycled instead of landfilled",
  "trash bags of waste recycled instead of landfilled",
  "incandescent lamps switched to LEDs",
  "tree seedlings grown for 10 years",
  "acres of US forests in one year",
  "acres of US forests preserved from conversion to cropland in one year"
)

value <- lapply(type, fct_ghgEq, CO2eq = total_ghg) |>
  unlist()

df <- data.frame(value, description)

options(knitr.table.toprule = NULL, knitr.table.bottomrule = NULL)

kbl_equivalencies <- kbl(df,
  align = "rl",
  booktabs = TRUE,
  col.names = NULL
) |>
  kable_styling(position = "left", latex_options = "HOLD_position") |>
  pack_rows(
    index = c(
      "This is equivalent to CO2 emissions from:" = 3,
      "This is equivalent to GHG emissions avoided by:" = 3,
      "This is equivalent to carbon sequestered by:" = 3
    ),
    hline_before = TRUE,
    hline_after = TRUE
  ) |>
  column_spec(
    column = 1,
    width = "2.2in",
    bold = TRUE,
    latex_valign = "m"
  ) |>
  column_spec(
    column = 2,
    width = "5in",
    latex_valign = "m"
  ) |>
  (function(x) sub("\\\\toprule", "", x))() |>
  (function(x) sub("\\\\bottomrule", "", x))()

kbl_equivalencies


WA-Department-of-Agriculture/WaCSEshiny documentation built on June 2, 2025, 12:35 p.m.