From f964af19e27ae94702aff99d2b27372f48e4a997 Mon Sep 17 00:00:00 2001 From: Carson Date: Fri, 21 Oct 2022 11:20:17 -0500 Subject: [PATCH 1/8] Add fill arguments to plotOutput(), imageOutput(), and uiOutput() --- DESCRIPTION | 6 ++++-- R/bootstrap.R | 31 ++++++++++++++++++++++++------- man/htmlOutput.Rd | 15 ++++++++++++++- man/plotOutput.Rd | 11 +++++++++-- 4 files changed, 51 insertions(+), 12 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 366fffa790..3d2d6e2fdf 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Package: shiny Type: Package Title: Web Application Framework for R -Version: 1.7.2.9000 +Version: 1.7.2.9001 Authors@R: c( person("Winston", "Chang", role = c("aut", "cre"), email = "winston@rstudio.com", comment = c(ORCID = "0000-0002-1576-2126")), person("Joe", "Cheng", role = "aut", email = "joe@rstudio.com"), @@ -79,7 +79,7 @@ Imports: jsonlite (>= 0.9.16), xtable, fontawesome (>= 0.2.1), - htmltools (>= 0.5.2), + htmltools (>= 0.5.3.9001), R6 (>= 2.0), sourcetools, later (>= 1.0.0), @@ -209,3 +209,5 @@ RdMacros: lifecycle Config/testthat/edition: 3 Config/Needs/check: rstudio/shinytest2 +Remotes: + rstudio/htmltools diff --git a/R/bootstrap.R b/R/bootstrap.R index 573ef97563..a1dd282b03 100644 --- a/R/bootstrap.R +++ b/R/bootstrap.R @@ -792,9 +792,9 @@ verbatimTextOutput <- function(outputId, placeholder = FALSE) { #' @name plotOutput #' @rdname plotOutput #' @export -imageOutput <- function(outputId, width = "100%", height="400px", +imageOutput <- function(outputId, width = "100%", height = "400px", click = NULL, dblclick = NULL, hover = NULL, brush = NULL, - inline = FALSE) { + inline = FALSE, fill = TRUE) { style <- if (!inline) { # Using `css()` here instead of paste/sprintf so that NULL values will @@ -850,7 +850,11 @@ imageOutput <- function(outputId, width = "100%", height="400px", } container <- if (inline) span else div - do.call(container, args) + res <- do.call(container, args) + if (fill) { + res <- asFillItem(res) + } + res } #' Create an plot or image output element @@ -918,6 +922,10 @@ imageOutput <- function(outputId, width = "100%", height="400px", #' `imageOutput`/`plotOutput` calls may share the same `id` #' value; brushing one image or plot will cause any other brushes with the #' same `id` to disappear. +#' @param fill whether or not the returned tag should be wrapped +#' [htmltools::asFillItem()] so that it's `height` is allowed to grow/shrink +#' inside a tag wrapped with [htmltools::asFillContainer()] (e.g., +#' [bslib::card_body_fill()]). #' @inheritParams textOutput #' @note The arguments `clickId` and `hoverId` only work for R base graphics #' (see the \pkg{\link[graphics:graphics-package]{graphics}} package). They do @@ -1088,11 +1096,11 @@ imageOutput <- function(outputId, width = "100%", height="400px", #' @export plotOutput <- function(outputId, width = "100%", height="400px", click = NULL, dblclick = NULL, hover = NULL, brush = NULL, - inline = FALSE) { + inline = FALSE, fill = TRUE) { # Result is the same as imageOutput, except for HTML class res <- imageOutput(outputId, width, height, click, dblclick, - hover, brush, inline) + hover, brush, inline, fill) res$attribs$class <- "shiny-plot-output" res @@ -1144,6 +1152,11 @@ dataTableOutput <- function(outputId) { #' @param outputId output variable to read the value from #' @param ... Other arguments to pass to the container tag function. This is #' useful for providing additional classes for the tag. +#' @param fill whether or not the returned `container` should be wrapped in +#' [htmltools::asFillContainer()] and [htmltools::asFillItem()]. This has the +#' benefit of allowing `uiOutput()`'s children to stretch to `uiOutput()`'s +#' container, but has the downside of changing the `display` context of +#' `uiOutput()`'s children to be flex items. #' @inheritParams textOutput #' @return An HTML output element that can be included in a panel #' @examples @@ -1155,12 +1168,16 @@ dataTableOutput <- function(outputId) { #' ) #' @export htmlOutput <- function(outputId, inline = FALSE, - container = if (inline) span else div, ...) + container = if (inline) span else div, fill = FALSE, ...) { if (any_unnamed(list(...))) { warning("Unnamed elements in ... will be replaced with dynamic UI.") } - container(id = outputId, class="shiny-html-output", ...) + res <- container(id = outputId, class = "shiny-html-output", ...) + if (fill) { + res <- asFillContainer(res, asItem = TRUE) + } + res } #' @rdname htmlOutput diff --git a/man/htmlOutput.Rd b/man/htmlOutput.Rd index 972fc29c3a..7702a61adf 100644 --- a/man/htmlOutput.Rd +++ b/man/htmlOutput.Rd @@ -9,10 +9,17 @@ htmlOutput( outputId, inline = FALSE, container = if (inline) span else div, + fill = FALSE, ... ) -uiOutput(outputId, inline = FALSE, container = if (inline) span else div, ...) +uiOutput( + outputId, + inline = FALSE, + container = if (inline) span else div, + fill = FALSE, + ... +) } \arguments{ \item{outputId}{output variable to read the value from} @@ -22,6 +29,12 @@ for the output} \item{container}{a function to generate an HTML element to contain the text} +\item{fill}{whether or not the returned \code{container} should be wrapped in +\code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}} and \code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}}. This has the +benefit of allowing \code{uiOutput()}'s children to stretch to \code{uiOutput()}'s +container, but has the downside of changing the \code{display} context of +\code{uiOutput()}'s children to be flex items.} + \item{...}{Other arguments to pass to the container tag function. This is useful for providing additional classes for the tag.} } diff --git a/man/plotOutput.Rd b/man/plotOutput.Rd index ba02666221..723a99707e 100644 --- a/man/plotOutput.Rd +++ b/man/plotOutput.Rd @@ -13,7 +13,8 @@ imageOutput( dblclick = NULL, hover = NULL, brush = NULL, - inline = FALSE + inline = FALSE, + fill = TRUE ) plotOutput( @@ -24,7 +25,8 @@ plotOutput( dblclick = NULL, hover = NULL, brush = NULL, - inline = FALSE + inline = FALSE, + fill = TRUE ) } \arguments{ @@ -76,6 +78,11 @@ same \code{id} to disappear.} \item{inline}{use an inline (\code{span()}) or block container (\code{div()}) for the output} + +\item{fill}{whether or not the returned tag should be wrapped +\code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}} so that it's \code{height} is allowed to grow/shrink +inside a tag wrapped with \code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}} (e.g., +\code{\link[bslib:card_body]{bslib::card_body_fill()}}).} } \value{ A plot or image output element that can be included in a panel. From 4e8eda791c3ff00691b8c3a79d30c77706b13dac Mon Sep 17 00:00:00 2001 From: Carson Date: Fri, 21 Oct 2022 16:35:20 -0500 Subject: [PATCH 2/8] Update news --- NEWS.md | 2 ++ 1 file changed, 2 insertions(+) diff --git a/NEWS.md b/NEWS.md index d8684067fb..951a6d1244 100644 --- a/NEWS.md +++ b/NEWS.md @@ -7,6 +7,8 @@ shiny 1.7.2.9000 ### New features and improvements +* `plotOutput()`, `imageOutput()`, and `uiOutput()` all gain a `fill` argument. If `TRUE` (the default for `plotOutput()` and `imageOutput()`), the output container is allowed to grow/shrink to fit its parent container (when that parent has a defined size and has been marked with `htmltools::asFillContainer()`). Most importantly, this means `plotOutput()` and `imageOutput()` will grow/shrink by default [inside of `bslib::card_body_fill()`](https://rstudio.github.io/bslib/articles/cards.html#responsive-sizing). (#3715) + * Internal: Added clearer and strict TypeScript type definitions (#3644) ### Bug fixes From 5a8fd304f96f661f2d6b201b8249d957a94c9620 Mon Sep 17 00:00:00 2001 From: Carson Date: Mon, 24 Oct 2022 16:21:43 -0500 Subject: [PATCH 3/8] Code review --- R/bootstrap.R | 43 ++++++++++++++++++++++++++----------------- man/htmlOutput.Rd | 26 +++++++++++++++++--------- man/plotOutput.Rd | 13 +++++++------ 3 files changed, 50 insertions(+), 32 deletions(-) diff --git a/R/bootstrap.R b/R/bootstrap.R index a1dd282b03..6ffb11b878 100644 --- a/R/bootstrap.R +++ b/R/bootstrap.R @@ -794,7 +794,7 @@ verbatimTextOutput <- function(outputId, placeholder = FALSE) { #' @export imageOutput <- function(outputId, width = "100%", height = "400px", click = NULL, dblclick = NULL, hover = NULL, brush = NULL, - inline = FALSE, fill = TRUE) { + inline = FALSE, fill = FALSE) { style <- if (!inline) { # Using `css()` here instead of paste/sprintf so that NULL values will @@ -922,10 +922,11 @@ imageOutput <- function(outputId, width = "100%", height = "400px", #' `imageOutput`/`plotOutput` calls may share the same `id` #' value; brushing one image or plot will cause any other brushes with the #' same `id` to disappear. -#' @param fill whether or not the returned tag should be wrapped -#' [htmltools::asFillItem()] so that it's `height` is allowed to grow/shrink -#' inside a tag wrapped with [htmltools::asFillContainer()] (e.g., -#' [bslib::card_body_fill()]). +#' @param fill whether or not the returned tag should be treated as a fill item +#' ([htmltools::asFillItem()]), meaning that its `height` is allowed to +#' grow/shrink inside a fill container ([htmltools::asFillContainer()]) with +#' an opinionated height. Examples of fill containers include [bslib::card()] +#' and [bslib::card_body_fill()]. #' @inheritParams textOutput #' @note The arguments `clickId` and `hoverId` only work for R base graphics #' (see the \pkg{\link[graphics:graphics-package]{graphics}} package). They do @@ -1096,7 +1097,7 @@ imageOutput <- function(outputId, width = "100%", height = "400px", #' @export plotOutput <- function(outputId, width = "100%", height="400px", click = NULL, dblclick = NULL, hover = NULL, brush = NULL, - inline = FALSE, fill = TRUE) { + inline = FALSE, fill = !inline) { # Result is the same as imageOutput, except for HTML class res <- imageOutput(outputId, width, height, click, dblclick, @@ -1143,20 +1144,25 @@ dataTableOutput <- function(outputId) { #' Create an HTML output element #' #' Render a reactive output variable as HTML within an application page. The -#' text will be included within an HTML `div` tag, and is presumed to -#' contain HTML content which should not be escaped. +#' text will be included within an HTML `div` tag, and is presumed to contain +#' HTML content which should not be escaped. #' -#' `uiOutput` is intended to be used with `renderUI` on the server -#' side. It is currently just an alias for `htmlOutput`. +#' `uiOutput` is intended to be used with `renderUI` on the server side. It is +#' currently just an alias for `htmlOutput`. #' #' @param outputId output variable to read the value from #' @param ... Other arguments to pass to the container tag function. This is #' useful for providing additional classes for the tag. -#' @param fill whether or not the returned `container` should be wrapped in -#' [htmltools::asFillContainer()] and [htmltools::asFillItem()]. This has the -#' benefit of allowing `uiOutput()`'s children to stretch to `uiOutput()`'s -#' container, but has the downside of changing the `display` context of -#' `uiOutput()`'s children to be flex items. +#' @param fill whether or not the returned `container` should be treated as a +#' fill container ([htmltools::asFillContainer()]). If `TRUE`, children of the +#' `container` (i.e., results of `renderUI()`) that are fill items +#' ([htmltools::asFillItem()]) are allowed to grow/shrink to fit a `container` +#' with an opinionated height. +#' @param fillItem whether or not the `container` result should be treated as a +#' fill item ([htmltools::asFillItem()]), meaning that its `height` is allowed +#' to grow/shrink inside a fill container ([htmltools::asFillContainer()]) +#' with an opinionated height. Examples of fill containers include +#' [bslib::card()] and [bslib::card_body_fill()]. #' @inheritParams textOutput #' @return An HTML output element that can be included in a panel #' @examples @@ -1168,14 +1174,17 @@ dataTableOutput <- function(outputId) { #' ) #' @export htmlOutput <- function(outputId, inline = FALSE, - container = if (inline) span else div, fill = FALSE, ...) + container = if (inline) span else div, fill = FALSE, fillItem = !inline, ...) { if (any_unnamed(list(...))) { warning("Unnamed elements in ... will be replaced with dynamic UI.") } res <- container(id = outputId, class = "shiny-html-output", ...) if (fill) { - res <- asFillContainer(res, asItem = TRUE) + res <- asFillContainer(res) + } + if (fillItem) { + res <- asFillItem(res) } res } diff --git a/man/htmlOutput.Rd b/man/htmlOutput.Rd index 7702a61adf..40a0910a39 100644 --- a/man/htmlOutput.Rd +++ b/man/htmlOutput.Rd @@ -10,6 +10,7 @@ htmlOutput( inline = FALSE, container = if (inline) span else div, fill = FALSE, + fillItem = !inline, ... ) @@ -18,6 +19,7 @@ uiOutput( inline = FALSE, container = if (inline) span else div, fill = FALSE, + fillItem = !inline, ... ) } @@ -29,11 +31,17 @@ for the output} \item{container}{a function to generate an HTML element to contain the text} -\item{fill}{whether or not the returned \code{container} should be wrapped in -\code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}} and \code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}}. This has the -benefit of allowing \code{uiOutput()}'s children to stretch to \code{uiOutput()}'s -container, but has the downside of changing the \code{display} context of -\code{uiOutput()}'s children to be flex items.} +\item{fill}{whether or not the returned \code{container} should be treated as a +fill container (\code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}}). If \code{TRUE}, children of the +\code{container} (i.e., results of \code{renderUI()}) that are fill items +(\code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}}) are allowed to grow/shrink to fit a \code{container} +with an opinionated height.} + +\item{fillItem}{whether or not the \code{container} result should be treated as a +fill item (\code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}}), meaning that its \code{height} is allowed +to grow/shrink inside a fill container (\code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}}) +with an opinionated height. Examples of fill containers include +\code{\link[bslib:card]{bslib::card()}} and \code{\link[bslib:card_body]{bslib::card_body_fill()}}.} \item{...}{Other arguments to pass to the container tag function. This is useful for providing additional classes for the tag.} @@ -43,12 +51,12 @@ An HTML output element that can be included in a panel } \description{ Render a reactive output variable as HTML within an application page. The -text will be included within an HTML \code{div} tag, and is presumed to -contain HTML content which should not be escaped. +text will be included within an HTML \code{div} tag, and is presumed to contain +HTML content which should not be escaped. } \details{ -\code{uiOutput} is intended to be used with \code{renderUI} on the server -side. It is currently just an alias for \code{htmlOutput}. +\code{uiOutput} is intended to be used with \code{renderUI} on the server side. It is +currently just an alias for \code{htmlOutput}. } \examples{ htmlOutput("summary") diff --git a/man/plotOutput.Rd b/man/plotOutput.Rd index 723a99707e..91156c9ffe 100644 --- a/man/plotOutput.Rd +++ b/man/plotOutput.Rd @@ -14,7 +14,7 @@ imageOutput( hover = NULL, brush = NULL, inline = FALSE, - fill = TRUE + fill = FALSE ) plotOutput( @@ -26,7 +26,7 @@ plotOutput( hover = NULL, brush = NULL, inline = FALSE, - fill = TRUE + fill = !inline ) } \arguments{ @@ -79,10 +79,11 @@ same \code{id} to disappear.} \item{inline}{use an inline (\code{span()}) or block container (\code{div()}) for the output} -\item{fill}{whether or not the returned tag should be wrapped -\code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}} so that it's \code{height} is allowed to grow/shrink -inside a tag wrapped with \code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}} (e.g., -\code{\link[bslib:card_body]{bslib::card_body_fill()}}).} +\item{fill}{whether or not the returned tag should be treated as a fill item +(\code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}}), meaning that its \code{height} is allowed to +grow/shrink inside a fill container (\code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}}) with +an opinionated height. Examples of fill containers include \code{\link[bslib:card]{bslib::card()}} +and \code{\link[bslib:card_body]{bslib::card_body_fill()}}.} } \value{ A plot or image output element that can be included in a panel. From 514addfc23acba37e9618485a2dc828fdce788c6 Mon Sep 17 00:00:00 2001 From: cpsievert Date: Mon, 24 Oct 2022 21:24:42 +0000 Subject: [PATCH 4/8] `devtools::document()` (GitHub Actions) --- man/htmlOutput.Rd | 2 +- man/plotOutput.Rd | 2 +- 2 files changed, 2 insertions(+), 2 deletions(-) diff --git a/man/htmlOutput.Rd b/man/htmlOutput.Rd index 40a0910a39..8364e6f77f 100644 --- a/man/htmlOutput.Rd +++ b/man/htmlOutput.Rd @@ -41,7 +41,7 @@ with an opinionated height.} fill item (\code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}}), meaning that its \code{height} is allowed to grow/shrink inside a fill container (\code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}}) with an opinionated height. Examples of fill containers include -\code{\link[bslib:card]{bslib::card()}} and \code{\link[bslib:card_body]{bslib::card_body_fill()}}.} +\code{\link[bslib:card]{bslib::card()}} and \code{\link[bslib:card_body_fill]{bslib::card_body_fill()}}.} \item{...}{Other arguments to pass to the container tag function. This is useful for providing additional classes for the tag.} diff --git a/man/plotOutput.Rd b/man/plotOutput.Rd index 91156c9ffe..476a1f69ff 100644 --- a/man/plotOutput.Rd +++ b/man/plotOutput.Rd @@ -83,7 +83,7 @@ for the output} (\code{\link[htmltools:asFillContainer]{htmltools::asFillItem()}}), meaning that its \code{height} is allowed to grow/shrink inside a fill container (\code{\link[htmltools:asFillContainer]{htmltools::asFillContainer()}}) with an opinionated height. Examples of fill containers include \code{\link[bslib:card]{bslib::card()}} -and \code{\link[bslib:card_body]{bslib::card_body_fill()}}.} +and \code{\link[bslib:card_body_fill]{bslib::card_body_fill()}}.} } \value{ A plot or image output element that can be included in a panel. From 6ec4795892131fcb182812b74c322286cfb4a2d3 Mon Sep 17 00:00:00 2001 From: cpsievert Date: Mon, 24 Oct 2022 21:26:14 +0000 Subject: [PATCH 5/8] `yarn build` (GitHub Actions) --- inst/www/shared/shiny-autoreload.js | 2 +- inst/www/shared/shiny-showcase.css | 2 +- inst/www/shared/shiny-showcase.js | 2 +- inst/www/shared/shiny-testmode.js | 2 +- inst/www/shared/shiny.js | 4 ++-- inst/www/shared/shiny.min.css | 2 +- inst/www/shared/shiny.min.js | 4 ++-- 7 files changed, 9 insertions(+), 9 deletions(-) diff --git a/inst/www/shared/shiny-autoreload.js b/inst/www/shared/shiny-autoreload.js index 416eaf49d9..f55ea97c97 100644 --- a/inst/www/shared/shiny-autoreload.js +++ b/inst/www/shared/shiny-autoreload.js @@ -1,3 +1,3 @@ -/*! shiny 1.7.2.9000 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ +/*! shiny 1.7.2.9001 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ "use strict";(function(){var on=Object.create;var Nr=Object.defineProperty;var un=Object.getOwnPropertyDescriptor;var cn=Object.getOwnPropertyNames;var vn=Object.getPrototypeOf,fn=Object.prototype.hasOwnProperty;var a=function(r,e){return function(){return e||r((e={exports:{}}).exports,e),e.exports}};var ln=function(r,e,t,n){if(e&&typeof e=="object"||typeof e=="function")for(var o=cn(e),i=0,u=o.length,c;i0?xa:qa)(r)}});var J=a(function(Qo,$e){var Sa=T(),ha=Math.min;$e.exports=function(r){return r>0?ha(Sa(r),9007199254740991):0}});var Ge=a(function(Vo,Ke){var ba=T(),Oa=Math.max,Pa=Math.min;Ke.exports=function(r,e){var t=ba(r);return t<0?Oa(t+e,0):Pa(t,e)}});var ke=a(function(ru,Xe){var Ia=B(),_a=J(),wa=Ge(),We=function(r){return function(e,t,n){var o=Ia(e),i=_a(o.length),u=wa(n,i),c;if(r&&t!=t){for(;i>u;)if(c=o[u++],c!=c)return!0}else for(;i>u;u++)if((r||u in o)&&o[u]===t)return r||u||0;return!r&&-1}};Xe.exports={includes:We(!0),indexOf:We(!1)}});var ze=a(function(eu,He){var hr=h(),Aa=B(),ma=ke().indexOf,Ta=pr();He.exports=function(r,e){var t=Aa(r),n=0,o=[],i;for(i in t)!hr(Ta,i)&&hr(t,i)&&o.push(i);for(;e.length>n;)hr(t,i=e[n++])&&(~ma(o,i)||o.push(i));return o}});var Je=a(function(tu,Ye){Ye.exports=["constructor","hasOwnProperty","isPrototypeOf","propertyIsEnumerable","toLocaleString","toString","valueOf"]});var Qe=a(function(Ze){var Ra=ze(),Da=Je(),Fa=Da.concat("length","prototype");Ze.f=Object.getOwnPropertyNames||function(e){return Ra(e,Fa)}});var rt=a(function(Ve){Ve.f=Object.getOwnPropertySymbols});var tt=a(function(iu,et){var Ca=Sr(),ja=Qe(),Na=rt(),Ma=A();et.exports=Ca("Reflect","ownKeys")||function(e){var t=ja.f(Ma(e)),n=Na.f;return n?t.concat(n(e)):t}});var at=a(function(ou,nt){var La=h(),Ua=tt(),Ba=vr(),$a=W();nt.exports=function(r,e){for(var t=Ua(e),n=$a.f,o=Ba.f,i=0;i0&&(!t.multiline||t.multiline&&e[t.lastIndex-1]!=="\n")&&(l="(?: "+l+")",f=" "+f,s++),o=new RegExp("^(?:"+l+")",v)),_r&&(o=new RegExp("^"+l+"$(?!\\s)",v)),Ir&&(n=t.lastIndex),i=Z.call(c?o:t,f),c?i?(i.input=i.input.slice(s),i[0]=i[0].slice(s),i.index=t.lastIndex,t.lastIndex+=i[0].length):t.lastIndex=0:Ir&&i&&(t.lastIndex=t.global?i.index+i[0].length:n),_r&&i&&i.length>1&&ni.call(i[0],o,function(){for(u=1;u=74)&&(q=Ar.match(/Chrome\/(\d+)/),q&&(V=q[1])));Ot.exports=V&&+V});var mr=a(function(Eu,It){var Pt=rr(),ci=y();It.exports=!!Object.getOwnPropertySymbols&&!ci(function(){var r=Symbol();return!String(r)||!(Object(r)instanceof Symbol)||!Symbol.sham&&Pt&&Pt<41})});var wt=a(function(yu,_t){var vi=mr();_t.exports=vi&&!Symbol.sham&&typeof Symbol.iterator=="symbol"});var C=a(function(qu,Tt){var fi=g(),li=H(),At=h(),si=sr(),mt=mr(),pi=wt(),D=li("wks"),F=fi.Symbol,di=pi?F:F&&F.withoutSetter||si;Tt.exports=function(r){return(!At(D,r)||!(mt||typeof D[r]=="string"))&&(mt&&At(F,r)?D[r]=F[r]:D[r]=di("Symbol."+r)),D[r]}});var Nt=a(function(xu,jt){"use strict";wr();var Rt=yr(),gi=Q(),er=y(),Rr=C(),Ei=O(),yi=Rr("species"),Tr=RegExp.prototype,qi=!er(function(){var r=/./;return r.exec=function(){var e=[];return e.groups={a:"7"},e},"".replace(r,"$")!=="7"}),Dt=function(){return"a".replace(/./,"$0")==="$0"}(),Ft=Rr("replace"),Ct=function(){return/./[Ft]?/./[Ft]("a","$0")==="":!1}(),xi=!er(function(){var r=/(?:)/,e=r.exec;r.exec=function(){return e.apply(this,arguments)};var t="ab".split(r);return t.length!==2||t[0]!=="a"||t[1]!=="b"});jt.exports=function(r,e,t,n){var o=Rr(r),i=!er(function(){var f={};return f[o]=function(){return 7},""[r](f)!=7}),u=i&&!er(function(){var f=!1,p=/a/;return r==="split"&&(p={},p.constructor={},p.constructor[yi]=function(){return p},p.flags="",p[o]=/./[o]),p.exec=function(){return f=!0,null},p[o](""),!f});if(!i||!u||r==="replace"&&!(qi&&Dt&&!Ct)||r==="split"&&!xi){var c=/./[o],v=t(o,""[r],function(f,p,E,j,P){var d=p.exec;return d===gi||d===Tr.exec?i&&!P?{done:!0,value:c.call(p,E,j)}:{done:!0,value:f.call(E,p,j)}:{done:!1}},{REPLACE_KEEPS_$0:Dt,REGEXP_REPLACE_SUBSTITUTES_UNDEFINED_CAPTURE:Ct}),l=v[0],s=v[1];Rt(String.prototype,r,l),Rt(Tr,o,e==2?function(f,p){return s.call(f,this,p)}:function(f){return s.call(f,this)})}n&&Ei(Tr[o],"sham",!0)}});var Ut=a(function(Su,Lt){var Si=T(),hi=w(),Mt=function(r){return function(e,t){var n=String(hi(e)),o=Si(t),i=n.length,u,c;return o<0||o>=i?r?"":void 0:(u=n.charCodeAt(o),u<55296||u>56319||o+1===i||(c=n.charCodeAt(o+1))<56320||c>57343?r?n.charAt(o):u:r?n.slice(o,o+2):(u-55296<<10)+(c-56320)+65536)}};Lt.exports={codeAt:Mt(!1),charAt:Mt(!0)}});var $t=a(function(hu,Bt){"use strict";var bi=Ut().charAt;Bt.exports=function(r,e,t){return e+(t?bi(r,e).length:1)}});var Gt=a(function(bu,Kt){var Oi=G(),Pi=Math.floor,Ii="".replace,_i=/\$([$&'`]|\d{1,2}|<[^>]*>)/g,wi=/\$([$&'`]|\d{1,2})/g;Kt.exports=function(r,e,t,n,o,i){var u=t+r.length,c=n.length,v=wi;return o!==void 0&&(o=Oi(o),v=_i),Ii.call(i,v,function(l,s){var f;switch(s.charAt(0)){case"$":return"$";case"&":return r;case"`":return e.slice(0,t);case"'":return e.slice(u);case"<":f=o[s.slice(1,-1)];break;default:var p=+s;if(p===0)return l;if(p>c){var E=Pi(p/10);return E===0?l:E<=c?n[E-1]===void 0?s.charAt(1):n[E-1]+s.charAt(1):l}f=n[p-1]}return f===void 0?"":f})}});var Xt=a(function(Ou,Wt){var Ai=U(),mi=Q();Wt.exports=function(r,e){var t=r.exec;if(typeof t=="function"){var n=t.call(r,e);if(typeof n!="object")throw TypeError("RegExp exec method returned something other than an Object or null");return n}if(Ai(r)!=="RegExp")throw TypeError("RegExp#exec called on incompatible receiver");return mi.call(r,e)}});var Dr=a(function(Pu,kt){var $i=U();kt.exports=Array.isArray||function(e){return $i(e)=="Array"}});var zt=a(function(Iu,Ht){"use strict";var Ki=K(),Gi=W(),Wi=L();Ht.exports=function(r,e,t){var n=Ki(e);n in r?Gi.f(r,n,Wi(0,t)):r[n]=t}});var Zt=a(function(_u,Jt){var Xi=S(),Yt=Dr(),ki=C(),Hi=ki("species");Jt.exports=function(r,e){var t;return Yt(r)&&(t=r.constructor,typeof t=="function"&&(t===Array||Yt(t.prototype))?t=void 0:Xi(t)&&(t=t[Hi],t===null&&(t=void 0))),new(t===void 0?Array:t)(e===0?0:e)}});var Vt=a(function(wu,Qt){var zi=y(),Yi=C(),Ji=rr(),Zi=Yi("species");Qt.exports=function(r){return Ji>=51||!zi(function(){var e=[],t=e.constructor={};return t[Zi]=function(){return{foo:1}},e[r](Boolean).foo!==1})}});var Au=sn(wr());var Ti=Nt(),Ri=A(),Di=J(),Fi=T(),Ci=w(),ji=$t(),Ni=Gt(),Mi=Xt(),Li=Math.max,Ui=Math.min,Bi=function(r){return r===void 0?r:String(r)};Ti("replace",2,function(r,e,t,n){var o=n.REGEXP_REPLACE_SUBSTITUTES_UNDEFINED_CAPTURE,i=n.REPLACE_KEEPS_$0,u=o?"$":"$0";return[function(v,l){var s=Ci(this),f=v==null?void 0:v[r];return f!==void 0?f.call(v,s,l):e.call(String(s),v,l)},function(c,v){if(!o&&i||typeof v=="string"&&v.indexOf(u)===-1){var l=t(e,c,this,v);if(l.done)return l.value}var s=Ri(c),f=String(this),p=typeof v=="function";p||(v=String(v));var E=s.global;if(E){var j=s.unicode;s.lastIndex=0}for(var P=[];;){var d=Mi(s,f);if(d===null||(P.push(d),!E))break;var an=String(d[0]);an===""&&(s.lastIndex=ji(f,Di(s.lastIndex),j))}for(var Fr="",N=0,tr=0;tr=N&&(Fr+=f.slice(N,I)+jr,N=I+nr.length)}return Fr+f.slice(N)}]});var Qi=Or(),Vi=y(),ro=Dr(),eo=S(),to=G(),no=J(),rn=zt(),ao=Zt(),io=Vt(),oo=C(),uo=rr(),nn=oo("isConcatSpreadable"),en=9007199254740991,tn="Maximum allowed index exceeded",co=uo>=51||!Vi(function(){var r=[];return r[nn]=!1,r.concat()[0]!==r}),vo=io("concat"),fo=function(r){if(!eo(r))return!1;var e=r[nn];return e!==void 0?!!e:ro(r)},lo=!co||!vo;Qi({target:"Array",proto:!0,forced:lo},{concat:function(e){var t=to(this),n=ao(t,0),o=0,i,u,c,v,l;for(i=-1,c=arguments.length;ien)throw TypeError(tn);for(u=0;u=en)throw TypeError(tn);rn(n,o++,l)}return n.length=o,n}});var so=window.location.protocol==="https:"?"wss:":"ws:",po=window.location.pathname.replace(/\/?$/,"/")+"autoreload/",go="".concat(so,"//").concat(window.location.host).concat(po),Eo=document.currentScript.dataset.wsUrl||go,yo=new WebSocket(Eo);yo.onmessage=function(r){r.data==="autoreload"&&window.location.reload()};})(); //# sourceMappingURL=shiny-autoreload.js.map diff --git a/inst/www/shared/shiny-showcase.css b/inst/www/shared/shiny-showcase.css index 9cbf4325e7..86f83d56b9 100644 --- a/inst/www/shared/shiny-showcase.css +++ b/inst/www/shared/shiny-showcase.css @@ -1,2 +1,2 @@ -/*! shiny 1.7.2.9000 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ +/*! shiny 1.7.2.9001 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ #showcase-well{border-radius:0}.shiny-code{background-color:#fff;margin-bottom:0}.shiny-code code{font-family:Menlo,Consolas,Courier New,monospace}.shiny-code-container{margin-top:20px;clear:both}.shiny-code-container h3{display:inline;margin-right:15px}.showcase-header{font-size:16px;font-weight:400}.showcase-code-link{text-align:right;padding:15px}#showcase-app-container{vertical-align:top}#showcase-code-tabs{margin-right:15px}#showcase-code-tabs pre{border:none;line-height:1em}#showcase-code-tabs .nav,#showcase-code-tabs ul{margin-bottom:0}#showcase-code-tabs .tab-content{border-style:solid;border-color:#e5e5e5;border-width:0px 1px 1px 1px;overflow:auto;border-bottom-right-radius:4px;border-bottom-left-radius:4px}#showcase-app-code{width:100%}#showcase-code-position-toggle{float:right}#showcase-sxs-code{padding-top:20px;vertical-align:top}.showcase-code-license{display:block;text-align:right}#showcase-code-content pre{background-color:#fff} diff --git a/inst/www/shared/shiny-showcase.js b/inst/www/shared/shiny-showcase.js index a05c4df3bb..ea6a9f5936 100644 --- a/inst/www/shared/shiny-showcase.js +++ b/inst/www/shared/shiny-showcase.js @@ -1,3 +1,3 @@ -/*! shiny 1.7.2.9000 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ +/*! shiny 1.7.2.9001 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ "use strict";(function(){var en=Object.create;var Me=Object.defineProperty;var rn=Object.getOwnPropertyDescriptor;var tn=Object.getOwnPropertyNames;var nn=Object.getPrototypeOf,on=Object.prototype.hasOwnProperty;var a=function(e,r){return function(){return r||e((r={exports:{}}).exports,r),r.exports}};var an=function(e,r,t,n){if(r&&typeof r=="object"||typeof r=="function")for(var o=tn(r),i=0,u=o.length,l;i0?pi:di)(e)}});var xe=a(function(qa,Ur){var gi=C(),hi=Math.min;Ur.exports=function(e){return e>0?hi(gi(e),9007199254740991):0}});var Hr=a(function(Sa,Wr){var yi=C(),Ei=Math.max,xi=Math.min;Wr.exports=function(e,r){var t=yi(e);return t<0?Ei(t+r,0):xi(t,r)}});var zr=a(function(ba,Kr){var mi=B(),qi=xe(),Si=Hr(),Gr=function(e){return function(r,t,n){var o=mi(r),i=qi(o.length),u=Si(n,i),l;if(e&&t!=t){for(;i>u;)if(l=o[u++],l!=l)return!0}else for(;i>u;u++)if((e||u in o)&&o[u]===t)return e||u||0;return!e&&-1}};Kr.exports={includes:Gr(!0),indexOf:Gr(!1)}});var Xr=a(function(wa,kr){var me=m(),bi=B(),wi=zr().indexOf,Ii=se();kr.exports=function(e,r){var t=bi(e),n=0,o=[],i;for(i in t)!me(Ii,i)&&me(t,i)&&o.push(i);for(;r.length>n;)me(t,i=r[n++])&&(~wi(o,i)||o.push(i));return o}});var Jr=a(function(Ia,Yr){Yr.exports=["constructor","hasOwnProperty","isPrototypeOf","propertyIsEnumerable","toLocaleString","toString","valueOf"]});var Qr=a(function(Zr){var Pi=Xr(),Oi=Jr(),Ti=Oi.concat("length","prototype");Zr.f=Object.getOwnPropertyNames||function(r){return Pi(r,Ti)}});var et=a(function(Vr){Vr.f=Object.getOwnPropertySymbols});var tt=a(function(Ta,rt){var _i=Ee(),Ci=Qr(),Ri=et(),Ai=T();rt.exports=_i("Reflect","ownKeys")||function(r){var t=Ci.f(Ai(r)),n=Ri.f;return n?t.concat(n(r)):t}});var it=a(function(_a,nt){var Ni=m(),Di=tt(),ji=ae(),Mi=ue();nt.exports=function(e,r){for(var t=Di(r),n=Mi.f,o=ji.f,i=0;i0&&(!t.multiline||t.multiline&&r[t.lastIndex-1]!=="\n")&&(s="(?: "+s+")",f=" "+f,v++),o=new RegExp("^(?:"+s+")",c)),we&&(o=new RegExp("^"+s+"$(?!\\s)",c)),be&&(n=t.lastIndex),i=K.call(l?o:t,f),l?i?(i.input=i.input.slice(v),i[0]=i[0].slice(v),i.index=t.lastIndex,t.lastIndex+=i[0].length):t.lastIndex=0:be&&i&&(t.lastIndex=t.global?i.index+i[0].length:n),we&&i&&i.length>1&&Qi.call(i[0],o,function(){for(u=1;u=74)&&(y=Pe.match(/Chrome\/(\d+)/),y&&(k=y[1])));wt.exports=k&&+k});var Oe=a(function(Fa,Ot){var Pt=It(),no=E();Ot.exports=!!Object.getOwnPropertySymbols&&!no(function(){var e=Symbol();return!String(e)||!(Object(e)instanceof Symbol)||!Symbol.sham&&Pt&&Pt<41})});var _t=a(function($a,Tt){var io=Oe();Tt.exports=io&&!Symbol.sham&&typeof Symbol.iterator=="symbol"});var Nt=a(function(Ua,At){var oo=g(),ao=W(),Ct=m(),uo=fe(),Rt=Oe(),lo=_t(),A=ao("wks"),N=oo.Symbol,co=lo?N:N&&N.withoutSetter||uo;At.exports=function(e){return(!Ct(A,e)||!(Rt||typeof A[e]=="string"))&&(Rt&&Ct(N,e)?A[e]=N[e]:A[e]=co("Symbol."+e)),A[e]}});var Ft=a(function(Wa,Lt){"use strict";Ie();var Dt=ge(),fo=z(),X=E(),_e=Nt(),so=S(),vo=_e("species"),Te=RegExp.prototype,po=!X(function(){var e=/./;return e.exec=function(){var r=[];return r.groups={a:"7"},r},"".replace(e,"$")!=="7"}),jt=function(){return"a".replace(/./,"$0")==="$0"}(),Mt=_e("replace"),Bt=function(){return/./[Mt]?/./[Mt]("a","$0")==="":!1}(),go=!X(function(){var e=/(?:)/,r=e.exec;e.exec=function(){return r.apply(this,arguments)};var t="ab".split(e);return t.length!==2||t[0]!=="a"||t[1]!=="b"});Lt.exports=function(e,r,t,n){var o=_e(e),i=!X(function(){var f={};return f[o]=function(){return 7},""[e](f)!=7}),u=i&&!X(function(){var f=!1,d=/a/;return e==="split"&&(d={},d.constructor={},d.constructor[vo]=function(){return d},d.flags="",d[o]=/./[o]),d.exec=function(){return f=!0,null},d[o](""),!f});if(!i||!u||e==="replace"&&!(po&&jt&&!Bt)||e==="split"&&!go){var l=/./[o],c=t(o,""[e],function(f,d,h,D,b){var p=d.exec;return p===fo||p===Te.exec?i&&!b?{done:!0,value:l.call(d,h,D)}:{done:!0,value:f.call(h,d,D)}:{done:!1}},{REPLACE_KEEPS_$0:jt,REGEXP_REPLACE_SUBSTITUTES_UNDEFINED_CAPTURE:Bt}),s=c[0],v=c[1];Dt(String.prototype,e,s),Dt(Te,o,r==2?function(f,d){return v.call(f,this,d)}:function(f){return v.call(f,this)})}n&&so(Te[o],"sham",!0)}});var Wt=a(function(Ha,Ut){var ho=C(),yo=P(),$t=function(e){return function(r,t){var n=String(yo(r)),o=ho(t),i=n.length,u,l;return o<0||o>=i?e?"":void 0:(u=n.charCodeAt(o),u<55296||u>56319||o+1===i||(l=n.charCodeAt(o+1))<56320||l>57343?e?n.charAt(o):u:e?n.slice(o,o+2):(u-55296<<10)+(l-56320)+65536)}};Ut.exports={codeAt:$t(!1),charAt:$t(!0)}});var Gt=a(function(Ga,Ht){"use strict";var Eo=Wt().charAt;Ht.exports=function(e,r,t){return r+(t?Eo(e,r).length:1)}});var zt=a(function(Ka,Kt){var xo=ne(),mo=Math.floor,qo="".replace,So=/\$([$&'`]|\d{1,2}|<[^>]*>)/g,bo=/\$([$&'`]|\d{1,2})/g;Kt.exports=function(e,r,t,n,o,i){var u=t+e.length,l=n.length,c=bo;return o!==void 0&&(o=xo(o),c=So),qo.call(i,c,function(s,v){var f;switch(v.charAt(0)){case"$":return"$";case"&":return e;case"`":return r.slice(0,t);case"'":return r.slice(u);case"<":f=o[v.slice(1,-1)];break;default:var d=+v;if(d===0)return s;if(d>l){var h=mo(d/10);return h===0?s:h<=l?n[h-1]===void 0?v.charAt(1):n[h-1]+v.charAt(1):s}f=n[d-1]}return f===void 0?"":f})}});var Xt=a(function(za,kt){var wo=re(),Io=z();kt.exports=function(e,r){var t=e.exec;if(typeof t=="function"){var n=t.call(e,r);if(typeof n!="object")throw TypeError("RegExp exec method returned something other than an Object or null");return n}if(wo(e)!=="RegExp")throw TypeError("RegExp#exec called on incompatible receiver");return Io.call(e,r)}});var ka=un(Ie());var Po=Ft(),Oo=T(),To=xe(),_o=C(),Co=P(),Ro=Gt(),Ao=zt(),No=Xt(),Do=Math.max,jo=Math.min,Mo=function(e){return e===void 0?e:String(e)};Po("replace",2,function(e,r,t,n){var o=n.REGEXP_REPLACE_SUBSTITUTES_UNDEFINED_CAPTURE,i=n.REPLACE_KEEPS_$0,u=o?"$":"$0";return[function(c,s){var v=Co(this),f=c==null?void 0:c[e];return f!==void 0?f.call(c,v,s):r.call(String(v),c,s)},function(l,c){if(!o&&i||typeof c=="string"&&c.indexOf(u)===-1){var s=t(r,l,this,c);if(s.done)return s.value}var v=Oo(l),f=String(this),d=typeof c=="function";d||(c=String(c));var h=v.global;if(h){var D=v.unicode;v.lastIndex=0}for(var b=[];;){var p=No(v,f);if(p===null||(b.push(p),!h))break;var Vt=String(p[0]);Vt===""&&(v.lastIndex=Ro(f,To(v.lastIndex),D))}for(var Ne="",j=0,Y=0;Y=j&&(Ne+=f.slice(j,w)+je,j=w+J.length)}return Ne+f.slice(j)}]});var Yt=400;function Ce(e,r){var t=0;if(e.nodeType===3){var n=e.nodeValue.replace(/\n/g,"").length;if(n>=r)return{element:e,offset:r};t+=n}else if(e.nodeType===1&&e.firstChild){var o=Ce(e.firstChild,r);if(o.element!==null)return o;t+=o.offset}return e.nextSibling?Ce(e.nextSibling,r-t):{element:null,offset:t}}function Re(e,r,t){for(var n=0,o=0;o show below':' show with app'}),r&&$(document.body).animate({scrollTop:0},n),Ae=r,Zt(r&&t),$(window).trigger("resize")};function Zt(e){var r=960,t=r,n=1,o=document.getElementById("showcase-app-code").offsetWidth;o/2>r?t=o/2:o*.66>r?t=960:(t=o*.66,n=t/r);var i=document.getElementById("showcase-app-container");$(i).animate({width:t+"px",zoom:n*100+"%"},e?Yt:0)}var Lo=function(){Jt(!Ae,!0)},Fo=function(){document.body.offsetWidth>1350&&Jt(!0,!1)};function Qt(){document.getElementById("showcase-code-content").style.height=$(window).height()+"px"}function $o(){var e=document.getElementById("showcase-markdown-content");if(e!==null){var r=e.innerText||e.innerHTML,t=window.Showdown.converter;document.getElementById("readme-md").innerHTML=new t().makeHtml(r)}}$(window).resize(function(){Ae&&(Zt(!1),Qt())});window.toggleCodePosition=Lo;$(window).on("load",Fo);$(window).on("load",$o);window.hljs&&window.hljs.initHighlightingOnLoad();})(); //# sourceMappingURL=shiny-showcase.js.map diff --git a/inst/www/shared/shiny-testmode.js b/inst/www/shared/shiny-testmode.js index 6760c192b9..b33798e4e9 100644 --- a/inst/www/shared/shiny-testmode.js +++ b/inst/www/shared/shiny-testmode.js @@ -1,3 +1,3 @@ -/*! shiny 1.7.2.9000 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ +/*! shiny 1.7.2.9001 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ "use strict";(function(){var a=eval;window.addEventListener("message",function(i){var e=i.data;e.code&&a(e.code)});})(); //# sourceMappingURL=shiny-testmode.js.map diff --git a/inst/www/shared/shiny.js b/inst/www/shared/shiny.js index 2e4f329eba..9b16e56539 100644 --- a/inst/www/shared/shiny.js +++ b/inst/www/shared/shiny.js @@ -1,4 +1,4 @@ -/*! shiny 1.7.2.9000 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ +/*! shiny 1.7.2.9001 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ "use strict"; (function() { var __create = Object.create; @@ -13063,7 +13063,7 @@ var windowShiny2; function setShiny(windowShiny_) { windowShiny2 = windowShiny_; - windowShiny2.version = "1.7.2.9000"; + windowShiny2.version = "1.7.2.9001"; var _initInputBindings = initInputBindings(), inputBindings = _initInputBindings.inputBindings, fileInputBinding2 = _initInputBindings.fileInputBinding; var _initOutputBindings = initOutputBindings(), outputBindings = _initOutputBindings.outputBindings; setFileInputBinding(fileInputBinding2); diff --git a/inst/www/shared/shiny.min.css b/inst/www/shared/shiny.min.css index 84fdf9635f..e52329609e 100644 --- a/inst/www/shared/shiny.min.css +++ b/inst/www/shared/shiny.min.css @@ -1,2 +1,2 @@ -/*! shiny 1.7.2.9000 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ +/*! shiny 1.7.2.9001 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ pre.shiny-text-output:empty:before{content:" "}pre.shiny-text-output.noplaceholder:empty{margin:0;padding:0;border-width:0;height:0}pre.shiny-text-output{word-wrap:normal}.shiny-image-output img.shiny-scalable,.shiny-plot-output img.shiny-scalable{max-width:100%;max-height:100%}#shiny-disconnected-overlay{position:fixed;inset:0;background-color:#999;opacity:.5;overflow:hidden;z-index:99998;pointer-events:none}.table.shiny-table>thead>tr>th,.table.shiny-table>thead>tr>td,.table.shiny-table>tbody>tr>th,.table.shiny-table>tbody>tr>td,.table.shiny-table>tfoot>tr>th,.table.shiny-table>tfoot>tr>td{padding-right:12px;padding-left:12px}.shiny-table.spacing-xs>thead>tr>th,.shiny-table.spacing-xs>thead>tr>td,.shiny-table.spacing-xs>tbody>tr>th,.shiny-table.spacing-xs>tbody>tr>td,.shiny-table.spacing-xs>tfoot>tr>th,.shiny-table.spacing-xs>tfoot>tr>td{padding-top:3px;padding-bottom:3px}.shiny-table.spacing-s>thead>tr>th,.shiny-table.spacing-s>thead>tr>td,.shiny-table.spacing-s>tbody>tr>th,.shiny-table.spacing-s>tbody>tr>td,.shiny-table.spacing-s>tfoot>tr>th,.shiny-table.spacing-s>tfoot>tr>td{padding-top:5px;padding-bottom:5px}.shiny-table.spacing-m>thead>tr>th,.shiny-table.spacing-m>thead>tr>td,.shiny-table.spacing-m>tbody>tr>th,.shiny-table.spacing-m>tbody>tr>td,.shiny-table.spacing-m>tfoot>tr>th,.shiny-table.spacing-m>tfoot>tr>td{padding-top:8px;padding-bottom:8px}.shiny-table.spacing-l>thead>tr>th,.shiny-table.spacing-l>thead>tr>td,.shiny-table.spacing-l>tbody>tr>th,.shiny-table.spacing-l>tbody>tr>td,.shiny-table.spacing-l>tfoot>tr>th,.shiny-table.spacing-l>tfoot>tr>td{padding-top:10px;padding-bottom:10px}.shiny-table .NA{color:#909090}.shiny-output-error{color:red;white-space:pre-wrap}.shiny-output-error:before{content:"Error: ";font-weight:700}.shiny-output-error-validation{color:#888}.shiny-output-error-validation:before{content:"";font-weight:inherit}@supports (-ms-ime-align:auto){.shiny-bound-output{transition:0}}.recalculating{opacity:.3;transition:opacity .25s ease .5s}.slider-animate-container{text-align:right;margin-top:-9px}.slider-animate-button{opacity:.5}.slider-animate-button .pause{display:none}.slider-animate-button.playing .pause,.slider-animate-button .play{display:inline}.slider-animate-button.playing .play{display:none}.progress.shiny-file-input-progress{visibility:hidden}.progress.shiny-file-input-progress .progress-bar.bar-danger{transition:none}.shiny-input-container input[type=file]{overflow:hidden;max-width:100%}.shiny-progress-container{position:fixed;top:0;width:100%;z-index:2000}.shiny-progress .progress{position:absolute;width:100%;top:0;height:3px;margin:0}.shiny-progress .bar{opacity:.6;transition-duration:.25s}.shiny-progress .progress-text{position:absolute;right:10px;width:240px;background-color:#eef8ff;margin:0;padding:2px 3px;opacity:.85}.shiny-progress .progress-text .progress-message{padding:0 3px;font-weight:700;font-size:90%}.shiny-progress .progress-text .progress-detail{padding:0 3px;font-size:80%}.shiny-progress-notification .progress{margin-bottom:5px;height:10px}.shiny-progress-notification .progress-text .progress-message{font-weight:700;font-size:90%}.shiny-progress-notification .progress-text .progress-detail{font-size:80%}.shiny-label-null{display:none}.crosshair{cursor:crosshair}.grabbable{cursor:grab;cursor:-moz-grab;cursor:-webkit-grab}.grabbing{cursor:grabbing;cursor:-moz-grabbing;cursor:-webkit-grabbing}.ns-resize{cursor:ns-resize}.ew-resize{cursor:ew-resize}.nesw-resize{cursor:nesw-resize}.nwse-resize{cursor:nwse-resize}.qt pre,.qt code{font-family:monospace!important}.qt5 .radio input[type=radio],.qt5 .checkbox input[type=checkbox]{margin-top:0}.qtmac input[type=radio],.qtmac input[type=checkbox]{zoom:1.0000001}.selectize-control{margin-bottom:10px}.shiny-frame{border:none}.shiny-flow-layout>div{display:inline-block;vertical-align:top;padding-right:12px;width:220px}.shiny-split-layout{width:100%;white-space:nowrap}.shiny-split-layout>div{display:inline-block;vertical-align:top;box-sizing:border-box;overflow:auto}.shiny-input-panel{padding:6px 8px;margin-top:6px;margin-bottom:6px;background-color:#f5f5f5;border:1px solid #e3e3e3;border-radius:2px}.shiny-input-checkboxgroup label~.shiny-options-group,.shiny-input-radiogroup label~.shiny-options-group{margin-top:-10px}.shiny-input-checkboxgroup.shiny-input-container-inline label~.shiny-options-group,.shiny-input-radiogroup.shiny-input-container-inline label~.shiny-options-group{margin-top:-1px}.shiny-input-container:not(.shiny-input-container-inline){width:300px;max-width:100%}.well .shiny-input-container{width:auto}.shiny-input-container>div>select:not(.selectized){width:100%}#shiny-notification-panel{position:fixed;bottom:0;right:0;background-color:#0000;padding:2px;width:250px;z-index:99999}.shiny-notification{background-color:#e8e8e8;color:#333;border:1px solid #ccc;border-radius:3px;opacity:.85;padding:10px 8px 10px 10px;margin:2px}.shiny-notification-message{color:#31708f;background-color:#d9edf7;border:1px solid #bce8f1}.shiny-notification-warning{color:#8a6d3b;background-color:#fcf8e3;border:1px solid #faebcc}.shiny-notification-error{color:#a94442;background-color:#f2dede;border:1px solid #ebccd1}.shiny-notification-close{float:right;font-weight:700;font-size:18px;bottom:9px;position:relative;padding-left:4px;color:#444;cursor:default}.shiny-notification-close:hover{color:#000}.shiny-notification-content-action a{color:#337ab7;text-decoration:underline;font-weight:700}.shiny-file-input-active{box-shadow:inset 0 1px 1px #00000013,0 0 8px #66afe999}.shiny-file-input-over{box-shadow:inset 0 1px 1px #00000013,0 0 8px #4cae4c99}.datepicker table tbody tr td.disabled,.datepicker table tbody tr td.disabled:hover,.datepicker table tbody tr td span.disabled,.datepicker table tbody tr td span.disabled:hover{color:#aaa;cursor:not-allowed}.nav-hidden{display:none!important} diff --git a/inst/www/shared/shiny.min.js b/inst/www/shared/shiny.min.js index 55ebc22eab..bb700b7efe 100644 --- a/inst/www/shared/shiny.min.js +++ b/inst/www/shared/shiny.min.js @@ -1,3 +1,3 @@ -/*! shiny 1.7.2.9000 | (c) 2012-2022 RStudio, PBC. | License: GPL-3 | file LICENSE */ -"use strict";(function(){var fm=Object.create;var ju=Object.defineProperty;var sm=Object.getOwnPropertyDescriptor;var lm=Object.getOwnPropertyNames;var cm=Object.getPrototypeOf,pm=Object.prototype.hasOwnProperty;var h=function(e,t){return function(){return t||e((t={exports:{}}).exports,t),t.exports}};var vm=function(e,t,r,n){if(t&&typeof t=="object"||typeof t=="function")for(var i=lm(t),o=0,a=i.length,u;o0?wg:bg)(e)}});var pe=h(function(uE,Lf){var _g=lt(),Og=Math.min;Lf.exports=function(e){return e>0?Og(_g(e),9007199254740991):0}});var Ut=h(function(fE,Uf){var Sg=lt(),Ig=Math.max,xg=Math.min;Uf.exports=function(e,t){var r=Sg(e);return r<0?Ig(r+t,0):xg(r,t)}});var io=h(function(sE,Hf){var Rg=Ie(),Pg=pe(),qg=Ut(),zf=function(e){return function(t,r,n){var i=Rg(t),o=Pg(i.length),a=qg(n,o),u;if(e&&r!=r){for(;o>a;)if(u=i[a++],u!=u)return!0}else for(;o>a;a++)if((e||a in i)&&i[a]===r)return e||a||0;return!e&&-1}};Hf.exports={includes:zf(!0),indexOf:zf(!1)}});var ao=h(function(lE,Gf){var oo=ce(),Eg=Ie(),Tg=io().indexOf,kg=dr();Gf.exports=function(e,t){var r=Eg(e),n=0,i=[],o;for(o in r)!oo(kg,o)&&oo(r,o)&&i.push(o);for(;t.length>n;)oo(r,o=t[n++])&&(~Tg(i,o)||i.push(o));return i}});var sn=h(function(cE,Kf){Kf.exports=["constructor","hasOwnProperty","isPrototypeOf","propertyIsEnumerable","toLocaleString","toString","valueOf"]});var zt=h(function(Wf){var Dg=ao(),Bg=sn(),Cg=Bg.concat("length","prototype");Wf.f=Object.getOwnPropertyNames||function(t){return Dg(t,Cg)}});var uo=h(function(Xf){Xf.f=Object.getOwnPropertySymbols});var fo=h(function(dE,Yf){var Ag=Rt(),Ng=zt(),$g=uo(),jg=X();Yf.exports=Ag("Reflect","ownKeys")||function(t){var r=Ng.f(jg(t)),n=$g.f;return n?r.concat(n(t)):r}});var so=h(function(hE,Qf){var Mg=ce(),Vg=fo(),Fg=ft(),Lg=de();Qf.exports=function(e,t){for(var r=Vg(t),n=Lg.f,i=Fg.f,o=0;o>>0||(py.test(n)?16:10))}:cn});var mo=h(function(TE,ws){"use strict";var wy=X();ws.exports=function(){var e=wy(this),t="";return e.global&&(t+="g"),e.ignoreCase&&(t+="i"),e.multiline&&(t+="m"),e.dotAll&&(t+="s"),e.unicode&&(t+="u"),e.sticky&&(t+="y"),t}});var yo=h(function(go){"use strict";var _s=j();function Os(e,t){return RegExp(e,t)}go.UNSUPPORTED_Y=_s(function(){var e=Os("a","y");return e.lastIndex=2,e.exec("abcd")!=null});go.BROKEN_CARET=_s(function(){var e=Os("^r","gy");return e.lastIndex=2,e.exec("str")!=null})});var wr=h(function(DE,Rs){"use strict";var _y=mo(),Ss=yo(),Oy=pr(),vn=RegExp.prototype.exec,Sy=Oy("native-string-replace",String.prototype.replace),Is=vn,bo=function(){var e=/a/,t=/b*/g;return vn.call(e,"a"),vn.call(t,"a"),e.lastIndex!==0||t.lastIndex!==0}(),xs=Ss.UNSUPPORTED_Y||Ss.BROKEN_CARET,wo=/()??/.exec("")[1]!==void 0,Iy=bo||wo||xs;Iy&&(Is=function(t){var r=this,n,i,o,a,u=xs&&r.sticky,s=_y.call(r),f=r.source,l=0,c=t;return u&&(s=s.replace("y",""),s.indexOf("g")===-1&&(s+="g"),c=String(t).slice(r.lastIndex),r.lastIndex>0&&(!r.multiline||r.multiline&&t[r.lastIndex-1]!=="\n")&&(f="(?: "+f+")",c=" "+c,l++),i=new RegExp("^(?:"+f+")",s)),wo&&(i=new RegExp("^"+f+"$(?!\\s)",s)),bo&&(n=r.lastIndex),o=vn.call(u?i:r,c),u?o?(o.input=o.input.slice(l),o[0]=o[0].slice(l),o.index=r.lastIndex,r.lastIndex+=o[0].length):r.lastIndex=0:bo&&o&&(r.lastIndex=r.global?o.index+o[0].length:n),wo&&o&&o.length>1&&Sy.call(o[0],i,function(){for(a=1;a=74)&&(Ve=_o.match(/Chrome\/(\d+)/),Ve&&(dn=Ve[1])));Bs.exports=dn&&+dn});var hn=h(function($E,As){var Cs=_r(),qy=j();As.exports=!!Object.getOwnPropertySymbols&&!qy(function(){var e=Symbol();return!String(e)||!(Object(e)instanceof Symbol)||!Symbol.sham&&Cs&&Cs<41})});var Oo=h(function(jE,Ns){var Ey=hn();Ns.exports=Ey&&!Symbol.sham&&typeof Symbol.iterator=="symbol"});var K=h(function(ME,Ms){var Ty=U(),ky=pr(),$s=ce(),Dy=an(),js=hn(),By=Oo(),Or=ky("wks"),Sr=Ty.Symbol,Cy=By?Sr:Sr&&Sr.withoutSetter||Dy;Ms.exports=function(e){return(!$s(Or,e)||!(js||typeof Or[e]=="string"))&&(js&&$s(Sr,e)?Or[e]=Sr[e]:Or[e]=Cy("Symbol."+e)),Or[e]}});var Ir=h(function(VE,zs){"use strict";Re();var Vs=Xe(),Ay=wr(),mn=j(),Io=K(),Ny=xe(),$y=Io("species"),So=RegExp.prototype,jy=!mn(function(){var e=/./;return e.exec=function(){var t=[];return t.groups={a:"7"},t},"".replace(e,"$")!=="7"}),Fs=function(){return"a".replace(/./,"$0")==="$0"}(),Ls=Io("replace"),Us=function(){return/./[Ls]?/./[Ls]("a","$0")==="":!1}(),My=!mn(function(){var e=/(?:)/,t=e.exec;e.exec=function(){return t.apply(this,arguments)};var r="ab".split(e);return r.length!==2||r[0]!=="a"||r[1]!=="b"});zs.exports=function(e,t,r,n){var i=Io(e),o=!mn(function(){var c={};return c[i]=function(){return 7},""[e](c)!=7}),a=o&&!mn(function(){var c=!1,p=/a/;return e==="split"&&(p={},p.constructor={},p.constructor[$y]=function(){return p},p.flags="",p[i]=/./[i]),p.exec=function(){return c=!0,null},p[i](""),!c});if(!o||!a||e==="replace"&&!(jy&&Fs&&!Us)||e==="split"&&!My){var u=/./[i],s=r(i,""[e],function(c,p,v,d,w){var g=p.exec;return g===Ay||g===So.exec?o&&!w?{done:!0,value:u.call(p,v,d)}:{done:!0,value:c.call(v,p,d)}:{done:!1}},{REPLACE_KEEPS_$0:Fs,REGEXP_REPLACE_SUBSTITUTES_UNDEFINED_CAPTURE:Us}),f=s[0],l=s[1];Vs(String.prototype,e,f),Vs(So,i,t==2?function(c,p){return l.call(c,this,p)}:function(c){return l.call(c,this)})}n&&Ny(So[i],"sham",!0)}});var xo=h(function(FE,Gs){var Vy=lt(),Fy=We(),Hs=function(e){return function(t,r){var n=String(Fy(t)),i=Vy(r),o=n.length,a,u;return i<0||i>=o?e?"":void 0:(a=n.charCodeAt(i),a<55296||a>56319||i+1===o||(u=n.charCodeAt(i+1))<56320||u>57343?e?n.charAt(i):a:e?n.slice(i,i+2):(a-55296<<10)+(u-56320)+65536)}};Gs.exports={codeAt:Hs(!1),charAt:Hs(!0)}});var gn=h(function(LE,Ks){"use strict";var Ly=xo().charAt;Ks.exports=function(e,t,r){return t+(r?Ly(e,t).length:1)}});var Xs=h(function(UE,Ws){var Uy=we(),zy=Math.floor,Hy="".replace,Gy=/\$([$&'`]|\d{1,2}|<[^>]*>)/g,Ky=/\$([$&'`]|\d{1,2})/g;Ws.exports=function(e,t,r,n,i,o){var a=r+e.length,u=n.length,s=Ky;return i!==void 0&&(i=Uy(i),s=Gy),Hy.call(o,s,function(f,l){var c;switch(l.charAt(0)){case"$":return"$";case"&":return e;case"`":return t.slice(0,r);case"'":return t.slice(a);case"<":c=i[l.slice(1,-1)];break;default:var p=+l;if(p===0)return f;if(p>u){var v=zy(p/10);return v===0?f:v<=u?n[v-1]===void 0?l.charAt(1):n[v-1]+l.charAt(1):f}c=n[p-1]}return c===void 0?"":c})}});var xr=h(function(zE,Ys){var Wy=Ke(),Xy=wr();Ys.exports=function(e,t){var r=e.exec;if(typeof r=="function"){var n=r.call(e,t);if(typeof n!="object")throw TypeError("RegExp exec method returned something other than an Object or null");return n}if(Wy(e)!=="RegExp")throw TypeError("RegExp#exec called on incompatible receiver");return Xy.call(e,t)}});var yn=h(function(HE,Js){var ub=K(),fb=ub("toStringTag"),Qs={};Qs[fb]="z";Js.exports=String(Qs)==="[object z]"});var Ro=h(function(GE,Zs){var sb=yn(),bn=Ke(),lb=K(),cb=lb("toStringTag"),pb=bn(function(){return arguments}())=="Arguments",vb=function(e,t){try{return e[t]}catch(r){}};Zs.exports=sb?bn:function(e){var t,r,n;return e===void 0?"Undefined":e===null?"Null":typeof(r=vb(t=Object(e),cb))=="string"?r:pb?bn(t):(n=bn(t))=="Object"&&typeof t.callee=="function"?"Arguments":n}});var tl=h(function(KE,el){"use strict";var db=yn(),hb=Ro();el.exports=db?{}.toString:function(){return"[object "+hb(this)+"]"}});var ol=h(function(WE,il){var xb=U(),Rb=br().trim,Pb=yr(),qo=xb.parseFloat,qb=1/qo(Pb+"-0")!==-1/0;il.exports=qb?function(t){var r=Rb(String(t)),n=qo(r);return n===0&&r.charAt(0)=="-"?-0:n}:qo});var fl=h(function(XE,ul){var Tb=Ke();ul.exports=function(e){if(typeof e!="number"&&Tb(e)!="Number")throw TypeError("Incorrect invocation");return+e}});var Rr=h(function(YE,cl){var Bb=Ke();cl.exports=Array.isArray||function(t){return Bb(t)=="Array"}});var Ht=h(function(QE,pl){"use strict";var Cb=Ft(),Ab=de(),Nb=Vt();pl.exports=function(e,t,r){var n=Cb(t);n in e?Ab.f(e,n,Nb(0,r)):e[n]=r}});var _n=h(function(JE,dl){var $b=re(),vl=Rr(),jb=K(),Mb=jb("species");dl.exports=function(e,t){var r;return vl(e)&&(r=e.constructor,typeof r=="function"&&(r===Array||vl(r.prototype))?r=void 0:$b(r)&&(r=r[Mb],r===null&&(r=void 0))),new(r===void 0?Array:r)(t===0?0:t)}});var Gt=h(function(ZE,hl){var Vb=j(),Fb=K(),Lb=_r(),Ub=Fb("species");hl.exports=function(e){return Lb>=51||!Vb(function(){var t=[],r=t.constructor={};return r[Ub]=function(){return{foo:1}},t[e](Boolean).foo!==1})}});var Kt=h(function(eT,Ol){Ol.exports=function(e){if(typeof e!="function")throw TypeError(String(e)+" is not a function");return e}});var Eo=h(function(tT,Sl){var qw=Kt();Sl.exports=function(e,t,r){if(qw(e),t===void 0)return e;switch(r){case 0:return function(){return e.call(t)};case 1:return function(n){return e.call(t,n)};case 2:return function(n,i){return e.call(t,n,i)};case 3:return function(n,i,o){return e.call(t,n,i,o)}}return function(){return e.apply(t,arguments)}}});var Wt=h(function(rT,xl){var Ew=Eo(),Tw=lr(),kw=we(),Dw=pe(),Bw=_n(),Il=[].push,ct=function(e){var t=e==1,r=e==2,n=e==3,i=e==4,o=e==6,a=e==7,u=e==5||o;return function(s,f,l,c){for(var p=kw(s),v=Tw(p),d=Ew(f,l,3),w=Dw(v.length),g=0,m=c||Bw,S=t?m(s,w):r||a?m(s,0):void 0,E,y;w>g;g++)if((u||g in v)&&(E=v[g],y=d(E,g,p),e))if(t)S[g]=y;else if(y)switch(e){case 3:return!0;case 5:return E;case 6:return g;case 2:Il.call(S,E)}else switch(e){case 4:return!1;case 7:Il.call(S,E)}return o?-1:n||i?i:S}};xl.exports={forEach:ct(0),map:ct(1),filter:ct(2),some:ct(3),every:ct(4),find:ct(5),findIndex:ct(6),filterOut:ct(7)}});var To=h(function(nT,Rl){"use strict";var Cw=Wt().forEach,Aw=gr(),Nw=Aw("forEach");Rl.exports=Nw?[].forEach:function(t){return Cw(this,t,arguments.length>1?arguments[1]:void 0)}});var ko=h(function(iT,ql){ql.exports={CSSRuleList:0,CSSStyleDeclaration:0,CSSValueList:0,ClientRectList:0,DOMRectList:0,DOMStringList:0,DOMTokenList:1,DataTransferItemList:0,FileList:0,HTMLAllCollection:0,HTMLCollection:0,HTMLFormElement:0,HTMLSelectElement:0,MediaList:0,MimeTypeArray:0,NamedNodeMap:0,NodeList:1,PaintRequestList:0,Plugin:0,PluginArray:0,SVGLengthList:0,SVGNumberList:0,SVGPathSegList:0,SVGPointList:0,SVGStringList:0,SVGTransformList:0,SourceBufferList:0,StyleSheetList:0,TextTrackCueList:0,TextTrackList:0,TouchList:0}});var qr=h(function(oT,Tl){var Fw=ao(),Lw=sn();Tl.exports=Object.keys||function(t){return Fw(t,Lw)}});var Bl=h(function(aT,Dl){var Kw=re(),Ww=Ke(),Xw=K(),Yw=Xw("match");Dl.exports=function(e){var t;return Kw(e)&&((t=e[Yw])!==void 0?!!t:Ww(e)=="RegExp")}});var Co=h(function(uT,Al){var Cl=X(),Qw=Kt(),Jw=K(),Zw=Jw("species");Al.exports=function(e,t){var r=Cl(e).constructor,n;return r===void 0||(n=Cl(r)[Zw])==null?t:Qw(n)}});var Yl=h(function(kT,Xl){var h_=le(),m_=de(),g_=X(),y_=qr();Xl.exports=h_?Object.defineProperties:function(t,r){g_(t);for(var n=y_(r),i=n.length,o=0,a;i>o;)m_.f(t,a=n[o++],r[a]);return t}});var Jl=h(function(DT,Ql){var b_=Rt();Ql.exports=b_("document","documentElement")});var Yt=h(function(BT,ic){var w_=X(),__=Yl(),Zl=sn(),O_=dr(),S_=Jl(),I_=Wi(),x_=vr(),ec=">",tc="<",zo="prototype",Ho="script",rc=x_("IE_PROTO"),Lo=function(){},nc=function(e){return tc+Ho+ec+e+tc+"/"+Ho+ec},R_=function(e){e.write(nc("")),e.close();var t=e.parentWindow.Object;return e=null,t},P_=function(){var e=I_("iframe"),t="java"+Ho+":",r;return e.style.display="none",S_.appendChild(e),e.src=String(t),r=e.contentWindow.document,r.open(),r.write(nc("document.F=Object")),r.close(),r.F},Uo,In=function(){try{Uo=document.domain&&new ActiveXObject("htmlfile")}catch(t){}In=Uo?R_(Uo):P_();for(var e=Zl.length;e--;)delete In[zo][Zl[e]];return In()};O_[rc]=!0;ic.exports=Object.create||function(t,r){var n;return t!==null?(Lo[zo]=w_(t),n=new Lo,Lo[zo]=null,n[rc]=t):n=In(),r===void 0?n:__(n,r)}});var Wo=h(function(CT,oc){var q_=K(),E_=Yt(),T_=de(),Go=q_("unscopables"),Ko=Array.prototype;Ko[Go]==null&&T_.f(Ko,Go,{configurable:!0,value:E_(null)});oc.exports=function(e){Ko[Go][e]=!0}});var fc=h(function(AT,uc){var C_=re();uc.exports=function(e){if(!C_(e)&&e!==null)throw TypeError("Can't set "+String(e)+" as a prototype");return e}});var Dr=h(function(NT,sc){var A_=X(),N_=fc();sc.exports=Object.setPrototypeOf||("__proto__"in{}?function(){var e=!1,t={},r;try{r=Object.getOwnPropertyDescriptor(Object.prototype,"__proto__").set,r.call(t,[]),e=t instanceof Array}catch(n){}return function(i,o){return A_(i),N_(o),e?r.call(i,o):i.__proto__=o,i}}():void 0)});var Yo=h(function($T,lc){var M_=j();lc.exports=!M_(function(){function e(){}return e.prototype.constructor=null,Object.getPrototypeOf(new e)!==e.prototype})});var Qt=h(function(jT,pc){var V_=ce(),F_=we(),L_=vr(),U_=Yo(),cc=L_("IE_PROTO"),z_=Object.prototype;pc.exports=U_?Object.getPrototypeOf:function(e){return e=F_(e),V_(e,cc)?e[cc]:typeof e.constructor=="function"&&e instanceof e.constructor?e.constructor.prototype:e instanceof Object?z_:null}});var mc=h(function(MT,hc){"use strict";var Y_=Kt(),Q_=re(),dc=[].slice,Qo={},J_=function(e,t,r){if(!(t in Qo)){for(var n=[],i=0;i=t.length?(e.target=void 0,{value:void 0,done:!0}):r=="keys"?{value:n,done:!1}:r=="values"?{value:t[n],done:!1}:{value:[n,t[n]],done:!1}},"values");hp.Arguments=hp.Array;Ia("keys");Ia("values");Ia("entries")});var Ep=h(function(sk,qp){var gS=j(),Rp=yr(),Pp="\u200B\x85\u180E";qp.exports=function(e){return gS(function(){return!!Rp[e]()||Pp[e]()!=Pp||Rp[e].name!==e})}});var Ap=h(function(xk,Cp){var ES=re(),Bp=Dr();Cp.exports=function(e,t,r){var n,i;return Bp&&typeof(n=t.constructor)=="function"&&n!==r&&ES(i=n.prototype)&&i!==r.prototype&&Bp(e,i),e}});var Ev=h(function(E1,qv){var yx=X();qv.exports=function(e){var t=e.return;if(t!==void 0)return yx(t.call(e)).value}});var kv=h(function(T1,Tv){var bx=X(),wx=Ev();Tv.exports=function(e,t,r,n){try{return n?t(bx(r)[0],r[1]):t(r)}catch(i){throw wx(e),i}}});var Bv=h(function(k1,Dv){var _x=K(),Ox=tr(),Sx=_x("iterator"),Ix=Array.prototype;Dv.exports=function(e){return e!==void 0&&(Ox.Array===e||Ix[Sx]===e)}});var Av=h(function(D1,Cv){var xx=Ro(),Rx=tr(),Px=K(),qx=Px("iterator");Cv.exports=function(e){if(e!=null)return e[qx]||e["@@iterator"]||Rx[xx(e)]}});var jv=h(function(B1,$v){"use strict";var Ex=Eo(),Tx=we(),kx=kv(),Dx=Bv(),Bx=pe(),Nv=Ht(),Cx=Av();$v.exports=function(t){var r=Tx(t),n=typeof this=="function"?this:Array,i=arguments.length,o=i>1?arguments[1]:void 0,a=o!==void 0,u=Cx(r),s=0,f,l,c,p,v,d;if(a&&(o=Ex(o,i>2?arguments[2]:void 0,2)),u!=null&&!(n==Array&&Dx(u)))for(p=u.call(r),v=p.next,l=new n;!(c=v.call(p)).done;s++)d=a?kx(p,o,[c.value,s],!0):c.value,Nv(l,s,d);else for(f=Bx(r.length),l=new n(f);f>s;s++)d=a?o(r[s],s):r[s],Nv(l,s,d);return l.length=s,l}});var Uv=h(function(C1,Lv){var Ax=K(),Vv=Ax("iterator"),Fv=!1;try{Mv=0,Ha={next:function(){return{done:!!Mv++}},return:function(){Fv=!0}},Ha[Vv]=function(){return this},Array.from(Ha,function(){throw 2})}catch(e){}var Mv,Ha;Lv.exports=function(e,t){if(!t&&!Fv)return!1;var r=!1;try{var n={};n[Vv]=function(){return{next:function(){return{done:r=!0}}}},e(n)}catch(i){}return r}});var gd=h(function(vA,md){md.exports=Object.is||function(t,r){return t===r?t!==0||1/t===1/r:t!=t&&r!=r}});var ou=h(function(UA,Rd){var X0=le(),Y0=qr(),Q0=Ie(),J0=tn().f,xd=function(e){return function(t){for(var r=Q0(t),n=Y0(r),i=n.length,o=0,a=[],u;i>o;)u=n[o++],(!X0||J0.call(r,u))&&a.push(e?[u,r[u]]:r[u]);return a}};Rd.exports={entries:xd(!0),values:xd(!1)}});var qu=h(function(cM,fh){fh.exports=typeof ArrayBuffer!="undefined"&&typeof DataView!="undefined"});var lh=h(function(pM,sh){var xP=Xe();sh.exports=function(e,t,r){for(var n in t)xP(e,n,t[n],r);return e}});var ph=h(function(vM,ch){ch.exports=function(e,t,r){if(!(e instanceof t))throw TypeError("Incorrect "+(r?r+" ":"")+"invocation");return e}});var dh=h(function(dM,vh){var RP=lt(),PP=pe();vh.exports=function(e){if(e===void 0)return 0;var t=RP(e),r=PP(t);if(t!==r)throw RangeError("Wrong length or index");return r}});var mh=h(function(hM,hh){var qP=Math.abs,it=Math.pow,EP=Math.floor,TP=Math.log,kP=Math.LN2,DP=function(e,t,r){var n=new Array(r),i=r*8-t-1,o=(1<>1,u=t===23?it(2,-24)-it(2,-77):0,s=e<0||e===0&&1/e<0?1:0,f=0,l,c,p;for(e=qP(e),e!=e||e===1/0?(c=e!=e?1:0,l=o):(l=EP(TP(e)/kP),e*(p=it(2,-l))<1&&(l--,p*=2),l+a>=1?e+=u/p:e+=u*it(2,1-a),e*p>=2&&(l++,p/=2),l+a>=o?(c=0,l=o):l+a>=1?(c=(e*p-1)*it(2,t),l=l+a):(c=e*it(2,a-1)*it(2,t),l=0));t>=8;n[f++]=c&255,c/=256,t-=8);for(l=l<0;n[f++]=l&255,l/=256,i-=8);return n[--f]|=s*128,n},BP=function(e,t){var r=e.length,n=r*8-t-1,i=(1<>1,a=n-7,u=r-1,s=e[u--],f=s&127,l;for(s>>=7;a>0;f=f*256+e[u],u--,a-=8);for(l=f&(1<<-a)-1,f>>=-a,a+=t;a>0;l=l*256+e[u],u--,a-=8);if(f===0)f=1-o;else{if(f===i)return l?NaN:s?-1/0:1/0;l=l+it(2,t),f=f-o}return(s?-1:1)*l*it(2,f-t)};hh.exports={pack:DP,unpack:BP}});var bh=h(function(mM,yh){"use strict";var CP=we(),gh=Ut(),AP=pe();yh.exports=function(t){for(var r=CP(this),n=AP(r.length),i=arguments.length,o=gh(i>1?arguments[1]:void 0,n),a=i>2?arguments[2]:void 0,u=a===void 0?n:gh(a,n);u>o;)r[o++]=t;return r}});var Li=h(function(gM,Ah){"use strict";var Cu=U(),Eu=le(),NP=qu(),$P=xe(),wh=lh(),Tu=j(),Ci=ph(),jP=lt(),MP=pe(),ji=dh(),Th=mh(),VP=Qt(),_h=Dr(),FP=zt().f,LP=de().f,UP=bh(),kh=Br(),Dh=Lt(),sr=Dh.get,Oh=Dh.set,Mi="ArrayBuffer",Vi="DataView",Zr="prototype",zP="Wrong length",Bh="Wrong index",je=Cu[Mi],Se=je,Me=Cu[Vi],Ai=Me&&Me[Zr],Sh=Object.prototype,Fi=Cu.RangeError,Ch=Th.pack,Ih=Th.unpack,xh=function(e){return[e&255]},Rh=function(e){return[e&255,e>>8&255]},Ph=function(e){return[e&255,e>>8&255,e>>16&255,e>>24&255]},qh=function(e){return e[3]<<24|e[2]<<16|e[1]<<8|e[0]},HP=function(e){return Ch(e,23,4)},GP=function(e){return Ch(e,52,8)},Ni=function(e,t){LP(e[Zr],t,{get:function(){return sr(this)[t]}})},Ot=function(e,t,r,n){var i=ji(r),o=sr(e);if(i+t>o.byteLength)throw Fi(Bh);var a=sr(o.buffer).bytes,u=i+o.byteOffset,s=a.slice(u,u+t);return n?s:s.reverse()},St=function(e,t,r,n,i,o){var a=ji(r),u=sr(e);if(a+t>u.byteLength)throw Fi(Bh);for(var s=sr(u.buffer).bytes,f=a+u.byteOffset,l=n(+i),c=0;ci)throw Fi("Wrong offset");if(n=n===void 0?i-o:MP(n),o+n>i)throw Fi(zP);Oh(this,{buffer:t,byteLength:n,byteOffset:o}),Eu||(this.buffer=t,this.byteLength=n,this.byteOffset=o)},Eu&&(Ni(Se,"byteLength"),Ni(Me,"buffer"),Ni(Me,"byteLength"),Ni(Me,"byteOffset")),wh(Me[Zr],{getInt8:function(t){return Ot(this,1,t)[0]<<24>>24},getUint8:function(t){return Ot(this,1,t)[0]},getInt16:function(t){var r=Ot(this,2,t,arguments.length>1?arguments[1]:void 0);return(r[1]<<8|r[0])<<16>>16},getUint16:function(t){var r=Ot(this,2,t,arguments.length>1?arguments[1]:void 0);return r[1]<<8|r[0]},getInt32:function(t){return qh(Ot(this,4,t,arguments.length>1?arguments[1]:void 0))},getUint32:function(t){return qh(Ot(this,4,t,arguments.length>1?arguments[1]:void 0))>>>0},getFloat32:function(t){return Ih(Ot(this,4,t,arguments.length>1?arguments[1]:void 0),23)},getFloat64:function(t){return Ih(Ot(this,8,t,arguments.length>1?arguments[1]:void 0),52)},setInt8:function(t,r){St(this,1,t,xh,r)},setUint8:function(t,r){St(this,1,t,xh,r)},setInt16:function(t,r){St(this,2,t,Rh,r,arguments.length>2?arguments[2]:void 0)},setUint16:function(t,r){St(this,2,t,Rh,r,arguments.length>2?arguments[2]:void 0)},setInt32:function(t,r){St(this,4,t,Ph,r,arguments.length>2?arguments[2]:void 0)},setUint32:function(t,r){St(this,4,t,Ph,r,arguments.length>2?arguments[2]:void 0)},setFloat32:function(t,r){St(this,4,t,HP,r,arguments.length>2?arguments[2]:void 0)},setFloat64:function(t,r){St(this,8,t,GP,r,arguments.length>2?arguments[2]:void 0)}});else{if(!Tu(function(){je(1)})||!Tu(function(){new je(-1)})||Tu(function(){return new je,new je(1.5),new je(NaN),je.name!=Mi})){for(Se=function(t){return Ci(this,Se),new je(ji(t))},Eh=Se[Zr]=je[Zr],ku=FP(je),Du=0;ku.length>Du;)($i=ku[Du++])in Se||$P(Se,$i,je[$i]);Eh.constructor=Se}_h&&VP(Ai)!==Sh&&_h(Ai,Sh),Jr=new Me(new Se(2)),Bu=Ai.setInt8,Jr.setInt8(0,2147483648),Jr.setInt8(1,2147483649),(Jr.getInt8(0)||!Jr.getInt8(1))&&wh(Ai,{setInt8:function(t,r){Bu.call(this,t,r<<24>>24)},setUint8:function(t,r){Bu.call(this,t,r<<24>>24)}},{unsafe:!0})}var Eh,ku,Du,$i,Jr,Bu;kh(Se,Mi);kh(Me,Vi);Ah.exports={ArrayBuffer:Se,DataView:Me}});var jh=h(function(yM,$h){"use strict";var KP=Rt(),WP=de(),XP=K(),YP=le(),Nh=XP("species");$h.exports=function(e){var t=KP(e),r=WP.f;YP&&t&&!t[Nh]&&r(t,Nh,{configurable:!0,get:function(){return this}})}});var Kh=h(function(bM,Gh){var lq=Kt(),cq=we(),pq=lr(),vq=pe(),Hh=function(e){return function(t,r,n,i){lq(r);var o=cq(t),a=pq(o),u=vq(o.length),s=e?u-1:0,f=e?-1:1;if(n<2)for(;;){if(s in a){i=a[s],s+=f;break}if(s+=f,e?s<0:u<=s)throw TypeError("Reduce of empty array with no initial value")}for(;e?s>=0:u>s;s+=f)s in a&&(i=r(i,a[s],s,o));return i}};Gh.exports={left:Hh(!1),right:Hh(!0)}});var Xh=h(function(wM,Wh){var dq=Ke(),hq=U();Wh.exports=dq(hq.process)=="process"});var Vu=_(k());function Fu(){(0,Vu.default)(document).on("submit","form:not([action])",function(e){e.preventDefault()})}var Lu=_(k());function Uu(){var e=window.history.pushState;window.history.pushState=function(){for(var t=arguments.length,r=new Array(t),n=0;n1?arguments[1]:void 0)}});var dy=A(),fs=us();dy({global:!0,forced:parseInt!=fs},{parseInt:fs});var pn=_(k());var ss=!1,ls=!1,cs=-1;function vo(e){ss=e}function ps(e){ls=e}function vs(e){cs=e}function ds(){return ss}function Pt(){return ls}function hs(){return cs}var ve;function ms(e){ve=e}function hy(){var e=ve.indexOf("MSIE ");if(Pt()&&e>0)return parseInt(ve.substring(e+5,ve.indexOf(".",e)),10);var t=ve.indexOf("Trident/");if(t>0){var r=ve.indexOf("rv:");return parseInt(ve.substring(r+3,ve.indexOf(".",r)),10)}return-1}function gs(){/\bQt\//.test(ve)?((0,pn.default)(document.documentElement).addClass("qt"),vo(!0)):vo(!1),/\bQt/.test(ve)&&/\bMacintosh/.test(ve)&&(0,pn.default)(document.documentElement).addClass("qtmac"),/\bQt\/5/.test(ve)&&/Linux/.test(ve)&&(0,pn.default)(document.documentElement).addClass("qt5"),ps(/MSIE|Trident|Edge/.test(ve)),vs(hy())}function ys(){return window.Shiny||(window.Shiny={}),window.Shiny}var nm=_(k());var my=le(),gy=de().f,ho=Function.prototype,yy=ho.toString,by=/^\s*function ([^ (]*)/,bs="name";my&&!(bs in ho)&&gy(ho,bs,{configurable:!0,get:function(){try{return yy.call(this).match(by)[1]}catch(e){return""}}});var lT=_(Re());var Yy=Ir(),Qy=X(),Jy=pe(),Zy=lt(),eb=We(),tb=gn(),rb=Xs(),nb=xr(),ib=Math.max,ob=Math.min,ab=function(e){return e===void 0?e:String(e)};Yy("replace",2,function(e,t,r,n){var i=n.REGEXP_REPLACE_SUBSTITUTES_UNDEFINED_CAPTURE,o=n.REPLACE_KEEPS_$0,a=i?"$":"$0";return[function(s,f){var l=eb(this),c=s==null?void 0:s[e];return c!==void 0?c.call(s,l,f):t.call(String(l),s,f)},function(u,s){if(!i&&o||typeof s=="string"&&s.indexOf(a)===-1){var f=r(t,u,this,s);if(f.done)return f.value}var l=Qy(u),c=String(this),p=typeof s=="function";p||(s=String(s));var v=l.global;if(v){var d=l.unicode;l.lastIndex=0}for(var w=[];;){var g=nb(l,c);if(g===null||(w.push(g),!v))break;var m=String(g[0]);m===""&&(l.lastIndex=tb(c,Jy(l.lastIndex),d))}for(var S="",E=0,y=0;y=E&&(S+=c.slice(E,B)+be,E=B+T.length)}return S+c.slice(E)}]});var mb=yn(),gb=Xe(),yb=tl();mb||gb(Object.prototype,"toString",yb,{unsafe:!0});var bb=Xe(),wb=X(),_b=j(),Ob=mo(),Po="toString",rl=RegExp.prototype,nl=rl[Po],Sb=_b(function(){return nl.call({source:"a",flags:"b"})!="/a/b"}),Ib=nl.name!=Po;(Sb||Ib)&&bb(RegExp.prototype,Po,function(){var t=wb(this),r=String(t.source),n=t.flags,i=String(n===void 0&&t instanceof RegExp&&!("flags"in rl)?Ob.call(t):n);return"/"+r+"/"+i},{unsafe:!0});var Eb=A(),al=ol();Eb({global:!0,forced:parseFloat!=al},{parseFloat:al});var kb=A(),sl=j(),ll=fl(),wn=1 .toPrecision,Db=sl(function(){return wn.call(1,void 0)!=="1"})||!sl(function(){wn.call({})});kb({target:"Number",proto:!0,forced:Db},{toPrecision:function(t){return t===void 0?wn.call(ll(this)):wn.call(ll(this),t)}});var zb=A(),Hb=j(),Gb=Rr(),Kb=re(),Wb=we(),Xb=pe(),ml=Ht(),Yb=_n(),Qb=Gt(),Jb=K(),Zb=_r(),bl=Jb("isConcatSpreadable"),gl=9007199254740991,yl="Maximum allowed index exceeded",ew=Zb>=51||!Hb(function(){var e=[];return e[bl]=!1,e.concat()[0]!==e}),tw=Qb("concat"),rw=function(e){if(!Kb(e))return!1;var t=e[bl];return t!==void 0?!!t:Gb(e)},nw=!ew||!tw;zb({target:"Array",proto:!0,forced:nw},{concat:function(t){var r=Wb(this),n=Yb(r,0),i=0,o,a,u,s,f;for(o=-1,u=arguments.length;ogl)throw TypeError(yl);for(a=0;a=gl)throw TypeError(yl);ml(n,i++,f)}return n.length=i,n}});var iw=A(),ow=re(),wl=Rr(),_l=Ut(),aw=pe(),uw=Ie(),fw=Ht(),sw=K(),lw=Gt(),cw=lw("slice"),pw=sw("species"),vw=[].slice,dw=Math.max;iw({target:"Array",proto:!0,forced:!cw},{slice:function(t,r){var n=uw(this),i=aw(n.length),o=_l(t,i),a=_l(r===void 0?i:r,i),u,s,f;if(wl(n)&&(u=n.constructor,typeof u=="function"&&(u===Array||wl(u.prototype))?u=void 0:ow(u)&&(u=u[pw],u===null&&(u=void 0)),u===Array||u===void 0))return vw.call(n,o,a);for(s=new(u===void 0?Array:u)(dw(a-o,0)),f=0;oRw)throw TypeError(Pw);for(f=ww(n,s),l=0;li-s+u;l--)delete n[l-1]}else if(u>s)for(l=i-s;l>o;l--)c=l+s-1,p=l+u-1,c in n?n[p]=n[c]:delete n[p];for(l=0;l1||"".split(/.?/).length?n=function(i,o){var a=String(Nl(this)),u=o===void 0?jl:o>>>0;if(u===0)return[];if(i===void 0)return[a];if(!t_(i))return t.call(a,i,u);for(var s=[],f=(i.ignoreCase?"i":"")+(i.multiline?"m":"")+(i.unicode?"u":"")+(i.sticky?"y":""),l=0,c=new RegExp(i.source,f+"g"),p,v,d;(p=a_.call(c,a))&&(v=c.lastIndex,!(v>l&&(s.push(a.slice(l,p.index)),p.length>1&&p.index=u)));)c.lastIndex===p.index&&c.lastIndex++;return l===a.length?(d||!c.test(""))&&s.push(""):s.push(a.slice(l)),s.length>u?s.slice(0,u):s}:"0".split(void 0,0).length?n=function(i,o){return i===void 0&&o===0?[]:t.call(this,i,o)}:n=t,[function(o,a){var u=Nl(this),s=o==null?void 0:o[e];return s!==void 0?s.call(o,u,a):n.call(String(u),o,a)},function(i,o){var a=r(n,i,this,o,n!==t);if(a.done)return a.value;var u=r_(i),s=String(this),f=n_(u,RegExp),l=u.unicode,c=(u.ignoreCase?"i":"")+(u.multiline?"m":"")+(u.unicode?"u":"")+(Xt?"g":"y"),p=new f(Xt?"^(?:"+u.source+")":u,c),v=o===void 0?jl:o>>>0;if(v===0)return[];if(s.length===0)return $l(p,s)===null?[s]:[];for(var d=0,w=0,g=[];w":">",'"':""","'":"'","/":"/"};return e.replace(/[&<>'"/]/g,function(r){return t[r]})}function On(){return Math.floor(4294967296+Math.random()*64424509440).toString(16)}function qt(e){if(!(!e||!e.toLowerCase))switch(e.toLowerCase()){case"true":return!0;case"false":return!1;default:return}}function Fe(e,t){var r=void 0;if("currentStyle"in e)r=e.currentStyle[t];else{var n,i,o=(n=document)===null||n===void 0||(i=n.defaultView)===null||i===void 0?void 0:i.getComputedStyle(e,null);o&&(r=o.getPropertyValue(t))}return r}function Ml(e,t){for(var r=e.toString();r.length1&&arguments[1]!==void 0?arguments[1]:1;if(t<1)throw"Significant digits must be at least 1.";return parseFloat(e.toPrecision(t))}function Fl(e){var t=new Date(e);return t.toString()==="Invalid Date"&&(t=new Date(e.replace(/-/g,"/"))),t}function ke(e){return e instanceof Date?e.getUTCFullYear()+"-"+Ml(e.getUTCMonth()+1,2)+"-"+Ml(e.getUTCDate(),2):null}function Ll(e,t){var r={};return function(){var n={w:e.offsetWidth,h:e.offsetHeight};n.w===0&&n.h===0||n.w===r.w&&n.h===r.h||(r=n,t(n.w,n.h))}}function jo(){return Ao()?Math.round(Ao()*100)/100:1}function Ul(e){var t=e.replace(/[\\"']/g,"\\$&").replace(/\u0000/g,"\\0").replace(/\n/g,"\\n").replace(/\r/g,"\\r").replace(/[\b]/g,"\\b"),r;try{r=new Function("with (this) {\n try {\n return (".concat(e,");\n } catch (e) {\n console.error('Error evaluating expression: ").concat(t,"');\n throw e;\n }\n }"))}catch(n){throw console.error("Error parsing expression: "+e),n}return function(n){return r.call(n)}}function Tr(e){return e==null?[]:Array.isArray(e)?e:[e]}function zl(e,t){function r(f,l){for(var c=0,p=0,v=[];c?@[\\\]^`{|}~])/g,"\\$1")}function De(e,t){var r={};return Object.keys(e).forEach(function(n){r[n]=t(e[n],n,e)}),r}function Hl(e){return typeof e=="number"&&isNaN(e)}function No(e,t){if(Er.default.type(e)==="object"&&Er.default.type(t)==="object"){var r=e,n=t;if(Object.keys(r).length!==Object.keys(n).length)return!1;for(var i in r)if(!Pe(n,i)||!No(r[i],n[i]))return!1;return!0}else if(Er.default.type(e)==="array"&&Er.default.type(t)==="array"){var o=e,a=t;if(o.length!==a.length)return!1;for(var u=0;u=")return a>=0;if(r===">")return a>0;if(r==="<=")return a<=0;if(r==="<")return a<0;throw"Unknown operator: ".concat(r)};function ie(e,t){if(typeof e!="undefined"){if(t.length!==1)throw new Error("labelNode must be of length 1");var r=Array.isArray(e)&&e.length===0;r?t.addClass("shiny-label-null"):(t.text(e),t.removeClass("shiny-label-null"))}}function kr(e){var t=document.createElement("a");t.href="/";var r=document.createElement("div");r.style.setProperty("position","absolute","important"),r.style.setProperty("top","-1000px","important"),r.style.setProperty("left","0","important"),r.style.setProperty("width","30px","important"),r.style.setProperty("height","10px","important"),r.appendChild(t),e.appendChild(r);var n=window.getComputedStyle(t).getPropertyValue("color");return e.removeChild(r),n}function Vo(){return!window.bootstrap}function l_(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")}function Kl(e,t){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:0,o={binding:r,priority:i};this.bindings.unshift(o),n&&(this.bindingNames[n]=o,r.name=n)}},{key:"setPriority",value:function(r,n){var i=this.bindingNames[r];if(!i)throw"Tried to set priority on unknown binding "+r;i.priority=n||0}},{key:"getPriority",value:function(r){var n=this.bindingNames[r];return n?n.priority:!1}},{key:"getBindings",value:function(){return zl(this.bindings,function(r,n){return n.priority-r.priority})}}]),e}();function p_(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")}function Wl(e,t){for(var r=0;r1?arguments[1]:void 0)}});B_(Xo);var $_=A(),j_=Dr();$_({target:"Object",stat:!0},{setPrototypeOf:j_});var H_=A(),G_=j(),K_=we(),vc=Qt(),W_=Yo(),X_=G_(function(){vc(1)});H_({target:"Object",stat:!0,forced:X_,sham:!W_},{getPrototypeOf:function(t){return vc(K_(t))}});var Z_=A(),eO=Rt(),gc=Kt(),tO=X(),yc=re(),rO=Yt(),nO=mc(),wc=j(),Jo=eO("Reflect","construct"),_c=wc(function(){function e(){}return!(Jo(function(){},[],e)instanceof e)}),Oc=!wc(function(){Jo(function(){})}),bc=_c||Oc;Z_({target:"Reflect",stat:!0,forced:bc,sham:bc},{construct:function(t,r){gc(t),tO(r);var n=arguments.length<3?t:gc(arguments[2]);if(Oc&&!_c)return Jo(t,r,n);if(t==n){switch(r.length){case 0:return new t;case 1:return new t(r[0]);case 2:return new t(r[0],r[1]);case 3:return new t(r[0],r[1],r[2]);case 4:return new t(r[0],r[1],r[2],r[3])}var i=[null];return i.push.apply(i,r),new(nO.apply(t,i))}var o=n.prototype,a=rO(yc(o)?o:Object.prototype),u=Function.apply.call(t,a,r);return yc(u)?u:a}});var Zt=A(),Nc=U(),dO=Rt(),hO=cr(),Jt=le(),Et=hn(),mO=Oo(),va=j(),W=ce(),gO=Rr(),yO=re(),aa=X(),bO=we(),xn=Ie(),da=Ft(),ua=Vt(),Ar=Yt(),$c=qr(),wO=zt(),jc=Rc(),fa=uo(),Mc=ft(),Vc=de(),Fc=tn(),_O=xe(),ta=Xe(),Nr=pr(),OO=vr(),Lc=dr(),Dc=an(),Uc=K(),SO=Zo(),IO=ea(),xO=Br(),zc=Lt(),Rn=Wt().forEach,he=OO("hidden"),Pn="Symbol",Ye="prototype",Bc=Uc("toPrimitive"),RO=zc.set,Cc=zc.getterFor(Pn),qe=Object[Ye],me=Nc.Symbol,Cr=dO("JSON","stringify"),Hc=Mc.f,pt=Vc.f,Gc=jc.f,PO=Fc.f,Qe=Nr("symbols"),$r=Nr("op-symbols"),ra=Nr("string-to-symbol-registry"),na=Nr("symbol-to-string-registry"),qO=Nr("wks"),ia=Nc.QObject,sa=!ia||!ia[Ye]||!ia[Ye].findChild,la=Jt&&va(function(){return Ar(pt({},"a",{get:function(){return pt(this,"a",{value:7}).a}})).a!=7})?function(e,t,r){var n=Hc(qe,t);n&&delete qe[t],pt(e,t,r),n&&e!==qe&&pt(qe,t,n)}:pt,oa=function(e,t){var r=Qe[e]=Ar(me[Ye]);return RO(r,{type:Pn,tag:e,description:t}),Jt||(r.description=t),r},ca=mO?function(e){return typeof e=="symbol"}:function(e){return Object(e)instanceof me},qn=function(t,r,n){t===qe&&qn($r,r,n),aa(t);var i=da(r,!0);return aa(n),W(Qe,i)?(n.enumerable?(W(t,he)&&t[he][i]&&(t[he][i]=!1),n=Ar(n,{enumerable:ua(0,!1)})):(W(t,he)||pt(t,he,ua(1,{})),t[he][i]=!0),la(t,i,n)):pt(t,i,n)},Kc=function(t,r){aa(t);var n=xn(r),i=$c(n).concat(ha(n));return Rn(i,function(o){(!Jt||pa.call(n,o))&&qn(t,o,n[o])}),t},EO=function(t,r){return r===void 0?Ar(t):Kc(Ar(t),r)},pa=function(t){var r=da(t,!0),n=PO.call(this,r);return this===qe&&W(Qe,r)&&!W($r,r)?!1:n||!W(this,r)||!W(Qe,r)||W(this,he)&&this[he][r]?n:!0},Wc=function(t,r){var n=xn(t),i=da(r,!0);if(!(n===qe&&W(Qe,i)&&!W($r,i))){var o=Hc(n,i);return o&&W(Qe,i)&&!(W(n,he)&&n[he][i])&&(o.enumerable=!0),o}},Xc=function(t){var r=Gc(xn(t)),n=[];return Rn(r,function(i){!W(Qe,i)&&!W(Lc,i)&&n.push(i)}),n},ha=function(t){var r=t===qe,n=Gc(r?$r:xn(t)),i=[];return Rn(n,function(o){W(Qe,o)&&(!r||W(qe,o))&&i.push(Qe[o])}),i};Et||(me=function(){if(this instanceof me)throw TypeError("Symbol is not a constructor");var t=!arguments.length||arguments[0]===void 0?void 0:String(arguments[0]),r=Dc(t),n=function(i){this===qe&&n.call($r,i),W(this,he)&&W(this[he],r)&&(this[he][r]=!1),la(this,r,ua(1,i))};return Jt&&sa&&la(qe,r,{configurable:!0,set:n}),oa(r,t)},ta(me[Ye],"toString",function(){return Cc(this).tag}),ta(me,"withoutSetter",function(e){return oa(Dc(e),e)}),Fc.f=pa,Vc.f=qn,Mc.f=Wc,wO.f=jc.f=Xc,fa.f=ha,SO.f=function(e){return oa(Uc(e),e)},Jt&&(pt(me[Ye],"description",{configurable:!0,get:function(){return Cc(this).description}}),hO||ta(qe,"propertyIsEnumerable",pa,{unsafe:!0})));Zt({global:!0,wrap:!0,forced:!Et,sham:!Et},{Symbol:me});Rn($c(qO),function(e){IO(e)});Zt({target:Pn,stat:!0,forced:!Et},{for:function(e){var t=String(e);if(W(ra,t))return ra[t];var r=me(t);return ra[t]=r,na[r]=t,r},keyFor:function(t){if(!ca(t))throw TypeError(t+" is not a symbol");if(W(na,t))return na[t]},useSetter:function(){sa=!0},useSimple:function(){sa=!1}});Zt({target:"Object",stat:!0,forced:!Et,sham:!Jt},{create:EO,defineProperty:qn,defineProperties:Kc,getOwnPropertyDescriptor:Wc});Zt({target:"Object",stat:!0,forced:!Et},{getOwnPropertyNames:Xc,getOwnPropertySymbols:ha});Zt({target:"Object",stat:!0,forced:va(function(){fa.f(1)})},{getOwnPropertySymbols:function(t){return fa.f(bO(t))}});Cr&&(Ac=!Et||va(function(){var e=me();return Cr([e])!="[null]"||Cr({a:e})!="{}"||Cr(Object(e))!="{}"}),Zt({target:"JSON",stat:!0,forced:Ac},{stringify:function(t,r,n){for(var i=[t],o=1,a;arguments.length>o;)i.push(arguments[o++]);if(a=r,!(!yO(r)&&t===void 0||ca(t)))return gO(r)||(r=function(u,s){if(typeof a=="function"&&(s=a.call(this,u,s)),!ca(s))return s}),i[1]=r,Cr.apply(null,i)}}));var Ac;me[Ye][Bc]||_O(me[Ye],Bc,me[Ye].valueOf);xO(me,Pn);Lc[he]=!0;var TO=A(),kO=le(),DO=U(),BO=ce(),CO=re(),AO=de().f,NO=so(),Je=DO.Symbol;kO&&typeof Je=="function"&&(!("description"in Je.prototype)||Je().description!==void 0)&&(ma={},er=function(){var t=arguments.length<1||arguments[0]===void 0?void 0:String(arguments[0]),r=this instanceof er?new Je(t):t===void 0?Je():Je(t);return t===""&&(ma[r]=!0),r},NO(er,Je),En=er.prototype=Je.prototype,En.constructor=er,Yc=En.toString,Qc=String(Je("test"))=="Symbol(test)",Jc=/^Symbol\((.*)\)[^)]+$/,AO(En,"description",{configurable:!0,get:function(){var t=CO(this)?this.valueOf():this,r=Yc.call(t);if(BO(ma,t))return"";var n=Qc?r.slice(7,-1):r.replace(Jc,"$1");return n===""?void 0:n}}),TO({global:!0,forced:!0},{Symbol:er}));var ma,er,En,Yc,Qc,Jc;var $O=ea();$O("iterator");var nk=_(V());var oS=xo().charAt,bp=Lt(),aS=Sa(),wp="String Iterator",uS=bp.set,fS=bp.getterFor(wp);aS(String,"String",function(e){uS(this,{type:wp,string:String(e),index:0})},function(){var t=fS(this),r=t.string,n=t.index,i;return n>=r.length?{value:void 0,done:!0}:(i=oS(r,n),t.index+=i.length,{value:i,done:!1})});var sS=U(),_p=ko(),Mr=V(),xa=xe(),Sp=K(),Ra=Sp("iterator"),Op=Sp("toStringTag"),Pa=Mr.values;for(Dn in _p)if(qa=sS[Dn],Le=qa&&qa.prototype,Le){if(Le[Ra]!==Pa)try{xa(Le,Ra,Pa)}catch(e){Le[Ra]=Pa}if(Le[Op]||xa(Le,Op,Dn),_p[Dn]){for(kt in Mr)if(Le[kt]!==Mr[kt])try{xa(Le,kt,Mr[kt])}catch(e){Le[kt]=Mr[kt]}}}var qa,Le,kt,Dn;var Dt=_(k());function Bn(e){return typeof Symbol=="function"&&typeof Symbol.iterator=="symbol"?Bn=function(r){return typeof r}:Bn=function(r){return r&&typeof Symbol=="function"&&r.constructor===Symbol&&r!==Symbol.prototype?"symbol":typeof r},Bn(e)}function lS(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")}function Ip(e,t){for(var r=0;r2){if(t=VS(t),r=t.charCodeAt(0),r===43||r===45){if(n=t.charCodeAt(2),n===88||n===120)return NaN}else if(r===48){switch(t.charCodeAt(1)){case 66:case 98:i=2,o=49;break;case 79:case 111:i=8,o=55;break;default:return+t}for(a=t.slice(2),u=a.length,s=0;so)return NaN;return parseInt(a,i)}}return+t};if(kS(Fr,!dt(" 0o1")||!dt("0b1")||dt("+0x1"))){for(vt=function(t){var r=arguments.length<1?0:t,n=this;return n instanceof vt&&(FS?AS(function(){jn.valueOf.call(n)}):Mp(n)!=Fr)?BS(new dt($p(r)),n,vt):$p(r)},ka=TS?$S(dt):"MAX_VALUE,MIN_VALUE,NaN,NEGATIVE_INFINITY,POSITIVE_INFINITY,EPSILON,isFinite,isInteger,isNaN,isSafeInteger,MAX_SAFE_INTEGER,MIN_SAFE_INTEGER,parseFloat,parseInt,isInteger,fromString,range".split(","),$n=0;ka.length>$n;$n++)Np(dt,Vr=ka[$n])&&!Np(vt,Vr)&&MS(vt,Vr,jS(dt,Vr));vt.prototype=jn,jn.constructor=vt,DS(jp,Fr,vt)}var vt,ka,$n,Vr;var Jk=_(V());var Ur=_(k());var LS=A(),US=re(),zS=X(),HS=ce(),GS=ft(),KS=Qt();function Vp(e,t){var r=arguments.length<3?e:arguments[2],n,i;if(zS(e)===r)return e[t];if(n=GS.f(e,t))return HS(n,"value")?n.value:n.get===void 0?void 0:n.get.call(r);if(US(i=KS(e)))return Vp(i,t,r)}LS({target:"Reflect",stat:!0},{get:Vp});var WS=A(),XS=j(),YS=Ie(),Fp=ft().f,Lp=le(),QS=XS(function(){Fp(1)}),JS=!Lp||QS;WS({target:"Object",stat:!0,forced:JS,sham:!Lp},{getOwnPropertyDescriptor:function(t,r){return Fp(YS(t),r)}});var $k=_(V());var Bt=_(k());function Mn(e){return typeof Symbol=="function"&&typeof Symbol.iterator=="symbol"?Mn=function(r){return typeof r}:Mn=function(r){return r&&typeof Symbol=="function"&&r.constructor===Symbol&&r!==Symbol.prototype?"symbol":typeof r},Mn(e)}function Hp(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")}function Up(e,t){for(var r=0;ru.getTime()?(0,F.default)(i).bsDatepicker("clearDates"):(0,F.default)(i).bsDatepicker("setUTCDate",u)}}},{key:"_setMax",value:function(i,o){if(o===null){(0,F.default)(i).bsDatepicker("setEndDate",null);return}var a=this._newDate(o);if(a!==null&&(o=a,!isNaN(o.valueOf()))){var u=(0,F.default)(i).bsDatepicker("getUTCDate");(0,F.default)(i).bsDatepicker("setEndDate",this._utcDateAsLocal(o)),o&&u&&o.getTime()1&&arguments[1]!==void 0?arguments[1]:",",r=arguments.length>2&&arguments[2]!==void 0?arguments[2]:".",n=e.toString().split(".");return n[0]=n[0].replace(/(\d{1,3}(?=(?:\d\d\d)+(?!\d)))/g,"$1"+t),n.length===1?n[0]:n.length===2?n[0]+r+n[1]:""}(0,Y.default)(document).on("click",".slider-animate-button",function(e){e.preventDefault();var t=(0,Y.default)(this),r=(0,Y.default)("#"+q(t.attr("data-target-id"))),n="Play",i="Pause",o=t.attr("data-loop")!==void 0&&!/^\s*false\s*$/i.test(t.attr("data-loop")),a=t.attr("data-interval");if(isNaN(a)?a=1500:a=Number(a),r.data("animTimer"))clearTimeout(r.data("animTimer")),r.removeData("animTimer"),t.attr("title",n),t.removeClass("playing"),r.removeData("animating");else{var u;if(r.hasClass("jslider")){var s=r.slider();s.canStepNext()||s.resetToStart(),u=setInterval(function(){o&&!s.canStepNext()?s.resetToStart():(s.stepNext(),!o&&!s.canStepNext()&&t.click())},a)}else{var f=r.data("ionRangeSlider"),l=function(){return f.options.type==="double"?f.result.to0}var Ov=function(e){ZI(r,e);var t=ex(r);function r(){return QI(this,r),t.apply(this,arguments)}return JI(r,[{key:"find",value:function(i){return(0,z.default)(i).find("select")}},{key:"getType",value:function(i){var o=(0,z.default)(i);return o.hasClass("symbol")?o.attr("multiple")==="multiple"?"shiny.symbolList":"shiny.symbol":null}},{key:"getId",value:function(i){return M.prototype.getId.call(this,i)||i.name}},{key:"getValue",value:function(i){return(0,z.default)(i).val()}},{key:"setValue",value:function(i,o){if(!_v(i))(0,z.default)(i).val(o);else{var a=this._selectize(i);a==null||a.setValue(o)}}},{key:"getState",value:function(i){for(var o=new Array(i.length),a=0;a1&&arguments[1]!==void 0?arguments[1]:!1;if(!!z.default.fn.selectize){var a=(0,z.default)(i),u=a.parent().find('script[data-for="'+q(i.id)+'"]');if(u.length!==0){var s=z.default.extend({labelField:"label",valueField:"value",searchField:["label"]},JSON.parse(u.html()));typeof u.data("nonempty")!="undefined"?(i.nonempty=!0,s=z.default.extend(s,{onItemRemove:function(p){this.getValue()===""&&(0,z.default)("select#"+q(i.id)).empty().append((0,z.default)("