R/tg_catches_link.R

Defines functions tg_catches_link

Documented in tg_catches_link

#' BioSamplesCatches
#'
#' @param cn.standardized Boolean, if FALSE (default) retains variable names as
#' delivered by the webserver otherwise mri-standaridzed variable names are used (not active)
#' @param lowercase Boolean, if TRUE, variable names are set to lower case. If FALSE,
#' names will be consitent with documentation.
#'
#' @return A dataframe
#' @export
#' @importFrom rlang .data
#'
#' @examples df <- tg_catches_link()
tg_catches_link <- function(cn.standardized = FALSE,
                          lowercase = FALSE) {
  species <- "mackerel"

  d <-
    jsonlite::fromJSON(paste0("http://smartfishsvc.hi.no/api/data/BioSamplesCatches/", species[1])) %>%
    dplyr::as_tibble()


  # if(cn.standardized) {
  #
  # }

  if(lowercase)
    d <- dplyr::select_all(d, tolower)
  return(d)

}
einarhjorleifsson/taggart documentation built on May 30, 2021, 8:19 p.m.