Skip to content

Commit

Permalink
inheritParams from str_like
Browse files Browse the repository at this point in the history
  • Loading branch information
edward-burn committed Aug 12, 2024
1 parent c7c6e75 commit 1a366e3
Showing 1 changed file with 1 addition and 3 deletions.
4 changes: 1 addition & 3 deletions R/detect.R
Original file line number Diff line number Diff line change
Expand Up @@ -163,9 +163,7 @@ str_like <- function(string, pattern, ignore_case = deprecated()) {
#' * `\%` and `\_` match literal `%` and `_`.
#' * The match is case insensitive.
#'
#' @inheritParams str_detect
#' @param pattern A character vector containing a SQL "like" pattern.
#' See above for details.
#' @inheritParams str_like
#' @return A logical vector the same length as `string`.
#' @export
#' @examples
Expand Down

0 comments on commit 1a366e3

Please sign in to comment.