Skip to content

Commit

Permalink
Merge pull request #680 from TimTaylor/main
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Mar 16, 2024
2 parents 1b5e691 + 5d92179 commit d9a2840
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/spark.R
Original file line number Diff line number Diff line change
Expand Up @@ -73,7 +73,7 @@ spark_bar_chars <- function(x, bars = NULL) {

factor <- cut(
x,
breaks = seq(0, 1, length = length(bars) + 1),
breaks = seq(0, 1, length.out = length(bars) + 1),
labels = bars,
include.lowest = TRUE
)
Expand Down Expand Up @@ -108,7 +108,7 @@ spark_line <- function(x) {
}

if (is_utf8_output()) {
y <- findInterval(x, seq(0, 1, length = 5), all.inside = TRUE)
y <- findInterval(x, seq(0, 1, length.out = 5), all.inside = TRUE)
ind <- matrix(y, ncol = 2, byrow = TRUE)
ind[, 2] <- ind[, 2] + 4
chars <- apply(ind, 1, braille)
Expand Down

0 comments on commit d9a2840

Please sign in to comment.