R/dwca_validate.R

Defines functions gbif_val dwca_validate

Documented in dwca_validate

#' Validate a Darwin Core Archive
#'
#' @export
#'
#' @param x (character) A url for a Darwin Core Archive. If you have a local
#' Darwin Core Archive, put it up online somewhere. Required.
#' @param ifModifiedSince (character) An optional ISO date (yyyy-mm-dd) to
#' enable conditional get requests, validating archives only if they have
#' been modified since the given date. This feature requires the archive url
#' to honor the if-modified-since http header. Apache webservers for example
#' do this out of the box for static files, but if you use dynamic scripts
#' to generate the archive on the fly this might not be recognised. Optional.
#' @param browse (logical) Browse to generated report or not.
#' Default: `FALSE`
#' @param ... Curl options passed to [crul::HttpClient]
#' @details Uses the GBIF DCA validator (http://tools.gbif.org/dwca-validator/)
#'
#' @examples \dontrun{
#' x <- "http://rs.gbif.org/datasets/german_sl.zip"
#' dwca_validate(x)
#' }
dwca_validate <- function(x, ifModifiedSince = NULL, browse = FALSE, ...) {
  checkforpkg("crul")
  checkforpkg("jsonlite")
  if (!is.character(x)) stop(x, " must be character class", call. = FALSE)
  if (!is.url(x)) stop(x, " does not appear to be a URL", call. = FALSE)
  args <- fcmp(list(archiveUrl = x, ifModifiedSince = ifModifiedSince))
  cli <- crul::HttpClient$new(url = gbif_val(), opts = list(...))
  res <- cli$get(query = args)
  res$raise_for_status()
  tmp <- res$parse("UTF-8")
  dat <- jsonlite::fromJSON(tmp)
  if (browse) utils::browseURL(dat$report) else dat
}

gbif_val <- function() "https://tools.gbif.org/dwca-validator/validatews.do"

Try the finch package in your browser

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

finch documentation built on Aug. 11, 2020, 9:06 a.m.