Skip to content

Commit ac83772

Browse files
committed
Don't use scientific notation for sending slider values
1 parent d53acdb commit ac83772

File tree

1 file changed

+5
-5
lines changed

1 file changed

+5
-5
lines changed

R/input-slider.R

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -132,11 +132,11 @@ sliderInput <- function(inputId, label, min, max, value, step = NULL,
132132
class = "js-range-slider",
133133
id = inputId,
134134
`data-type` = if (length(value) > 1) "double",
135-
`data-min` = min,
136-
`data-max` = max,
137-
`data-from` = value[1],
138-
`data-to` = if (length(value) > 1) value[2],
139-
`data-step` = step,
135+
`data-min` = formatNoSci(min),
136+
`data-max` = formatNoSci(max),
137+
`data-from` = formatNoSci(value[1]),
138+
`data-to` = if (length(value) > 1) formatNoSci(value[2]),
139+
`data-step` = formatNoSci(step),
140140
`data-grid` = ticks,
141141
`data-grid-num` = n_ticks,
142142
`data-grid-snap` = FALSE,

0 commit comments

Comments
 (0)