Skip to content

Commit

Permalink
add snapshot and account for url with @
Browse files Browse the repository at this point in the history
  • Loading branch information
catalamarti committed Aug 15, 2024
1 parent a0d2807 commit ac7a005
Show file tree
Hide file tree
Showing 3 changed files with 14 additions and 6 deletions.
10 changes: 5 additions & 5 deletions R/build-home-index.R
Original file line number Diff line number Diff line change
Expand Up @@ -108,7 +108,7 @@ data_home_sidebar <- function(pkg = ".", call = caller_env()) {
"home.sidebar.structure",
default = default_sidebar_structure(),
call = call
)
)

# compute all default sections
default_components <- list(
Expand All @@ -122,7 +122,7 @@ data_home_sidebar <- function(pkg = ".", call = caller_env()) {
)

needs_components <- setdiff(structure, names(default_components))
custom_yaml <- config_pluck_sidebar_components(pkg, needs_components, call = call)
custom_yaml <- config_pluck_sidebar_components(pkg, needs_components, call = call)
custom_components <- purrr::map(custom_yaml, function(x) {
sidebar_section(x$title, markdown_text_block(pkg, x$text))
})
Expand All @@ -140,11 +140,11 @@ default_sidebar_structure <- function() {
config_pluck_sidebar_components <- function(pkg, new_components, call = caller_env()) {
base_path <- "home.sidebar.components"
components <- config_pluck_list(pkg, base_path, has_names = new_components, call = call)

for (name in names(components)) {
component <- components[[name]]
component_path <- paste0(base_path, ".", name)

config_pluck_list(pkg, component_path, has_names = c("title", "text"), call = call)
config_pluck_string(pkg, paste0(component_path, ".title"), call = call)
config_pluck_string(pkg, paste0(component_path, ".text"), call = call)
Expand All @@ -159,7 +159,7 @@ data_home_sidebar_links <- function(pkg = ".") {
links <- config_pluck(pkg, "home.links")

bug_reports <- pkg$desc$get_field("BugReports", default = NULL)
if (grepl("@", bug_reports)) {
if (grepl("@", bug_reports) && !startsWith(bug_reports, "hhtp")) {
bug_reports <- paste0("mailto:", bug_reports)
}

Expand Down
8 changes: 8 additions & 0 deletions tests/testthat/_snaps/build-home-index.md
Original file line number Diff line number Diff line change
Expand Up @@ -149,3 +149,11 @@
! In _pkgdown.yml, home.sidebar.components.fancy must have components "title" and "text".
2 missing components: "title" and "text".

# allow email in BugReports

Code
xpath_xml(html, ".//li/a")
Output
<a href="mailto:[email protected]">Report a bug</a>
<a href="authors.html#citation">Citing testpackage</a>

2 changes: 1 addition & 1 deletion tests/testthat/test-build-home-index.R
Original file line number Diff line number Diff line change
Expand Up @@ -30,7 +30,7 @@ test_that("math is handled", {
expect_equal(xpath_length(html, ".//math"), 1)
})

test_that("data_home() validates yaml metadata", {
test_that("data_home() validates yaml metadata", {
data_home_ <- function(...) {
pkg <- local_pkgdown_site(meta = list(...))
data_home(pkg)
Expand Down

0 comments on commit ac7a005

Please sign in to comment.