Skip to content

Commit

Permalink
Revert unnecessary changes
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy committed Dec 7, 2023
1 parent be8a0f0 commit 69e7b82
Show file tree
Hide file tree
Showing 3 changed files with 4 additions and 4 deletions.
4 changes: 2 additions & 2 deletions R/browse.R
Original file line number Diff line number Diff line change
Expand Up @@ -198,12 +198,12 @@ github_url <- function(package = NULL) {
ui_warn("
Package {ui_value(package)} has no GitHub URLs in DESCRIPTION
Trying the GitHub CRAN mirror")
glue::glue("https://github.com/cran/{package}")
glue_chr("https://github.com/cran/{package}")
}

cran_home <- function(package = NULL) {
package <- package %||% project_name()
glue::glue("https://cran.r-project.org/package={package}")
glue_chr("https://cran.r-project.org/package={package}")
}

# returns NULL, if no DESCRIPTION found
Expand Down
2 changes: 1 addition & 1 deletion R/github-actions.R
Original file line number Diff line number Diff line change
Expand Up @@ -231,7 +231,7 @@ use_tidy_github_actions <- function(ref = NULL) {
"Remove existing {ui_path('.travis.yml')} and {ui_path('appveyor.yml')}?"
)) {
file_delete(old_configs[has_appveyor_travis])
# TODO maybe add ui_path("README.Rmd")?
# TODO maybe add ui_path("README.Rmd") or ui_path("README.md")?
ui_todo("Remove old badges from README")
}
}
Expand Down
2 changes: 1 addition & 1 deletion tests/testthat/test-browse.R
Original file line number Diff line number Diff line change
Expand Up @@ -107,7 +107,7 @@ test_that("browse_XXX() goes to correct URL", {

expect_match(browse_github_actions("gh"), g("r-lib/gh/actions"))

expect_match(browse_cran("usethis"), "https://cran.r-project.org/package=usethis")
expect_equal(browse_cran("usethis"), "https://cran.r-project.org/package=usethis")
})

test_that("browse_package() errors if no project", {
Expand Down

0 comments on commit 69e7b82

Please sign in to comment.