FRG scalars

##   StandID   count         m2     total      weight
## 1   63437 1362536 1226282400 412127346 0.003306104
## 2   51690  999382  899443800 412127346 0.002424935
## 3   62761  880643  792578700 412127346 0.002136823
## 4   63431  851508  766357200 412127346 0.002066128
## 5    8380  779152  701236800 412127346 0.001890561
## 6    4689  743339  669005100 412127346 0.001803663
##   StandID  count        m2    total      weight
## 1   64438 649516 584564400 36914631 0.017595083
## 2   40797 643370 579033000 36914631 0.017428591
## 3   37913 583398 525058200 36914631 0.015803978
## 4   37952 492879 443591100 36914631 0.013351860
## 5   40228 397812 358030800 36914631 0.010776540
## 6   40806 289181 260262900 36914631 0.007833777
fig <- plot_ly(alpha = .6)


fig = fig %>% add_histogram(x = ~frg1.freq$StandID, name = 'frg1')
fig = fig %>% add_histogram(x = ~frg2.freq$StandID, name = 'frg2')
fig = fig %>% add_histogram(x = ~frg3.freq$StandID, name = 'frg3')
fig = fig %>% add_histogram(x = ~frg4.freq$StandID, name = 'frg4')
fig = fig %>% add_histogram(x = ~frg5.freq$StandID, name = 'frg5')
fig
frg1.carb = AGB%>%
  filter(StandID %in% frg1.freq$StandID)%>%
  left_join(frg1.freq, AGB, by = 'StandID')%>%
  filter(StandID != 0)%>%
  #filter(count > 25)%>%
  mutate(total = sum(count))%>%
  mutate(weight = count / total)%>%
  group_by(StandID, MgmtID)%>%
  mutate(w.Carb = d.prop * weight)%>%
  select(MgmtID, Year, d.prop, w.Carb, weight)%>%
  mutate(FRG = 1)
## Adding missing grouping variables: `StandID`
frg2.carb = AGB%>%
  filter(StandID %in% frg2.freq$StandID)%>%
  left_join(frg2.freq, AGB, by = 'StandID')%>%
  filter(StandID != 0)%>%
  filter(count > 25)%>%
  mutate(total = sum(count))%>%
  mutate(weight = count / total)%>%
  group_by(StandID, MgmtID)%>%
  mutate(w.Carb = d.prop * weight)%>%
  select(MgmtID, Year, d.prop, w.Carb, weight)%>%
  mutate(FRG = 2)
## Adding missing grouping variables: `StandID`
frg3.carb = AGB%>%
  filter(StandID %in% frg3.freq$StandID)%>%
  left_join(frg3.freq, AGB, by = 'StandID')%>%
  filter(StandID != 0)%>%
  #filter(count > 25)%>%
  mutate(total = sum(count))%>%
  mutate(weight = count / total)%>%
  group_by(StandID, MgmtID)%>%
  mutate(w.Carb = d.prop * weight)%>%
  select(MgmtID, Year, d.prop, w.Carb, weight)%>%
  mutate(FRG = 3)
## Adding missing grouping variables: `StandID`
frg4.carb = AGB%>%
  filter(StandID %in% frg4.freq$StandID)%>%
  left_join(frg4.freq, AGB, by = 'StandID')%>%
  filter(StandID != 0)%>%
  #filter(count > 25)%>%
  mutate(total = sum(count))%>%
  mutate(weight = count / total)%>%
  group_by(StandID, MgmtID)%>%
  mutate(w.Carb = d.prop * weight)%>%
  select(MgmtID, Year, d.prop, w.Carb, weight)%>%
  mutate(FRG = 4)
## Adding missing grouping variables: `StandID`
frg5.carb = AGB%>%
  filter(StandID %in% frg5.freq$StandID)%>%
  left_join(frg5.freq, AGB, by = 'StandID')%>%
  filter(StandID != 0)%>%
  #filter(count > 25)%>%
  mutate(total = sum(count))%>%
  mutate(weight = count / total)%>%
  group_by(StandID, MgmtID)%>%
  mutate(w.Carb = d.prop * weight)%>%
  select(MgmtID, Year, d.prop, w.Carb, weight)%>%
  mutate(FRG = 5)
