Skip to content

Commit 492168b

Browse files
ensure import
1 parent f9d29a9 commit 492168b

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/transform-code.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -90,7 +90,7 @@ identify_raw_chunks <- function(lines, filetype, engine_pattern = get_engine_pat
9090
starts <- grep("^[\t >]*```+\\s*\\{([Rr]( *[ ,].*)?)\\}\\s*$", lines, perl = TRUE)
9191
ends <- grep("^[\t >]*```+\\s*$", lines, perl = TRUE)
9292
ends <- purrr::imap_int(starts, ~ ends[which(ends > .x)[1]]) %>%
93-
na.omit()
93+
stats::na.omit()
9494
if (length(starts) != length(ends) || anyDuplicated(ends) != 0) {
9595
abort("Malformed file!")
9696
}

0 commit comments

Comments
 (0)