tests/testthat/test-1-ctverce.R

library(dplyr)
library(httr)

test_that("faunistické čtverce", {

  skip_on_cran()

  expect_true(is.data.frame(KFME_grid()))

  expect_s3_class(KFME_grid(), "sf")

  expect_equal(nrow(KFME_grid()), 26 * 42) # čtverce jsou všechny
  expect_equal(nrow(KFME_grid("low")), 26 * 42) # čtverce jsou všechny
  expect_equal(nrow(KFME_grid("high")), 4 * 26 * 42) # čtverce jsou všechny

  expect_equal(KFME_grid("low")$ctverec %>% unique() %>% length(), 26 * 42) # názvy jsou unikátní
  expect_equal(KFME_grid("high")$ctverec %>% unique() %>% length(), 4 * 26 * 42) # názvy jsou unikátní

  expect_equal(st_crs(KFME_grid())$input, "EPSG:4326")
  expect_equal(st_crs(KFME_grid("high"))$input, "EPSG:4326")
  expect_equal(st_crs(KFME_grid("low"))$input, "EPSG:4326")

  expect_true(all(st_is_valid(KFME_grid())))
  expect_true(all(st_is_valid(KFME_grid("high"))))
  expect_true(all(st_is_valid(KFME_grid("low"))))

  expect_true(all(st_geometry_type(KFME_grid()) == "POLYGON"))
  expect_true(all(st_geometry_type(KFME_grid("low")) == "POLYGON"))
  expect_true(all(st_geometry_type(KFME_grid("high")) == "POLYGON"))


  expect_error(KFME_grid("bflm")) # neznámé rozlišení - očekávám high(default) / low

})
jlacko/RCzechia documentation built on June 9, 2025, 5:18 p.m.