knitr::opts_chunk$set(echo = TRUE)
pacman::p_load(tidyverse, brms, readxl, parameters, gt, posterior, broom.mixed, ggrepel)
# Set seed
set.seed(97)
fb <- read_excel("C:/Users/DrewIvory/OneDrive - University of Florida/Desktop/School/PHD/01_Projects/01_FuelDynamics/02_Data/02_Fuel_Data/C1O2_FireData.xlsx")
# Remove rows with NA in S_ROS
fb <- fb %>%
dplyr::filter(!is.na(S_ROS))
Standardize Predictors
# variables to recode
fuel_vars <- c("Live_FM", "Dead_FM",
"LiveB", "DeadB",
"LitterB", "TreeBH")
# Standardized predictors
fb <- fb %>%
mutate(across(all_of(fuel_vars), ~ as.numeric(scale(.)), .names = "{.col}_z"))
# Split data by invasion status
fb_invaded <- fb %>% filter(Status == "Invaded")
fb_noninvaded <- fb %>% filter(Status == "Non_Invaded")
# Weakly regularizing priors
priors <- c(
prior(normal(0, 1), class = "b"),
prior(student_t(3, 0, 2), class = "sigma")
)
GLMM Surface Rate of Spread
# Fit Bayesian regression for invaded sites
sros_model_inv <- brm(
S_ROS ~ Live_FM_z + Dead_FM_z +
LiveB_z + DeadB_z + LitterB_z,
data = fb_invaded,
family = student(),
prior = priors,
chains = 4, iter = 4000, warmup = 1000, cores = 4,
control = list(adapt_delta = 0.95)
)
## Compiling Stan program...
## WARNING: Rtools is required to build R packages, but is not currently installed.
##
## Please download and install the appropriate version of Rtools for 4.5.1 from
## https://cran.r-project.org/bin/windows/Rtools/.
## Trying to compile a simple C file
## Running "C:/PROGRA~1/R/R-45~1.1/bin/x64/Rcmd.exe" SHLIB foo.c
## using C compiler: 'gcc.exe (GCC) 14.2.0'
## gcc -I"C:/PROGRA~1/R/R-45~1.1/include" -DNDEBUG -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/Rcpp/include/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/unsupported" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/BH/include" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/src/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppParallel/include/" -DRCPP_PARALLEL_USE_TBB=1 -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/rstan/include" -DEIGEN_NO_DEBUG -DBOOST_DISABLE_ASSERTS -DBOOST_PENDING_INTEGER_LOG2_HPP -DSTAN_THREADS -DUSE_STANC3 -DSTRICT_R_HEADERS -DBOOST_PHOENIX_NO_VARIADIC_EXPRESSION -D_HAS_AUTO_PTR_ETC=0 -include "C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/stan/math/prim/fun/Eigen.hpp" -std=c++1y -I"c:/rtools45/x86_64-w64-mingw32.static.posix/include" -O2 -Wall -std=gnu2x -mfpmath=sse -msse2 -mstackrealign -c foo.c -o foo.o
## cc1.exe: warning: command-line option '-std=c++14' is valid for C++/ObjC++ but not for C
## In file included from C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/Eigen/Core:19,
## from C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/Eigen/Dense:1,
## from C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/stan/math/prim/fun/Eigen.hpp:22,
## from <command-line>:
## C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/Eigen/src/Core/util/Macros.h:679:10: fatal error: cmath: No such file or directory
## 679 | #include <cmath>
## | ^~~~~~~
## compilation terminated.
## make: *** [C:/PROGRA~1/R/R-45~1.1/etc/x64/Makeconf:289: foo.o] Error 1
## WARNING: Rtools is required to build R packages, but is not currently installed.
##
## Please download and install the appropriate version of Rtools for 4.5.1 from
## https://cran.r-project.org/bin/windows/Rtools/.
## Start sampling
# Fit Bayesian regression for non-invaded sites
sros_model_noninv <- brm(
S_ROS ~ Live_FM_z + Dead_FM_z +
LiveB_z + DeadB_z + LitterB_z,
data = fb_noninvaded,
family = student(),
prior = priors,
chains = 4, iter = 4000, warmup = 1000, cores = 4,
control = list(adapt_delta = 0.95)
)
## Compiling Stan program...
## WARNING: Rtools is required to build R packages, but is not currently installed.
##
## Please download and install the appropriate version of Rtools for 4.5.1 from
## https://cran.r-project.org/bin/windows/Rtools/.
## Trying to compile a simple C file
## Running "C:/PROGRA~1/R/R-45~1.1/bin/x64/Rcmd.exe" SHLIB foo.c
## using C compiler: 'gcc.exe (GCC) 14.2.0'
## gcc -I"C:/PROGRA~1/R/R-45~1.1/include" -DNDEBUG -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/Rcpp/include/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/unsupported" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/BH/include" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/src/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/" -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppParallel/include/" -DRCPP_PARALLEL_USE_TBB=1 -I"C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/rstan/include" -DEIGEN_NO_DEBUG -DBOOST_DISABLE_ASSERTS -DBOOST_PENDING_INTEGER_LOG2_HPP -DSTAN_THREADS -DUSE_STANC3 -DSTRICT_R_HEADERS -DBOOST_PHOENIX_NO_VARIADIC_EXPRESSION -D_HAS_AUTO_PTR_ETC=0 -include "C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/stan/math/prim/fun/Eigen.hpp" -std=c++1y -I"c:/rtools45/x86_64-w64-mingw32.static.posix/include" -O2 -Wall -std=gnu2x -mfpmath=sse -msse2 -mstackrealign -c foo.c -o foo.o
## cc1.exe: warning: command-line option '-std=c++14' is valid for C++/ObjC++ but not for C
## In file included from C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/Eigen/Core:19,
## from C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/Eigen/Dense:1,
## from C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/StanHeaders/include/stan/math/prim/fun/Eigen.hpp:22,
## from <command-line>:
## C:/Users/DrewIvory/AppData/Local/R/win-library/4.5/RcppEigen/include/Eigen/src/Core/util/Macros.h:679:10: fatal error: cmath: No such file or directory
## 679 | #include <cmath>
## | ^~~~~~~
## compilation terminated.
## make: *** [C:/PROGRA~1/R/R-45~1.1/etc/x64/Makeconf:289: foo.o] Error 1
## WARNING: Rtools is required to build R packages, but is not currently installed.
##
## Please download and install the appropriate version of Rtools for 4.5.1 from
## https://cran.r-project.org/bin/windows/Rtools/.
## Start sampling
Rate of Spread Model Comparison
# Posterior summaries
posterior_summary(sros_model_inv)
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 3.19079935 0.03349366 3.12530357 3.25655607
## b_Live_FM_z -0.64188795 0.02775134 -0.69646938 -0.58738162
## b_Dead_FM_z -0.70334338 0.01730642 -0.73714235 -0.66916309
## b_LiveB_z 0.02970464 0.02666491 -0.02228675 0.08175464
## b_DeadB_z 0.71608566 0.02036439 0.67590345 0.75611600
## b_LitterB_z 0.90948083 0.01585526 0.87864650 0.94022427
## sigma 0.42682648 0.01235935 0.40319341 0.45143233
## nu 41.67510182 16.36293159 17.90040902 81.15481165
## Intercept 3.22963536 0.01631967 3.19795067 3.26152020
## lprior -13.78785308 1.26497592 -16.99357343 -12.18996697
## lp__ -442.38316979 2.02426054 -447.19438614 -439.44609787
posterior_summary(sros_model_noninv)
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 1.8383434 0.032082188 1.7758799 1.9004102
## b_Live_FM_z -0.3994170 0.004722015 -0.4086158 -0.3900918
## b_Dead_FM_z -0.3760682 0.005959408 -0.3876985 -0.3643535
## b_LiveB_z -0.7181915 0.022398511 -0.7621749 -0.6751222
## b_DeadB_z 0.3627576 0.028756939 0.3071006 0.4192969
## b_LitterB_z 0.4944359 0.007563522 0.4797056 0.5091160
## sigma 0.1255672 0.006308306 0.1137567 0.1384041
## nu 4.4534546 0.851533340 3.1414697 6.4523951
## Intercept 2.4955585 0.005876310 2.4840777 2.5068522
## lprior -11.6816648 0.095431211 -11.8776202 -11.5010531
## lp__ 287.9044268 2.011117014 283.1608351 290.8210065
Surface Rate of Spread Table
## Warning in tidy.brmsfit(sros_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(sros_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning: `geom_errobarh()` was deprecated in ggplot2 4.0.0.
## ℹ Please use the `orientation` argument of `geom_errorbar()` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
## `height` was translated to `width`.

