Skip to content

Commit 216f418

Browse files
needs explicit 0
1 parent d36ea5b commit 216f418

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/relevel.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -212,7 +212,7 @@ relocate_eq_assign_one <- function(pd) {
212212
idx_eq_assign <- which(pd$token == "EQ_ASSIGN")
213213
eq_ind <- seq2(idx_eq_assign[1] - 1L, last(idx_eq_assign) + 1L)
214214
# initialize because wrap_expr_in_expr -> create_tokens -> requires it
215-
pd$indent <- NA
215+
pd$indent <- 0
216216
eq_expr <- pd[eq_ind, ] %>%
217217
wrap_expr_in_expr() %>%
218218
add_line_col_to_wrapped_expr() %>%

0 commit comments

Comments
 (0)