Skip to content

Commit

Permalink
Merge remote-tracking branch 'origin/main'
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Mar 26, 2023
2 parents 2f57dc1 + 0b3de0f commit 5ca2ba9
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 1 deletion.
1 change: 1 addition & 0 deletions R/cliapp-docs.R
Original file line number Diff line number Diff line change
Expand Up @@ -80,6 +80,7 @@
#' * `run` is an R expression, that is potentially clickable if the terminal
#' supports ANSI hyperlinks to runnable code (e.g. RStudio).
#' It supports link text. See [links] for more about cli hyperlinks.
#' * `str` for a double quoted string escaped by [base::encodeString()].
#' * `strong` for strong importance.
#' * `topic` is a help page of a _ropic_.
#' If the terminal supports ANSI hyperlinks to help pages (e.g. RStudio),
Expand Down
2 changes: 1 addition & 1 deletion R/diff.R
Original file line number Diff line number Diff line change
Expand Up @@ -167,7 +167,7 @@ get_diff_chunks <- function(lcs, context = 3L) {

# chunk starts at operation number sum(length) before it, plus 1, but
# at the end we change this to include the context chunks are well
chunks$op_begin <- c(0, cumsum(runs$length))[which(runs$values)] + 1
chunks$op_begin <- c(0, cumsum(runs$lengths))[which(runs$values)] + 1
chunks$op_length <- runs$lengths[runs$values]

# `old` positions are from `old_off`, but need to fix the boundaries
Expand Down

0 comments on commit 5ca2ba9

Please sign in to comment.