## `height` was translated to `width`.

GLMM Flame Length
Flame Length Model Comparison
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 1.67033681 0.015422751 1.64011476 1.70073873
## b_Live_FM_z -0.22702210 0.012551250 -0.25187296 -0.20255422
## b_Dead_FM_z -0.30678347 0.007999188 -0.32252045 -0.29110029
## b_LiveB_z -0.04248132 0.012322584 -0.06628767 -0.01809807
## b_DeadB_z 0.36351246 0.009460846 0.34510592 0.38195238
## b_LitterB_z 0.46074216 0.007431145 0.44628319 0.47532442
## sigma 0.19896329 0.005472684 0.18847360 0.20987219
## nu 50.44567277 17.745405433 23.87720757 93.29976048
## Intercept 1.66821924 0.007521280 1.65362988 1.68300557
## lprior -13.55114908 1.439580116 -17.16618173 -11.58162533
## lp__ 118.77005967 2.017455471 113.92794572 121.70666193
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 1.41547248 0.014466597 1.38627635 1.44369400
## b_Live_FM_z -0.13641546 0.002448029 -0.14134187 -0.13167945
## b_Dead_FM_z -0.16903429 0.002839068 -0.17477167 -0.16362181
## b_LiveB_z -0.15629389 0.010505239 -0.17710296 -0.13582578
## b_DeadB_z 0.20432423 0.013498042 0.17817910 0.23092748
## b_LitterB_z 0.28054507 0.004093468 0.27256937 0.28876787
## sigma 0.05220169 0.003037722 0.04655659 0.05830949
## nu 1.82120436 0.177699145 1.50956270 2.20815250
## Intercept 1.54229027 0.003089570 1.53611326 1.54813278
## lprior -11.79755973 0.077939381 -11.94732571 -11.64175103
## lp__ 663.28640243 2.039309686 658.27430052 666.25228628
Surface Flame Length Table
## Warning in tidy.brmsfit(sfl_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(sfl_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## `height` was translated to `width`.