## Adding missing grouping variables: `StandID`
fig <- plot_ly(alpha = .8)
fig = fig %>% add_histogram(x = ~frg2.carb$w.Carb, name = 'FIC2 - Weighted')
fig = fig %>% add_histogram(x = ~frg2.carb$d.prop, name = 'FIC2 - Unweighted')

fig
fig <- plot_ly(alpha = .8)
fig = fig %>% add_histogram(x = ~frg3.carb$d.prop, name = 'FIC3')
fig = fig %>% add_histogram(x = ~frg2.carb$d.prop, name = 'FIC2')
fig = fig %>% add_histogram(x = ~frg1.carb$d.prop, name = 'FIC1')
fig = fig %>% add_histogram(x = ~frg4.carb$d.prop, name = 'FIC4')
fig = fig %>% add_histogram(x = ~frg5.carb$d.prop, name = 'FIC5')

fig
agb.RF.1 <- frg1.carb%>%
  group_by(MgmtID, Year) %>%
  summarize(
    median.d.prop = round(median(d.prop, na.rm = TRUE), 3),
    .groups = 'drop'  # Ensures the result is ungrouped
  )%>% 
  mutate(FRG = 1) 
  # get_summary_stats(frg1.carb) %>%
  # filter(variable != 'FRG') %>%
  # mutate(FRG = 1) 
agb.RF.2 = frg2.carb%>%
  group_by(MgmtID, Year) %>%
  summarize(
    median.d.prop = round(median(d.prop, na.rm = TRUE), 3),
    .groups = 'drop'  # Ensures the result is ungrouped
  )%>% 
  mutate(FRG = 2) 
agb.RF.3 = frg3.carb%>%
  group_by(MgmtID, Year) %>%
  summarize(
    median.d.prop = round(median(d.prop, na.rm = TRUE), 3),
    .groups = 'drop'  # Ensures the result is ungrouped
  )%>% 
  mutate(FRG = 3) 
agb.RF.4 = frg4.carb%>%
  group_by(MgmtID, Year) %>%
  summarize(
    median.d.prop = round(median(d.prop, na.rm = TRUE), 3),
    .groups = 'drop'  # Ensures the result is ungrouped
  )%>% 
  mutate(FRG = 4) 
agb.RF.5 = frg5.carb%>%
  group_by(MgmtID, Year) %>%
  summarize(
    median.d.prop = round(median(d.prop, na.rm = TRUE), 3),
    .groups = 'drop'  # Ensures the result is ungrouped
  )%>% 
  mutate(FRG = 5) 

agb.RF = rbind(agb.RF.1, agb.RF.2, agb.RF.3, agb.RF.4, agb.RF.5)

 te.agb.RF = agb.RF

te.agb.RF%>%
  kbl()%>%
  kable_minimal()
