Skip to content

Commit

Permalink
Move comment to relevant line
Browse files Browse the repository at this point in the history
  • Loading branch information
markfairbanks committed Feb 19, 2024
1 parent 7a18df9 commit 66b22ef
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/step.R
Original file line number Diff line number Diff line change
Expand Up @@ -203,8 +203,8 @@ print.dtplyr_step <- function(x,
n = n,
max_extra_cols = max_extra_cols,
max_footer_lines = max_footer_lines
)[-1]
) # Hack to remove "A tibble" line
)[-1] # Hack to remove "A tibble" line
)
cat_line()
cat_line(cli::col_silver(
"# Use as.data.table()/as.data.frame()/as_tibble() to access results"
Expand Down

0 comments on commit 66b22ef

Please sign in to comment.