Hi there,
The following file doesn't make it through styler. It throws a warning message:
When processing r.R: '\.' is an unrecognized escape in character string starting ""\."
#' Function.
#'
#' Details.
#'
#' @param x Only argument.
#'
#' @examples
#' \dontrun{
#' funfunfun("\\.txt$")
#' }
#' @export
funfunfun <- function(x) {
invisible(x)
}
Is this a bug, or am I missing something?
Thanks, love styler,
Rory