Skip to content

Commit

Permalink
document and build
Browse files Browse the repository at this point in the history
  • Loading branch information
librill committed Dec 10, 2024
1 parent d9ae0d5 commit 6fb03f5
Show file tree
Hide file tree
Showing 3 changed files with 49 additions and 3 deletions.
6 changes: 6 additions & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -12,11 +12,13 @@ S3method(type,stringr_fixed)
S3method(type,stringr_regex)
export("%>%")
export("str_sub<-")
export(StrToPascal)
export(boundary)
export(coll)
export(fixed)
export(invert_match)
export(regex)
export(strToCamel)
export(str_c)
export(str_conv)
export(str_count)
Expand Down Expand Up @@ -57,8 +59,12 @@ export(str_starts)
export(str_sub)
export(str_sub_all)
export(str_subset)
export(str_to_camel)
export(str_to_kebab)
export(str_to_lower)
export(str_to_pascal)
export(str_to_sentence)
export(str_to_snake)
export(str_to_title)
export(str_to_upper)
export(str_trim)
Expand Down
5 changes: 3 additions & 2 deletions R/case.R
Original file line number Diff line number Diff line change
Expand Up @@ -22,6 +22,7 @@
#'
#' @inheritParams str_detect
#' @inheritParams coll
#' @param separator string. For snake case, can change the `_`
#' @return A character vector the same length as `string`.
#' @examples
#' dog <- "The quick brown dog"
Expand Down Expand Up @@ -116,7 +117,7 @@ str_to_snake <- function(string, separator = "_", locale = "en") {
}
#' @export
#' @rdname case
str_to_kebab <- function(string) {
string <- str_to_snake(string, separator = "-")
str_to_kebab <- function(string, locale = "en") {
string <- str_to_snake(string, separator = "-", locale = locale)
return(string)
}
41 changes: 40 additions & 1 deletion man/case.Rd

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

0 comments on commit 6fb03f5

Please sign in to comment.