## `height` was translated to `width`.

GLMM Surface Fireline Intensity
Fireline Intensity Model Comparison
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 9.463425e+02 25.0236111 896.513576 994.782479
## b_Live_FM_z -1.413400e-01 1.0014263 -2.117176 1.852627
## b_Dead_FM_z -4.596288e-01 0.9896223 -2.383566 1.512327
## b_LiveB_z -1.887851e-03 0.9881196 -1.948467 1.939629
## b_DeadB_z 3.758885e-01 0.9897406 -1.541009 2.351342
## b_LitterB_z 7.870936e-01 0.9930775 -1.164404 2.730544
## sigma 6.600728e+02 17.8458405 626.175934 696.039303
## nu 5.533338e+01 18.5468217 27.176668 99.118322
## Intercept 9.462645e+02 24.9939161 896.501307 994.755322
## lprior -4.349873e+01 2.4227319 -49.157656 -39.748946
## lp__ -5.812954e+03 1.9865512 -5817.713013 -5810.065934
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 6.914805e+02 12.4068651 667.2706708 716.0820321
## b_Live_FM_z -1.303028e+00 0.9898921 -3.2240785 0.6581127
## b_Dead_FM_z -1.137936e+00 1.0010643 -3.0811264 0.8371164
## b_LiveB_z -5.259004e-02 1.0035119 -2.0216330 1.9371836
## b_DeadB_z 3.829294e-02 1.0025707 -1.9544223 2.0199354
## b_LitterB_z 1.237058e+00 1.0011524 -0.7417864 3.1955471
## sigma 3.241223e+02 10.8732929 301.7464197 344.6878560
## nu 2.889203e+01 14.2360001 10.6063702 64.8444652
## Intercept 6.923846e+02 12.3484138 668.2342983 716.7277350
## lprior -3.946080e+01 2.8531792 -46.1694338 -35.2394508
## lp__ -5.311321e+03 2.0228566 -5316.1586576 -5308.3921741
Surface Fireline Intensity Table
## Warning in tidy.brmsfit(sfin_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(sfin_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## `height` was translated to `width`.

## `height` was translated to `width`.

