We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 9bdbdb8 commit d36ea5bCopy full SHA for d36ea5b
R/relevel.R
@@ -211,6 +211,8 @@ find_block_id <- function(pd) {
211
relocate_eq_assign_one <- function(pd) {
212
idx_eq_assign <- which(pd$token == "EQ_ASSIGN")
213
eq_ind <- seq2(idx_eq_assign[1] - 1L, last(idx_eq_assign) + 1L)
214
+ # initialize because wrap_expr_in_expr -> create_tokens -> requires it
215
+ pd$indent <- NA
216
eq_expr <- pd[eq_ind, ] %>%
217
wrap_expr_in_expr() %>%
218
add_line_col_to_wrapped_expr() %>%
0 commit comments