Skip to content

Commit

Permalink
Fix doc typo
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed May 8, 2012
1 parent d9ba3f3 commit 4802347
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/replace.r
Expand Up @@ -44,7 +44,7 @@ str_replace <- function(string, pattern, replacement) {
#' @return character vector. #' @return character vector.
#' @keywords character #' @keywords character
#' @seealso \code{\link{gsub}} which this function wraps, #' @seealso \code{\link{gsub}} which this function wraps,
#' \code{\link{str_replace_all}} to replace a single match #' \code{\link{str_replace}} to replace a single match
#' @export #' @export
#' @examples #' @examples
#' fruits <- c("one apple", "two pears", "three bananas") #' fruits <- c("one apple", "two pears", "three bananas")
Expand Down
2 changes: 1 addition & 1 deletion man/str_replace_all.Rd
Expand Up @@ -40,7 +40,7 @@ str_replace_all(fruits, c("a", "e", "i"), "-")
} }
\seealso{ \seealso{
\code{\link{gsub}} which this function wraps, \code{\link{gsub}} which this function wraps,
\code{\link{str_replace_all}} to replace a single match \code{\link{str_replace}} to replace a single match
} }
\keyword{character} \keyword{character}


0 comments on commit 4802347

Please sign in to comment.