Skip to content

Commit

Permalink
rename arg
Browse files Browse the repository at this point in the history
  • Loading branch information
thomasp85 committed Oct 22, 2024
1 parent 106ba14 commit 95f21d2
Show file tree
Hide file tree
Showing 2 changed files with 7 additions and 7 deletions.
10 changes: 5 additions & 5 deletions R/upkeep.R
Original file line number Diff line number Diff line change
Expand Up @@ -22,7 +22,7 @@ use_upkeep_issue <- function(year = NULL) {
make_upkeep_issue(year = year, tidy = FALSE)
}

make_upkeep_issue <- function(year, last_year, tidy) {
make_upkeep_issue <- function(year, last_upkeep, tidy) {
who <- if (tidy) "use_tidy_upkeep_issue()" else "use_upkeep_issue()"
check_is_package(who)

Expand All @@ -41,7 +41,7 @@ make_upkeep_issue <- function(year, last_year, tidy) {

gh <- gh_tr(tr)
if (tidy) {
checklist <- tidy_upkeep_checklist(last_year, repo_spec = tr$repo_spec)
checklist <- tidy_upkeep_checklist(last_upkeep, repo_spec = tr$repo_spec)

Check warning on line 44 in R/upkeep.R

View check run for this annotation

Codecov / codecov/patch

R/upkeep.R#L44

Added line #L44 was not covered by tests
} else {
checklist <- upkeep_checklist(tr)
}
Expand Down Expand Up @@ -118,11 +118,11 @@ upkeep_checklist <- function(target_repo = NULL) {

#' @export
#' @rdname tidyverse
#' @param year Approximate year when you last touched this package. Default will
#' @param last_upkeep Approximate year when you last touched this package. Default will
#' use the recorded year of the last upkeep issue or, if missing, show the full
#' checklist
use_tidy_upkeep_issue <- function(year = last_upkeep_year()) {
make_upkeep_issue(year = NULL, last_year = year, tidy = TRUE)
use_tidy_upkeep_issue <- function(last_upkeep = last_upkeep_year()) {
make_upkeep_issue(year = NULL, last_upkeep = last_upkeep, tidy = TRUE)
record_upkeep_date(Sys.Date())

Check warning on line 126 in R/upkeep.R

View check run for this annotation

Codecov / codecov/patch

R/upkeep.R#L125-L126

Added lines #L125 - L126 were not covered by tests
}

Expand Down
4 changes: 2 additions & 2 deletions man/tidyverse.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 95f21d2

Please sign in to comment.