library(Rothermel) # v. 1.2
data("SFM_metric")

Low fuel load

Total load = 0.24 tonnes/ha.

ros (
   modeltype = 'D', 
   w = c( 0.024, # 1 hr
          0,     # 10 hr
          0,     # 100 hr
          0.216, # Live fine
          0 ),   # Live coarse,
   s = SFM_metric ['GR2', 7:11], 
   delta = 10, 
   mx.dead = 15, 
   h = SFM_metric ['GR2', 14:18], 
   m = c(2, 4, 0, 60, 90), 
   u = 10, 
   slope = 0)[15]
## $`ROS [m/min]`
## [1] 7.17

This is not consistent with BehavePlus, which returns 0.6 m/min.

Moderate load

ros (
   modeltype = 'D', 
   w = c( 0.22, # 1 hr
          0,     # 10 hr
          0,     # 100 hr
          0.22, # Live fine
          0 ),   # Live coarse,
   s = SFM_metric ['GR2', 7:11], 
   delta = 10, 
   mx.dead = 15, 
   h = SFM_metric ['GR2', 14:18], 
   m = c(2, 4, 0, 60, 90), 
   u = 10, 
   slope = 0)[15]
## $`ROS [m/min]`
## [1] 9.23

This is not consistent with BehavePlus, which returns 2.2 m/min.

High fuel load

Total load = 2.244 tonnes/ha.

ros (
   modeltype = 'D', 
   w =  c( 0.224,  # 1 hr
           0,     # 10 hr
           0,     # 100 hr
           2.02,  # Live fine
           0 ),   # Live coarse,
   s = SFM_metric ['GR2', 7:11], 
   delta = 10, 
   mx.dead = 15, 
   h = SFM_metric ['GR2', 14:18], 
   m = c(2, 4, 0, 60, 90), 
   u = 10, 
   slope = 0)[15]
## $`ROS [m/min]`
## [1] 6.49

This is consistent with BehavePlus, which returns 6.5 m/min.

Session info

## R version 4.0.3 (2020-10-10)
## Platform: x86_64-w64-mingw32/x64 (64-bit)
## Running under: Windows 10 x64 (build 19042)
## 
## Matrix products: default
## 
## locale:
## [1] LC_COLLATE=English_United States.1252 
## [2] LC_CTYPE=English_United States.1252   
## [3] LC_MONETARY=English_United States.1252
## [4] LC_NUMERIC=C                          
## [5] LC_TIME=English_United States.1252    
## 
## attached base packages:
## [1] splines   stats4    stats     graphics  grDevices utils     datasets 
## [8] methods   base     
## 
## other attached packages:
##  [1] Rothermel_1.2    ftsa_6.0         sde_2.0.15       zoo_1.8-9       
##  [5] fda_5.1.9        fds_1.8          RCurl_1.98-1.2   Matrix_1.2-18   
##  [9] rainbow_3.6      pcaPP_1.9-74     MASS_7.3-53      forecast_8.15   
## [13] GA_3.2.1         iterators_1.0.13 foreach_1.5.1   
## 
## loaded via a namespace (and not attached):
##  [1] nlme_3.1-149       bitops_1.0-6       xts_0.12.1         ecp_3.1.3         
##  [5] tools_4.0.3        bslib_0.2.4        utf8_1.2.1         R6_2.5.0          
##  [9] KernSmooth_2.23-17 DBI_1.1.1          colorspace_2.0-1   nnet_7.3-14       
## [13] tidyselect_1.1.1   curl_4.3           compiler_4.0.3     cli_3.0.1         
## [17] sandwich_3.0-1     sass_0.3.1         tseries_0.10-48    scales_1.1.1      
## [21] lmtest_0.9-38      fracdiff_1.5-1     mvtnorm_1.1-2      quadprog_1.5-8    
## [25] proxy_0.4-25       stringr_1.4.0      digest_0.6.27      rmarkdown_2.7     
## [29] pkgconfig_2.0.3    htmltools_0.5.1.1  rlang_0.4.11       TTR_0.24.2        
## [33] rstudioapi_0.13    quantmod_0.4.18    jquerylib_0.1.3    generics_0.1.0    
## [37] jsonlite_1.7.2     mclust_5.4.7       dplyr_1.0.5        magrittr_2.0.1    
## [41] Rcpp_1.0.6         munsell_0.5.0      fansi_0.4.2        abind_1.4-5       
## [45] lifecycle_1.0.0    stringi_1.5.3      yaml_2.2.1         grid_4.0.3        
## [49] parallel_4.0.3     strucchange_1.5-2  crayon_1.4.1       lattice_0.20-41   
## [53] knitr_1.31         pillar_1.6.1       codetools_0.2-16   magic_1.5-9       
## [57] urca_1.3-0         pdfCluster_1.0-3   glue_1.4.2         evaluate_0.14     
## [61] vctrs_0.3.8        gtable_0.3.0       purrr_0.3.4        assertthat_0.2.1  
## [65] ks_1.13.2          ggplot2_3.3.3      xfun_0.22          pracma_2.3.3      
## [69] e1071_1.7-6        class_7.3-17       geometry_0.4.5     timeDate_3043.102 
## [73] tibble_3.1.1       cluster_2.1.0      ellipsis_0.3.2     hdrcde_3.4