R/PRM_DT.R

Defines functions PRM_DT

Documented in PRM_DT

#' PRM Data Table Function
#'
#' @param PRM_data a data frame of either daily average or wet season PRM values
#' @param fill_cols A vector of column names of pesticide groups to fill colour
#' with corresponding PRM risk category
#' @param colour_cols A vector of column names of pesticide groups to colour
#' text with corresponding PRM risk category
#'
#' @return a data table colour coded to PRM risk
#' @export
#'
#' @examples
#' Canto_pesticides_LOR_treated <- treat_LORs_all_data(raw_data = Canto_pesticides,
#' pesticide_info = CalcThemAll.PRM::pesticide_info)
#' Canto_daily_PRM <- calculate_daily_average_PRM(LOR_treated_data = Canto_pesticides_LOR_treated)
#' PRM_DT(PRM_data = Canto_daily_PRM, fill_cols = "Total PRM",
#' colour_cols = c("PSII Herbicide PRM", "Other Herbicide PRM", "Insecticide PRM"))
#'
PRM_DT <- function(PRM_data, fill_cols = NULL, colour_cols = NULL){
  PRM_data <- PRM_data %>%
    dplyr::mutate_at(dplyr::vars(dplyr::matches("PRM")), ~round(., 2))

  DT::datatable(PRM_data, rownames = FALSE, options = list(scrollX = TRUE, pageLength = 10)) %>%
    DT::formatStyle(
      colour_cols,
      Color = DT::styleInterval(c(1.01, 5.01, 10.01, 20.01), c("forestgreen", "yellowgreen", "yellow",  "orange", "red")),
      fontWeight = "bold",
      backgroundColor = "#e0e0e0") %>%
    DT::formatStyle(
      fill_cols,
      backgroundColor = DT::styleInterval(c(1.01, 5.01, 10.01, 20.01), c("forestgreen", "yellowgreen", "yellow",  "orange", "red")),
      fontWeight = "bold")
}

Try the CalcThemAll.PRM package in your browser

Any scripts or data that you put into this service are public.

CalcThemAll.PRM documentation built on May 29, 2024, 5:39 a.m.