GLMM Crown Transition Ratio
Crown Transition Ratio Model Comparison
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 0.263093502 0.005652686 0.25215065 0.274370800
## b_Live_FM_z -0.059084534 0.004062839 -0.06720901 -0.051155395
## b_Dead_FM_z -0.078595440 0.002816385 -0.08419108 -0.073076406
## b_LiveB_z -0.005760337 0.004411702 -0.01443547 0.002745956
## b_DeadB_z 0.086845974 0.003132250 0.08070292 0.093061046
## b_LitterB_z 0.111367043 0.002709282 0.10602732 0.116769189
## b_TreeBH_z -0.083646613 0.005485469 -0.09471915 -0.073299384
## sigma 0.048206017 0.003035684 0.04268100 0.054509344
## nu 1.063463511 0.050103901 1.00240343 1.187164949
## Intercept 0.264146631 0.004514877 0.25553417 0.273154086
## lprior -13.097266441 0.040771245 -13.14899239 -12.999013452
## lp__ 372.071737284 2.175076872 366.89602876 375.286548456
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 0.20703433 0.012067591 0.18402218 0.23114815
## b_Live_FM_z -0.03635098 0.001890003 -0.04012609 -0.03271828
## b_Dead_FM_z -0.04497036 0.002334827 -0.04959661 -0.04049314
## b_LiveB_z -0.03997914 0.008655051 -0.05703218 -0.02299566
## b_DeadB_z 0.05790936 0.011307768 0.03614880 0.08040321
## b_LitterB_z 0.07775747 0.003104774 0.07185001 0.08395554
## b_TreeBH_z -0.12412162 0.003004638 -0.13002456 -0.11820532
## sigma 0.04656391 0.002627656 0.04161959 0.05196316
## nu 2.63181153 0.339894450 2.06252472 3.38961188
## Intercept 0.23760264 0.002520875 0.23258322 0.24253387
## lprior -12.35129143 0.092456781 -12.52916108 -12.16660398
## lp__ 884.86706912 2.181565322 879.64664084 888.05827101
Transition Ratio Table
## Warning in tidy.brmsfit(ctr_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(ctr_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## `height` was translated to `width`.

## `height` was translated to `width`.

GLMM Crown Fire Active Ratio
Crown Fire Active Ratio Model Comparison
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 8.191650e-02 2.817661e-04 8.135958e-02 8.247793e-02
## b_Live_FM_z -1.361830e-02 4.552955e-04 -1.450674e-02 -1.271643e-02
## b_Dead_FM_z -5.662094e-02 2.786726e-04 -5.716065e-02 -5.608236e-02
## sigma 6.988794e-03 1.940567e-04 6.612531e-03 7.375068e-03
## nu 4.724446e+01 1.755303e+01 2.084982e+01 8.810225e+01
## Intercept 7.004703e-02 2.649597e-04 6.952257e-02 7.056560e-02
## lprior -1.029425e+01 1.401290e+00 -1.368994e+01 -8.405883e+00
## lp__ 2.557774e+03 1.564633e+00 2.553892e+03 2.559825e+03
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 0.07499325 7.266209e-04 0.07357508 7.639131e-02
## b_Live_FM_z -0.01084130 5.657618e-04 -0.01196412 -9.740013e-03
## b_Dead_FM_z -0.05858000 6.773467e-04 -0.05992079 -5.724814e-02
## sigma 0.01862667 5.090640e-04 0.01767339 1.965876e-02
## nu 61.68416415 1.961551e+01 31.28291465 1.071588e+02
## Intercept 0.08659771 7.117605e-04 0.08518792 8.795929e-02
## lprior -11.45395261 1.654331e+00 -15.39985164 -9.043479e+00
## lp__ 1849.90148547 1.589455e+00 1845.88796481 1.852021e+03
Active Ratio Table
## Warning in tidy.brmsfit(car_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(car_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## `height` was translated to `width`.

## `height` was translated to `width`.

GLMM Crown Fire Rate of Spread
Crown Fire Rate of Spread Model Comparison
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 0.94833573 0.003602875 0.94122080 0.95549686
## b_Live_FM_z -0.15774408 0.005724564 -0.16904167 -0.14653954
## b_Dead_FM_z -0.65375678 0.003513922 -0.66062896 -0.64693314
## sigma 0.08799838 0.002394311 0.08341711 0.09287581
## nu 55.75477748 18.479018561 27.65072338 98.95943217
## Intercept 0.81118360 0.003358269 0.80458519 0.81777260
## lprior -11.19244742 1.529761460 -14.88773838 -9.02809203
## lp__ 717.53220872 1.580820572 713.64005601 719.64026677
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 0.8996355 0.008084985 0.8839601 0.9155429
## b_Live_FM_z -0.1411090 0.006192135 -0.1531818 -0.1289620
## b_Dead_FM_z -0.7188004 0.007681528 -0.7337831 -0.7033841
## sigma 0.2069175 0.005615104 0.1962490 0.2183236
## nu 58.3576495 19.111749978 29.1440530 103.0874769
## Intercept 1.0437082 0.007919442 1.0282477 1.0592373
## lprior -11.4665388 1.597225441 -15.3149325 -9.1842585
## lp__ 95.9468231 1.589466138 91.9849697 98.0634288
Crown Fire Rate of Spread Table
## Warning in tidy.brmsfit(cros_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(cros_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## `height` was translated to `width`.

## `height` was translated to `width`.

