inst/tinytest/test_rapr.R

library(tinytest)  

is_cran <- function() {
  !interactive() && !isTRUE(as.logical(Sys.getenv("NOT_CRAN", unset = "TRUE")))
}

if (is_cran()) {
  exit_file("On CRAN")
}

# test modern interface
res <- get_rap(
  x = c(-120, 37, -119.99, 36.99),
  product = c("gap", "iag"),
  source = "rap-10m",
  year = 2020:2021,
  verbose = FALSE
)

expect_true(inherits(res, 'SpatRaster'))

expect_equivalent(terra::nlyr(res), 10)

expect_true("iag_2020_invasive_annual_grasses" %in% names(res))

tf <- tempfile(fileext = ".tif")
res <- get_rap(
  terra::vect("POLYGON ((-120 36.99,-119.99 37,-120 37,-120 36.99))", crs = "EPSG:4326"),
  product = c("vegetation-biomass", "vegetation-cover"),
  version = "v3",
  year = 1986,
  legacy = FALSE,
  verbose = FALSE,
  datatype = "INT2U",
  overwrite = TRUE,
  filename = tf
)

expect_true(file.exists(tf))

expect_true(inherits(res, 'SpatRaster'))

expect_equivalent(terra::nlyr(res), 8)

expect_true("vegetation-cover_v3_1986_perennial_forb_and_grass" %in% names(res))

unlink(tf)

# test legacy interface
res <- get_rap(
  x = c(-120, 37, -119.99, 36.99),
  product = c("vegetation-biomass", "vegetation-cover"),
  source = "rap-30m",
  version = "v3",
  legacy = TRUE,
  year = 2020:2021,
  progress = FALSE
)

expect_true(inherits(res, 'SpatRaster'))

expect_equivalent(terra::nlyr(res), 16)

expect_true("perennial_forb_and_grass_biomass_2021_v3" %in% names(res))

tf <- tempfile(fileext = ".tif")
res <- get_rap(
  terra::vect("POLYGON ((-120 36.99,-119.99 37,-120 37,-120 36.99))", crs = "EPSG:4326"),
  product = c("vegetation-biomass", "vegetation-cover"),
  version = "v3",
  year = 1986,
  legacy = TRUE,
  progress = FALSE,
  filename = tf
)

expect_true(file.exists(tf))

expect_true(inherits(res, 'SpatRaster'))

expect_equivalent(terra::nlyr(res), 8)

expect_true("perennial_forb_and_grass_biomass_1986_v3" %in% names(res))

unlink(tf)

# test legacy sp interface via sf
if (requireNamespace("sf")) {
  res <- get_rap(
    sf::as_Spatial(sf::st_as_sf(
      data.frame(
        geometry = sf::st_as_sfc("POLYGON ((-120 36.99,-119.99 37,-120 37,-120 36.99))")
      ), crs = "EPSG:4326"
    )),
    product = c("vegetation-biomass", "vegetation-cover"),
    version = "v3",
    year = 1986,
    legacy = TRUE,
    progress = FALSE
  )
  
  expect_true(inherits(res, 'SpatRaster'))
  
  expect_equivalent(terra::nlyr(res), 8)
  
  expect_true("perennial_forb_and_grass_biomass_1986_v3" %in% names(res))
}

Try the rapr package in your browser

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

rapr documentation built on June 8, 2025, 1:51 p.m.