Skip to content

Commit

Permalink
fix: styler CI
Browse files Browse the repository at this point in the history
  • Loading branch information
wurli committed Sep 19, 2024
1 parent 1e5e127 commit dc08277
Showing 1 changed file with 3 additions and 2 deletions.
5 changes: 3 additions & 2 deletions R/transform-code.R
Original file line number Diff line number Diff line change
Expand Up @@ -100,8 +100,9 @@ identify_raw_chunks <- function(lines,

if (filetype == "Rmd") {
starts <- grep(
"^[\t >]*```+\\s*\\{((r|webr-r|webr)( *[ ,].*)?)\\}\\s*$",
lines, perl = TRUE, ignore.case = TRUE
"^[\t >]*```+\\s*\\{((r|webr-r|webr)( *[ ,].*)?)\\}\\s*$",
lines,
perl = TRUE, ignore.case = TRUE
)
ends <- grep("^[\t >]*```+\\s*$", lines, perl = TRUE)
ends <- purrr::imap_int(starts, ~ ends[which(ends > .x)[1L]]) %>%
Expand Down

0 comments on commit dc08277

Please sign in to comment.