#' pfifun_sum_weedbyeu
#'
#' @param rawdata Tibble of the form pfi_ghobsraw
#'
#' @return A tibble with total seeds by weed and experimental unit (eu)
#' @export
pfifun_sum_weedbyeu <- function(rawdata){
assertthat::assert_that(is.data.frame(rawdata), msg = "You must feed me a data.frame")
assertthat::assert_that("AMATU" %in% colnames(rawdata))
assertthat::assert_that("trayID" %in% colnames(rawdata), msg = "Is the pkg updated?")
#--sum by ind species and eu
datsp <-
rawdata %>%
# sum over dates
dplyr::mutate_if(is.numeric, tidyr::replace_na, 0) %>%
dplyr::group_by(site_name, field, sys_trt, cc_trt, rep, blockID) %>%
dplyr::summarise_if(is.numeric, sum) %>%
tidyr::pivot_longer(
data = .,
cols = -(site_name:blockID),
names_to = "weed",
values_to = "seeds") %>%
# 2.8575 cm radius cores, 20 cores per 'rep'
dplyr::mutate(seeds_m2 = seeds / ( ( (pi * 2.8575^2) * 20 ) / 10000 )) %>%
dplyr::ungroup()
return(datsp)
}
#' pfifun_sum_byeu
#'
#' @param rawdata Tibble of the form pfi_ghobsraw
#'
#' @return A tibble with total seeds per eu
#' @export
pfifun_sum_byeu <- function(rawdata) {
assertthat::assert_that(is.data.frame(rawdata), msg = "You must feed me a data.frame")
assertthat::assert_that("AMATU" %in% colnames(rawdata),
msg = "You can only feed me the pfi_ghobsraw data.")
#--sum by ind species and eu
datsum <-
rawdata %>%
# sum over dates
dplyr::mutate_if(is.numeric, tidyr::replace_na, 0) %>%
dplyr::group_by(site_name, field, sys_trt, cc_trt, rep, blockID) %>%
dplyr::summarise_if(is.numeric, sum) %>%
tidyr::pivot_longer(
data = .,
cols = -(site_name:blockID),
names_to = "weed",
values_to = "seeds") %>%
# 2.8575 cm radius cores, 20 cores per 'rep'
dplyr::mutate(seeds_m2 = seeds / ( ( (pi * 2.8575^2) * 20 ) / 10000 )) %>%
dplyr::ungroup() %>%
dplyr::group_by(site_name, field, sys_trt, cc_trt, rep, blockID) %>%
dplyr::summarise(totseeds = sum(seeds, na.rm = T),
totseeds_m2 = sum(seeds_m2, na.rm = T))
return(datsum)
}
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.