test_that("Indicators wording is correct in translation db", {
ind1 = whesApp::indicator_info %>% dplyr::pull(name)
ind2 = whesApp::translate_db %>% dplyr::filter(stringr::str_detect(key, "ind_\\d{3}")) %>% dplyr::pull("EN")
expect_identical(length(which(!(ind1 %in% ind2))), 0L)
})
test_that("Source keys present in translation db", {
source1 = whesApp::indicator_info %>% dplyr::pull(source_id)
source2 = whesApp::translate_db %>% dplyr::pull(key)
expect_identical(length(which(!(source1 %in% source2))), 0L)
})
test_that("All indicators present in translation db", {
ind1 = whesApp::indicator_info %>% dplyr::pull(ind_id)
ind2 = whesApp::translate_db %>%
dplyr::filter(stringr::str_detect(key, "ind_\\d{3}")) %>%
dplyr::mutate(key = stringr::str_extract(key, pattern = "(?<=_).*")) %>%
dplyr::pull(key)
expect_identical(length(which(!(ind1 %in% ind2))), 0L)
})
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.