LANDFIRE Late Succession Assessment Demo
  • Home
  • Methods
  • Results
  • Discussion
  • About

On this page

  • Historical Ecosystems
  • Estimated Percentages of Late-Succesional Habitat, Reference and Current
  • Estimated Changes in Late Successional, Reference to Current
  • Reference and current open-canopy late successional habitat
  • Reference and current closed-canopy late successional habitat
  • Estimated Changes in Late Successional Habitat, Reference to Current, Open and Closed

Results

Historical Ecosystems

This chart represents the historical ecosystems of our area of interest, split out by estimated acres of the various succession classes, pre-European Settlement (referred to as ‘Reference’). On the y axis are names of LANDFIRE’s BpSs and the x axis represent the number of acres. The colors represent the age classes; the purple and orange areas represent late-succession ecosystems. We mapped 28 BpSs within the area of interest. For the chart below excluded BpSs with footprints of less than 100,000 acres. Roughly 60% of the area is estimated to have been historically classified as late-successional habitat.

Show the code
library(tidyverse)
library(scales)


raw_data <- read.csv("data/final_df.csv") %>%
  filter(!is.na(age_category)) %>%
  filter(bps_acres > 100000)


# get labels ordered properly

raw_data$age_category <- factor(raw_data$age_category, 
                                    levels = c(
                                      "Early1",
                                      "Mid1",
                                      "Mid2",
                                      "Late1",
                                      "Late2"
                                    ))

raw_data$age_category <- factor(raw_data$age_category, levels = rev(levels(raw_data$age_category)))



plot_acres <-
  ggplot(raw_data, aes(fill = age_category, y = ref_scls_acres, x = reorder(bps_name, -bps_acres))) +
  geom_bar(position = "stack", stat = "identity") +
  coord_flip() +
  labs(
    title = "",
    subtitle = "",
    caption = "Data from landfire.gov. BpSs with small footprint removed for clarity (> 100k acres)",
    x = "",
    y = "Acres",
    fill = "Succession Class") +
  scale_x_discrete(limits = rev, labels = wrap_format(20)) +
  scale_y_continuous(label = comma, n.breaks = 4) + 
  theme_bw(base_size = 12) + 
  scale_fill_manual(values = c("#f5922f", # orange
                               "#532a66", # purple
                               "#827c75", # grey
                               "#f5eb2f", # yellow
                               "#74a36f" # green-natural veg
  )) +
  theme(plot.caption = element_text(hjust = 0, face = "italic"), #Default is hjust=1
        plot.title.position = "plot", #NEW parameter. Apply for subtitle too.
        plot.caption.position =  "plot") +
  theme(legend.position = c(0.8, 0.2)) + 
  theme(plot.margin = unit(c(0.2, 0.75, 0.2, 0.2),
                           "inches"))

plot_acres

Estimated Percentages of Late-Succesional Habitat, Reference and Current

The map below represents the reference and current (ca2020) percentages of late-successional forest by ecosystem. In general there has been a substantial loss of late-successional habitat in this area. Loss is calculated per ecosystem, and the percent is the same across each ecosystem’s footprint. We did not map where late succession occurred historically as it likely moved around so we cannot calculate change at a per pixel level.

Estimated Changes in Late Successional, Reference to Current

This chart shows changes in amounts of late-successional habitat by ecosystem, reference to current (ca2020). The y axis are the top LANDFIRE BpSs and the x axis displays the percent change from reference to current . The arrows/ecosystems are arranged in descending order from most prevalent to least (at the bottom). Yellow arrows indicate a loss, while the green ones represent a gain.

Here we present the same ecosystems as above, i.e., ones mapped with more than 100,000ac.

Show the code
## filter, group and add helper columns

old_classes <- c("Late1", "Late2")

old_growth_loss <- raw_data %>%
  filter(age_category %in% old_classes) %>%
  group_by(bps_name) %>%
  summarize(ref_percent = sum(ref_percent, na.rm = TRUE),
            cur_percent = sum(cur_percent, na.rm = TRUE),
            bps_acres = max(bps_acres)) %>%
  mutate(change = cur_percent - ref_percent,
       sign_change = (change >0)) 


