Skip to content

Commit

Permalink
Fix typo in as_factor() docs, close #748
Browse files Browse the repository at this point in the history
  • Loading branch information
gorcha authored Oct 10, 2024
1 parent 73c6d46 commit d83f406
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/as_factor.R
Original file line number Diff line number Diff line change
Expand Up @@ -56,7 +56,7 @@ as_factor.data.frame <- function(x, ..., only_labelled = TRUE) {
#' Labels are sorted by value.
#' * "both": like "default", but pastes together the level and value
#' * "label": use only the labels; unlabelled values become `NA`
#' * "values: use only the values
#' * "values": use only the values
#' @rdname as_factor
#' @export
as_factor.haven_labelled <- function(x, levels = c("default", "labels", "values", "both"),
Expand Down

0 comments on commit d83f406

Please sign in to comment.