MgmtID Year median.d.prop FRG
BASE 2035 0.000 1
CMUR 2035 -0.157 1
HCTA 2035 -0.081 1
MRCC 2035 -1.000 1
MRCT 2035 -0.119 1
MTTH 2035 -0.005 1
MTUR 2035 -0.095 1
REVA 2035 0.280 1
RMGP 2035 0.000 1
RMMA 2035 -0.242 1
RXAI 2035 -0.126 1
RXGF 2035 -0.098 1
BASE 2035 0.000 2
CMUR 2035 -0.172 2
HCTA 2035 -0.120 2
MRCC 2035 -1.000 2
MRCT 2035 -0.114 2
MTTH 2035 -0.010 2
MTUR 2035 -0.121 2
REVA 2035 0.273 2
RMGP 2035 -0.011 2
RMMA 2035 -0.328 2
RXAI 2035 -0.121 2
RXGF 2035 -0.095 2
BASE 2035 0.000 3
CMUR 2035 -0.155 3
HCTA 2035 -0.067 3
MRCC 2035 -1.000 3
MRCT 2035 -0.119 3
MTTH 2035 -0.004 3
MTUR 2035 -0.091 3
REVA 2035 0.287 3
RMGP 2035 0.000 3
RMMA 2035 -0.235 3
RXAI 2035 -0.126 3
RXGF 2035 -0.098 3
BASE 2035 0.000 4
CMUR 2035 -0.157 4
HCTA 2035 -0.070 4
MRCC 2035 -1.000 4
MRCT 2035 -0.114 4
MTTH 2035 -0.006 4
MTUR 2035 -0.099 4
REVA 2035 0.287 4
RMGP 2035 -0.001 4
RMMA 2035 -0.259 4
RXAI 2035 -0.127 4
RXGF 2035 -0.101 4
BASE 2035 0.000 5
CMUR 2035 -0.156 5
HCTA 2035 -0.057 5
MRCC 2035 -1.000 5
MRCT 2035 -0.118 5
MTTH 2035 -0.007 5
MTUR 2035 -0.096 5
REVA 2035 0.291 5
RMGP 2035 0.000 5
RMMA 2035 -0.241 5
RXAI 2035 -0.124 5
RXGF 2035 -0.096 5
## Warning in RColorBrewer::brewer.pal(N, "Set2"): n too large, allowed maximum for palette Set2 is 8
## Returning the palette you asked for with that many colors
## Warning in RColorBrewer::brewer.pal(N, "Set2"): n too large, allowed maximum for palette Set2 is 8
## Returning the palette you asked for with that many colors

Calculate Variable Density Thin which is a weighted proportion of: - ‘No action’ : 10% - Clearcut for gap generation : 10% - Manual thinning : 40% - Commercial thinning : 40%

REBA.Github <- read.csv("FVS-LT-Crosswalk.csv")

# Ensure the data frames are sorted by MgmtID and predictor_value
REBA.Github <- REBA.Github %>% arrange(MgmtID, predictor_value)
RF.agb <- RF.agb %>% arrange(MgmtID, predictor_value)

# Create an index to match the rows
index <- match(paste(REBA.Github$MgmtID, REBA.Github$predictor_value), paste(RF.agb$MgmtID, RF.agb$predictor_value))

# Overwrite the value column in REBA.Github with the matched values from RF.agb
REBA.Github$value <- RF.agb$value[index]

# Ensure the column order in REBA.Github is maintained
REBA.PR <- REBA.Github%>%
  select(-MgmtID)%>%
  mutate(value = replace(value, is.na(value), 0))%>%
  arrange(treatment_type, predictor_value)#fill FRG 6 with 0 instead of NA

REBA.PR%>%
  kbl()%>%
  kable_minimal()
