Skip to content

Commit d698022

Browse files
committed
Add @export tags for internal S3 methods
1 parent 240da9e commit d698022

File tree

3 files changed

+5
-1
lines changed

3 files changed

+5
-1
lines changed

DESCRIPTION

+1-1
Original file line numberDiff line numberDiff line change
@@ -64,4 +64,4 @@ Config/testthat/edition: 3
6464
Encoding: UTF-8
6565
LazyData: true
6666
Roxygen: list(markdown = TRUE)
67-
RoxygenNote: 7.2.3
67+
RoxygenNote: 7.3.1

NAMESPACE

+2
Original file line numberDiff line numberDiff line change
@@ -120,6 +120,8 @@ S3method(rbind,grouped_df)
120120
S3method(recode,character)
121121
S3method(recode,factor)
122122
S3method(recode,numeric)
123+
S3method(recode_default,default)
124+
S3method(recode_default,factor)
123125
S3method(reframe,data.frame)
124126
S3method(relocate,data.frame)
125127
S3method(rename,data.frame)

R/recode.R

+2
Original file line numberDiff line numberDiff line change
@@ -239,6 +239,7 @@ recode_default <- function(x, default, out) {
239239
UseMethod("recode_default")
240240
}
241241

242+
#' @export
242243
recode_default.default <- function(x, default, out) {
243244
same_type <- identical(typeof(x), typeof(out))
244245
if (is.null(default) && same_type) {
@@ -248,6 +249,7 @@ recode_default.default <- function(x, default, out) {
248249
}
249250
}
250251

252+
#' @export
251253
recode_default.factor <- function(x, default, out) {
252254
if (is.null(default)) {
253255
if ((is.character(out) || is.factor(out)) && is.factor(x)) {

0 commit comments

Comments
 (0)