Summary of Aspen Data & Variables

Live basal area at time ‘t=0’ (2025 for modeling purposes)

asp.plot=plot_ly(data = Asp.25, y = ~ LiveBA, type = 'box')%>%
  layout(title='Aspen Live Basal Area')
  
asp.plot
Asp.S = Asp %>%
  group_by(MgmtID, Year, LiveBA) %>%
  summarise()
## `summarise()` has grouped output by 'MgmtID', 'Year'. You can override using
## the `.groups` argument.

Effects of fire in year of occurrence (2035 for modeling purposes)

Asp.35 = Asp %>%
  filter(Year==2040)
asp.plot=plot_ly(data = Asp.35, y = ~ LiveBA, x = ~ MgmtID, type = 'box', color = ~ MgmtID)%>%
  layout(title='Aspen Live Basal Area by FIC at Year of Fire')
  
asp.plot

Here we see the longer term trajectory of LiveBA for quaking aspen, where we see the effect of fire induced sprouting.

asp.plot2=plot_ly(data = Asp, x = ~ Year, y = ~ LiveBA, type = 'scatter', mode= 'markers', color = ~ MgmtID, opacity = .7)%>%
  layout(title='Timeseries View of Aspen Live Basal Area')
  
asp.plot2

Response function at the year of disturbance (current quantification framework):

kable(Asp.RF.35%>%
  select('MgmtID', 'RF.mean', 'RF.rd'))%>%
  kable_styling(latex_options = "striped")
MgmtID RF.mean RF.rd
CRbs 0.0000000 0.000
FIC1 -0.0713667 -0.071
FIC2 -0.1230710 -0.123
FIC3 -0.2816025 -0.282
FIC4 -0.5719740 -0.572
FIC5 -0.9421912 -0.942
FIC6 -0.9828619 -0.983

Response function 5 years post disturbance: equivalent to treatments allowed to rebound

kable(Asp.RF.40%>%
  select('MgmtID', 'RF.mean', 'RF.rd'))%>%
  kable_styling(latex_options = "striped")
MgmtID RF.mean RF.rd
CRbs 0.0000000 0.000
FIC1 0.4650642 0.465
FIC2 0.4062239 0.406
FIC3 0.2089694 0.209
FIC4 -0.1341042 -0.134
FIC5 -0.5612706 -0.561
FIC6 -0.6078454 -0.608