Skip to content

Commit cffab1e

Browse files
Merge pull request #950 from IndrajeetPatil/roxygen_bump
Upgrade to roxygen2 7.2.0
2 parents 76a7421 + 6e7d97e commit cffab1e

15 files changed

+24
-60
lines changed

.pre-commit-config.yaml

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,7 @@ default_language_version:
66

77
repos:
88
- repo: https://github.com/lorenzwalthert/precommit
9-
rev: v0.2.2.9015
9+
rev: v0.3.0
1010
hooks:
1111
- id: style-files
1212
args: ['--ignore-start="^# styler: on$"', '--ignore-stop="^# styler: off$"']
@@ -22,6 +22,7 @@ repos:
2222
- id: roxygenize
2323
additional_dependencies:
2424
- r-lib/pkgapi
25+
2526
- id: use-tidy-description
2627
- id: spell-check
2728
exclude: >

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -45,7 +45,7 @@ VignetteBuilder:
4545
Encoding: UTF-8
4646
Roxygen: list(markdown = TRUE, roclets = c("rd", "namespace", "collate",
4747
"pkgapi::api_roclet"))
48-
RoxygenNote: 7.1.2
48+
RoxygenNote: 7.2.0
4949
Config/testthat/edition: 3
5050
Collate:
5151
'addins.R'

R/testing.R

Lines changed: 0 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -213,19 +213,6 @@ testthat_file <- function(...) {
213213
file.path(rprojroot::find_testthat_root_file(), ...)
214214
}
215215

216-
#' Convert a serialized R object to a certain version.
217-
#'
218-
#' Needed to make [testthat::expect_known_value()] work on R < 3.6.
219-
#' @param path A path to an rds file.
220-
#' @param version The target version.
221-
#' @keywords internal
222-
rds_to_version <- function(path, version = 2) {
223-
readRDS(path) %>%
224-
saveRDS(path, version = version)
225-
}
226-
227-
228-
229216
#' Copy a file to a temporary directory
230217
#'
231218
#' Takes the path to a file as input and returns the path where the temporary

R/utils-cache.R

Lines changed: 3 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -16,8 +16,9 @@ hash_standardize <- function(text) {
1616
#' Check if text is cached
1717
#'
1818
#' This boils down to check if the hash exists at the caching dir as a file.
19-
#' @param text,transformers,more_specs Passed to [cache_make_key()] to generate
20-
#' a key.
19+
#' @param text Passed to [cache_make_key()] to generate a key.
20+
#' @param transformers Passed to [cache_make_key()] to generate a key.
21+
#' @param more_specs Passed to [cache_make_key()] to generate a key.
2122
#' @param cache_dir The caching directory relative to the `.Rcache` root to
2223
#' look for a cached value.
2324
#' @keywords internal

man/add_token_terminal.Rd

Lines changed: 2 additions & 4 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/combine_children.Rd

Lines changed: 2 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/compute_parse_data_nested.Rd

Lines changed: 2 additions & 4 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/is_cached.Rd

Lines changed: 5 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/parse_transform_serialize_r.Rd

Lines changed: 1 addition & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/rds_to_version.Rd

Lines changed: 0 additions & 17 deletions
This file was deleted.

0 commit comments

Comments
 (0)