Per species/ taxon text
planning_advice <- url %>%
get_page_links() %>%
.[grepl("advice-for-making",.)] %>%
.[grepl("^https", .)] %>%
enframe()
planning_advice_text <- planning_advice %>%
mutate(text = map(value, get_page_text)) %>%
unnest("text") %>%
group_by(name) %>%
slice(-c(1:12)) %>%
mutate(species = str_remove(value, "https://www.gov.uk/guidance/"),
species = str_remove(species, "-advice-for-making-planning-decisions"))
planning_advice_text %>%
select(species, text) %>%
reactable::reactable(searchable = TRUE, filterable = TRUE, sortable = TRUE)
Consolidated list
https://data.jncc.gov.uk/data/478f7160-967b-4366-acdf-8941fd33850b/Taxon-designations-20220202.xlsx
csvs <- list.files(here::here("data"), "csv", full.names = TRUE)
taxa_list <- read_csv(csvs[3], show_col_types = FALSE)
taxa_list <- taxa_list %>%
mutate(designation = ifelse(`Count of Recommended taxon name` > 1, `Row Labels`, NA),
designation1 = ifelse(str_detect(designation, "\\d$"), designation, NA)) %>%
fill(designation1, .direction = "downup") %>%
mutate(designation = ifelse(designation != designation1, designation, NA)) %>%
fill(designation, .direction = "down") %>%
select(-`Count of Recommended taxon name`) %>%
filter(`Row Labels` != designation) %>%
filter(`Row Labels` != designation1) %>%
select(designation, designation1, taxa = `Row Labels`)
taxa_list %>%
DT::datatable(filter = "top", options = list(pageLength = 25))
## Warning in instance$preRenderHook(instance): It seems your data is too big
## for client-side DataTables. You may consider server-side processing: https://
## rstudio.github.io/DT/server.html
get_common_names <- function(x){
require(taxize)
taxize::sci2comm(x, db = "itis", simplify = TRUE)
}
bd_list <- taxa_list %>%
filter(designation == "Birds Directive",
designation1 == "Annex 1") %>%
pluck("taxa")
bd_names <- get_common_names(bd_list)
## ══ 1 queries ═══════════════
## ✔ Found: Acrocephalus melanopogon
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Acrocephalus paludicola
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Aegolius funereus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Alcedo atthis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Anser erythropus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Anthus campestris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Aquila chrysaetos
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ardea purpurea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ardeola ralloides
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Asio flammeus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Aythya nyroca
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Botaurus stellaris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Branta leucopsis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Branta ruficollis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Bubo bubo
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Bubo scandiacus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Bulweria bulwerii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Burhinus oedicnemus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Calandrella brachydactyla
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Calidris pugnax
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Calonectris diomedea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Caprimulgus europaeus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Charadrius morinellus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Chlamydotis undulata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Chlidonias niger
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Chroicocephalus genei
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ciconia ciconia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ciconia nigra
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Circus aeruginosus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Circus cyaneus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Circus macrourus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Circus pygargus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Coracias garrulus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Crex crex
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Cursorius cursor
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Cygnus columbianus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Cygnus cygnus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Egretta garzetta
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Emberiza caesia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Emberiza hortulana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Falco columbarius
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Falco eleonorae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Falco naumanni
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Falco peregrinus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Falco rusticolus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ficedula albicollis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ficedula parva
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Gallinago media
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Gavia arctica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Gavia immer
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Gavia stellata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Glareola pratincola
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Grus grus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Gyps fulvus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Haliaeetus albicilla
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Himantopus himantopus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Hydrobates pelagicus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Hydrocoloeus minutus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Hydroprogne caspia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ixobrychus minutus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Lanius collurio
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Lanius minor
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Limosa lapponica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Loxia scotica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Lullula arborea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Luscinia svecica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Melanocorypha calandra
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Mergellus albellus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Milvus migrans
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Milvus milvus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Neophron percnopterus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Nycticorax nycticorax
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Oceanodroma castro
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Oceanodroma leucorhoa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Otis tarda
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pandion haliaetus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pelagodroma marina
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pernis apivorus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Phalaropus lobatus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Platalea leucorodia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Plegadis falcinellus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pluvialis apricaria
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Podiceps auritus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Porzana porzana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pterodroma feae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pterodroma madeira
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Puffinus assimilis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pyrrhocorax pyrrhocorax
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Recurvirostra avosetta
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Sterna dougallii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Sterna hirundo
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Sterna paradisaea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Sternula albifrons
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Surnia ulula
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Tadorna ferruginea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Tetrao urogallus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Tetrax tetrax
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Tringa glareola
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Xenus cinereus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Anser albifrons flavirostris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Calidris alpina schinzii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Clanga clanga
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Curruca nisoria
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Curruca ruppeli
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Curruca sarda
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Curruca undata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Ichthyaetus melanocephalus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Thalasseus sandvicensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Troglodytes troglodytes fridariensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Zapornia parva
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Zapornia pusilla
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
taxa_list %>%
count(designation, designation1)
## # A tibble: 774 × 3
## designation designation1 n
## <chr> <chr> <int>
## 1 Abrothallus suecicus Annex 5 211
## 2 Achillea ptarmica Annex 5 11
## 3 Actaea spicata Annex 5 5
## 4 Adiantum capillus-veneris Annex 5 2
## 5 Adonis annua Annex 5 2
## 6 Adoxa moschatellina Annex 5 3
## 7 Aegopodium podagraria Annex 5 9
## 8 Aethusa cynapium Annex 5 1
## 9 Aethusa cynapium subsp. cynapium Annex 5 20
## 10 AEWA Annex II Annex 2.2 152
## # … with 764 more rows
bd_names %>%
enframe() %>%
unnest("value") %>%
DT::datatable()
Red listed plants
Common names - endangered, near-threatened or vulnerable
p_red <- curl::curl_download(plant_red_list, prd) %>%
read_excel() %>%
filter(`England Red List` %in% c("EN", "NT", "VU"), `GB Red List` != "LC") %>%
pluck("Taxon")
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in F1886 / R1886C6: got '>50%'
pl_names <- map(p_red, get_common_names)
## ══ 1 queries ═══════════════
## ✔ Found: Adonis annua
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ajuga chamaepitys
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Alchemilla acutiloba
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Alchemilla glomerulans
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Alchemilla micans
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Alchemilla monticola
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Alchemilla subcrenata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Alchemilla wichurae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Allium sphaerocephalon
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Anacamptis morio (Orchis morio)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Anthemis arvensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Anthemis cotula
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Apium repens
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Arabis scabra
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Arenaria norvegica subsp. anglica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Artemisia campestris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Artemisia campestris subsp. campestris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Asparagus prostratus (Asparagus officinalis subsp. prostratus)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Asplenium obovatum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Asplenium septentrionale
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Asplenium trichomanes subsp. pachyrachis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Astragalus danicus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Baldellia ranunculoides
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Blysmus compressus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Bromus secalinus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Bupleurum baldense
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Bupleurum tenuissimum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Calamagrostis stricta
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Campanula rapunculus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Carex depauperata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Carex diandra
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Carex ericetorum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Carex flava
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Carex muricata subsp. muricata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Carex vulpina
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Centaurea calcitrapa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Centaurium scilloides
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Centunculus minimus (Anagallis minima)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Cephalanthera damasonium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Cephalanthera longifolia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Chamaemelum nobile
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Chenopodium bonus-henricus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Chenopodium glaucum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Chenopodium murale
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Chenopodium vulvaria
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Cicendia filiformis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Cirsium tuberosum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Clinopodium acinos
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Clinopodium menthifolium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Coeloglossum viride (Dactylorhiza viridis)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Coincya wrightii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Corallorhiza trifida
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Cornus suecica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Corrigiola litoralis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Corynephorus canescens
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Crepis mollis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Crepis praemorsa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Cuscuta epithymum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Cynoglossum germanicum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Cynoglossum officinale
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Cyperus fuscus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Cyperus longus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Cystopteris diaphana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Daphne mezereum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Dianthus armeria
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Dianthus deltoides
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Dianthus gratianopolitanus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Drosera anglica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Dryopteris cristata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Epipactis sancta
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Equisetum ramosissimum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Eriophorum gracile
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Eryngium campestre
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Euphorbia exigua
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Euphorbia hyberna
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Euphrasia arctica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Euphrasia confusa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Euphrasia micrantha
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Euphrasia officinalis subsp. anglica (Euphrasia anglica)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Euphrasia officinalis subsp. pratensis (Euphrasia rostkoviana subsp. rostkoviana)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Euphrasia pseudokerneri
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Euphrasia rivularis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Euphrasia vigursii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Fallopia dumetorum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Filago lutescens
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Filago pyramidata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Filago vulgaris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Frankenia laevis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Fumaria parviflora
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Fumaria vaillantii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Galeopsis speciosa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Galium parisiense
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Galium pumilum s.l.
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Genista anglica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Genista pilosa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Gentianella amarella subsp. septentrionalis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Gentianella campestris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Gentianella germanica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Glebionis segetum (Chrysanthemum segetum)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Gnaphalium sylvaticum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Groenlandia densa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Helianthemum apenninum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Helianthemum oelandicum subsp. levigatum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Herminium monorchis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Herniaria ciliolata subsp. ciliolata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium amnicola
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium ampliatiforme
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium argutifolium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium bakeranum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium caesitium auct. Angl.
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium candelabrae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium cyathis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium dentulum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium eminentiforme
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium eustomon
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium inaequilaterum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium jaculifolium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium lakelandicum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium lortetiae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium maculoides
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium ornatilorum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium peroblongum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium portlandicum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium promontoriale
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium sinuolatum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium stenolepiforme
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium subgracilentipes
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium sublasiophyllum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium subprasinifolium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium surrejanum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hieracium vagicola
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Hordeum marinum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Hydrocharis morsus-ranae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Hyoscyamus niger
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Hypochaeris glabra
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Hypochaeris maculata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Hypopitys monotropa (Monotropa hypopitys)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Iberis amara
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Illecebrum verticillatum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Isoetes histrix
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Juncus capitatus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Juncus compressus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Juncus pygmaeus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Koeleria vallesiana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Lactuca saligna
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Lamiastrum galeobdolon subsp. galeobdolon
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Lathyrus aphaca
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Lathyrus palustris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Leersia oryzoides
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Limonium recurvum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Liparis loeselii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Lithospermum arvense
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Lobelia urens
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Lotus angustissimus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Lycopodiella inundata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Lythrum hyssopifolia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Maianthemum bifolium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Matthiola sinuata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Medicago minima
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Melampyrum arvense
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Melampyrum cristatum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Melittis melissophyllum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Mentha suaveolens
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Microthlaspi perfoliatum (Thlaspi perfoliatum)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Minuartia hybrida
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Minuartia stricta
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Misopates orontium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Myosotis alpestris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## Warning: > 1 result; no direct match found
## tsn target commonNames
## 1 18786 Myosurus minimus NA
## 2 503898 Myosurus minimus tiny mousetail
## 3 18788 Myosurus minimus ssp. apus tiny mousetail
## 4 526190 Myosurus minimus ssp. apus little mousetail
## 5 531735 Myosurus minimus ssp. apus var. apus tiny mousetail
## 6 531736 Myosurus minimus ssp. apus var. filiformis tiny mousetail
## 7 531737 Myosurus minimus ssp. apus var. sessiliflorus tiny mousetail
## 8 18789 Myosurus minimus ssp. major tiny mousetail
## 9 531738 Myosurus minimus ssp. major var. clavicaulis tiny mousetail
## 10 531739 Myosurus minimus ssp. major var. major tiny mousetail
## 11 18787 Myosurus minimus ssp. minimus tiny mousetail
## 12 18790 Myosurus minimus ssp. montanus NA
## 13 537711 Myosurus minimus var. apus NA
## 14 537712 Myosurus minimus var. aristatus NA
## 15 537713 Myosurus minimus var. clavicaulis NA
## 16 537719 Myosurus minimus var. filiformis NA
## 17 537714 Myosurus minimus var. interior NA
## 18 537715 Myosurus minimus var. lepturus NA
## 19 537722 Myosurus minimus var. major NA
## 20 537716 Myosurus minimus var. sessiliflorus NA
## nameUsage
## 1 not accepted
## 2 accepted
## 3 not accepted
## 4 not accepted
## 5 not accepted
## 6 not accepted
## 7 not accepted
## 8 not accepted
## 9 not accepted
## 10 not accepted
## 11 not accepted
## 12 not accepted
## 13 not accepted
## 14 not accepted
## 15 not accepted
## 16 not accepted
## 17 not accepted
## 18 not accepted
## 19 not accepted
## 20 not accepted
## ✖ Not Found: Myosurus minimus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Myriophyllum verticillatum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Najas marina
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Neotinea ustulata (Orchis ustulata)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Neottia nidus-avis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Nepeta cataria
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Onobrychis viciifolia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ophioglossum lusitanicum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Ophrys fuciflora
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Ophrys insectifera
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Orchis anthropophora (Aceras anthropophorum)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Orchis militaris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Orchis purpurea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Orchis simia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Orobanche caryophyllacea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Orobanche picridis (Orobanche artemisiae-campestris)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Orobanche purpurea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Orobanche rapum-genistae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Orobanche reticulata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Papaver argemone
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Persicaria mitis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Petrorhagia nanteuilii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Petrorhagia prolifera
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Phyteuma spicatum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Pilularia globulifera
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Platanthera bifolia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## Warning: > 1 result; no direct match found
## tsn target commonNames
## 1 41084 Poa glauca glaucous bluegrass,white bluegrass
## 2 794150 Poa glauca NA
## 3 803674 Poa glauca f. arenaria NA
## 4 803675 Poa glauca f. pallida NA
## 5 803676 Poa glauca f. prolifera NA
## 6 526424 Poa glauca ssp. conferta NA
## 7 524542 Poa glauca ssp. glauca glaucous bluegrass,white blue grass
## 8 524543 Poa glauca ssp. glaucantha upland bluegrass
## 9 524544 Poa glauca ssp. rupicola timberline bluegrass
## 10 802168 Poa glauca var. anadryica NA
## 11 802169 Poa glauca var. atroviolacea NA
## 12 802170 Poa glauca var. bryophila NA
## 13 802171 Poa glauca var. caesia NA
## 14 538992 Poa glauca var. conferta NA
## 15 802172 Poa glauca var. crocata NA
## 16 802173 Poa glauca var. elatior NA
## 17 802174 Poa glauca var. glaucantha NA
## 18 538993 Poa glauca var. laxiuscula NA
## 19 802175 Poa glauca var. pallida NA
## 20 798573 Poa glauca var. pekulnejensis NA
## 21 538994 Poa glauca var. rupicola NA
## 22 802176 Poa glauca var. strictior NA
## 23 802177 Poa glauca var. tenuior NA
## 24 41094 Poa glaucantha NA
## nameUsage
## 1 accepted
## 2 not accepted
## 3 not accepted
## 4 not accepted
## 5 not accepted
## 6 not accepted
## 7 accepted
## 8 not accepted
## 9 accepted
## 10 not accepted
## 11 not accepted
## 12 not accepted
## 13 not accepted
## 14 not accepted
## 15 not accepted
## 16 not accepted
## 17 not accepted
## 18 not accepted
## 19 not accepted
## 20 accepted
## 21 not accepted
## 22 not accepted
## 23 not accepted
## 24 not accepted
## ✖ Not Found: Poa glauca
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Polygala amarella
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Polygonum maritimum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Polystichum lonchitis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Potamogeton acutifolius
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Potamogeton compressus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Potamogeton friesii
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Potamogeton nodosus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Potamogeton praelongus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Potentilla argentea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Potentilla fruticosa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Primula farinosa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Pseudorchis albida
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✔ Found: Puccinellia fasciculata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Pulicaria vulgaris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Pulmonaria obscura
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Pulsatilla vulgaris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Pyrola media
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Pyrola rotundifolia subsp. rotundifolia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Pyrus cordata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Radiola linoides
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Ranunculus arvensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Ranunculus tripartitus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Romulea columnae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Rosa agrestis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Rumex rupestris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Salvia pratensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Scandix pecten-veneris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Scirpoides holoschoenus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Scleranthus annuus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Scleranthus annuus subsp. annuus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Scleranthus perennis subsp. prostratus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Scorzonera humilis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Sedum villosum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Selinum carvifolia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Seseli libanotis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Silene conica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Silene gallica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Silene noctiflora
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Silene nutans
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Silene otites
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Sium latifolium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus admonitor
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus anglica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus bristoliensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus eminens
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus eminentiformis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus lancastriensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus leighensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus margaretae
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus subcuneata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus vexans
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus whiteana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Sorbus wilmottiana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Spartina maritima
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## Warning: > 1 result; no direct match found
## tsn target
## 1 20365 Spergula arvensis
## 2 505306 Spergula arvensis
## 3 823670 Spergula arvensis ssp. arvensis
## 4 526730 Spergula arvensis ssp. sativa
## 5 530502 Spergula arvensis var. sativa
## commonNames nameUsage
## 1 NA not accepted
## 2 field spurry,devil's gut,pickpurse,sandweed,corn spurry accepted
## 3 stickwort,starwort not accepted
## 4 NA not accepted
## 5 corn spurry not accepted
## ✖ Not Found: Spergula arvensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Spiranthes spiralis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Stachys arvensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Stachys germanica
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Stellaria palustris
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Taraxacum hygrophilum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Teesdalia nudicaulis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Tephroseris integrifolia
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Teucrium scordium
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Thyselium palustre (Peucedanum palustre)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Torilis arvensis
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Trifolium bocconei
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Trifolium ochroleucon
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Trifolium strictum
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Turritis glabra (Arabis glabra)
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Valerianella dentata
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Valerianella rimosa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Veronica serpyllifolia subsp. humifusa
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Veronica verna
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Vicia lutea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✔ Found: Vicia orobus
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Vicia parviflora
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Viola canina
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Viola canina subsp. canina
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Viola canina subsp. montana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Viola kitaibeliana
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## Warning: Unknown or uninitialised column: `commonName`.
## ══ 1 queries ═══════════════
## ✖ Not Found: Viola lactea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Viola tricolor
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Viola tricolor subsp. tricolor
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✖ Not Found: Wahlenbergia hederacea
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
## ══ 1 queries ═══════════════
## ✔ Found: Zostera marina
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 1
## • Not Found: 0
## ══ 1 queries ═══════════════
## ✖ Not Found: Zostera noltei
## ══ Results ═════════════════
##
## • Total: 1
## • Found: 0
## • Not Found: 1
pl_names %>%
enframe() %>%
unnest("value") %>%
unnest("value") %>%
DT::datatable()