Skip to content

Commit

Permalink
Add log parsing vignette
Browse files Browse the repository at this point in the history
  • Loading branch information
jimhester committed Oct 8, 2014
1 parent 64d6bbc commit ca767dd
Show file tree
Hide file tree
Showing 6 changed files with 1,085 additions and 1 deletion.
3 changes: 2 additions & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -13,7 +13,8 @@ Imports:
License: GPL (>=2)
Suggests:
testthat,
knitr
knitr,
dplyr
VignetteBuilder: knitr
Collate:
'aaa.R'
Expand Down
3 changes: 3 additions & 0 deletions R/match.R
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
#' @param pattern regular expression to use for matching
#' @param global use global matching
#' @param options regular expression options
#' @param ... options passed to regexpr or gregexpr
#' @return if no captures, returns a logical vector the same length as the
#' input character vector specifying if the relevant value matched or not. If
#' there are captures in the regular expression, returns a \code{data.frame} with a
Expand Down Expand Up @@ -70,7 +71,9 @@ re_matches <- function(data, pattern, global = FALSE, options = NULL, ...) {
#' @param data character vector to substitute
#' @param pattern regular expression to match
#' @param replacement replacement text to use
#' @param global substitute all occurrences
#' @param options option flags
#' @param ... options passed to sub or gsub
#' @seealso \code{\link{regexp}} Section "Perl-like Regular Expressions" for a
#' discussion of the supported options
#' @examples
Expand Down
2 changes: 2 additions & 0 deletions man/re_matches.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -13,6 +13,8 @@ re_matches(data, pattern, global = FALSE, options = NULL, ...)
\item{global}{use global matching}

\item{options}{regular expression options}

\item{...}{options passed to regexpr or gregexpr}
}
\value{
if no captures, returns a logical vector the same length as the
Expand Down
4 changes: 4 additions & 0 deletions man/re_substitutes.Rd
Original file line number Diff line number Diff line change
Expand Up @@ -13,7 +13,11 @@ re_substitutes(data, pattern, replacement, global = FALSE, options = NULL,

\item{replacement}{replacement text to use}

\item{global}{substitute all occurrences}

\item{options}{option flags}

\item{...}{options passed to sub or gsub}
}
\description{
Substitution function
Expand Down
Loading

0 comments on commit ca767dd

Please sign in to comment.