Skip to content

Commit 9b4180f

Browse files
authored
Add 2025 bullets for tidy upkeep (#2119)
* Add 2025 bullets for tidy upkeep * Remove the nudge re: R minimum version from "To finish" Currently this is redundant with the 2025 bullets * Add the posit-dev org
1 parent 66f46c5 commit 9b4180f

File tree

3 files changed

+70
-9
lines changed

3 files changed

+70
-9
lines changed

R/release.R

+8-2
Original file line numberDiff line numberDiff line change
@@ -462,7 +462,8 @@ is_posit_person_canonical <- function() {
462462
"fnd" %in% roles &&
463463
"cph" %in% roles &&
464464
attr(roles, "appears_in", exact = TRUE) == "given" &&
465-
attr(roles, "appears_as", exact = TRUE) == "Posit Software, PBC"
465+
attr(roles, "appears_as", exact = TRUE) == "Posit Software, PBC" &&
466+
attr(roles, "ror", exact = TRUE) %in% "03wc8by49"
466467
}
467468

468469
get_posit_roles <- function() {
@@ -493,6 +494,10 @@ get_posit_roles <- function() {
493494
attr(out, "appears_as") <- person$family
494495
attr(out, "appears_in") <- "family"
495496
}
497+
498+
comment <- person$comment %||% character()
499+
attr(out, "ror") <- comment["ROR"]
500+
496501
out
497502
}
498503

@@ -512,7 +517,8 @@ posit_orgs <- function() {
512517
"tidyverse",
513518
"r-lib",
514519
"tidymodels",
515-
"rstudio"
520+
"rstudio",
521+
"posit-dev"
516522
)
517523
}
518524

R/upkeep.R

+38-5
Original file line numberDiff line numberDiff line change
@@ -243,20 +243,53 @@ tidy_upkeep_checklist <- function(last_upkeep = last_upkeep_year(),
243243
)
244244
}
245245

246+
if (last_upkeep <= 2025) {
247+
bullets <- c(
248+
bullets,
249+
"### 2025",
250+
"",
251+
todo("`usethis::use_air()` <https://posit-dev.github.io/air/>"),
252+
todo('`usethis::use_package("R", "Depends", "4.1")`'),
253+
todo("Switch to the base pipe (`|>`)"),
254+
todo("Switch to the base anonymous function syntax (`\\(x)`) "),
255+
todo(
256+
'
257+
Add ROR for Posit in `DESCRIPTION`:
258+
`person("Posit Software, PBC", role = c("cph", "fnd"), comment = c(ROR = "03wc8by49"))`',
259+
posit_pkg && !posit_person_ok
260+
),
261+
todo(
262+
'
263+
`knitr::convert_chunk_header(type = "yaml")` to convert in-header \\
264+
chunk options to the newer in-body style used by Quarto
265+
'
266+
),
267+
todo(
268+
"Switch to `expect_snapshot(error = TRUE)` instead of calling `expect_error()` without specifying `class =`"
269+
),
270+
""
271+
)
272+
}
273+
274+
# if the most recent year doesn't nudge about the minimum R version,
275+
# re-introduce that todo() below
246276
minimum_r_version <- pkg_minimum_r_version()
247277
bullets <- c(
248278
bullets,
249279
"### To finish",
250280
"",
251281
todo("`usethis::use_mit_license()`", grepl("MIT", desc$get_field("License"))),
252-
todo(
253-
'`usethis::use_package("R", "Depends", "{tidy_minimum_r_version()}")`',
254-
is.na(minimum_r_version) || tidy_minimum_r_version() > minimum_r_version
255-
),
256282
todo("`usethis::use_tidy_description()`"),
257283
todo("`usethis::use_tidy_github_actions()`"),
258284
todo("`devtools::build_readme()`"),
259-
todo("[Re-publish released site](https://pkgdown.r-lib.org/dev/articles/how-to-update-released-site.html) if needed"),
285+
todo(
286+
"
287+
Add alt-text to pictures, plots, etc; see \\
288+
https://posit.co/blog/knitr-fig-alt/ for examples"
289+
),
290+
todo(
291+
"[Re-publish released site](https://pkgdown.r-lib.org/dev/articles/how-to-update-released-site.html) if needed"
292+
),
260293
""
261294
)
262295