treatment_type sara_id spatial_predictor predictor_value value name objective treatment_name
CMR_CC_NONE_NONE 34 FRG 1 -1.000 Aboveground Live Biomass crb Complex Mechanical Removal - Clearcut
CMR_CC_NONE_NONE 34 FRG 2 -1.000 Aboveground Live Biomass crb Complex Mechanical Removal - Clearcut
CMR_CC_NONE_NONE 34 FRG 3 -1.000 Aboveground Live Biomass crb Complex Mechanical Removal - Clearcut
CMR_CC_NONE_NONE 34 FRG 4 -1.000 Aboveground Live Biomass crb Complex Mechanical Removal - Clearcut
CMR_CC_NONE_NONE 34 FRG 5 -1.000 Aboveground Live Biomass crb Complex Mechanical Removal - Clearcut
CMR_CC_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Complex Mechanical Removal - Clearcut
CMR_CC_NONE_NONE 34 FRG 32767 -1.000 Aboveground Live Biomass crb Complex Mechanical Removal - Clearcut
CMR_TH_NONE_NONE 34 FRG 1 -0.005 Aboveground Live Biomass crb Complex Mechanical Removal - Thinning
CMR_TH_NONE_NONE 34 FRG 2 -0.010 Aboveground Live Biomass crb Complex Mechanical Removal - Thinning
CMR_TH_NONE_NONE 34 FRG 3 -0.004 Aboveground Live Biomass crb Complex Mechanical Removal - Thinning
CMR_TH_NONE_NONE 34 FRG 4 -0.006 Aboveground Live Biomass crb Complex Mechanical Removal - Thinning
CMR_TH_NONE_NONE 34 FRG 5 -0.007 Aboveground Live Biomass crb Complex Mechanical Removal - Thinning
CMR_TH_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Complex Mechanical Removal - Thinning
CMR_TH_NONE_NONE 34 FRG 32767 -0.006 Aboveground Live Biomass crb Complex Mechanical Removal - Thinning
CMR_URC_NONE_NONE 34 FRG 1 -0.157 Aboveground Live Biomass crb Complex Mechanical Removal - Urban Clearing
CMR_URC_NONE_NONE 34 FRG 2 -0.172 Aboveground Live Biomass crb Complex Mechanical Removal - Urban Clearing
CMR_URC_NONE_NONE 34 FRG 3 -0.155 Aboveground Live Biomass crb Complex Mechanical Removal - Urban Clearing
CMR_URC_NONE_NONE 34 FRG 4 -0.157 Aboveground Live Biomass crb Complex Mechanical Removal - Urban Clearing
CMR_URC_NONE_NONE 34 FRG 5 -0.156 Aboveground Live Biomass crb Complex Mechanical Removal - Urban Clearing
CMR_URC_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Complex Mechanical Removal - Urban Clearing
CMR_URC_NONE_NONE 34 FRG 32767 -0.159 Aboveground Live Biomass crb Complex Mechanical Removal - Urban Clearing
HCD_BR_NONE_NONE 34 FRG 1 -0.242 Aboveground Live Biomass crb Herbicides - Broad
HCD_BR_NONE_NONE 34 FRG 2 -0.328 Aboveground Live Biomass crb Herbicides - Broad
HCD_BR_NONE_NONE 34 FRG 3 -0.235 Aboveground Live Biomass crb Herbicides - Broad
HCD_BR_NONE_NONE 34 FRG 4 -0.259 Aboveground Live Biomass crb Herbicides - Broad
HCD_BR_NONE_NONE 34 FRG 5 -0.241 Aboveground Live Biomass crb Herbicides - Broad
HCD_BR_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Herbicides - Broad
HCD_BR_NONE_NONE 34 FRG 32767 -0.261 Aboveground Live Biomass crb Herbicides - Broad
HCD_TA_NONE_NONE 34 FRG 1 -0.081 Aboveground Live Biomass crb Herbicides - Targeted
HCD_TA_NONE_NONE 34 FRG 2 -0.120 Aboveground Live Biomass crb Herbicides - Targeted
HCD_TA_NONE_NONE 34 FRG 3 -0.067 Aboveground Live Biomass crb Herbicides - Targeted
HCD_TA_NONE_NONE 34 FRG 4 -0.070 Aboveground Live Biomass crb Herbicides - Targeted
HCD_TA_NONE_NONE 34 FRG 5 -0.057 Aboveground Live Biomass crb Herbicides - Targeted
HCD_TA_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Herbicides - Targeted
HCD_TA_NONE_NONE 34 FRG 32767 -0.079 Aboveground Live Biomass crb Herbicides - Targeted
HRB_HRB_NONE_NONE 34 FRG 1 0.000 Aboveground Live Biomass crb Herbivory - Herbivory
HRB_HRB_NONE_NONE 34 FRG 2 0.000 Aboveground Live Biomass crb Herbivory - Herbivory
HRB_HRB_NONE_NONE 34 FRG 3 0.000 Aboveground Live Biomass crb Herbivory - Herbivory
HRB_HRB_NONE_NONE 34 FRG 4 0.000 Aboveground Live Biomass crb Herbivory - Herbivory
HRB_HRB_NONE_NONE 34 FRG 5 0.000 Aboveground Live Biomass crb Herbivory - Herbivory
HRB_HRB_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Herbivory - Herbivory
HRB_HRB_NONE_NONE 34 FRG 32767 0.000 Aboveground Live Biomass crb Herbivory - Herbivory
MRM_CC_NONE_NONE 34 FRG 1 -1.000 Aboveground Live Biomass crb Mechanical Removal - Clearcut
MRM_CC_NONE_NONE 34 FRG 2 -1.000 Aboveground Live Biomass crb Mechanical Removal - Clearcut
MRM_CC_NONE_NONE 34 FRG 3 -1.000 Aboveground Live Biomass crb Mechanical Removal - Clearcut
MRM_CC_NONE_NONE 34 FRG 4 -1.000 Aboveground Live Biomass crb Mechanical Removal - Clearcut
MRM_CC_NONE_NONE 34 FRG 5 -1.000 Aboveground Live Biomass crb Mechanical Removal - Clearcut
MRM_CC_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Removal - Clearcut
MRM_CC_NONE_NONE 34 FRG 32767 -1.000 Aboveground Live Biomass crb Mechanical Removal - Clearcut
MRM_CT_NONE_NONE 34 FRG 1 -0.119 Aboveground Live Biomass crb Mechanical Removal - Commercial Thinning
MRM_CT_NONE_NONE 34 FRG 2 -0.114 Aboveground Live Biomass crb Mechanical Removal - Commercial Thinning
MRM_CT_NONE_NONE 34 FRG 3 -0.119 Aboveground Live Biomass crb Mechanical Removal - Commercial Thinning
MRM_CT_NONE_NONE 34 FRG 4 -0.114 Aboveground Live Biomass crb Mechanical Removal - Commercial Thinning
MRM_CT_NONE_NONE 34 FRG 5 -0.118 Aboveground Live Biomass crb Mechanical Removal - Commercial Thinning
MRM_CT_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Removal - Commercial Thinning
MRM_CT_NONE_NONE 34 FRG 32767 -0.117 Aboveground Live Biomass crb Mechanical Removal - Commercial Thinning
MRM_SD_NONE_NONE 34 FRG 1 -0.005 Aboveground Live Biomass crb Mechanical Removal - Small Diameter
MRM_SD_NONE_NONE 34 FRG 2 -0.010 Aboveground Live Biomass crb Mechanical Removal - Small Diameter
MRM_SD_NONE_NONE 34 FRG 3 -0.004 Aboveground Live Biomass crb Mechanical Removal - Small Diameter
MRM_SD_NONE_NONE 34 FRG 4 -0.006 Aboveground Live Biomass crb Mechanical Removal - Small Diameter
MRM_SD_NONE_NONE 34 FRG 5 -0.007 Aboveground Live Biomass crb Mechanical Removal - Small Diameter
MRM_SD_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Removal - Small Diameter
MRM_SD_NONE_NONE 34 FRG 32767 -0.006 Aboveground Live Biomass crb Mechanical Removal - Small Diameter
MRM_TH_NONE_NONE 34 FRG 1 -0.119 Aboveground Live Biomass crb Mechanical Removal - Thinning
MRM_TH_NONE_NONE 34 FRG 2 -0.114 Aboveground Live Biomass crb Mechanical Removal - Thinning
MRM_TH_NONE_NONE 34 FRG 3 -0.119 Aboveground Live Biomass crb Mechanical Removal - Thinning
MRM_TH_NONE_NONE 34 FRG 4 -0.114 Aboveground Live Biomass crb Mechanical Removal - Thinning
MRM_TH_NONE_NONE 34 FRG 5 -0.118 Aboveground Live Biomass crb Mechanical Removal - Thinning
MRM_TH_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Removal - Thinning
MRM_TH_NONE_NONE 34 FRG 32767 -0.117 Aboveground Live Biomass crb Mechanical Removal - Thinning
MRM_VDT_NONE_NONE 34 FRG 1 -0.150 Aboveground Live Biomass crb Mechanical Removal - Variable Density Thinning
MRM_VDT_NONE_NONE 34 FRG 2 -0.150 Aboveground Live Biomass crb Mechanical Removal - Variable Density Thinning
MRM_VDT_NONE_NONE 34 FRG 3 -0.149 Aboveground Live Biomass crb Mechanical Removal - Variable Density Thinning
MRM_VDT_NONE_NONE 34 FRG 4 -0.148 Aboveground Live Biomass crb Mechanical Removal - Variable Density Thinning
MRM_VDT_NONE_NONE 34 FRG 5 -0.150 Aboveground Live Biomass crb Mechanical Removal - Variable Density Thinning
MRM_VDT_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Removal - Variable Density Thinning
MRM_VDT_NONE_NONE 34 FRG 32767 0.000 Aboveground Live Biomass crb Mechanical Removal - Variable Density Thinning
MTH_ISR_NONE_NONE 34 FRG 1 0.000 Aboveground Live Biomass crb Manual - Invasives Removal
MTH_ISR_NONE_NONE 34 FRG 2 0.000 Aboveground Live Biomass crb Manual - Invasives Removal
MTH_ISR_NONE_NONE 34 FRG 3 0.000 Aboveground Live Biomass crb Manual - Invasives Removal
MTH_ISR_NONE_NONE 34 FRG 4 0.000 Aboveground Live Biomass crb Manual - Invasives Removal
MTH_ISR_NONE_NONE 34 FRG 5 0.000 Aboveground Live Biomass crb Manual - Invasives Removal
MTH_ISR_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Manual - Invasives Removal
MTH_ISR_NONE_NONE 34 FRG 32767 0.000 Aboveground Live Biomass crb Manual - Invasives Removal
MTH_TH_NONE_NONE 34 FRG 1 -0.005 Aboveground Live Biomass crb Manual - Thinning
MTH_TH_NONE_NONE 34 FRG 2 -0.010 Aboveground Live Biomass crb Manual - Thinning
MTH_TH_NONE_NONE 34 FRG 3 -0.004 Aboveground Live Biomass crb Manual - Thinning
MTH_TH_NONE_NONE 34 FRG 4 -0.006 Aboveground Live Biomass crb Manual - Thinning
MTH_TH_NONE_NONE 34 FRG 5 -0.007 Aboveground Live Biomass crb Manual - Thinning
MTH_TH_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Manual - Thinning
MTH_TH_NONE_NONE 34 FRG 32767 -0.006 Aboveground Live Biomass crb Manual - Thinning
MTH_URC_NONE_NONE 34 FRG 1 -0.157 Aboveground Live Biomass crb Manual - Urban Clearing
MTH_URC_NONE_NONE 34 FRG 2 -0.172 Aboveground Live Biomass crb Manual - Urban Clearing
MTH_URC_NONE_NONE 34 FRG 3 -0.155 Aboveground Live Biomass crb Manual - Urban Clearing
MTH_URC_NONE_NONE 34 FRG 4 -0.157 Aboveground Live Biomass crb Manual - Urban Clearing
MTH_URC_NONE_NONE 34 FRG 5 -0.156 Aboveground Live Biomass crb Manual - Urban Clearing
MTH_URC_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Manual - Urban Clearing
MTH_URC_NONE_NONE 34 FRG 32767 -0.159 Aboveground Live Biomass crb Manual - Urban Clearing
REV_A_NONE_NONE 34 FRG 1 0.280 Aboveground Live Biomass crb Revegetation - Revegetation
REV_A_NONE_NONE 34 FRG 2 0.273 Aboveground Live Biomass crb Revegetation - Revegetation
REV_A_NONE_NONE 34 FRG 3 0.287 Aboveground Live Biomass crb Revegetation - Revegetation
REV_A_NONE_NONE 34 FRG 4 0.287 Aboveground Live Biomass crb Revegetation - Revegetation
REV_A_NONE_NONE 34 FRG 5 0.291 Aboveground Live Biomass crb Revegetation - Revegetation
REV_A_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Revegetation - Revegetation
REV_A_NONE_NONE 34 FRG 32767 0.284 Aboveground Live Biomass crb Revegetation - Revegetation
RGM_GMP_NONE_NONE 34 FRG 1 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Grapple Pile
RGM_GMP_NONE_NONE 34 FRG 2 -0.011 Aboveground Live Biomass crb Mechanical Rearrangement - Grapple Pile
RGM_GMP_NONE_NONE 34 FRG 3 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Grapple Pile
RGM_GMP_NONE_NONE 34 FRG 4 -0.001 Aboveground Live Biomass crb Mechanical Rearrangement - Grapple Pile
RGM_GMP_NONE_NONE 34 FRG 5 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Grapple Pile
RGM_GMP_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Grapple Pile
RGM_GMP_NONE_NONE 34 FRG 32767 -0.002 Aboveground Live Biomass crb Mechanical Rearrangement - Grapple Pile
RGM_MASL_NONE_NONE 34 FRG 1 -0.242 Aboveground Live Biomass crb Mechanical Rearrangement - Mastication
RGM_MASL_NONE_NONE 34 FRG 2 -0.328 Aboveground Live Biomass crb Mechanical Rearrangement - Mastication
RGM_MASL_NONE_NONE 34 FRG 3 -0.235 Aboveground Live Biomass crb Mechanical Rearrangement - Mastication
RGM_MASL_NONE_NONE 34 FRG 4 -0.259 Aboveground Live Biomass crb Mechanical Rearrangement - Mastication
RGM_MASL_NONE_NONE 34 FRG 5 -0.241 Aboveground Live Biomass crb Mechanical Rearrangement - Mastication
RGM_MASL_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mastication
RGM_MASL_NONE_NONE 34 FRG 32767 -0.261 Aboveground Live Biomass crb Mechanical Rearrangement - Mastication
RGM_TFF_NONE_NONE 34 FRG 1 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mowing
RGM_TFF_NONE_NONE 34 FRG 2 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mowing
RGM_TFF_NONE_NONE 34 FRG 3 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mowing
RGM_TFF_NONE_NONE 34 FRG 4 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mowing
RGM_TFF_NONE_NONE 34 FRG 5 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mowing
RGM_TFF_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mowing
RGM_TFF_NONE_NONE 34 FRG 32767 0.000 Aboveground Live Biomass crb Mechanical Rearrangement - Mowing
RXF_AI_NONE_NONE 34 FRG 1 -0.126 Aboveground Live Biomass crb Rx Fire - Rx Fire - Aerial
RXF_AI_NONE_NONE 34 FRG 2 -0.121 Aboveground Live Biomass crb Rx Fire - Rx Fire - Aerial
RXF_AI_NONE_NONE 34 FRG 3 -0.126 Aboveground Live Biomass crb Rx Fire - Rx Fire - Aerial
RXF_AI_NONE_NONE 34 FRG 4 -0.127 Aboveground Live Biomass crb Rx Fire - Rx Fire - Aerial
RXF_AI_NONE_NONE 34 FRG 5 -0.124 Aboveground Live Biomass crb Rx Fire - Rx Fire - Aerial
RXF_AI_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Rx Fire - Rx Fire - Aerial
RXF_AI_NONE_NONE 34 FRG 32767 -0.125 Aboveground Live Biomass crb Rx Fire - Rx Fire - Aerial
RXF_GFL_NONE_NONE 34 FRG 1 -0.098 Aboveground Live Biomass crb Rx Fire - Rx Fire - Ground
RXF_GFL_NONE_NONE 34 FRG 2 -0.095 Aboveground Live Biomass crb Rx Fire - Rx Fire - Ground
RXF_GFL_NONE_NONE 34 FRG 3 -0.098 Aboveground Live Biomass crb Rx Fire - Rx Fire - Ground
RXF_GFL_NONE_NONE 34 FRG 4 -0.101 Aboveground Live Biomass crb Rx Fire - Rx Fire - Ground
RXF_GFL_NONE_NONE 34 FRG 5 -0.096 Aboveground Live Biomass crb Rx Fire - Rx Fire - Ground
RXF_GFL_NONE_NONE 34 FRG 6 0.000 Aboveground Live Biomass crb Rx Fire - Rx Fire - Ground
RXF_GFL_NONE_NONE 34 FRG 32767 -0.098 Aboveground Live Biomass crb Rx Fire - Rx Fire - Ground
#write.csv(REBA.PR, 'agb-te-rf-230524.csv')