GLMM Crown Fire Intensity
Crown Fire Intensity Model Comparison
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 8.847620e+02 28.0975164 829.936086 939.835232
## b_Live_FM_z -8.355617e-02 1.0189747 -2.043215 1.913773
## b_Dead_FM_z -8.248366e-01 1.0021311 -2.761622 1.149937
## b_LiveB_z -2.290456e-03 0.9919127 -1.944628 1.916817
## b_DeadB_z 3.069076e-02 1.0140143 -1.951883 2.023113
## b_LitterB_z 8.357208e-02 1.0055349 -1.923828 2.053108
## b_TreeBH_z 2.583863e-01 0.9996270 -1.683651 2.226153
## sigma 7.508609e+02 19.8984746 713.076556 791.095734
## nu 5.997619e+01 19.2403733 30.766957 105.291305
## Intercept 8.846063e+02 28.0968615 829.557291 939.465634
## lprior -4.612827e+01 2.5364057 -52.045258 -42.088180
## lp__ -5.907401e+03 2.1262191 -5912.403086 -5904.231087
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 1.129768e+03 34.745712 1061.474416 1195.584031
## b_Live_FM_z -2.249224e-01 1.000482 -2.190662 1.721791
## b_Dead_FM_z -6.957840e-01 1.004710 -2.640589 1.281540
## b_LiveB_z 3.928624e-04 1.000447 -1.960576 1.971725
## b_DeadB_z 2.087307e-03 1.002768 -2.000648 1.941998
## b_LitterB_z 3.594859e-02 1.004300 -1.948116 1.993312
## b_TreeBH_z 2.209213e-01 0.983529 -1.701215 2.107868
## sigma 9.173140e+02 24.851895 870.067223 967.483745
## nu 6.107621e+01 19.414646 31.332469 106.416941
## Intercept 1.129937e+03 34.732822 1061.934349 1195.879928
## lprior -4.690795e+01 2.500502 -52.645849 -42.953740
## lp__ -6.053840e+03 2.111055 -6058.775564 -6050.704113
Crown Fire Intensity Table
## Warning in tidy.brmsfit(cfin_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(cfin_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## `height` was translated to `width`.

## `height` was translated to `width`.

GLMM Crown Fire Flame Length
Crown Fire Flame Length Model Comparison
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 2.42161863 0.025098785 2.37216390 2.47120453
## b_Live_FM_z -0.33234493 0.020798535 -0.37323394 -0.29109617
## b_Dead_FM_z -1.65045957 0.012875090 -1.67575376 -1.62554589
## b_LiveB_z -0.01461308 0.019509580 -0.05287926 0.02415697
## b_DeadB_z 0.08575359 0.015112458 0.05594182 0.11524747
## b_LitterB_z 0.10303099 0.011865237 0.07985508 0.12644972
## b_TreeBH_z 0.33766980 0.012334360 0.31292186 0.36172689
## sigma 0.31512056 0.009812354 0.29554174 0.33441881
## nu 34.80810198 15.659351854 13.04848160 73.55961994
## Intercept 2.10921238 0.012246505 2.08536693 2.13310928
## lprior -14.57598245 1.147333232 -17.61190234 -13.29706020
## lp__ -228.43152392 2.107324203 -233.42108248 -225.29436893
## Estimate Est.Error Q2.5 Q97.5
## b_Intercept 2.23937448 0.12760577 1.98937716 2.4863528
## b_Live_FM_z -0.24534379 0.01836803 -0.28145878 -0.2093791
## b_Dead_FM_z -1.67595316 0.02254668 -1.72015722 -1.6319771
## b_LiveB_z 0.03615593 0.09141286 -0.14381720 0.2139192
## b_DeadB_z 0.07951501 0.11854532 -0.15159045 0.3069346
## b_LitterB_z 0.09040778 0.02752160 0.03651475 0.1447359
## b_TreeBH_z 0.39253018 0.02289775 0.34776303 0.4374638
## sigma 0.60090244 0.01628173 0.56999235 0.6331741
## nu 57.15631689 18.81840023 28.54555300 101.0372168
## Intercept 2.49358962 0.02241882 2.45020362 2.5375494
## lprior -16.37201208 1.57189938 -20.15038728 -14.1524143
## lp__ -685.74397941 2.13086193 -690.72960260 -682.5488357
Crown Flame Length Table
## Warning in tidy.brmsfit(cfl_model_inv): some parameter names contain
## underscores: term naming may be unreliable!
## Warning in tidy.brmsfit(cfl_model_noninv): some parameter names contain
## underscores: term naming may be unreliable!
## `height` was translated to `width`.

## `height` was translated to `width`.

Table Creation