#' aggregate parameters by plot, tree height class, species and year
#'
#' This function calculates for each plot, tree height class, species and year
#' the number of regeneration (or interval with mean and confidence interval
#' using a log transformation) and
#' the approximate rubbing damage percentage per hectare for regeneration.
#' For core area plots, these variables are calculated for each subplot.
#'
#' @inheritParams calculate_regeneration
#'
#' @return dataframe with columns `plot`, `subplot`, `year`, `height_class`,
#' `species`, `approx_rubbing_damage_perc`, `mean_number_of_regeneration_ha`,
#' `lci_number_of_regeneration_ha`, `uci_number_of_regeneration_ha` and
#' `approx_nr_regeneration_ha`.
#'
#' @examples
#' library(forrescalc)
#' # (add path to your own fieldmap database here)
#' path_to_fieldmapdb <-
#' system.file("example/database/mdb_bosres.sqlite", package = "forrescalc")
#' data_regeneration <- load_data_regeneration(path_to_fieldmapdb)
#' calc_reg_plot_height_species(data_regeneration)
#'
#' @export
#'
#' @importFrom dplyr %>% group_by select summarise ungroup
#' @importFrom rlang .data
#'
calc_reg_plot_height_species <- function(data_regeneration) {
check_forrescalc_version_attr(data_regeneration)
by_plot_height_species <- data_regeneration %>%
mutate(
plotarea_ha = ifelse(.data$plottype == "CA", 0.01, .data$plotarea_ha),
nr_tmp =
ifelse(
!is.na(.data$nr_of_regeneration),
.data$nr_of_regeneration,
.data$approx_nr_regeneration
)
) %>%
group_by(
.data$plottype, .data$plot_id, .data$subplot_id, .data$period, .data$year,
.data$height_class, .data$species, .data$plotarea_ha
) %>%
summarise(
approx_nr_regeneration_ha =
sum(.data$approx_nr_regeneration) / unique(.data$plotarea_ha),
approx_rubbing_damage_perc = pmin(
sum(.data$rubbing_damage_number, na.rm = TRUE) * 100 /
sum(.data$nr_tmp, na.rm = TRUE), 100),
rubbing_damage_number = sum(.data$rubbing_damage_number, na.rm = TRUE),
not_na_rubbing = sum(!is.na(.data$rubbing_damage_number)),
interval =
sum_intervals(
var_min = .data$min_number_of_regeneration,
var_max = .data$max_number_of_regeneration,
transformation = "log", na_rm = TRUE
)
) %>%
ungroup() %>%
mutate(
rubbing_damage_number_ha =
.data$rubbing_damage_number / .data$plotarea_ha,
mean_number_of_regeneration_ha = .data$interval$sum / .data$plotarea_ha,
lci_number_of_regeneration_ha = .data$interval$lci / .data$plotarea_ha,
uci_number_of_regeneration_ha = .data$interval$uci / .data$plotarea_ha,
approx_rubbing_damage_perc =
ifelse(
.data$not_na_rubbing > 0,
.data$approx_rubbing_damage_perc,
NA
)
) %>%
select(
-"interval", -"plotarea_ha",
-"not_na_rubbing", -"rubbing_damage_number"
)
attr(by_plot_height_species, "database") <-
attr(data_regeneration, "database")
attr(by_plot_height_species, "forrescalc") <-
attr(data_regeneration, "forrescalc")
return(by_plot_height_species)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.