# try arrow plot


arrow_plot <- old_growth_loss |> 
  ggplot(aes(
      x = ref_percent, xend = cur_percent, 
      y = reorder(bps_name, -bps_acres), yend = bps_name,
      color = sign_change)) +
  geom_segment(
    arrow = arrow(angle = 30, length = unit(0.5, 'cm')),
    size = 2) +
  labs(
    x = 'Percent Change', 
    y = element_blank(),
    title = 'Changes in Late Succession Classes References to ~2020',
    subtitle = 'BpSs in descending order by total extent'
  ) +
  scale_color_manual(
    values = c("#fcba03", "#10692c")) +
  theme_bw(base_size = 12) + 
  theme(legend.position = "none") +
  scale_y_discrete(limits = rev, labels = wrap_format(20)) 


arrow_plot

Reference and current open-canopy late successional habitat

This map represents the percent of reference (left) and current (right), open-canopy, late-successional forests. Reference open-canopy late-succession habitat ranged from 5-68% per BpS, and currently that amount ranges from 1-28% per BpS.

Reference and current closed-canopy late successional habitat

This map represents the percent of reference (left) and current (right), closed-canopy, late-successional forests. Reference closed-canopy late-succession habitat ranged from 42-55% per BpS, and currently that amount ranges from 32-84% per BpS.

Estimated Changes in Late Successional Habitat, Reference to Current, Open and Closed

This chart shows change in amounts of late-successional open and closed canopy habitat by ecosystem, from modeled reference to mapped using data from 2020. The y axis are the top LANDFIRE BpSs and the x axis displays the percent change from reference to ca2020. The arrows/ecosystems are arranged in descending order from most prevalent to least (at the bottom). Yellow arrows indicate a loss, while the green ones represent a gain.

Example interpretations: 1) North Pacific Maritime Mesic-Wet Douglas-fir Western Hemlock Forest experienced a ~73% decrease in closed-canopy and a ~5% decrease in open-canopy forest type. 2) Mediterranean California Dry-Mesic Mixed Conifer Forest and Woodland experienced a ~23% increase in closed-canopy and a ~35% decrease in open-canopy forest type.

Show the code
## old growth change split out by open/closed


library(tidyverse)


## filter, group and add helper columns


old_classes <- c("Late1", "Late2")

old_growth_chng_canopy <- raw_data %>%
  filter(age_category %in% old_classes) %>%
  filter(canopy_category != 'ALL') %>%
  group_by(bps_name, canopy_category) %>%
  summarize(ref_percent = sum(ref_percent, na.rm = TRUE),
            cur_percent = sum(cur_percent, na.rm = TRUE),
            bps_acres = max(bps_acres)) %>%
  mutate(change = cur_percent - ref_percent,
         sign_change = (change > 0)) 


## try chart with facets

facet_names <- c(
  "CLS" = "Closed Canopy",
  "OPN" = "Open Canopy"
)

canopy_arrow_plot <- old_growth_chng_canopy %>%
  ggplot(aes(
    x = ref_percent, xend = cur_percent, 
    y = reorder(bps_name, bps_acres), yend = bps_name,
    color = sign_change)) +
  geom_segment(
    arrow = arrow(angle = 30, length = unit(0.5, 'cm')),
    size = 2) +
  labs(
    x = 'Percent Change', 
    y = element_blank(),
    title = 'Changes in Late Succession Classes Historical to ~2020',
    subtitle = 'Arrows in descending order by total extent of ecosystem'
  ) +
  scale_color_manual(
    values = c("#fcba03", "#10692c")) +
  theme_bw(base_size = 12) + 
  theme(legend.position = "none") +
  facet_wrap(~ canopy_category, 
             ncol = 2,
             labeller = as_labeller(facet_names))+
  scale_y_discrete(limits = rev, labels = wrap_format(20))

canopy_arrow_plot