tests/testthat/_snaps/upkeep.md

+24-2
Original file line numberDiff line numberDiff line change
@@ -49,13 +49,24 @@
4949
or [file an issue](new) if you don't have time to do it now
5050
* [ ] Add alt-text to pictures, plots, etc; see https://posit.co/blog/knitr-fig-alt/ for examples
5151
52+
### 2025
53+
54+
* [ ] `usethis::use_air()` <https://posit-dev.github.io/air/>
55+
* [ ] `usethis::use_package("R", "Depends", "4.1")`
56+
* [ ] Switch to the base pipe (`|>`)
57+
* [ ] Switch to the base anonymous function syntax (`\(x)`)
58+
* [ ] Add ROR for Posit in `DESCRIPTION`:
59+
`person("Posit Software, PBC", role = c("cph", "fnd"), comment = c(ROR = "03wc8by49"))`
60+
* [ ] `knitr::convert_chunk_header(type = "yaml")` to convert in-header chunk options to the newer in-body style used by Quarto
61+
* [ ] Switch to `expect_snapshot(error = TRUE)` instead of calling `expect_error()` without specifying `class =`
62+
5263
### To finish
5364
5465
* [ ] `usethis::use_mit_license()`
55-
* [ ] `usethis::use_package("R", "Depends", "4.1")`
5666
* [ ] `usethis::use_tidy_description()`
5767
* [ ] `usethis::use_tidy_github_actions()`
5868
* [ ] `devtools::build_readme()`
69+
* [ ] Add alt-text to pictures, plots, etc; see https://posit.co/blog/knitr-fig-alt/ for examples
5970
* [ ] [Re-publish released site](https://pkgdown.r-lib.org/dev/articles/how-to-update-released-site.html) if needed
6071
6172
<sup>Created on 2025-01-01 with `usethis::use_tidy_upkeep_issue()`, using [usethis v1.1.0](https://usethis.r-lib.org)</sup>
@@ -83,13 +94,24 @@
8394
or [file an issue](new) if you don't have time to do it now
8495
* [ ] Add alt-text to pictures, plots, etc; see https://posit.co/blog/knitr-fig-alt/ for examples
8596
97+
### 2025
98+
99+
* [ ] `usethis::use_air()` <https://posit-dev.github.io/air/>
100+
* [ ] `usethis::use_package("R", "Depends", "4.1")`
101+
* [ ] Switch to the base pipe (`|>`)
102+
* [ ] Switch to the base anonymous function syntax (`\(x)`)
103+
* [ ] Add ROR for Posit in `DESCRIPTION`:
104+
`person("Posit Software, PBC", role = c("cph", "fnd"), comment = c(ROR = "03wc8by49"))`
105+
* [ ] `knitr::convert_chunk_header(type = "yaml")` to convert in-header chunk options to the newer in-body style used by Quarto
106+
* [ ] Switch to `expect_snapshot(error = TRUE)` instead of calling `expect_error()` without specifying `class =`
107+
86108
### To finish
87109
88110
* [ ] `usethis::use_mit_license()`
89-
* [ ] `usethis::use_package("R", "Depends", "4.1")`
90111
* [ ] `usethis::use_tidy_description()`
91112
* [ ] `usethis::use_tidy_github_actions()`
92113
* [ ] `devtools::build_readme()`
114+
* [ ] Add alt-text to pictures, plots, etc; see https://posit.co/blog/knitr-fig-alt/ for examples
93115
* [ ] [Re-publish released site](https://pkgdown.r-lib.org/dev/articles/how-to-update-released-site.html) if needed
94116
95117
<sup>Created on 2025-01-01 with `usethis::use_tidy_upkeep_issue()`, using [usethis v1.1.0](https://usethis.r-lib.org)</sup>

0 commit comments

Comments
 (0)