From ae7c31656e920bfb7021d8b9337010a519111f67 Mon Sep 17 00:00:00 2001 From: John Coene Date: Tue, 12 Mar 2024 09:27:56 +0100 Subject: [PATCH 1/9] fix: allow update input labels with HTML fixes #3995 --- R/update-input.R | 20 ++++++++++---------- R/utils.R | 8 ++++++++ srcts/src/utils/index.ts | 16 ++++++++-------- 3 files changed, 26 insertions(+), 18 deletions(-) diff --git a/R/update-input.R b/R/update-input.R index 24c5911684..727712dcaa 100644 --- a/R/update-input.R +++ b/R/update-input.R @@ -37,7 +37,7 @@ updateTextInput <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL, placeholder = NULL) { validate_session_object(session) - message <- dropNulls(list(label=label, value=value, placeholder=placeholder)) + message <- dropNulls(list(label=label %convert% as.character, value=value, placeholder=placeholder)) session$sendInputMessage(inputId, message) } @@ -111,7 +111,7 @@ updateTextAreaInput <- updateTextInput updateCheckboxInput <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL) { validate_session_object(session) - message <- dropNulls(list(label=label, value=value)) + message <- dropNulls(list(label=label %convert% as.character, value=value)) session$sendInputMessage(inputId, message) } @@ -175,13 +175,13 @@ updateActionButton <- function(session = getDefaultReactiveDomain(), inputId, la validate_session_object(session) if (!is.null(icon)) icon <- as.character(validateIcon(icon)) - message <- dropNulls(list(label=label, icon=icon, disabled=disabled)) + message <- dropNulls(list(label=label %convert% as.character, icon=icon, disabled=disabled)) session$sendInputMessage(inputId, message) } #' @rdname updateActionButton #' @export updateActionLink <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, icon = NULL) { - updateActionButton(session, inputId=inputId, label=label, icon=icon) + updateActionButton(session, inputId=inputId, label=label %convert% as.character, icon=icon) } @@ -225,7 +225,7 @@ updateDateInput <- function(session = getDefaultReactiveDomain(), inputId, label min <- dateYMD(min, "min") max <- dateYMD(max, "max") - message <- dropNulls(list(label=label, value=value, min=min, max=max)) + message <- dropNulls(list(label=label %convert% as.character, value=value, min=min, max=max)) session$sendInputMessage(inputId, message) } @@ -275,7 +275,7 @@ updateDateRangeInput <- function(session = getDefaultReactiveDomain(), inputId, max <- dateYMD(max, "max") message <- dropNulls(list( - label = label, + label = label %convert% as.character, value = dropNulls(list(start = start, end = end)), min = min, max = max @@ -379,7 +379,7 @@ updateNumericInput <- function(session = getDefaultReactiveDomain(), inputId, la validate_session_object(session) message <- dropNulls(list( - label = label, value = formatNoSci(value), + label = label %convert% as.character, value = formatNoSci(value), min = formatNoSci(min), max = formatNoSci(max), step = formatNoSci(step) )) session$sendInputMessage(inputId, message) @@ -460,7 +460,7 @@ updateSliderInput <- function(session = getDefaultReactiveDomain(), inputId, lab } message <- dropNulls(list( - label = label, + label = label %convert% as.character, value = formatNoSci(value), min = formatNoSci(min), max = formatNoSci(max), @@ -491,7 +491,7 @@ updateInputOptions <- function(session, inputId, label = NULL, choices = NULL, )) } - message <- dropNulls(list(label = label, options = options, value = selected)) + message <- dropNulls(list(label = label %convert% as.character, options = options, value = selected)) session$sendInputMessage(inputId, message) } @@ -644,7 +644,7 @@ updateSelectInput <- function(session = getDefaultReactiveDomain(), inputId, lab choices <- if (!is.null(choices)) choicesWithNames(choices) if (!is.null(selected)) selected <- as.character(selected) options <- if (!is.null(choices)) selectOptions(choices, selected, inputId, FALSE) - message <- dropNulls(list(label = label, options = options, value = selected)) + message <- dropNulls(list(label = label %convert% as.character, options = options, value = selected)) session$sendInputMessage(inputId, message) } diff --git a/R/utils.R b/R/utils.R index e2f0a07714..c68ff4a613 100644 --- a/R/utils.R +++ b/R/utils.R @@ -1755,3 +1755,11 @@ cnd_some <- function(.cnd, .p, ...) { FALSE } + +`%convert%` <- function(lhs, rhs) { + if (is.null(lhs)) { + lhs + } + + rhs(lhs) +} diff --git a/srcts/src/utils/index.ts b/srcts/src/utils/index.ts index ffc848453c..993f71a438 100644 --- a/srcts/src/utils/index.ts +++ b/srcts/src/utils/index.ts @@ -119,8 +119,8 @@ function makeResizeFilter( el: HTMLElement, func: ( width: HTMLElement["offsetWidth"], - height: HTMLElement["offsetHeight"] - ) => void + height: HTMLElement["offsetHeight"], + ) => void, ): () => void { let lastSize: LastSizeInterface = {}; @@ -170,7 +170,7 @@ function scopeExprToFunc(expr: string): (scope: unknown) => boolean { console.error('Error evaluating expression: ${exprEscaped}'); throw e; } - }` + }`, ); } catch (e) { console.error("Error parsing expression: " + expr); @@ -192,7 +192,7 @@ function asArray(value: T | T[] | null | undefined): T[] { // bindings by priority and insertion order. function mergeSort( list: Item[], - sortfunc: (a: Item, b: Item) => boolean | number + sortfunc: (a: Item, b: Item) => boolean | number, ): Item[] { function merge(a: Item[], b: Item[]) { let ia = 0; @@ -241,7 +241,7 @@ function $escape(val: string | undefined): string | undefined { // function from lodash. function mapValues( obj: T, - f: (value: MapValuesUnion, key: string, object: typeof obj) => R + f: (value: MapValuesUnion, key: string, object: typeof obj) => R, ): MapWithResult { const newObj = {} as MapWithResult; @@ -302,7 +302,7 @@ function equal(...args: unknown[]): boolean { const compareVersion = function ( a: string, op: "<" | "<=" | "==" | ">" | ">=", - b: string + b: string, ): boolean { function versionParts(ver: string) { return (ver + "") @@ -338,7 +338,7 @@ const compareVersion = function ( function updateLabel( labelTxt: string | undefined, - labelNode: JQuery + labelNode: JQuery, ): void { // Only update if label was specified in the update method if (typeof labelTxt === "undefined") return; @@ -352,7 +352,7 @@ function updateLabel( if (emptyLabel) { labelNode.addClass("shiny-label-null"); } else { - labelNode.text(labelTxt); + labelNode.html(labelTxt); labelNode.removeClass("shiny-label-null"); } } From 2c566e3e9ed633af878e533a475675f496382ee6 Mon Sep 17 00:00:00 2001 From: John Coene Date: Tue, 12 Mar 2024 19:09:15 +0100 Subject: [PATCH 2/9] refactor: use processDeps and renderContent --- R/update-input.R | 20 +++++------ R/utils.R | 8 ----- srcts/src/bindings/input/checkboxgroup.ts | 6 ++-- srcts/src/bindings/input/date.ts | 7 ++-- srcts/src/bindings/input/daterange.ts | 7 ++-- srcts/src/bindings/input/number.ts | 7 ++-- srcts/src/bindings/input/radio.ts | 7 ++-- srcts/src/bindings/input/selectInput.ts | 6 ++-- srcts/src/bindings/input/slider.ts | 7 ++-- srcts/src/bindings/input/text.ts | 7 ++-- srcts/src/utils/index.ts | 36 ++++++++++++------- .../src/bindings/input/checkboxgroup.d.ts | 2 +- srcts/types/src/bindings/input/date.d.ts | 2 +- srcts/types/src/bindings/input/daterange.d.ts | 2 +- srcts/types/src/bindings/input/number.d.ts | 2 +- srcts/types/src/bindings/input/radio.d.ts | 2 +- .../types/src/bindings/input/selectInput.d.ts | 2 +- srcts/types/src/bindings/input/slider.d.ts | 2 +- srcts/types/src/bindings/input/text.d.ts | 2 +- srcts/types/src/utils/index.d.ts | 6 +++- 20 files changed, 82 insertions(+), 58 deletions(-) diff --git a/R/update-input.R b/R/update-input.R index 727712dcaa..9e079a0212 100644 --- a/R/update-input.R +++ b/R/update-input.R @@ -37,7 +37,7 @@ updateTextInput <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL, placeholder = NULL) { validate_session_object(session) - message <- dropNulls(list(label=label %convert% as.character, value=value, placeholder=placeholder)) + message <- dropNulls(list(label=processDeps(label, session), value=value, placeholder=placeholder)) session$sendInputMessage(inputId, message) } @@ -111,7 +111,7 @@ updateTextAreaInput <- updateTextInput updateCheckboxInput <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL) { validate_session_object(session) - message <- dropNulls(list(label=label %convert% as.character, value=value)) + message <- dropNulls(list(label=processDeps(label, session), value=value)) session$sendInputMessage(inputId, message) } @@ -175,13 +175,13 @@ updateActionButton <- function(session = getDefaultReactiveDomain(), inputId, la validate_session_object(session) if (!is.null(icon)) icon <- as.character(validateIcon(icon)) - message <- dropNulls(list(label=label %convert% as.character, icon=icon, disabled=disabled)) + message <- dropNulls(list(label=processDeps(label, session), icon=icon, disabled=disabled)) session$sendInputMessage(inputId, message) } #' @rdname updateActionButton #' @export updateActionLink <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, icon = NULL) { - updateActionButton(session, inputId=inputId, label=label %convert% as.character, icon=icon) + updateActionButton(session, inputId=inputId, label=processDeps(label, session), icon=icon) } @@ -225,7 +225,7 @@ updateDateInput <- function(session = getDefaultReactiveDomain(), inputId, label min <- dateYMD(min, "min") max <- dateYMD(max, "max") - message <- dropNulls(list(label=label %convert% as.character, value=value, min=min, max=max)) + message <- dropNulls(list(label=processDeps(label, session), value=value, min=min, max=max)) session$sendInputMessage(inputId, message) } @@ -275,7 +275,7 @@ updateDateRangeInput <- function(session = getDefaultReactiveDomain(), inputId, max <- dateYMD(max, "max") message <- dropNulls(list( - label = label %convert% as.character, + label = processDeps(label, session), value = dropNulls(list(start = start, end = end)), min = min, max = max @@ -379,7 +379,7 @@ updateNumericInput <- function(session = getDefaultReactiveDomain(), inputId, la validate_session_object(session) message <- dropNulls(list( - label = label %convert% as.character, value = formatNoSci(value), + label = processDeps(label, session), value = formatNoSci(value), min = formatNoSci(min), max = formatNoSci(max), step = formatNoSci(step) )) session$sendInputMessage(inputId, message) @@ -460,7 +460,7 @@ updateSliderInput <- function(session = getDefaultReactiveDomain(), inputId, lab } message <- dropNulls(list( - label = label %convert% as.character, + label = processDeps(label, session), value = formatNoSci(value), min = formatNoSci(min), max = formatNoSci(max), @@ -491,7 +491,7 @@ updateInputOptions <- function(session, inputId, label = NULL, choices = NULL, )) } - message <- dropNulls(list(label = label %convert% as.character, options = options, value = selected)) + message <- dropNulls(list(label = processDeps(label, session), options = options, value = selected)) session$sendInputMessage(inputId, message) } @@ -644,7 +644,7 @@ updateSelectInput <- function(session = getDefaultReactiveDomain(), inputId, lab choices <- if (!is.null(choices)) choicesWithNames(choices) if (!is.null(selected)) selected <- as.character(selected) options <- if (!is.null(choices)) selectOptions(choices, selected, inputId, FALSE) - message <- dropNulls(list(label = label %convert% as.character, options = options, value = selected)) + message <- dropNulls(list(label = processDeps(label, session), options = options, value = selected)) session$sendInputMessage(inputId, message) } diff --git a/R/utils.R b/R/utils.R index c68ff4a613..e2f0a07714 100644 --- a/R/utils.R +++ b/R/utils.R @@ -1755,11 +1755,3 @@ cnd_some <- function(.cnd, .p, ...) { FALSE } - -`%convert%` <- function(lhs, rhs) { - if (is.null(lhs)) { - lhs - } - - rhs(lhs) -} diff --git a/srcts/src/bindings/input/checkboxgroup.ts b/srcts/src/bindings/input/checkboxgroup.ts index a6683e9b28..eee1c5f174 100644 --- a/srcts/src/bindings/input/checkboxgroup.ts +++ b/srcts/src/bindings/input/checkboxgroup.ts @@ -113,10 +113,10 @@ class CheckboxGroupInputBinding extends InputBinding { options: options, }; } - receiveMessage( + async receiveMessage( el: CheckboxGroupHTMLElement, data: CheckboxGroupReceiveMessageData - ): void { + ): Promise { const $el = $(el); // This will replace all the options @@ -132,7 +132,7 @@ class CheckboxGroupInputBinding extends InputBinding { this.setValue(el, data.value); } - updateLabel(data.label, getLabelNode(el)); + await updateLabel(data.label, getLabelNode(el)); $(el).trigger("change"); } diff --git a/srcts/src/bindings/input/date.ts b/srcts/src/bindings/input/date.ts index ab8d66cd59..6641174013 100644 --- a/srcts/src/bindings/input/date.ts +++ b/srcts/src/bindings/input/date.ts @@ -296,10 +296,13 @@ class DateInputBinding extends DateInputBindingBase { startview: startview, }; } - receiveMessage(el: HTMLElement, data: DateReceiveMessageData): void { + async receiveMessage( + el: HTMLElement, + data: DateReceiveMessageData + ): Promise { const $input = $(el).find("input"); - updateLabel(data.label, this._getLabelNode(el)); + await updateLabel(data.label, this._getLabelNode(el)); if (hasDefinedProperty(data, "min")) this._setMin($input[0], data.min); diff --git a/srcts/src/bindings/input/daterange.ts b/srcts/src/bindings/input/daterange.ts index f80a45efbe..ecc4eb3c48 100644 --- a/srcts/src/bindings/input/daterange.ts +++ b/srcts/src/bindings/input/daterange.ts @@ -106,13 +106,16 @@ class DateRangeInputBinding extends DateInputBindingBase { startview: startview, }; } - receiveMessage(el: HTMLElement, data: DateRangeReceiveMessageData): void { + async receiveMessage( + el: HTMLElement, + data: DateRangeReceiveMessageData + ): Promise { const $el = $(el); const $inputs = $el.find("input"); const $startinput = $inputs.eq(0); const $endinput = $inputs.eq(1); - updateLabel(data.label, getLabelNode(el)); + await updateLabel(data.label, getLabelNode(el)); if (hasDefinedProperty(data, "min")) { this._setMin($startinput[0], data.min); diff --git a/srcts/src/bindings/input/number.ts b/srcts/src/bindings/input/number.ts index b47395838c..434094b0ab 100644 --- a/srcts/src/bindings/input/number.ts +++ b/srcts/src/bindings/input/number.ts @@ -51,7 +51,10 @@ class NumberInputBinding extends TextInputBindingBase { return "shiny.number"; el; } - receiveMessage(el: NumberHTMLElement, data: NumberReceiveMessageData): void { + async receiveMessage( + el: NumberHTMLElement, + data: NumberReceiveMessageData + ): Promise { // Setting values to `""` will remove the attribute value from the DOM element. // The attr key will still remain, but there is not value... ex: `` if (hasDefinedProperty(data, "value")) el.value = data.value ?? ""; @@ -59,7 +62,7 @@ class NumberInputBinding extends TextInputBindingBase { if (hasDefinedProperty(data, "max")) el.max = data.max ?? ""; if (hasDefinedProperty(data, "step")) el.step = data.step ?? ""; - updateLabel(data.label, getLabelNode(el)); + await updateLabel(data.label, getLabelNode(el)); $(el).trigger("change"); } diff --git a/srcts/src/bindings/input/radio.ts b/srcts/src/bindings/input/radio.ts index 00bbbedc1b..da5a59664a 100644 --- a/srcts/src/bindings/input/radio.ts +++ b/srcts/src/bindings/input/radio.ts @@ -103,7 +103,10 @@ class RadioInputBinding extends InputBinding { options: options, }; } - receiveMessage(el: RadioHTMLElement, data: RadioReceiveMessageData): void { + async receiveMessage( + el: RadioHTMLElement, + data: RadioReceiveMessageData + ): Promise { const $el = $(el); // This will replace all the options @@ -122,7 +125,7 @@ class RadioInputBinding extends InputBinding { this.setValue(el, data.value); } - updateLabel(data.label, getLabelNode(el)); + await updateLabel(data.label, getLabelNode(el)); $(el).trigger("change"); } diff --git a/srcts/src/bindings/input/selectInput.ts b/srcts/src/bindings/input/selectInput.ts index 9204e9c141..9e10d654b9 100644 --- a/srcts/src/bindings/input/selectInput.ts +++ b/srcts/src/bindings/input/selectInput.ts @@ -102,10 +102,10 @@ class SelectInputBinding extends InputBinding { options: options, }; } - receiveMessage( + async receiveMessage( el: SelectHTMLElement, data: SelectInputReceiveMessageData - ): void { + ): Promise { const $el = $(el); // This will replace all the options @@ -199,7 +199,7 @@ class SelectInputBinding extends InputBinding { this.setValue(el, data.value); } - updateLabel(data.label, getLabelNode(el)); + await updateLabel(data.label, getLabelNode(el)); $(el).trigger("change"); } diff --git a/srcts/src/bindings/input/slider.ts b/srcts/src/bindings/input/slider.ts index 841964cfa8..13e03ead8b 100644 --- a/srcts/src/bindings/input/slider.ts +++ b/srcts/src/bindings/input/slider.ts @@ -179,7 +179,10 @@ class SliderInputBinding extends TextInputBindingBase { unsubscribe(el: HTMLElement): void { $(el).off(".sliderInputBinding"); } - receiveMessage(el: HTMLElement, data: SliderReceiveMessageData): void { + async receiveMessage( + el: HTMLElement, + data: SliderReceiveMessageData + ): Promise { const $el = $(el); const slider = $el.data("ionRangeSlider"); const msg: { @@ -226,7 +229,7 @@ class SliderInputBinding extends TextInputBindingBase { } } - updateLabel(data.label, getLabelNode(el)); + await updateLabel(data.label, getLabelNode(el)); // (maybe) update data elements const domElements: Array<"data-type" | "time-format" | "timezone"> = [ diff --git a/srcts/src/bindings/input/text.ts b/srcts/src/bindings/input/text.ts index 31c6406c2c..04dd059611 100644 --- a/srcts/src/bindings/input/text.ts +++ b/srcts/src/bindings/input/text.ts @@ -109,10 +109,13 @@ class TextInputBinding extends TextInputBindingBase { placeholder: el.placeholder, }; } - receiveMessage(el: TextHTMLElement, data: TextReceiveMessageData): void { + async receiveMessage( + el: TextHTMLElement, + data: TextReceiveMessageData + ): Promise { if (hasDefinedProperty(data, "value")) this.setValue(el, data.value); - updateLabel(data.label, getLabelNode(el)); + await updateLabel(data.label, getLabelNode(el)); if (hasDefinedProperty(data, "placeholder")) el.placeholder = data.placeholder; diff --git a/srcts/src/utils/index.ts b/srcts/src/utils/index.ts index 993f71a438..e02dfbd92c 100644 --- a/srcts/src/utils/index.ts +++ b/srcts/src/utils/index.ts @@ -1,7 +1,9 @@ import $ from "jquery"; import { windowDevicePixelRatio } from "../window/pixelRatio"; import type { MapValuesUnion, MapWithResult } from "./extraTypes"; +import type { HtmlDep } from "../shiny/render"; import { hasOwnProperty, hasDefinedProperty } from "./object"; +import { renderContent } from "../shiny/render"; function escapeHTML(str: string): string { /* eslint-disable @typescript-eslint/naming-convention */ @@ -119,8 +121,8 @@ function makeResizeFilter( el: HTMLElement, func: ( width: HTMLElement["offsetWidth"], - height: HTMLElement["offsetHeight"], - ) => void, + height: HTMLElement["offsetHeight"] + ) => void ): () => void { let lastSize: LastSizeInterface = {}; @@ -170,7 +172,7 @@ function scopeExprToFunc(expr: string): (scope: unknown) => boolean { console.error('Error evaluating expression: ${exprEscaped}'); throw e; } - }`, + }` ); } catch (e) { console.error("Error parsing expression: " + expr); @@ -192,7 +194,7 @@ function asArray(value: T | T[] | null | undefined): T[] { // bindings by priority and insertion order. function mergeSort( list: Item[], - sortfunc: (a: Item, b: Item) => boolean | number, + sortfunc: (a: Item, b: Item) => boolean | number ): Item[] { function merge(a: Item[], b: Item[]) { let ia = 0; @@ -241,7 +243,7 @@ function $escape(val: string | undefined): string | undefined { // function from lodash. function mapValues( obj: T, - f: (value: MapValuesUnion, key: string, object: typeof obj) => R, + f: (value: MapValuesUnion, key: string, object: typeof obj) => R ): MapWithResult { const newObj = {} as MapWithResult; @@ -302,7 +304,7 @@ function equal(...args: unknown[]): boolean { const compareVersion = function ( a: string, op: "<" | "<=" | "==" | ">" | ">=", - b: string, + b: string ): boolean { function versionParts(ver: string) { return (ver + "") @@ -336,23 +338,31 @@ const compareVersion = function ( else throw `Unknown operator: ${op}`; }; -function updateLabel( - labelTxt: string | undefined, - labelNode: JQuery, -): void { +async function updateLabel( + labelContent: string | { html: string; deps: HtmlDep[] } | undefined, + labelNode: JQuery +): Promise { // Only update if label was specified in the update method - if (typeof labelTxt === "undefined") return; + if (typeof labelContent === "undefined") return; if (labelNode.length !== 1) { throw new Error("labelNode must be of length 1"); } + if (typeof labelContent === "string") { + labelContent = { + html: labelContent, + deps: [], + }; + } + // Should the label be empty? - const emptyLabel = Array.isArray(labelTxt) && labelTxt.length === 0; + const emptyLabel = + Array.isArray(labelContent.html) && labelContent.html.length === 0; if (emptyLabel) { labelNode.addClass("shiny-label-null"); } else { - labelNode.html(labelTxt); + await renderContent(labelNode, labelContent); labelNode.removeClass("shiny-label-null"); } } diff --git a/srcts/types/src/bindings/input/checkboxgroup.d.ts b/srcts/types/src/bindings/input/checkboxgroup.d.ts index efeb8e19eb..749ef182db 100644 --- a/srcts/types/src/bindings/input/checkboxgroup.d.ts +++ b/srcts/types/src/bindings/input/checkboxgroup.d.ts @@ -20,7 +20,7 @@ declare class CheckboxGroupInputBinding extends InputBinding { value: ReturnType; options: ValueLabelObject[]; }; - receiveMessage(el: CheckboxGroupHTMLElement, data: CheckboxGroupReceiveMessageData): void; + receiveMessage(el: CheckboxGroupHTMLElement, data: CheckboxGroupReceiveMessageData): Promise; subscribe(el: CheckboxGroupHTMLElement, callback: (x: boolean) => void): void; unsubscribe(el: CheckboxGroupHTMLElement): void; } diff --git a/srcts/types/src/bindings/input/date.d.ts b/srcts/types/src/bindings/input/date.d.ts index 49e9d579bc..b0e5a557de 100644 --- a/srcts/types/src/bindings/input/date.d.ts +++ b/srcts/types/src/bindings/input/date.d.ts @@ -52,7 +52,7 @@ declare class DateInputBinding extends DateInputBindingBase { format: string; startview: DatepickerViewModes; }; - receiveMessage(el: HTMLElement, data: DateReceiveMessageData): void; + receiveMessage(el: HTMLElement, data: DateReceiveMessageData): Promise; } export { DateInputBinding, DateInputBindingBase }; export type { DateReceiveMessageData }; diff --git a/srcts/types/src/bindings/input/daterange.d.ts b/srcts/types/src/bindings/input/daterange.d.ts index 984a5308f8..f899c21a34 100644 --- a/srcts/types/src/bindings/input/daterange.d.ts +++ b/srcts/types/src/bindings/input/daterange.d.ts @@ -27,7 +27,7 @@ declare class DateRangeInputBinding extends DateInputBindingBase { language: string; startview: string; }; - receiveMessage(el: HTMLElement, data: DateRangeReceiveMessageData): void; + receiveMessage(el: HTMLElement, data: DateRangeReceiveMessageData): Promise; initialize(el: HTMLElement): void; subscribe(el: HTMLElement, callback: (x: boolean) => void): void; unsubscribe(el: HTMLElement): void; diff --git a/srcts/types/src/bindings/input/number.d.ts b/srcts/types/src/bindings/input/number.d.ts index 815c63c703..48e28fa016 100644 --- a/srcts/types/src/bindings/input/number.d.ts +++ b/srcts/types/src/bindings/input/number.d.ts @@ -12,7 +12,7 @@ declare class NumberInputBinding extends TextInputBindingBase { getValue(el: NumberHTMLElement): string[] | number | string | null | undefined; setValue(el: NumberHTMLElement, value: number): void; getType(el: NumberHTMLElement): string; - receiveMessage(el: NumberHTMLElement, data: NumberReceiveMessageData): void; + receiveMessage(el: NumberHTMLElement, data: NumberReceiveMessageData): Promise; getState(el: NumberHTMLElement): { label: string; value: ReturnType; diff --git a/srcts/types/src/bindings/input/radio.d.ts b/srcts/types/src/bindings/input/radio.d.ts index cb4dd029bd..1e725ccbc3 100644 --- a/srcts/types/src/bindings/input/radio.d.ts +++ b/srcts/types/src/bindings/input/radio.d.ts @@ -18,7 +18,7 @@ declare class RadioInputBinding extends InputBinding { value: ReturnType; options: ValueLabelObject[]; }; - receiveMessage(el: RadioHTMLElement, data: RadioReceiveMessageData): void; + receiveMessage(el: RadioHTMLElement, data: RadioReceiveMessageData): Promise; subscribe(el: RadioHTMLElement, callback: (x: boolean) => void): void; unsubscribe(el: RadioHTMLElement): void; } diff --git a/srcts/types/src/bindings/input/selectInput.d.ts b/srcts/types/src/bindings/input/selectInput.d.ts index ae4a0ed3c5..dd5f65a5a2 100644 --- a/srcts/types/src/bindings/input/selectInput.d.ts +++ b/srcts/types/src/bindings/input/selectInput.d.ts @@ -28,7 +28,7 @@ declare class SelectInputBinding extends InputBinding { label: string; }>; }; - receiveMessage(el: SelectHTMLElement, data: SelectInputReceiveMessageData): void; + receiveMessage(el: SelectHTMLElement, data: SelectInputReceiveMessageData): Promise; subscribe(el: SelectHTMLElement, callback: (x: boolean) => void): void; unsubscribe(el: HTMLElement): void; initialize(el: SelectHTMLElement): void; diff --git a/srcts/types/src/bindings/input/slider.d.ts b/srcts/types/src/bindings/input/slider.d.ts index d983ab94d8..18ddcaa6ec 100644 --- a/srcts/types/src/bindings/input/slider.d.ts +++ b/srcts/types/src/bindings/input/slider.d.ts @@ -26,7 +26,7 @@ declare class SliderInputBinding extends TextInputBindingBase { setValue(el: HTMLElement, value: number | string | [number | string, number | string]): void; subscribe(el: HTMLElement, callback: (x: boolean) => void): void; unsubscribe(el: HTMLElement): void; - receiveMessage(el: HTMLElement, data: SliderReceiveMessageData): void; + receiveMessage(el: HTMLElement, data: SliderReceiveMessageData): Promise; getRatePolicy(el: HTMLElement): { policy: "debounce"; delay: 250; diff --git a/srcts/types/src/bindings/input/text.d.ts b/srcts/types/src/bindings/input/text.d.ts index f521e5ed7c..a885b29b9e 100644 --- a/srcts/types/src/bindings/input/text.d.ts +++ b/srcts/types/src/bindings/input/text.d.ts @@ -27,7 +27,7 @@ declare class TextInputBinding extends TextInputBindingBase { value: string; placeholder: string; }; - receiveMessage(el: TextHTMLElement, data: TextReceiveMessageData): void; + receiveMessage(el: TextHTMLElement, data: TextReceiveMessageData): Promise; } export { TextInputBinding, TextInputBindingBase }; export type { TextHTMLElement, TextReceiveMessageData }; diff --git a/srcts/types/src/utils/index.d.ts b/srcts/types/src/utils/index.d.ts index 3107f5ee24..d4c737f4fb 100644 --- a/srcts/types/src/utils/index.d.ts +++ b/srcts/types/src/utils/index.d.ts @@ -1,4 +1,5 @@ import type { MapValuesUnion, MapWithResult } from "./extraTypes"; +import type { HtmlDep } from "../shiny/render"; import { hasOwnProperty, hasDefinedProperty } from "./object"; declare function escapeHTML(str: string): string; declare function randomId(): string; @@ -22,7 +23,10 @@ declare function isnan(x: unknown): boolean; declare function _equal(x: unknown, y: unknown): boolean; declare function equal(...args: unknown[]): boolean; declare const compareVersion: (a: string, op: "<" | "<=" | "==" | ">" | ">=", b: string) => boolean; -declare function updateLabel(labelTxt: string | undefined, labelNode: JQuery): void; +declare function updateLabel(labelContent: string | { + html: string; + deps: HtmlDep[]; +} | undefined, labelNode: JQuery): Promise; declare function getComputedLinkColor(el: HTMLElement): string; declare function isBS3(): boolean; declare function toLowerCase(str: T): Lowercase; From dfac222b017876fb5afa9986fbff2c3fb30420c0 Mon Sep 17 00:00:00 2001 From: John Coene Date: Wed, 13 Mar 2024 10:45:15 +0100 Subject: [PATCH 3/9] fix: formatting on lists --- R/update-input.R | 73 +++++++++++++++++++++++++++++++++--------------- 1 file changed, 50 insertions(+), 23 deletions(-) diff --git a/R/update-input.R b/R/update-input.R index 9e079a0212..4b2a344636 100644 --- a/R/update-input.R +++ b/R/update-input.R @@ -37,7 +37,11 @@ updateTextInput <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL, placeholder = NULL) { validate_session_object(session) - message <- dropNulls(list(label=processDeps(label, session), value=value, placeholder=placeholder)) + message <- dropNulls(list( + label=processDeps(label, session), + value=value, + placeholder=placeholder + )) session$sendInputMessage(inputId, message) } @@ -111,7 +115,10 @@ updateTextAreaInput <- updateTextInput updateCheckboxInput <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL) { validate_session_object(session) - message <- dropNulls(list(label=processDeps(label, session), value=value)) + message <- dropNulls(list( + label=processDeps(label, session), + value=value + )) session$sendInputMessage(inputId, message) } @@ -175,7 +182,11 @@ updateActionButton <- function(session = getDefaultReactiveDomain(), inputId, la validate_session_object(session) if (!is.null(icon)) icon <- as.character(validateIcon(icon)) - message <- dropNulls(list(label=processDeps(label, session), icon=icon, disabled=disabled)) + message <- dropNulls(list( + label=processDeps(label, session), + icon=icon, + disabled=disabled + )) session$sendInputMessage(inputId, message) } #' @rdname updateActionButton @@ -225,7 +236,12 @@ updateDateInput <- function(session = getDefaultReactiveDomain(), inputId, label min <- dateYMD(min, "min") max <- dateYMD(max, "max") - message <- dropNulls(list(label=processDeps(label, session), value=value, min=min, max=max)) + message <- dropNulls(list( + label=processDeps(label, session), + value=value, + min=min, + max=max + )) session$sendInputMessage(inputId, message) } @@ -275,10 +291,10 @@ updateDateRangeInput <- function(session = getDefaultReactiveDomain(), inputId, max <- dateYMD(max, "max") message <- dropNulls(list( - label = processDeps(label, session), - value = dropNulls(list(start = start, end = end)), - min = min, - max = max + label=processDeps(label, session), + value=dropNulls(list(start = start, end = end)), + min=min, + max=max )) session$sendInputMessage(inputId, message) @@ -379,8 +395,11 @@ updateNumericInput <- function(session = getDefaultReactiveDomain(), inputId, la validate_session_object(session) message <- dropNulls(list( - label = processDeps(label, session), value = formatNoSci(value), - min = formatNoSci(min), max = formatNoSci(max), step = formatNoSci(step) + label=processDeps(label, session), + value=formatNoSci(value), + min=formatNoSci(min), + max=formatNoSci(max), + step=formatNoSci(step) )) session$sendInputMessage(inputId, message) } @@ -460,14 +479,14 @@ updateSliderInput <- function(session = getDefaultReactiveDomain(), inputId, lab } message <- dropNulls(list( - label = processDeps(label, session), - value = formatNoSci(value), - min = formatNoSci(min), - max = formatNoSci(max), - step = formatNoSci(step), - `data-type` = dataType, - `time-format` = timeFormat, - timezone = timezone + label=processDeps(label, session), + value=formatNoSci(value), + min=formatNoSci(min), + max=formatNoSci(max), + step=formatNoSci(step), + `data-type`=dataType, + `time-format`=timeFormat, + timezone=timezone )) session$sendInputMessage(inputId, message) } @@ -491,7 +510,11 @@ updateInputOptions <- function(session, inputId, label = NULL, choices = NULL, )) } - message <- dropNulls(list(label = processDeps(label, session), options = options, value = selected)) + message <- dropNulls(list( + label=processDeps(label, session), + options=options, + value=selected + )) session$sendInputMessage(inputId, message) } @@ -644,7 +667,11 @@ updateSelectInput <- function(session = getDefaultReactiveDomain(), inputId, lab choices <- if (!is.null(choices)) choicesWithNames(choices) if (!is.null(selected)) selected <- as.character(selected) options <- if (!is.null(choices)) selectOptions(choices, selected, inputId, FALSE) - message <- dropNulls(list(label = processDeps(label, session), options = options, value = selected)) + message <- dropNulls(list( + label=processDeps(label, session), + options=options, + value=selected + )) session$sendInputMessage(inputId, message) } @@ -764,9 +791,9 @@ updateSelectizeInput <- function(session = getDefaultReactiveDomain(), inputId, attr(choices, 'selected_value') <- value message <- dropNulls(list( - label = label, - value = value, - url = session$registerDataObj(inputId, choices, selectizeJSON) + label=label, + value=value, + url=session$registerDataObj(inputId, choices, selectizeJSON) )) session$sendInputMessage(inputId, message) } From 62283b307ffa0cf583f8dda7c0ab987ac9ecaed9 Mon Sep 17 00:00:00 2001 From: John Coene Date: Wed, 13 Mar 2024 15:09:18 +0100 Subject: [PATCH 4/9] fix: put spaces between infix --- R/update-input.R | 80 ++++++++++++++++++++++++------------------------ 1 file changed, 40 insertions(+), 40 deletions(-) diff --git a/R/update-input.R b/R/update-input.R index 4b2a344636..d36b0e908e 100644 --- a/R/update-input.R +++ b/R/update-input.R @@ -38,9 +38,9 @@ updateTextInput <- function(session = getDefaultReactiveDomain(), inputId, label validate_session_object(session) message <- dropNulls(list( - label=processDeps(label, session), - value=value, - placeholder=placeholder + label = processDeps(label, session), + value = value, + placeholder = placeholder )) session$sendInputMessage(inputId, message) } @@ -116,8 +116,8 @@ updateCheckboxInput <- function(session = getDefaultReactiveDomain(), inputId, l validate_session_object(session) message <- dropNulls(list( - label=processDeps(label, session), - value=value + label = processDeps(label, session), + value = value )) session$sendInputMessage(inputId, message) } @@ -183,16 +183,16 @@ updateActionButton <- function(session = getDefaultReactiveDomain(), inputId, la if (!is.null(icon)) icon <- as.character(validateIcon(icon)) message <- dropNulls(list( - label=processDeps(label, session), - icon=icon, - disabled=disabled + label = processDeps(label, session), + icon = icon, + disabled = disabled )) session$sendInputMessage(inputId, message) } #' @rdname updateActionButton #' @export updateActionLink <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, icon = NULL) { - updateActionButton(session, inputId=inputId, label=processDeps(label, session), icon=icon) + updateActionButton(session, inputId = inputId, label = processDeps(label, session), icon = icon) } @@ -237,10 +237,10 @@ updateDateInput <- function(session = getDefaultReactiveDomain(), inputId, label max <- dateYMD(max, "max") message <- dropNulls(list( - label=processDeps(label, session), - value=value, - min=min, - max=max + label = processDeps(label, session), + value = value, + min = min, + max = max )) session$sendInputMessage(inputId, message) } @@ -291,10 +291,10 @@ updateDateRangeInput <- function(session = getDefaultReactiveDomain(), inputId, max <- dateYMD(max, "max") message <- dropNulls(list( - label=processDeps(label, session), - value=dropNulls(list(start = start, end = end)), - min=min, - max=max + label = processDeps(label, session), + value = dropNulls(list(start = start, end = end)), + min = min, + max = max )) session$sendInputMessage(inputId, message) @@ -390,16 +390,16 @@ updateNavlistPanel <- updateTabsetPanel #' } #' @export updateNumericInput <- function(session = getDefaultReactiveDomain(), inputId, label = NULL, value = NULL, - min = NULL, max = NULL, step = NULL) { + min = NULL, max = NULL, step = NULL) { validate_session_object(session) message <- dropNulls(list( - label=processDeps(label, session), - value=formatNoSci(value), - min=formatNoSci(min), - max=formatNoSci(max), - step=formatNoSci(step) + label = processDeps(label, session), + value = formatNoSci(value), + min = formatNoSci(min), + max = formatNoSci(max), + step = formatNoSci(step) )) session$sendInputMessage(inputId, message) } @@ -479,14 +479,14 @@ updateSliderInput <- function(session = getDefaultReactiveDomain(), inputId, lab } message <- dropNulls(list( - label=processDeps(label, session), - value=formatNoSci(value), - min=formatNoSci(min), - max=formatNoSci(max), - step=formatNoSci(step), - `data-type`=dataType, - `time-format`=timeFormat, - timezone=timezone + label = processDeps(label, session), + value = formatNoSci(value), + min = formatNoSci(min), + max = formatNoSci(max), + step = formatNoSci(step), + `data-type` = dataType, + `time-format` = timeFormat, + timezone = timezone )) session$sendInputMessage(inputId, message) } @@ -511,9 +511,9 @@ updateInputOptions <- function(session, inputId, label = NULL, choices = NULL, } message <- dropNulls(list( - label=processDeps(label, session), - options=options, - value=selected + label = processDeps(label, session), + options = options, + value = selected )) session$sendInputMessage(inputId, message) @@ -668,9 +668,9 @@ updateSelectInput <- function(session = getDefaultReactiveDomain(), inputId, lab if (!is.null(selected)) selected <- as.character(selected) options <- if (!is.null(choices)) selectOptions(choices, selected, inputId, FALSE) message <- dropNulls(list( - label=processDeps(label, session), - options=options, - value=selected + label = processDeps(label, session), + options = options, + value = selected )) session$sendInputMessage(inputId, message) } @@ -791,9 +791,9 @@ updateSelectizeInput <- function(session = getDefaultReactiveDomain(), inputId, attr(choices, 'selected_value') <- value message <- dropNulls(list( - label=label, - value=value, - url=session$registerDataObj(inputId, choices, selectizeJSON) + label = label, + value = value, + url = session$registerDataObj(inputId, choices, selectizeJSON) )) session$sendInputMessage(inputId, message) } From 0229ee5c127e7d5ae3bfddc8f34ba722a303b6f1 Mon Sep 17 00:00:00 2001 From: John Coene Date: Fri, 15 Mar 2024 09:22:37 +0100 Subject: [PATCH 5/9] chore: generated files --- inst/www/shared/shiny-autoreload.js | 2 +- inst/www/shared/shiny-autoreload.js.map | 8 +- inst/www/shared/shiny-showcase.js | 2 +- inst/www/shared/shiny-showcase.js.map | 8 +- inst/www/shared/shiny.js | 31936 ++++++++++++---------- inst/www/shared/shiny.js.map | 8 +- inst/www/shared/shiny.min.js | 2 +- inst/www/shared/shiny.min.js.map | 8 +- 8 files changed, 17912 insertions(+), 14062 deletions(-) diff --git a/inst/www/shared/shiny-autoreload.js b/inst/www/shared/shiny-autoreload.js index f6a7452b31..4f9e32051f 100644 --- a/inst/www/shared/shiny-autoreload.js +++ b/inst/www/shared/shiny-autoreload.js @@ -1,4 +1,4 @@ /*! shiny 1.8.0.9000 | (c) 2012-2024 RStudio, PBC. | License: GPL-3 | file LICENSE */ -"use strict";(function(){var Fl=Object.create;var li=Object.defineProperty;var $l=Object.getOwnPropertyDescriptor;var Ul=Object.getOwnPropertyNames;var Gl=Object.getPrototypeOf,Bl=Object.prototype.hasOwnProperty;var i=function(r,e){return function(){return e||r((e={exports:{}}).exports,e),e.exports}};var kl=function(r,e,t,n){if(e&&typeof e=="object"||typeof e=="function")for(var a=Ul(e),o=0,v=a.length,u;o0&&H[0]<4?1:+(H[0]+H[1]));!Ne&&Ft&&(H=Ft.match(/Edge\/(\d+)/),(!H||H[1]>=74)&&(H=Ft.match(/Chrome\/(\d+)/),H&&(Ne=+H[1])));Yi.exports=Ne});var pr=i(function(HI,Hi){var Wi=Qr(),fp=w();Hi.exports=!!Object.getOwnPropertySymbols&&!fp(function(){var r=Symbol();return!String(r)||!(Object(r)instanceof Symbol)||!Symbol.sham&&Wi&&Wi<41})});var $t=i(function(JI,Ji){var lp=pr();Ji.exports=lp&&!Symbol.sham&&typeof Symbol.iterator=="symbol"});var Zr=i(function(zI,zi){var pp=Y(),yp=P(),dp=_r(),qp=$t(),hp=Object;zi.exports=qp?function(r){return typeof r=="symbol"}:function(r){var e=pp("Symbol");return yp(e)&&dp(e.prototype,hp(r))}});var Cr=i(function(XI,Xi){var gp=String;Xi.exports=function(r){try{return gp(r)}catch(e){return"Object"}}});var rr=i(function(QI,Qi){var Sp=P(),bp=Cr(),mp=TypeError;Qi.exports=function(r){if(Sp(r))return r;throw mp(bp(r)+" is not a function")}});var re=i(function(ZI,Zi){var Op=rr(),Ep=xr();Zi.exports=function(r,e){var t=r[e];return Ep(t)?void 0:Op(t)}});var eo=i(function(rT,ro){var Ut=A(),Gt=P(),Bt=V(),Ip=TypeError;ro.exports=function(r,e){var t,n;if(e==="string"&&Gt(t=r.toString)&&!Bt(n=Ut(t,r))||Gt(t=r.valueOf)&&!Bt(n=Ut(t,r))||e!=="string"&&Gt(t=r.toString)&&!Bt(n=Ut(t,r)))return n;throw Ip("Can't convert object to primitive value")}});var z=i(function(eT,to){to.exports=!1});var Ae=i(function(tT,ao){var no=x(),Tp=Object.defineProperty;ao.exports=function(r,e){try{Tp(no,r,{value:e,configurable:!0,writable:!0})}catch(t){no[r]=e}return e}});var je=i(function(nT,oo){var Pp=x(),wp=Ae(),io="__core-js_shared__",Rp=Pp[io]||wp(io,{});oo.exports=Rp});var yr=i(function(aT,vo){var xp=z(),uo=je();(vo.exports=function(r,e){return uo[r]||(uo[r]=e!==void 0?e:{})})("versions",[]).push({version:"3.29.0",mode:xp?"pure":"global",copyright:"\xA9 2014-2023 Denis Pushkarev (zloirock.ru)",license:"https://github.com/zloirock/core-js/blob/v3.29.0/LICENSE",source:"https://github.com/zloirock/core-js"})});var or=i(function(iT,so){var _p=zr(),Cp=Object;so.exports=function(r){return Cp(_p(r))}});var D=i(function(oT,co){var Np=R(),Ap=or(),jp=Np({}.hasOwnProperty);co.exports=Object.hasOwn||function(e,t){return jp(Ap(e),t)}});var De=i(function(uT,fo){var Dp=R(),Lp=0,Mp=Math.random(),Fp=Dp(1 .toString);fo.exports=function(r){return"Symbol("+(r===void 0?"":r)+")_"+Fp(++Lp+Mp,36)}});var _=i(function(vT,po){var $p=x(),Up=yr(),lo=D(),Gp=De(),Bp=pr(),kp=$t(),Nr=$p.Symbol,kt=Up("wks"),Kp=kp?Nr.for||Nr:Nr&&Nr.withoutSetter||Gp;po.exports=function(r){return lo(kt,r)||(kt[r]=Bp&&lo(Nr,r)?Nr[r]:Kp("Symbol."+r)),kt[r]}});var go=i(function(sT,ho){var Vp=A(),yo=V(),qo=Zr(),Yp=re(),Wp=eo(),Hp=_(),Jp=TypeError,zp=Hp("toPrimitive");ho.exports=function(r,e){if(!yo(r)||qo(r))return r;var t=Yp(r,zp),n;if(t){if(e===void 0&&(e="default"),n=Vp(t,r,e),!yo(n)||qo(n))return n;throw Jp("Can't convert object to primitive value")}return e===void 0&&(e="number"),Wp(r,e)}});var ee=i(function(cT,So){var Xp=go(),Qp=Zr();So.exports=function(r){var e=Xp(r,"string");return Qp(e)?e:e+""}});var te=i(function(fT,mo){var Zp=x(),bo=V(),Kt=Zp.document,ry=bo(Kt)&&bo(Kt.createElement);mo.exports=function(r){return ry?Kt.createElement(r):{}}});var Vt=i(function(lT,Oo){var ey=M(),ty=w(),ny=te();Oo.exports=!ey&&!ty(function(){return Object.defineProperty(ny("div"),"a",{get:function(){return 7}}).a!=7})});var ne=i(function(Io){var ay=M(),iy=A(),oy=Ct(),uy=Rr(),vy=Z(),sy=ee(),cy=D(),fy=Vt(),Eo=Object.getOwnPropertyDescriptor;Io.f=ay?Eo:function(e,t){if(e=vy(e),t=sy(t),fy)try{return Eo(e,t)}catch(n){}if(cy(e,t))return uy(!iy(oy.f,e,t),e[t])}});var Yt=i(function(yT,To){var ly=M(),py=w();To.exports=ly&&py(function(){return Object.defineProperty(function(){},"prototype",{value:42,writable:!1}).prototype!=42})});var F=i(function(dT,Po){var yy=V(),dy=String,qy=TypeError;Po.exports=function(r){if(yy(r))return r;throw qy(dy(r)+" is not an object")}});var B=i(function(Ro){var hy=M(),gy=Vt(),Sy=Yt(),Le=F(),wo=ee(),by=TypeError,Wt=Object.defineProperty,my=Object.getOwnPropertyDescriptor,Ht="enumerable",Jt="configurable",zt="writable";Ro.f=hy?Sy?function(e,t,n){if(Le(e),t=wo(t),Le(n),typeof e=="function"&&t==="prototype"&&"value"in n&&zt in n&&!n[zt]){var a=my(e,t);a&&a[zt]&&(e[t]=n.value,n={configurable:Jt in n?n[Jt]:a[Jt],enumerable:Ht in n?n[Ht]:a[Ht],writable:!1})}return Wt(e,t,n)}:Wt:function(e,t,n){if(Le(e),t=wo(t),Le(n),gy)try{return Wt(e,t,n)}catch(a){}if("get"in n||"set"in n)throw by("Accessors not supported");return"value"in n&&(e[t]=n.value),e}});var dr=i(function(hT,xo){var Oy=M(),Ey=B(),Iy=Rr();xo.exports=Oy?function(r,e,t){return Ey.f(r,e,Iy(1,t))}:function(r,e,t){return r[e]=t,r}});var Me=i(function(gT,Co){var Xt=M(),Ty=D(),_o=Function.prototype,Py=Xt&&Object.getOwnPropertyDescriptor,Qt=Ty(_o,"name"),wy=Qt&&function(){}.name==="something",Ry=Qt&&(!Xt||Xt&&Py(_o,"name").configurable);Co.exports={EXISTS:Qt,PROPER:wy,CONFIGURABLE:Ry}});var Fe=i(function(ST,No){var xy=R(),_y=P(),Zt=je(),Cy=xy(Function.toString);_y(Zt.inspectSource)||(Zt.inspectSource=function(r){return Cy(r)});No.exports=Zt.inspectSource});var Do=i(function(bT,jo){var Ny=x(),Ay=P(),Ao=Ny.WeakMap;jo.exports=Ay(Ao)&&/native code/.test(String(Ao))});var ae=i(function(mT,Mo){var jy=yr(),Dy=De(),Lo=jy("keys");Mo.exports=function(r){return Lo[r]||(Lo[r]=Dy(r))}});var ie=i(function(OT,Fo){Fo.exports={}});var hr=i(function(ET,Go){var Ly=Do(),Uo=x(),My=V(),Fy=dr(),rn=D(),en=je(),$y=ae(),Uy=ie(),$o="Object already initialized",tn=Uo.TypeError,Gy=Uo.WeakMap,$e,oe,Ue,By=function(r){return Ue(r)?oe(r):$e(r,{})},ky=function(r){return function(e){var t;if(!My(e)||(t=oe(e)).type!==r)throw tn("Incompatible receiver, "+r+" required");return t}};Ly||en.state?(J=en.state||(en.state=new Gy),J.get=J.get,J.has=J.has,J.set=J.set,$e=function(r,e){if(J.has(r))throw tn($o);return e.facade=r,J.set(r,e),e},oe=function(r){return J.get(r)||{}},Ue=function(r){return J.has(r)}):(qr=$y("state"),Uy[qr]=!0,$e=function(r,e){if(rn(r,qr))throw tn($o);return e.facade=r,Fy(r,qr,e),e},oe=function(r){return rn(r,qr)?r[qr]:{}},Ue=function(r){return rn(r,qr)});var J,qr;Go.exports={set:$e,get:oe,has:Ue,enforce:By,getterFor:ky}});var on=i(function(IT,Ko){var an=R(),Ky=w(),Vy=P(),Ge=D(),nn=M(),Yy=Me().CONFIGURABLE,Wy=Fe(),ko=hr(),Hy=ko.enforce,Jy=ko.get,Bo=String,Be=Object.defineProperty,zy=an("".slice),Xy=an("".replace),Qy=an([].join),Zy=nn&&!Ky(function(){return Be(function(){},"length",{value:8}).length!==8}),rd=String(String).split("String"),ed=Ko.exports=function(r,e,t){zy(Bo(e),0,7)==="Symbol("&&(e="["+Xy(Bo(e),/^Symbol\(([^)]*)\)/,"$1")+"]"),t&&t.getter&&(e="get "+e),t&&t.setter&&(e="set "+e),(!Ge(r,"name")||Yy&&r.name!==e)&&(nn?Be(r,"name",{value:e,configurable:!0}):r.name=e),Zy&&t&&Ge(t,"arity")&&r.length!==t.arity&&Be(r,"length",{value:t.arity});try{t&&Ge(t,"constructor")&&t.constructor?nn&&Be(r,"prototype",{writable:!1}):r.prototype&&(r.prototype=void 0)}catch(a){}var n=Hy(r);return Ge(n,"source")||(n.source=Qy(rd,typeof e=="string"?e:"")),r};Function.prototype.toString=ed(function(){return Vy(this)&&Jy(this).source||Wy(this)},"toString")});var X=i(function(TT,Vo){var td=P(),nd=B(),ad=on(),id=Ae();Vo.exports=function(r,e,t,n){n||(n={});var a=n.enumerable,o=n.name!==void 0?n.name:e;if(td(t)&&ad(t,o,n),n.global)a?r[e]=t:id(e,t);else{try{n.unsafe?r[e]&&(a=!0):delete r[e]}catch(v){}a?r[e]=t:nd.f(r,e,{value:t,enumerable:!1,configurable:!n.nonConfigurable,writable:!n.nonWritable})}return r}});var Wo=i(function(PT,Yo){var od=Math.ceil,ud=Math.floor;Yo.exports=Math.trunc||function(e){var t=+e;return(t>0?ud:od)(t)}});var ue=i(function(wT,Ho){var vd=Wo();Ho.exports=function(r){var e=+r;return e!==e||e===0?0:vd(e)}});var ke=i(function(RT,Jo){var sd=ue(),cd=Math.max,fd=Math.min;Jo.exports=function(r,e){var t=sd(r);return t<0?cd(t+e,0):fd(t,e)}});var un=i(function(xT,zo){var ld=ue(),pd=Math.min;zo.exports=function(r){return r>0?pd(ld(r),9007199254740991):0}});var gr=i(function(_T,Xo){var yd=un();Xo.exports=function(r){return yd(r.length)}});var ru=i(function(CT,Zo){var dd=Z(),qd=ke(),hd=gr(),Qo=function(r){return function(e,t,n){var a=dd(e),o=hd(a),v=qd(n,o),u;if(r&&t!=t){for(;o>v;)if(u=a[v++],u!=u)return!0}else for(;o>v;v++)if((r||v in a)&&a[v]===t)return r||v||0;return!r&&-1}};Zo.exports={includes:Qo(!0),indexOf:Qo(!1)}});var sn=i(function(NT,tu){var gd=R(),vn=D(),Sd=Z(),bd=ru().indexOf,md=ie(),eu=gd([].push);tu.exports=function(r,e){var t=Sd(r),n=0,a=[],o;for(o in t)!vn(md,o)&&vn(t,o)&&eu(a,o);for(;e.length>n;)vn(t,o=e[n++])&&(~bd(a,o)||eu(a,o));return a}});var Ke=i(function(AT,nu){nu.exports=["constructor","hasOwnProperty","isPrototypeOf","propertyIsEnumerable","toLocaleString","toString","valueOf"]});var Ve=i(function(au){var Od=sn(),Ed=Ke(),Id=Ed.concat("length","prototype");au.f=Object.getOwnPropertyNames||function(e){return Od(e,Id)}});var Ye=i(function(iu){iu.f=Object.getOwnPropertySymbols});var uu=i(function(LT,ou){var Td=Y(),Pd=R(),wd=Ve(),Rd=Ye(),xd=F(),_d=Pd([].concat);ou.exports=Td("Reflect","ownKeys")||function(e){var t=wd.f(xd(e)),n=Rd.f;return n?_d(t,n(e)):t}});var cn=i(function(MT,su){var vu=D(),Cd=uu(),Nd=ne(),Ad=B();su.exports=function(r,e,t){for(var n=Cd(e),a=Ad.f,o=Nd.f,v=0;vv;)lq.f(e,u=a[v++],n[u]);return e}});var gn=i(function(WT,Ou){var qq=Y();Ou.exports=qq("document","documentElement")});var Ar=i(function(HT,xu){var hq=F(),gq=hn(),Eu=Ke(),Sq=ie(),bq=gn(),mq=te(),Oq=ae(),Iu=">",Tu="<",bn="prototype",mn="script",wu=Oq("IE_PROTO"),Sn=function(){},Ru=function(r){return Tu+mn+Iu+r+Tu+"/"+mn+Iu},Pu=function(r){r.write(Ru("")),r.close();var e=r.parentWindow.Object;return r=null,e},Eq=function(){var r=mq("iframe"),e="java"+mn+":",t;return r.style.display="none",bq.appendChild(r),r.src=String(e),t=r.contentWindow.document,t.open(),t.write(Ru("document.F=Object")),t.close(),t.F},Je,ze=function(){try{Je=new ActiveXObject("htmlfile")}catch(e){}ze=typeof document!="undefined"?document.domain&&Je?Pu(Je):Eq():Pu(Je);for(var r=Eu.length;r--;)delete ze[bn][Eu[r]];return ze()};Sq[wu]=!0;xu.exports=Object.create||function(e,t){var n;return e!==null?(Sn[bn]=hq(e),n=new Sn,Sn[bn]=null,n[wu]=e):n=ze(),t===void 0?n:gq.f(n,t)}});var Cu=i(function(JT,_u){var Iq=w(),Tq=x(),Pq=Tq.RegExp;_u.exports=Iq(function(){var r=Pq(".","s");return!(r.dotAll&&r.exec("\n")&&r.flags==="s")})});var Au=i(function(zT,Nu){var wq=w(),Rq=x(),xq=Rq.RegExp;Nu.exports=wq(function(){var r=xq("(?b)","g");return r.exec("b").groups.a!=="b"||"b".replace(r,"$c")!=="bc"})});var Ze=i(function(XT,Du){"use strict";var jr=A(),Qe=R(),_q=er(),Cq=hu(),Nq=Su(),Aq=yr(),jq=Ar(),Dq=hr().get,Lq=Cu(),Mq=Au(),Fq=Aq("native-string-replace",String.prototype.replace),Xe=RegExp.prototype.exec,En=Xe,$q=Qe("".charAt),Uq=Qe("".indexOf),Gq=Qe("".replace),On=Qe("".slice),In=function(){var r=/a/,e=/b*/g;return jr(Xe,r,"a"),jr(Xe,e,"a"),r.lastIndex!==0||e.lastIndex!==0}(),ju=Nq.BROKEN_CARET,Tn=/()??/.exec("")[1]!==void 0,Bq=In||Tn||ju||Lq||Mq;Bq&&(En=function(e){var t=this,n=Dq(t),a=_q(e),o=n.raw,v,u,c,f,y,S,m;if(o)return o.lastIndex=t.lastIndex,v=jr(En,o,a),t.lastIndex=o.lastIndex,v;var h=n.groups,O=ju&&t.sticky,I=jr(Cq,t),E=t.source,T=0,b=a;if(O&&(I=Gq(I,"y",""),Uq(I,"g")===-1&&(I+="g"),b=On(a,t.lastIndex),t.lastIndex>0&&(!t.multiline||t.multiline&&$q(a,t.lastIndex-1)!=="\n")&&(E="(?: "+E+")",b=" "+b,T++),u=new RegExp("^(?:"+E+")",I)),Tn&&(u=new RegExp("^"+E+"$(?!\\s)",I)),In&&(c=t.lastIndex),f=jr(Xe,O?u:t,b),O?f?(f.input=On(f.input,T),f[0]=On(f[0],T),f.index=t.lastIndex,t.lastIndex+=f[0].length):t.lastIndex=0:In&&f&&(t.lastIndex=t.global?f.index+f[0].length:c),Tn&&f&&f.length>1&&jr(Fq,f[0],u,function(){for(y=1;y=o?r?"":void 0:(v=Hu(n,a),v<55296||v>56319||a+1===o||(u=Hu(n,a+1))<56320||u>57343?r?Zq(n,a):v:r?rh(n,a,a+2):(v-55296<<10)+(u-56320)+65536)}};zu.exports={codeAt:Ju(!1),charAt:Ju(!0)}});var Qu=i(function(aP,Xu){"use strict";var eh=_n().charAt;Xu.exports=function(r,e,t){return e+(t?eh(r,e).length:1)}});var rv=i(function(iP,Zu){var An=R(),th=or(),nh=Math.floor,Cn=An("".charAt),ah=An("".replace),Nn=An("".slice),ih=/\$([$&'`]|\d{1,2}|<[^>]*>)/g,oh=/\$([$&'`]|\d{1,2})/g;Zu.exports=function(r,e,t,n,a,o){var v=t+r.length,u=n.length,c=oh;return a!==void 0&&(a=th(a),c=ih),ah(o,c,function(f,y){var S;switch(Cn(y,0)){case"$":return"$";case"&":return r;case"`":return Nn(e,0,t);case"'":return Nn(e,v);case"<":S=a[Nn(y,1,-1)];break;default:var m=+y;if(m===0)return f;if(m>u){var h=nh(m/10);return h===0?f:h<=u?n[h-1]===void 0?Cn(y,1):n[h-1]+Cn(y,1):f}S=n[m-1]}return S===void 0?"":S})}});var nv=i(function(oP,tv){var ev=A(),uh=F(),vh=P(),sh=Q(),ch=Ze(),fh=TypeError;tv.exports=function(r,e){var t=r.exec;if(vh(t)){var n=ev(t,r,e);return n!==null&&uh(n),n}if(sh(r)==="RegExp")return ev(ch,r,e);throw fh("RegExp#exec called on incompatible receiver")}});var Lr=i(function(uP,vv){var Nh=Q();vv.exports=Array.isArray||function(e){return Nh(e)=="Array"}});var cv=i(function(vP,sv){var Ah=TypeError,jh=9007199254740991;sv.exports=function(r){if(r>jh)throw Ah("Maximum allowed index exceeded");return r}});var tt=i(function(sP,fv){"use strict";var Dh=ee(),Lh=B(),Mh=Rr();fv.exports=function(r,e,t){var n=Dh(e);n in r?Lh.f(r,n,Mh(0,t)):r[n]=t}});var nt=i(function(cP,qv){var Fh=R(),$h=w(),lv=P(),Uh=se(),Gh=Y(),Bh=Fe(),pv=function(){},kh=[],yv=Gh("Reflect","construct"),Ln=/^\s*(?:class|function)\b/,Kh=Fh(Ln.exec),Vh=!Ln.exec(pv),ce=function(e){if(!lv(e))return!1;try{return yv(pv,kh,e),!0}catch(t){return!1}},dv=function(e){if(!lv(e))return!1;switch(Uh(e)){case"AsyncFunction":case"GeneratorFunction":case"AsyncGeneratorFunction":return!1}try{return Vh||!!Kh(Ln,Bh(e))}catch(t){return!0}};dv.sham=!0;qv.exports=!yv||$h(function(){var r;return ce(ce.call)||!ce(Object)||!ce(function(){r=!0})||r})?dv:ce});var bv=i(function(fP,Sv){var hv=Lr(),Yh=nt(),Wh=V(),Hh=_(),Jh=Hh("species"),gv=Array;Sv.exports=function(r){var e;return hv(r)&&(e=r.constructor,Yh(e)&&(e===gv||hv(e.prototype))?e=void 0:Wh(e)&&(e=e[Jh],e===null&&(e=void 0))),e===void 0?gv:e}});var Mn=i(function(lP,mv){var zh=bv();mv.exports=function(r,e){return new(zh(r))(e===0?0:e)}});var Fn=i(function(pP,Ov){var Xh=w(),Qh=_(),Zh=Qr(),rg=Qh("species");Ov.exports=function(r){return Zh>=51||!Xh(function(){var e=[],t=e.constructor={};return t[rg]=function(){return{foo:1}},e[r](Boolean).foo!==1})}});var wv=i(function(yP,Pv){"use strict";var yg=We(),dg=se();Pv.exports=yg?{}.toString:function(){return"[object "+dg(this)+"]"}});var fe=i(function(dP,Rv){var Sg=Q();Rv.exports=typeof process!="undefined"&&Sg(process)=="process"});var _v=i(function(qP,xv){var bg=R(),mg=rr();xv.exports=function(r,e,t){try{return bg(mg(Object.getOwnPropertyDescriptor(r,e)[t]))}catch(n){}}});var Nv=i(function(hP,Cv){var Og=P(),Eg=String,Ig=TypeError;Cv.exports=function(r){if(typeof r=="object"||Og(r))return r;throw Ig("Can't set "+Eg(r)+" as a prototype")}});var at=i(function(gP,Av){var Tg=_v(),Pg=F(),wg=Nv();Av.exports=Object.setPrototypeOf||("__proto__"in{}?function(){var r=!1,e={},t;try{t=Tg(Object.prototype,"__proto__","set"),t(e,[]),r=e instanceof Array}catch(n){}return function(a,o){return Pg(a),wg(o),r?t(a,o):a.__proto__=o,a}}():void 0)});var ur=i(function(SP,Dv){var Rg=B().f,xg=D(),_g=_(),jv=_g("toStringTag");Dv.exports=function(r,e,t){r&&!t&&(r=r.prototype),r&&!xg(r,jv)&&Rg(r,jv,{configurable:!0,value:e})}});var le=i(function(bP,Mv){var Lv=on(),Cg=B();Mv.exports=function(r,e,t){return t.get&&Lv(t.get,e,{getter:!0}),t.set&&Lv(t.set,e,{setter:!0}),Cg.f(r,e,t)}});var Uv=i(function(mP,$v){"use strict";var Ng=Y(),Ag=le(),jg=_(),Dg=M(),Fv=jg("species");$v.exports=function(r){var e=Ng(r);Dg&&e&&!e[Fv]&&Ag(e,Fv,{configurable:!0,get:function(){return this}})}});var Bv=i(function(OP,Gv){var Lg=_r(),Mg=TypeError;Gv.exports=function(r,e){if(Lg(e,r))return r;throw Mg("Incorrect invocation")}});var Kv=i(function(EP,kv){var Fg=nt(),$g=Cr(),Ug=TypeError;kv.exports=function(r){if(Fg(r))return r;throw Ug($g(r)+" is not a constructor")}});var Wv=i(function(IP,Yv){var Vv=F(),Gg=Kv(),Bg=xr(),kg=_(),Kg=kg("species");Yv.exports=function(r,e){var t=Vv(r).constructor,n;return t===void 0||Bg(n=Vv(t)[Kg])?e:Gg(n)}});var pe=i(function(TP,Jv){var Hv=wn(),Vg=rr(),Yg=Jr(),Wg=Hv(Hv.bind);Jv.exports=function(r,e){return Vg(r),e===void 0?r:Yg?Wg(r,e):function(){return r.apply(e,arguments)}}});var it=i(function(PP,zv){var Hg=R();zv.exports=Hg([].slice)});var Qv=i(function(wP,Xv){var Jg=TypeError;Xv.exports=function(r,e){if(rS;S++)if(h=T(r[S]),h&&cc(lc,h))return h;return new dt(!1)}f=Sb(r,y)}for(O=o?r.next:f.next;!(I=yb(O,f)).done;){try{h=T(I.value)}catch(b){fc(f,"throw",b)}if(typeof h=="object"&&h&&cc(lc,h))return h}return new dt(!1)}});var gc=i(function(JP,hc){var Ob=_(),dc=Ob("iterator"),qc=!1;try{yc=0,ya={next:function(){return{done:!!yc++}},return:function(){qc=!0}},ya[dc]=function(){return this},Array.from(ya,function(){throw 2})}catch(r){}var yc,ya;hc.exports=function(r,e){if(!e&&!qc)return!1;var t=!1;try{var n={};n[dc]=function(){return{next:function(){return{done:t=!0}}}},r(n)}catch(a){}return t}});var da=i(function(zP,Sc){var Eb=Fr(),Ib=gc(),Tb=$r().CONSTRUCTOR;Sc.exports=Tb||!Ib(function(r){Eb.all(r).then(void 0,function(){})})});var bc=i(function(){"use strict";var Pb=C(),wb=A(),Rb=rr(),xb=Ur(),_b=vt(),Cb=pa(),Nb=da();Pb({target:"Promise",stat:!0,forced:Nb},{all:function(e){var t=this,n=xb.f(t),a=n.resolve,o=n.reject,v=_b(function(){var u=Rb(t.resolve),c=[],f=0,y=1;Cb(e,function(S){var m=f++,h=!1;y++,wb(u,t,S).then(function(O){h||(h=!0,c[m]=O,--y||a(c))},o)}),--y||a(c)});return v.error&&o(v.value),n.promise}})});var Oc=i(function(){"use strict";var Ab=C(),jb=z(),Db=$r().CONSTRUCTOR,ha=Fr(),Lb=Y(),Mb=P(),Fb=X(),mc=ha&&ha.prototype;Ab({target:"Promise",proto:!0,forced:Db,real:!0},{catch:function(r){return this.then(void 0,r)}});!jb&&Mb(ha)&&(qa=Lb("Promise").prototype.catch,mc.catch!==qa&&Fb(mc,"catch",qa,{unsafe:!0}));var qa});var Ec=i(function(){"use strict";var $b=C(),Ub=A(),Gb=rr(),Bb=Ur(),kb=vt(),Kb=pa(),Vb=da();$b({target:"Promise",stat:!0,forced:Vb},{race:function(e){var t=this,n=Bb.f(t),a=n.reject,o=kb(function(){var v=Gb(t.resolve);Kb(e,function(u){Ub(v,t,u).then(n.resolve,a)})});return o.error&&a(o.value),n.promise}})});var Ic=i(function(){"use strict";var Yb=C(),Wb=A(),Hb=Ur(),Jb=$r().CONSTRUCTOR;Yb({target:"Promise",stat:!0,forced:Jb},{reject:function(e){var t=Hb.f(this);return Wb(t.reject,void 0,e),t.promise}})});var Pc=i(function(iw,Tc){var zb=F(),Xb=V(),Qb=Ur();Tc.exports=function(r,e){if(zb(r),Xb(e)&&e.constructor===r)return e;var t=Qb.f(r),n=t.resolve;return n(e),t.promise}});var xc=i(function(){"use strict";var Zb=C(),rm=Y(),wc=z(),em=Fr(),Rc=$r().CONSTRUCTOR,tm=Pc(),nm=rm("Promise"),am=wc&&!Rc;Zb({target:"Promise",stat:!0,forced:wc||Rc},{resolve:function(e){return tm(am&&this===nm?em:this,e)}})});var Ac=i(function(vw,Nc){var Cc=ke(),um=gr(),vm=tt(),sm=Array,cm=Math.max;Nc.exports=function(r,e,t){for(var n=um(r),a=Cc(e,n),o=Cc(t===void 0?n:t,n),v=sm(cm(o-a,0)),u=0;aE;E++)if((u||E in h)&&($=h[E],K=O($,E,m),r))if(e)b[E]=K;else if(K)switch(r){case 3:return!0;case 5:return $;case 6:return E;case 2:Vc(b,$)}else switch(r){case 4:return!1;case 7:Vc(b,$)}return o?-1:n||a?a:b}};Yc.exports={forEach:sr(0),map:sr(1),filter:sr(2),some:sr(3),every:sr(4),find:sr(5),findIndex:sr(6),filterReject:sr(7)}});var sf=i(function(){"use strict";var qt=C(),Ra=x(),xa=A(),_m=R(),Cm=z(),Yr=M(),Wr=pr(),Nm=w(),j=D(),Am=_r(),Ea=F(),ht=Z(),_a=ee(),jm=er(),Ia=Rr(),me=Ar(),Jc=qn(),Dm=Ve(),zc=Mc(),Lm=Ye(),Xc=ne(),Qc=B(),Mm=hn(),Zc=Ct(),ba=X(),Fm=le(),Ca=yr(),$m=ae(),rf=ie(),Wc=De(),Um=_(),Gm=ga(),Bm=Se(),km=Kc(),Km=ur(),ef=hr(),gt=Sa().forEach,G=$m("hidden"),St="Symbol",Oe="prototype",Vm=ef.set,Hc=ef.getterFor(St),W=Object[Oe],Er=Ra.Symbol,be=Er&&Er[Oe],Ym=Ra.TypeError,ma=Ra.QObject,tf=Xc.f,Or=Qc.f,nf=zc.f,Wm=Zc.f,af=_m([].push),tr=Ca("symbols"),Ee=Ca("op-symbols"),Hm=Ca("wks"),Ta=!ma||!ma[Oe]||!ma[Oe].findChild,Pa=Yr&&Nm(function(){return me(Or({},"a",{get:function(){return Or(this,"a",{value:7}).a}})).a!=7})?function(r,e,t){var n=tf(W,e);n&&delete W[e],Or(r,e,t),n&&r!==W&&Or(W,e,n)}:Or,Oa=function(r,e){var t=tr[r]=me(be);return Vm(t,{type:St,tag:r,description:e}),Yr||(t.description=e),t},bt=function(e,t,n){e===W&&bt(Ee,t,n),Ea(e);var a=_a(t);return Ea(n),j(tr,a)?(n.enumerable?(j(e,G)&&e[G][a]&&(e[G][a]=!1),n=me(n,{enumerable:Ia(0,!1)})):(j(e,G)||Or(e,G,Ia(1,{})),e[G][a]=!0),Pa(e,a,n)):Or(e,a,n)},Na=function(e,t){Ea(e);var n=ht(t),a=Jc(n).concat(vf(n));return gt(a,function(o){(!Yr||xa(wa,n,o))&&bt(e,o,n[o])}),e},Jm=function(e,t){return t===void 0?me(e):Na(me(e),t)},wa=function(e){var t=_a(e),n=xa(Wm,this,t);return this===W&&j(tr,t)&&!j(Ee,t)?!1:n||!j(this,t)||!j(tr,t)||j(this,G)&&this[G][t]?n:!0},of=function(e,t){var n=ht(e),a=_a(t);if(!(n===W&&j(tr,a)&&!j(Ee,a))){var o=tf(n,a);return o&&j(tr,a)&&!(j(n,G)&&n[G][a])&&(o.enumerable=!0),o}},uf=function(e){var t=nf(ht(e)),n=[];return gt(t,function(a){!j(tr,a)&&!j(rf,a)&&af(n,a)}),n},vf=function(r){var e=r===W,t=nf(e?Ee:ht(r)),n=[];return gt(t,function(a){j(tr,a)&&(!e||j(W,a))&&af(n,tr[a])}),n};Wr||(Er=function(){if(Am(be,this))throw Ym("Symbol is not a constructor");var e=!arguments.length||arguments[0]===void 0?void 0:jm(arguments[0]),t=Wc(e),n=function(a){this===W&&xa(n,Ee,a),j(this,G)&&j(this[G],t)&&(this[G][t]=!1),Pa(this,t,Ia(1,a))};return Yr&&Ta&&Pa(W,t,{configurable:!0,set:n}),Oa(t,e)},be=Er[Oe],ba(be,"toString",function(){return Hc(this).tag}),ba(Er,"withoutSetter",function(r){return Oa(Wc(r),r)}),Zc.f=wa,Qc.f=bt,Mm.f=Na,Xc.f=of,Dm.f=zc.f=uf,Lm.f=vf,Gm.f=function(r){return Oa(Um(r),r)},Yr&&(Fm(be,"description",{configurable:!0,get:function(){return Hc(this).description}}),Cm||ba(W,"propertyIsEnumerable",wa,{unsafe:!0})));qt({global:!0,constructor:!0,wrap:!0,forced:!Wr,sham:!Wr},{Symbol:Er});gt(Jc(Hm),function(r){Bm(r)});qt({target:St,stat:!0,forced:!Wr},{useSetter:function(){Ta=!0},useSimple:function(){Ta=!1}});qt({target:"Object",stat:!0,forced:!Wr,sham:!Yr},{create:Jm,defineProperty:bt,defineProperties:Na,getOwnPropertyDescriptor:of});qt({target:"Object",stat:!0,forced:!Wr},{getOwnPropertyNames:uf});km();Km(Er,St);rf[G]=!0});var Aa=i(function(hw,cf){var zm=pr();cf.exports=zm&&!!Symbol.for&&!!Symbol.keyFor});var lf=i(function(){var Xm=C(),Qm=Y(),Zm=D(),rO=er(),ff=yr(),eO=Aa(),ja=ff("string-to-symbol-registry"),tO=ff("symbol-to-string-registry");Xm({target:"Symbol",stat:!0,forced:!eO},{for:function(r){var e=rO(r);if(Zm(ja,e))return ja[e];var t=Qm("Symbol")(e);return ja[e]=t,tO[t]=e,t}})});var yf=i(function(){var nO=C(),aO=D(),iO=Zr(),oO=Cr(),uO=yr(),vO=Aa(),pf=uO("symbol-to-string-registry");nO({target:"Symbol",stat:!0,forced:!vO},{keyFor:function(e){if(!iO(e))throw TypeError(oO(e)+" is not a symbol");if(aO(pf,e))return pf[e]}})});var Sf=i(function(Ow,gf){var sO=R(),df=Lr(),cO=P(),qf=Q(),fO=er(),hf=sO([].push);gf.exports=function(r){if(cO(r))return r;if(!!df(r)){for(var e=r.length,t=[],n=0;n=e.length?(r.target=void 0,Pt(void 0,!0)):t=="keys"?Pt(n,!1):t=="values"?Pt(e[n],!1):Pt([n,e[n]],!1)},"values");var vl=ul.Arguments=ul.Array;Wa("keys");Wa("values");Wa("entries");if(!bE&&mE&&vl.name!=="values")try{gE(vl,"name",{value:"values"})}catch(r){}});var Ja=i(function(Dw,dl){dl.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 Xa=i(function(Lw,hl){var xE=te(),za=xE("span").classList,ql=za&&za.constructor&&za.constructor.prototype;hl.exports=ql===Object.prototype?void 0:ql});var Tl=i(function(Mw,Il){"use strict";var kE=w();Il.exports=function(r,e){var t=[][r];return!!t&&kE(function(){t.call(null,e||function(){return 1},1)})}});var ei=i(function(Fw,Pl){"use strict";var KE=Sa().forEach,VE=Tl(),YE=VE("forEach");Pl.exports=YE?[].forEach:function(e){return KE(this,e,arguments.length>1?arguments[1]:void 0)}});var $w=pi(Pn());var lh=rt(),av=A(),et=R(),ph=Wu(),yh=w(),dh=F(),qh=P(),hh=xr(),gh=ue(),Sh=un(),Dr=er(),bh=zr(),mh=Qu(),Oh=re(),Eh=rv(),Ih=nv(),Th=_(),Dn=Th("replace"),Ph=Math.max,wh=Math.min,Rh=et([].concat),jn=et([].push),iv=et("".indexOf),ov=et("".slice),xh=function(r){return r===void 0?r:String(r)},_h=function(){return"a".replace(/./,"$0")==="$0"}(),uv=function(){return/./[Dn]?/./[Dn]("a","$0")==="":!1}(),Ch=!yh(function(){var r=/./;return r.exec=function(){var e=[];return e.groups={a:"7"},e},"".replace(r,"$")!=="7"});ph("replace",function(r,e,t){var n=uv?"$":"$0";return[function(o,v){var u=bh(this),c=hh(o)?void 0:Oh(o,Dn);return c?av(c,o,u,v):av(e,Dr(u),o,v)},function(a,o){var v=dh(this),u=Dr(a);if(typeof o=="string"&&iv(o,n)===-1&&iv(o,"$<")===-1){var c=t(e,v,u,o);if(c.done)return c.value}var f=qh(o);f||(o=Dr(o));var y=v.global;if(y){var S=v.unicode;v.lastIndex=0}for(var m=[];;){var h=Ih(v,u);if(h===null||(jn(m,h),!y))break;var O=Dr(h[0]);O===""&&(v.lastIndex=mh(u,Sh(v.lastIndex),S))}for(var I="",E=0,T=0;T=E&&(I+=ov(u,E,$)+wr,E=$+b.length)}return I+ov(u,E)}]},!Ch||!_h||uv);var eg=C(),tg=w(),ng=Lr(),ag=V(),ig=or(),og=gr(),Ev=cv(),Iv=tt(),ug=Mn(),vg=Fn(),sg=_(),cg=Qr(),Tv=sg("isConcatSpreadable"),fg=cg>=51||!tg(function(){var r=[];return r[Tv]=!1,r.concat()[0]!==r}),lg=function(r){if(!ag(r))return!1;var e=r[Tv];return e!==void 0?!!e:ng(r)},pg=!fg||!vg("concat");eg({target:"Array",proto:!0,arity:1,forced:pg},{concat:function(e){var t=ig(this),n=ug(t,0),a=0,o,v,u,c,f;for(o=-1,u=arguments.length;o=t.length?ll(void 0,!0):(a=IE(t,n),e.index+=a.length,ll(a,!1))});var gl=x(),bl=Ja(),_E=Xa(),Re=Ha(),Qa=dr(),ml=_(),Za=ml("iterator"),Sl=ml("toStringTag"),ri=Re.values,Ol=function(r,e){if(r){if(r[Za]!==ri)try{Qa(r,Za,ri)}catch(n){r[Za]=ri}if(r[Sl]||Qa(r,Sl,e),bl[e]){for(var t in Re)if(r[t]!==Re[t])try{Qa(r,t,Re[t])}catch(n){r[t]=Re[t]}}}};for(wt in bl)Ol(gl[wt]&&gl[wt].prototype,wt);var wt;Ol(_E,"DOMTokenList");var CE=Se();CE("asyncIterator");var NE=Y(),AE=Se(),jE=ur();AE("toStringTag");jE(NE("Symbol"),"Symbol");var DE=x(),LE=ur();LE(DE.JSON,"JSON",!0);var ME=ur();ME(Math,"Math",!0);var FE=C(),$E=w(),UE=or(),El=Et(),GE=Fa(),BE=$E(function(){El(1)});FE({target:"Object",stat:!0,forced:BE,sham:!GE},{getPrototypeOf:function(e){return El(UE(e))}});var WE=C(),wl=ei();WE({target:"Array",proto:!0,forced:[].forEach!=wl},{forEach:wl});var Rl=x(),xl=Ja(),HE=Xa(),ti=ei(),JE=dr(),_l=function(r){if(r&&r.forEach!==ti)try{JE(r,"forEach",ti)}catch(e){r.forEach=ti}};for(Rt in xl)xl[Rt]&&_l(Rl[Rt]&&Rl[Rt].prototype);var Rt;_l(HE);var zE=M(),XE=Me().EXISTS,Cl=R(),QE=le(),Nl=Function.prototype,ZE=Cl(Nl.toString),Al=/function\b(?:\s|\/\*[\S\s]*?\*\/|\/\/[^\n\r]*[\n\r]+)*([^\s(/]*)/,rI=Cl(Al.exec),eI="name";zE&&!XE&&QE(Nl,eI,{configurable:!0,get:function(){try{return rI(Al,ZE(this))[1]}catch(r){return""}}});var tI=C(),nI=at();tI({target:"Object",stat:!0},{setPrototypeOf:nI});var aI=C(),iI=R(),oI=Lr(),uI=iI([].reverse),jl=[1,2];aI({target:"Array",proto:!0,forced:String(jl)===String(jl.reverse())},{reverse:function(){return oI(this)&&(this.length=this.length),uI(this)}});var vI=C(),Dl=Lr(),sI=nt(),cI=V(),Ll=ke(),fI=gr(),lI=Z(),pI=tt(),yI=_(),dI=Fn(),qI=it(),hI=dI("slice"),gI=yI("species"),ni=Array,SI=Math.max;vI({target:"Array",proto:!0,forced:!hI},{slice:function(e,t){var n=lI(this),a=fI(n),o=Ll(e,a),v=Ll(t===void 0?a:t,a),u,c,f;if(Dl(n)&&(u=n.constructor,sI(u)&&(u===ni||Dl(u.prototype))?u=void 0:cI(u)&&(u=u[gI],u===null&&(u=void 0)),u===ni||u===void 0))return qI(n,o,v);for(c=new(u===void 0?ni:u)(SI(v-o,0)),f=0;o=0;--g){var q=this.tryEntries[g],N=q.completion;if(q.tryLoc==="root")return d("end");if(q.tryLoc<=this.prev){var L=t.call(q,"catchLoc"),U=t.call(q,"finallyLoc");if(L&&U){if(this.prev=0;--d){var g=this.tryEntries[d];if(g.tryLoc<=this.prev&&t.call(g,"finallyLoc")&&this.prev=0;--l){var d=this.tryEntries[l];if(d.finallyLoc===s)return this.complete(d.completion,d.afterLoc),wr(d),S}},catch:function(s){for(var l=this.tryEntries.length-1;l>=0;--l){var d=this.tryEntries[l];if(d.tryLoc===s){var g=d.completion;if(g.type==="throw"){var q=g.arg;wr(d)}return q}}throw new Error("illegal catch attempt")},delegateYield:function(s,l,d){return this.delegate={iterator:_t(s),resultName:l,nextLoc:d},this.method==="next"&&(this.arg=void 0),S}},r}function Ml(r,e,t,n,a,o,v){try{var u=r[o](v),c=u.value}catch(f){t(f);return}u.done?e(c):Promise.resolve(c).then(n,a)}function ci(r){return function(){var e=this,t=arguments;return new Promise(function(n,a){var o=r.apply(e,t);function v(c){Ml(o,n,a,v,u,"next",c)}function u(c){Ml(o,n,a,v,u,"throw",c)}v(void 0)})}}document.documentElement.classList.add("autoreload-enabled");var bI=window.location.protocol==="https:"?"wss:":"ws:",mI=window.location.pathname.replace(/\/?$/,"/")+"autoreload/",OI="".concat(bI,"//").concat(window.location.host).concat(mI),EI=((ai=document.currentScript)===null||ai===void 0||(ii=ai.dataset)===null||ii===void 0?void 0:ii.wsUrl)||OI;function II(r){return ui.apply(this,arguments)}function ui(){return ui=ci(Tr().mark(function r(e){var t,n;return Tr().wrap(function(o){for(;;)switch(o.prev=o.next){case 0:return t=new WebSocket(e),n=!1,o.abrupt("return",new Promise(function(v,u){t.onopen=function(){n=!0},t.onerror=function(c){u(c)},t.onclose=function(){n?v(!1):u(new Error("WebSocket connection failed"))},t.onmessage=function(c){c.data==="autoreload"&&v(!0)}}));case 3:case"end":return o.stop()}},r)})),ui.apply(this,arguments)}function TI(r){return vi.apply(this,arguments)}function vi(){return vi=ci(Tr().mark(function r(e){return Tr().wrap(function(n){for(;;)switch(n.prev=n.next){case 0:return n.abrupt("return",new Promise(function(a){return setTimeout(a,e)}));case 1:case"end":return n.stop()}},r)})),vi.apply(this,arguments)}function PI(){return si.apply(this,arguments)}function si(){return si=ci(Tr().mark(function r(){return Tr().wrap(function(t){for(;;)switch(t.prev=t.next){case 0:return t.prev=1,t.next=4,II(EI);case 4:if(!t.sent){t.next=7;break}return window.location.reload(),t.abrupt("return");case 7:t.next=13;break;case 9:return t.prev=9,t.t0=t.catch(1),console.debug("Giving up on autoreload"),t.abrupt("return");case 13:return t.next=15,TI(1e3);case 15:t.next=0;break;case 17:case"end":return t.stop()}},r,null,[[1,9]])})),si.apply(this,arguments)}PI().catch(function(r){console.error(r)});})(); +"use strict";(function(){var ip=Object.create;var fa=Object.defineProperty;var np=Object.getOwnPropertyDescriptor;var ap=Object.getOwnPropertyNames;var op=Object.getPrototypeOf,up=Object.prototype.hasOwnProperty;var a=function(r,e){return function(){return e||r((e={exports:{}}).exports,e),e.exports}};var sp=function(r,e,t,i){if(e&&typeof e=="object"||typeof e=="function")for(var n=ap(e),o=0,s=n.length,u;o0&&J[0]<4?1:+(J[0]+J[1]));!De&&kt&&(J=kt.match(/Edge\/(\d+)/),(!J||J[1]>=74)&&(J=kt.match(/Chrome\/(\d+)/),J&&(De=+J[1])));Ba.exports=De});var hr=a(function(cT,ka){"use strict";var Ga=ie(),xp=P(),Rp=T(),_p=Rp.String;ka.exports=!!Object.getOwnPropertySymbols&&!xp(function(){var r=Symbol("symbol detection");return!_p(r)||!(Object(r)instanceof Symbol)||!Symbol.sham&&Ga&&Ga<41})});var Kt=a(function(vT,Ka){"use strict";var Cp=hr();Ka.exports=Cp&&!Symbol.sham&&typeof Symbol.iterator=="symbol"});var ne=a(function(lT,Va){"use strict";var Np=V(),jp=R(),Ap=_r(),Dp=Kt(),Lp=Object;Va.exports=Dp?function(r){return typeof r=="symbol"}:function(r){var e=Np("Symbol");return jp(e)&&Ap(e.prototype,Lp(r))}});var Cr=a(function(fT,Ya){"use strict";var Fp=String;Ya.exports=function(r){try{return Fp(r)}catch(e){return"Object"}}});var tr=a(function(pT,Wa){"use strict";var Mp=R(),$p=Cr(),Up=TypeError;Wa.exports=function(r){if(Mp(r))return r;throw new Up($p(r)+" is not a function")}});var ae=a(function(yT,Ha){"use strict";var Bp=tr(),Gp=Rr();Ha.exports=function(r,e){var t=r[e];return Gp(t)?void 0:Bp(t)}});var za=a(function(dT,Ja){"use strict";var Vt=D(),Yt=R(),Wt=k(),kp=TypeError;Ja.exports=function(r,e){var t,i;if(e==="string"&&Yt(t=r.toString)&&!Wt(i=Vt(t,r))||Yt(t=r.valueOf)&&!Wt(i=Vt(t,r))||e!=="string"&&Yt(t=r.toString)&&!Wt(i=Vt(t,r)))return i;throw new kp("Can't convert object to primitive value")}});var Q=a(function(qT,Xa){"use strict";Xa.exports=!1});var Le=a(function(hT,Za){"use strict";var Qa=T(),Kp=Object.defineProperty;Za.exports=function(r,e){try{Kp(Qa,r,{value:e,configurable:!0,writable:!0})}catch(t){Qa[r]=e}return e}});var Fe=a(function(gT,to){"use strict";var Vp=Q(),Yp=T(),Wp=Le(),ro="__core-js_shared__",eo=to.exports=Yp[ro]||Wp(ro,{});(eo.versions||(eo.versions=[])).push({version:"3.36.0",mode:Vp?"pure":"global",copyright:"\xA9 2014-2024 Denis Pushkarev (zloirock.ru)",license:"https://github.com/zloirock/core-js/blob/v3.36.0/LICENSE",source:"https://github.com/zloirock/core-js"})});var gr=a(function(ST,no){"use strict";var io=Fe();no.exports=function(r,e){return io[r]||(io[r]=e||{})}});var vr=a(function(bT,ao){"use strict";var Hp=ee(),Jp=Object;ao.exports=function(r){return Jp(Hp(r))}});var M=a(function(mT,oo){"use strict";var zp=x(),Xp=vr(),Qp=zp({}.hasOwnProperty);oo.exports=Object.hasOwn||function(e,t){return Qp(Xp(e),t)}});var Me=a(function(OT,uo){"use strict";var Zp=x(),ry=0,ey=Math.random(),ty=Zp(1 .toString);uo.exports=function(r){return"Symbol("+(r===void 0?"":r)+")_"+ty(++ry+ey,36)}});var _=a(function(ET,co){"use strict";var iy=T(),ny=gr(),so=M(),ay=Me(),oy=hr(),uy=Kt(),Nr=iy.Symbol,Ht=ny("wks"),sy=uy?Nr.for||Nr:Nr&&Nr.withoutSetter||ay;co.exports=function(r){return so(Ht,r)||(Ht[r]=oy&&so(Nr,r)?Nr[r]:sy("Symbol."+r)),Ht[r]}});var po=a(function(IT,fo){"use strict";var cy=D(),vo=k(),lo=ne(),vy=ae(),ly=za(),fy=_(),py=TypeError,yy=fy("toPrimitive");fo.exports=function(r,e){if(!vo(r)||lo(r))return r;var t=vy(r,yy),i;if(t){if(e===void 0&&(e="default"),i=cy(t,r,e),!vo(i)||lo(i))return i;throw new py("Can't convert object to primitive value")}return e===void 0&&(e="number"),ly(r,e)}});var $e=a(function(TT,yo){"use strict";var dy=po(),qy=ne();yo.exports=function(r){var e=dy(r,"string");return qy(e)?e:e+""}});var oe=a(function(wT,ho){"use strict";var hy=T(),qo=k(),Jt=hy.document,gy=qo(Jt)&&qo(Jt.createElement);ho.exports=function(r){return gy?Jt.createElement(r):{}}});var zt=a(function(PT,go){"use strict";var Sy=F(),by=P(),my=oe();go.exports=!Sy&&!by(function(){return Object.defineProperty(my("div"),"a",{get:function(){return 7}}).a!==7})});var Ue=a(function(bo){"use strict";var Oy=F(),Ey=D(),Iy=Ft(),Ty=xr(),wy=er(),Py=$e(),xy=M(),Ry=zt(),So=Object.getOwnPropertyDescriptor;bo.f=Oy?So:function(e,t){if(e=wy(e),t=Py(t),Ry)try{return So(e,t)}catch(i){}if(xy(e,t))return Ty(!Ey(Iy.f,e,t),e[t])}});var Xt=a(function(RT,mo){"use strict";var _y=F(),Cy=P();mo.exports=_y&&Cy(function(){return Object.defineProperty(function(){},"prototype",{value:42,writable:!1}).prototype!==42})});var U=a(function(_T,Oo){"use strict";var Ny=k(),jy=String,Ay=TypeError;Oo.exports=function(r){if(Ny(r))return r;throw new Ay(jy(r)+" is not an object")}});var Y=a(function(Io){"use strict";var Dy=F(),Ly=zt(),Fy=Xt(),Be=U(),Eo=$e(),My=TypeError,Qt=Object.defineProperty,$y=Object.getOwnPropertyDescriptor,Zt="enumerable",ri="configurable",ei="writable";Io.f=Dy?Fy?function(e,t,i){if(Be(e),t=Eo(t),Be(i),typeof e=="function"&&t==="prototype"&&"value"in i&&ei in i&&!i[ei]){var n=$y(e,t);n&&n[ei]&&(e[t]=i.value,i={configurable:ri in i?i[ri]:n[ri],enumerable:Zt in i?i[Zt]:n[Zt],writable:!1})}return Qt(e,t,i)}:Qt:function(e,t,i){if(Be(e),t=Eo(t),Be(i),Ly)try{return Qt(e,t,i)}catch(n){}if("get"in i||"set"in i)throw new My("Accessors not supported");return"value"in i&&(e[t]=i.value),e}});var Sr=a(function(NT,To){"use strict";var Uy=F(),By=Y(),Gy=xr();To.exports=Uy?function(r,e,t){return By.f(r,e,Gy(1,t))}:function(r,e,t){return r[e]=t,r}});var Ge=a(function(jT,Po){"use strict";var ti=F(),ky=M(),wo=Function.prototype,Ky=ti&&Object.getOwnPropertyDescriptor,ii=ky(wo,"name"),Vy=ii&&function(){}.name==="something",Yy=ii&&(!ti||ti&&Ky(wo,"name").configurable);Po.exports={EXISTS:ii,PROPER:Vy,CONFIGURABLE:Yy}});var ke=a(function(AT,xo){"use strict";var Wy=x(),Hy=R(),ni=Fe(),Jy=Wy(Function.toString);Hy(ni.inspectSource)||(ni.inspectSource=function(r){return Jy(r)});xo.exports=ni.inspectSource});var Co=a(function(DT,_o){"use strict";var zy=T(),Xy=R(),Ro=zy.WeakMap;_o.exports=Xy(Ro)&&/native code/.test(String(Ro))});var ue=a(function(LT,jo){"use strict";var Qy=gr(),Zy=Me(),No=Qy("keys");jo.exports=function(r){return No[r]||(No[r]=Zy(r))}});var se=a(function(FT,Ao){"use strict";Ao.exports={}});var mr=a(function(MT,Fo){"use strict";var rd=Co(),Lo=T(),ed=k(),td=Sr(),ai=M(),oi=Fe(),id=ue(),nd=se(),Do="Object already initialized",ui=Lo.TypeError,ad=Lo.WeakMap,Ke,ce,Ve,od=function(r){return Ve(r)?ce(r):Ke(r,{})},ud=function(r){return function(e){var t;if(!ed(e)||(t=ce(e)).type!==r)throw new ui("Incompatible receiver, "+r+" required");return t}};rd||oi.state?(z=oi.state||(oi.state=new ad),z.get=z.get,z.has=z.has,z.set=z.set,Ke=function(r,e){if(z.has(r))throw new ui(Do);return e.facade=r,z.set(r,e),e},ce=function(r){return z.get(r)||{}},Ve=function(r){return z.has(r)}):(br=id("state"),nd[br]=!0,Ke=function(r,e){if(ai(r,br))throw new ui(Do);return e.facade=r,td(r,br,e),e},ce=function(r){return ai(r,br)?r[br]:{}},Ve=function(r){return ai(r,br)});var z,br;Fo.exports={set:Ke,get:ce,has:Ve,enforce:od,getterFor:ud}});var vi=a(function($T,Uo){"use strict";var ci=x(),sd=P(),cd=R(),Ye=M(),si=F(),vd=Ge().CONFIGURABLE,ld=ke(),$o=mr(),fd=$o.enforce,pd=$o.get,Mo=String,We=Object.defineProperty,yd=ci("".slice),dd=ci("".replace),qd=ci([].join),hd=si&&!sd(function(){return We(function(){},"length",{value:8}).length!==8}),gd=String(String).split("String"),Sd=Uo.exports=function(r,e,t){yd(Mo(e),0,7)==="Symbol("&&(e="["+dd(Mo(e),/^Symbol\(([^)]*)\).*$/,"$1")+"]"),t&&t.getter&&(e="get "+e),t&&t.setter&&(e="set "+e),(!Ye(r,"name")||vd&&r.name!==e)&&(si?We(r,"name",{value:e,configurable:!0}):r.name=e),hd&&t&&Ye(t,"arity")&&r.length!==t.arity&&We(r,"length",{value:t.arity});try{t&&Ye(t,"constructor")&&t.constructor?si&&We(r,"prototype",{writable:!1}):r.prototype&&(r.prototype=void 0)}catch(n){}var i=fd(r);return Ye(i,"source")||(i.source=qd(gd,typeof e=="string"?e:"")),r};Function.prototype.toString=Sd(function(){return cd(this)&&pd(this).source||ld(this)},"toString")});var Z=a(function(UT,Bo){"use strict";var bd=R(),md=Y(),Od=vi(),Ed=Le();Bo.exports=function(r,e,t,i){i||(i={});var n=i.enumerable,o=i.name!==void 0?i.name:e;if(bd(t)&&Od(t,o,i),i.global)n?r[e]=t:Ed(e,t);else{try{i.unsafe?r[e]&&(n=!0):delete r[e]}catch(s){}n?r[e]=t:md.f(r,e,{value:t,enumerable:!1,configurable:!i.nonConfigurable,writable:!i.nonWritable})}return r}});var ko=a(function(BT,Go){"use strict";var Id=Math.ceil,Td=Math.floor;Go.exports=Math.trunc||function(e){var t=+e;return(t>0?Td:Id)(t)}});var ve=a(function(GT,Ko){"use strict";var wd=ko();Ko.exports=function(r){var e=+r;return e!==e||e===0?0:wd(e)}});var li=a(function(kT,Vo){"use strict";var Pd=ve(),xd=Math.max,Rd=Math.min;Vo.exports=function(r,e){var t=Pd(r);return t<0?xd(t+e,0):Rd(t,e)}});var fi=a(function(KT,Yo){"use strict";var _d=ve(),Cd=Math.min;Yo.exports=function(r){var e=_d(r);return e>0?Cd(e,9007199254740991):0}});var jr=a(function(VT,Wo){"use strict";var Nd=fi();Wo.exports=function(r){return Nd(r.length)}});var zo=a(function(YT,Jo){"use strict";var jd=er(),Ad=li(),Dd=jr(),Ho=function(r){return function(e,t,i){var n=jd(e),o=Dd(n);if(o===0)return!r&&-1;var s=Ad(i,o),u;if(r&&t!==t){for(;o>s;)if(u=n[s++],u!==u)return!0}else for(;o>s;s++)if((r||s in n)&&n[s]===t)return r||s||0;return!r&&-1}};Jo.exports={includes:Ho(!0),indexOf:Ho(!1)}});var yi=a(function(WT,Qo){"use strict";var Ld=x(),pi=M(),Fd=er(),Md=zo().indexOf,$d=se(),Xo=Ld([].push);Qo.exports=function(r,e){var t=Fd(r),i=0,n=[],o;for(o in t)!pi($d,o)&&pi(t,o)&&Xo(n,o);for(;e.length>i;)pi(t,o=e[i++])&&(~Md(n,o)||Xo(n,o));return n}});var He=a(function(HT,Zo){"use strict";Zo.exports=["constructor","hasOwnProperty","isPrototypeOf","propertyIsEnumerable","toLocaleString","toString","valueOf"]});var Je=a(function(ru){"use strict";var Ud=yi(),Bd=He(),Gd=Bd.concat("length","prototype");ru.f=Object.getOwnPropertyNames||function(e){return Ud(e,Gd)}});var ze=a(function(eu){"use strict";eu.f=Object.getOwnPropertySymbols});var iu=a(function(XT,tu){"use strict";var kd=V(),Kd=x(),Vd=Je(),Yd=ze(),Wd=U(),Hd=Kd([].concat);tu.exports=kd("Reflect","ownKeys")||function(e){var t=Vd.f(Wd(e)),i=Yd.f;return i?Hd(t,i(e)):t}});var di=a(function(QT,au){"use strict";var nu=M(),Jd=iu(),zd=Ue(),Xd=Y();au.exports=function(r,e,t){for(var i=Jd(e),n=Xd.f,o=zd.f,s=0;ss;)wq.f(e,u=n[s++],i[u]);return e}});var Si=a(function(ow,yu){"use strict";var _q=V();yu.exports=_q("document","documentElement")});var Ar=a(function(uw,mu){"use strict";var Cq=U(),Nq=gi(),du=He(),jq=se(),Aq=Si(),Dq=oe(),Lq=ue(),qu=">",hu="<",mi="prototype",Oi="script",Su=Lq("IE_PROTO"),bi=function(){},bu=function(r){return hu+Oi+qu+r+hu+"/"+Oi+qu},gu=function(r){r.write(bu("")),r.close();var e=r.parentWindow.Object;return r=null,e},Fq=function(){var r=Dq("iframe"),e="java"+Oi+":",t;return r.style.display="none",Aq.appendChild(r),r.src=String(e),t=r.contentWindow.document,t.open(),t.write(bu("document.F=Object")),t.close(),t.F},rt,et=function(){try{rt=new ActiveXObject("htmlfile")}catch(e){}et=typeof document!="undefined"?document.domain&&rt?gu(rt):Fq():gu(rt);for(var r=du.length;r--;)delete et[mi][du[r]];return et()};jq[Su]=!0;mu.exports=Object.create||function(e,t){var i;return e!==null?(bi[mi]=Cq(e),i=new bi,bi[mi]=null,i[Su]=e):i=et(),t===void 0?i:Nq.f(i,t)}});var pe=a(function(sw,Ou){"use strict";var Mq=x();Ou.exports=Mq([].slice)});var wu=a(function(cw,Tu){"use strict";var $q=rr(),Uq=er(),Eu=Je().f,Bq=pe(),Iu=typeof window=="object"&&window&&Object.getOwnPropertyNames?Object.getOwnPropertyNames(window):[],Gq=function(r){try{return Eu(r)}catch(e){return Bq(Iu)}};Tu.exports.f=function(e){return Iu&&$q(e)==="Window"?Gq(e):Eu(Uq(e))}});var ye=a(function(vw,xu){"use strict";var Pu=vi(),kq=Y();xu.exports=function(r,e,t){return t.get&&Pu(t.get,e,{getter:!0}),t.set&&Pu(t.set,e,{setter:!0}),kq.f(r,e,t)}});var Ei=a(function(Ru){"use strict";var Kq=_();Ru.f=Kq});var Cu=a(function(fw,_u){"use strict";var Vq=T();_u.exports=Vq});var de=a(function(pw,ju){"use strict";var Nu=Cu(),Yq=M(),Wq=Ei(),Hq=Y().f;ju.exports=function(r){var e=Nu.Symbol||(Nu.Symbol={});Yq(e,r)||Hq(e,r,{value:Wq.f(r)})}});var Du=a(function(yw,Au){"use strict";var Jq=D(),zq=V(),Xq=_(),Qq=Z();Au.exports=function(){var r=zq("Symbol"),e=r&&r.prototype,t=e&&e.valueOf,i=Xq("toPrimitive");e&&!e[i]&&Qq(e,i,function(n){return Jq(t,this)},{arity:1})}});var nr=a(function(dw,Fu){"use strict";var Zq=Y().f,rh=M(),eh=_(),Lu=eh("toStringTag");Fu.exports=function(r,e,t){r&&!t&&(r=r.prototype),r&&!rh(r,Lu)&&Zq(r,Lu,{configurable:!0,value:e})}});var $u=a(function(qw,Mu){"use strict";var th=rr(),ih=x();Mu.exports=function(r){if(th(r)==="Function")return ih(r)}});var qe=a(function(hw,Bu){"use strict";var Uu=$u(),nh=tr(),ah=re(),oh=Uu(Uu.bind);Bu.exports=function(r,e){return nh(r),e===void 0?r:ah?oh(r,e):function(){return r.apply(e,arguments)}}});var Dr=a(function(gw,Gu){"use strict";var uh=rr();Gu.exports=Array.isArray||function(e){return uh(e)==="Array"}});var tt=a(function(Sw,Wu){"use strict";var sh=x(),ch=P(),ku=R(),vh=fe(),lh=V(),fh=ke(),Ku=function(){},Vu=lh("Reflect","construct"),Ii=/^\s*(?:class|function)\b/,ph=sh(Ii.exec),yh=!Ii.test(Ku),he=function(e){if(!ku(e))return!1;try{return Vu(Ku,[],e),!0}catch(t){return!1}},Yu=function(e){if(!ku(e))return!1;switch(vh(e)){case"AsyncFunction":case"GeneratorFunction":case"AsyncGeneratorFunction":return!1}try{return yh||!!ph(Ii,fh(e))}catch(t){return!0}};Yu.sham=!0;Wu.exports=!Vu||ch(function(){var r;return he(he.call)||!he(Object)||!he(function(){r=!0})||r})?Yu:he});var Xu=a(function(bw,zu){"use strict";var Hu=Dr(),dh=tt(),qh=k(),hh=_(),gh=hh("species"),Ju=Array;zu.exports=function(r){var e;return Hu(r)&&(e=r.constructor,dh(e)&&(e===Ju||Hu(e.prototype))?e=void 0:qh(e)&&(e=e[gh],e===null&&(e=void 0))),e===void 0?Ju:e}});var Ti=a(function(mw,Qu){"use strict";var Sh=Xu();Qu.exports=function(r,e){return new(Sh(r))(e===0?0:e)}});var wi=a(function(Ow,rs){"use strict";var bh=qe(),mh=x(),Oh=Ut(),Eh=vr(),Ih=jr(),Th=Ti(),Zu=mh([].push),lr=function(r){var e=r===1,t=r===2,i=r===3,n=r===4,o=r===6,s=r===7,u=r===5||o;return function(f,v,y,b){for(var m=Eh(f),h=Oh(m),E=Ih(h),w=bh(v,y),S=0,I=b||Th,O=e?I(f,E):t||s?I(f,0):void 0,A,H;E>S;S++)if((u||S in h)&&(A=h[S],H=w(A,S,m),r))if(e)O[S]=H;else if(H)switch(r){case 3:return!0;case 5:return A;case 6:return S;case 2:Zu(O,A)}else switch(r){case 4:return!1;case 7:Zu(O,A)}return o?-1:i||n?n:O}};rs.exports={forEach:lr(0),map:lr(1),filter:lr(2),some:lr(3),every:lr(4),find:lr(5),findIndex:lr(6),filterReject:lr(7)}});var hs=a(function(){"use strict";var it=j(),be=T(),Di=D(),wh=x(),Ph=Q(),Lr=F(),Fr=hr(),xh=P(),L=M(),Rh=_r(),_i=U(),nt=er(),Li=$e(),_h=ir(),Ci=xr(),Mr=Ar(),is=hi(),Ch=Je(),ns=wu(),Nh=ze(),as=Ue(),os=Y(),jh=gi(),us=Ft(),Pi=Z(),Ah=ye(),Fi=gr(),Dh=ue(),ss=se(),es=Me(),Lh=_(),Fh=Ei(),Mh=de(),$h=Du(),Uh=nr(),cs=mr(),at=wi().forEach,G=Dh("hidden"),ot="Symbol",Se="prototype",Bh=cs.set,ts=cs.getterFor(ot),W=Object[Se],Or=be.Symbol,ge=Or&&Or[Se],Gh=be.RangeError,kh=be.TypeError,xi=be.QObject,vs=as.f,Er=os.f,ls=ns.f,Kh=us.f,fs=wh([].push),ar=Fi("symbols"),me=Fi("op-symbols"),Vh=Fi("wks"),Ni=!xi||!xi[Se]||!xi[Se].findChild,ps=function(r,e,t){var i=vs(W,e);i&&delete W[e],Er(r,e,t),i&&r!==W&&Er(W,e,i)},ji=Lr&&xh(function(){return Mr(Er({},"a",{get:function(){return Er(this,"a",{value:7}).a}})).a!==7})?ps:Er,Ri=function(r,e){var t=ar[r]=Mr(ge);return Bh(t,{type:ot,tag:r,description:e}),Lr||(t.description=e),t},ut=function(e,t,i){e===W&&ut(me,t,i),_i(e);var n=Li(t);return _i(i),L(ar,n)?(i.enumerable?(L(e,G)&&e[G][n]&&(e[G][n]=!1),i=Mr(i,{enumerable:Ci(0,!1)})):(L(e,G)||Er(e,G,Ci(1,Mr(null))),e[G][n]=!0),ji(e,n,i)):Er(e,n,i)},Mi=function(e,t){_i(e);var i=nt(t),n=is(i).concat(qs(i));return at(n,function(o){(!Lr||Di(Ai,i,o))&&ut(e,o,i[o])}),e},Yh=function(e,t){return t===void 0?Mr(e):Mi(Mr(e),t)},Ai=function(e){var t=Li(e),i=Di(Kh,this,t);return this===W&&L(ar,t)&&!L(me,t)?!1:i||!L(this,t)||!L(ar,t)||L(this,G)&&this[G][t]?i:!0},ys=function(e,t){var i=nt(e),n=Li(t);if(!(i===W&&L(ar,n)&&!L(me,n))){var o=vs(i,n);return o&&L(ar,n)&&!(L(i,G)&&i[G][n])&&(o.enumerable=!0),o}},ds=function(e){var t=ls(nt(e)),i=[];return at(t,function(n){!L(ar,n)&&!L(ss,n)&&fs(i,n)}),i},qs=function(r){var e=r===W,t=ls(e?me:nt(r)),i=[];return at(t,function(n){L(ar,n)&&(!e||L(W,n))&&fs(i,ar[n])}),i};Fr||(Or=function(){if(Rh(ge,this))throw new kh("Symbol is not a constructor");var e=!arguments.length||arguments[0]===void 0?void 0:_h(arguments[0]),t=es(e),i=function(n){var o=this===void 0?be:this;o===W&&Di(i,me,n),L(o,G)&&L(o[G],t)&&(o[G][t]=!1);var s=Ci(1,n);try{ji(o,t,s)}catch(u){if(!(u instanceof Gh))throw u;ps(o,t,s)}};return Lr&&Ni&&ji(W,t,{configurable:!0,set:i}),Ri(t,e)},ge=Or[Se],Pi(ge,"toString",function(){return ts(this).tag}),Pi(Or,"withoutSetter",function(r){return Ri(es(r),r)}),us.f=Ai,os.f=ut,jh.f=Mi,as.f=ys,Ch.f=ns.f=ds,Nh.f=qs,Fh.f=function(r){return Ri(Lh(r),r)},Lr&&(Ah(ge,"description",{configurable:!0,get:function(){return ts(this).description}}),Ph||Pi(W,"propertyIsEnumerable",Ai,{unsafe:!0})));it({global:!0,constructor:!0,wrap:!0,forced:!Fr,sham:!Fr},{Symbol:Or});at(is(Vh),function(r){Mh(r)});it({target:ot,stat:!0,forced:!Fr},{useSetter:function(){Ni=!0},useSimple:function(){Ni=!1}});it({target:"Object",stat:!0,forced:!Fr,sham:!Lr},{create:Yh,defineProperty:ut,defineProperties:Mi,getOwnPropertyDescriptor:ys});it({target:"Object",stat:!0,forced:!Fr},{getOwnPropertyNames:ds});$h();Uh(Or,ot);ss[G]=!0});var $i=a(function(Tw,gs){"use strict";var Wh=hr();gs.exports=Wh&&!!Symbol.for&&!!Symbol.keyFor});var bs=a(function(){"use strict";var Hh=j(),Jh=V(),zh=M(),Xh=ir(),Ss=gr(),Qh=$i(),Ui=Ss("string-to-symbol-registry"),Zh=Ss("symbol-to-string-registry");Hh({target:"Symbol",stat:!0,forced:!Qh},{for:function(r){var e=Xh(r);if(zh(Ui,e))return Ui[e];var t=Jh("Symbol")(e);return Ui[e]=t,Zh[t]=e,t}})});var Os=a(function(){"use strict";var rg=j(),eg=M(),tg=ne(),ig=Cr(),ng=gr(),ag=$i(),ms=ng("symbol-to-string-registry");rg({target:"Symbol",stat:!0,forced:!ag},{keyFor:function(e){if(!tg(e))throw new TypeError(ig(e)+" is not a symbol");if(eg(ms,e))return ms[e]}})});var st=a(function(_w,ws){"use strict";var og=re(),Ts=Function.prototype,Es=Ts.apply,Is=Ts.call;ws.exports=typeof Reflect=="object"&&Reflect.apply||(og?Is.bind(Es):function(){return Is.apply(Es,arguments)})});var Cs=a(function(Cw,_s){"use strict";var ug=x(),Ps=Dr(),sg=R(),xs=rr(),cg=ir(),Rs=ug([].push);_s.exports=function(r){if(sg(r))return r;if(!!Ps(r)){for(var e=r.length,t=[],i=0;iBg)throw Ug("Maximum allowed index exceeded");return r}});var Gi=a(function(Ww,ac){"use strict";var Gg=F(),kg=Y(),Kg=xr();ac.exports=function(r,e,t){Gg?kg.f(r,e,Kg(0,t)):r[e]=t}});var ki=a(function(Hw,oc){"use strict";var Vg=P(),Yg=_(),Wg=ie(),Hg=Yg("species");oc.exports=function(r){return Wg>=51||!Vg(function(){var e=[],t=e.constructor={};return t[Hg]=function(){return{foo:1}},e[r](Boolean).foo!==1})}});var vc=a(function(){"use strict";var Jg=j(),zg=P(),Xg=Dr(),Qg=k(),Zg=vr(),rS=jr(),uc=nc(),sc=Gi(),eS=Ti(),tS=ki(),iS=_(),nS=ie(),cc=iS("isConcatSpreadable"),aS=nS>=51||!zg(function(){var r=[];return r[cc]=!1,r.concat()[0]!==r}),oS=function(r){if(!Qg(r))return!1;var e=r[cc];return e!==void 0?!!e:Xg(r)},uS=!aS||!tS("concat");Jg({target:"Array",proto:!0,arity:1,forced:uS},{concat:function(e){var t=Zg(this),i=eS(t,0),n=0,o,s,u,f,v;for(o=-1,u=arguments.length;o1?arguments[1]:void 0)}});var dc=a(function(){"use strict";var fS=j(),yc=Ki();fS({target:"Array",proto:!0,forced:[].forEach!==yc},{forEach:yc})});var hc=a(function(eP,qc){"use strict";var pS=_(),yS=Ar(),dS=Y().f,Vi=pS("unscopables"),Yi=Array.prototype;Yi[Vi]===void 0&&dS(Yi,Vi,{configurable:!0,value:yS(null)});qc.exports=function(r){Yi[Vi][r]=!0}});var $r=a(function(tP,gc){"use strict";gc.exports={}});var Wi=a(function(iP,Sc){"use strict";var qS=P();Sc.exports=!qS(function(){function r(){}return r.prototype.constructor=null,Object.getPrototypeOf(new r)!==r.prototype})});var lt=a(function(nP,mc){"use strict";var hS=M(),gS=R(),SS=vr(),bS=ue(),mS=Wi(),bc=bS("IE_PROTO"),Hi=Object,OS=Hi.prototype;mc.exports=mS?Hi.getPrototypeOf:function(r){var e=SS(r);if(hS(e,bc))return e[bc];var t=e.constructor;return gS(t)&&e instanceof t?t.prototype:e instanceof Hi?OS:null}});var Qi=a(function(aP,Ic){"use strict";var ES=P(),IS=R(),TS=k(),wS=Ar(),Oc=lt(),PS=Z(),xS=_(),RS=Q(),Xi=xS("iterator"),Ec=!1,ur,Ji,zi;[].keys&&(zi=[].keys(),"next"in zi?(Ji=Oc(Oc(zi)),Ji!==Object.prototype&&(ur=Ji)):Ec=!0);var _S=!TS(ur)||ES(function(){var r={};return ur[Xi].call(r)!==r});_S?ur={}:RS&&(ur=wS(ur));IS(ur[Xi])||PS(ur,Xi,function(){return this});Ic.exports={IteratorPrototype:ur,BUGGY_SAFARI_ITERATORS:Ec}});var wc=a(function(oP,Tc){"use strict";var CS=Qi().IteratorPrototype,NS=Ar(),jS=xr(),AS=nr(),DS=$r(),LS=function(){return this};Tc.exports=function(r,e,t,i){var n=e+" Iterator";return r.prototype=NS(CS,{next:jS(+!i,t)}),AS(r,n,!1,!0),DS[n]=LS,r}});var xc=a(function(uP,Pc){"use strict";var FS=x(),MS=tr();Pc.exports=function(r,e,t){try{return FS(MS(Object.getOwnPropertyDescriptor(r,e)[t]))}catch(i){}}});var _c=a(function(sP,Rc){"use strict";var $S=k();Rc.exports=function(r){return $S(r)||r===null}});var Nc=a(function(cP,Cc){"use strict";var US=_c(),BS=String,GS=TypeError;Cc.exports=function(r){if(US(r))return r;throw new GS("Can't set "+BS(r)+" as a prototype")}});var ft=a(function(vP,jc){"use strict";var kS=xc(),KS=U(),VS=Nc();jc.exports=Object.setPrototypeOf||("__proto__"in{}?function(){var r=!1,e={},t;try{t=kS(Object.prototype,"__proto__","set"),t(e,[]),r=e instanceof Array}catch(i){}return function(n,o){return KS(n),VS(o),r?t(n,o):n.__proto__=o,n}}():void 0)});var rn=a(function(lP,kc){"use strict";var YS=j(),WS=D(),pt=Q(),Bc=Ge(),HS=R(),JS=wc(),Ac=lt(),Dc=ft(),zS=nr(),XS=Sr(),Zi=Z(),QS=_(),Lc=$r(),Gc=Qi(),ZS=Bc.PROPER,rb=Bc.CONFIGURABLE,Fc=Gc.IteratorPrototype,yt=Gc.BUGGY_SAFARI_ITERATORS,Ie=QS("iterator"),Mc="keys",Te="values",$c="entries",Uc=function(){return this};kc.exports=function(r,e,t,i,n,o,s){JS(t,e,i);var u=function(I){if(I===n&&m)return m;if(!yt&&I&&I in y)return y[I];switch(I){case Mc:return function(){return new t(this,I)};case Te:return function(){return new t(this,I)};case $c:return function(){return new t(this,I)}}return function(){return new t(this)}},f=e+" Iterator",v=!1,y=r.prototype,b=y[Ie]||y["@@iterator"]||n&&y[n],m=!yt&&b||u(n),h=e==="Array"&&y.entries||b,E,w,S;if(h&&(E=Ac(h.call(new r)),E!==Object.prototype&&E.next&&(!pt&&Ac(E)!==Fc&&(Dc?Dc(E,Fc):HS(E[Ie])||Zi(E,Ie,Uc)),zS(E,f,!0,!0),pt&&(Lc[f]=Uc))),ZS&&n===Te&&b&&b.name!==Te&&(!pt&&rb?XS(y,"name",Te):(v=!0,m=function(){return WS(b,this)})),n)if(w={values:u(Te),keys:o?m:u(Mc),entries:u($c)},s)for(S in w)(yt||v||!(S in y))&&Zi(y,S,w[S]);else YS({target:e,proto:!0,forced:yt||v},w);return(!pt||s)&&y[Ie]!==m&&Zi(y,Ie,m,{name:n}),Lc[e]=m,w}});var en=a(function(fP,Kc){"use strict";Kc.exports=function(r,e){return{value:r,done:e}}});var nn=a(function(pP,Jc){"use strict";var eb=er(),tn=hc(),Vc=$r(),Wc=mr(),tb=Y().f,ib=rn(),dt=en(),nb=Q(),ab=F(),Hc="Array Iterator",ob=Wc.set,ub=Wc.getterFor(Hc);Jc.exports=ib(Array,"Array",function(r,e){ob(this,{type:Hc,target:eb(r),index:0,kind:e})},function(){var r=ub(this),e=r.target,t=r.index++;if(!e||t>=e.length)return r.target=void 0,dt(void 0,!0);switch(r.kind){case"keys":return dt(t,!1);case"values":return dt(e[t],!1)}return dt([t,e[t]],!1)},"values");var Yc=Vc.Arguments=Vc.Array;tn("keys");tn("values");tn("entries");if(!nb&&ab&&Yc.name!=="values")try{tb(Yc,"name",{value:"values"})}catch(r){}});var Xc=a(function(){"use strict";var sb=j(),cb=x(),vb=Dr(),lb=cb([].reverse),zc=[1,2];sb({target:"Array",proto:!0,forced:String(zc)===String(zc.reverse())},{reverse:function(){return vb(this)&&(this.length=this.length),lb(this)}})});var rv=a(function(){"use strict";var fb=j(),Qc=Dr(),pb=tt(),yb=k(),Zc=li(),db=jr(),qb=er(),hb=Gi(),gb=_(),Sb=ki(),bb=pe(),mb=Sb("slice"),Ob=gb("species"),an=Array,Eb=Math.max;fb({target:"Array",proto:!0,forced:!mb},{slice:function(e,t){var i=qb(this),n=db(i),o=Zc(e,n),s=Zc(t===void 0?n:t,n),u,f,v;if(Qc(i)&&(u=i.constructor,pb(u)&&(u===an||Qc(u.prototype))?u=void 0:yb(u)&&(u=u[Ob],u===null&&(u=void 0)),u===an||u===void 0))return bb(i,o,s);for(f=new(u===void 0?an:u)(Eb(s-o,0)),v=0;ob;b++)if(h=I(r[b]),h&&Ml(Ul,h))return h;return new Tt(!1)}v=NO(r,y)}for(E=o?r.next:v.next;!(w=PO(E,v)).done;){try{h=I(w.value)}catch(O){$l(v,"throw",O)}if(typeof h=="object"&&h&&Ml(Ul,h))return h}return new Tt(!1)}});var Yl=a(function(nx,Vl){"use strict";var DO=_(),kl=DO("iterator"),Kl=!1;try{Gl=0,Dn={next:function(){return{done:!!Gl++}},return:function(){Kl=!0}},Dn[kl]=function(){return this},Array.from(Dn,function(){throw 2})}catch(r){}var Gl,Dn;Vl.exports=function(r,e){try{if(!e&&!Kl)return!1}catch(n){return!1}var t=!1;try{var i={};i[kl]=function(){return{next:function(){return{done:t=!0}}}},r(i)}catch(n){}return t}});var Ln=a(function(ax,Wl){"use strict";var LO=Gr(),FO=Yl(),MO=kr().CONSTRUCTOR;Wl.exports=MO||!FO(function(r){LO.all(r).then(void 0,function(){})})});var Hl=a(function(){"use strict";var $O=j(),UO=D(),BO=tr(),GO=Kr(),kO=gt(),KO=An(),VO=Ln();$O({target:"Promise",stat:!0,forced:VO},{all:function(e){var t=this,i=GO.f(t),n=i.resolve,o=i.reject,s=kO(function(){var u=BO(t.resolve),f=[],v=0,y=1;KO(e,function(b){var m=v++,h=!1;y++,UO(u,t,b).then(function(E){h||(h=!0,f[m]=E,--y||n(f))},o)}),--y||n(f)});return s.error&&o(s.value),i.promise}})});var zl=a(function(){"use strict";var YO=j(),WO=Q(),HO=kr().CONSTRUCTOR,Mn=Gr(),JO=V(),zO=R(),XO=Z(),Jl=Mn&&Mn.prototype;YO({target:"Promise",proto:!0,forced:HO,real:!0},{catch:function(r){return this.then(void 0,r)}});!WO&&zO(Mn)&&(Fn=JO("Promise").prototype.catch,Jl.catch!==Fn&&XO(Jl,"catch",Fn,{unsafe:!0}));var Fn});var Xl=a(function(){"use strict";var QO=j(),ZO=D(),rE=tr(),eE=Kr(),tE=gt(),iE=An(),nE=Ln();QO({target:"Promise",stat:!0,forced:nE},{race:function(e){var t=this,i=eE.f(t),n=i.reject,o=tE(function(){var s=rE(t.resolve);iE(e,function(u){ZO(s,t,u).then(i.resolve,n)})});return o.error&&n(o.value),i.promise}})});var Ql=a(function(){"use strict";var aE=j(),oE=Kr(),uE=kr().CONSTRUCTOR;aE({target:"Promise",stat:!0,forced:uE},{reject:function(e){var t=oE.f(this),i=t.reject;return i(e),t.promise}})});var rf=a(function(yx,Zl){"use strict";var sE=U(),cE=k(),vE=Kr();Zl.exports=function(r,e){if(sE(r),cE(e)&&e.constructor===r)return e;var t=vE.f(r),i=t.resolve;return i(e),t.promise}});var nf=a(function(){"use strict";var lE=j(),fE=V(),ef=Q(),pE=Gr(),tf=kr().CONSTRUCTOR,yE=rf(),dE=fE("Promise"),qE=ef&&!tf;lE({target:"Promise",stat:!0,forced:ef||tf},{resolve:function(e){return yE(qE&&this===dE?pE:this,e)}})});var af=a(function(){"use strict";xl();Hl();zl();Xl();Ql();nf()});var uf=a(function(Sx,of){"use strict";var hE=U();of.exports=function(){var r=hE(this),e="";return r.hasIndices&&(e+="d"),r.global&&(e+="g"),r.ignoreCase&&(e+="i"),r.multiline&&(e+="m"),r.dotAll&&(e+="s"),r.unicode&&(e+="u"),r.unicodeSets&&(e+="v"),r.sticky&&(e+="y"),e}});var cf=a(function(bx,sf){"use strict";var $n=P(),gE=T(),Un=gE.RegExp,Bn=$n(function(){var r=Un("a","y");return r.lastIndex=2,r.exec("abcd")!==null}),SE=Bn||$n(function(){return!Un("a","y").sticky}),bE=Bn||$n(function(){var r=Un("^r","gy");return r.lastIndex=2,r.exec("str")!==null});sf.exports={BROKEN_CARET:bE,MISSED_STICKY:SE,UNSUPPORTED_Y:Bn}});var lf=a(function(mx,vf){"use strict";var mE=P(),OE=T(),EE=OE.RegExp;vf.exports=mE(function(){var r=EE(".","s");return!(r.dotAll&&r.test("\n")&&r.flags==="s")})});var pf=a(function(Ox,ff){"use strict";var IE=P(),TE=T(),wE=TE.RegExp;ff.exports=IE(function(){var r=wE("(?b)","g");return r.exec("b").groups.a!=="b"||"b".replace(r,"$c")!=="bc"})});var xt=a(function(Ex,df){"use strict";var Jr=D(),Pt=x(),PE=ir(),xE=uf(),RE=cf(),_E=gr(),CE=Ar(),NE=mr().get,jE=lf(),AE=pf(),DE=_E("native-string-replace",String.prototype.replace),wt=RegExp.prototype.exec,kn=wt,LE=Pt("".charAt),FE=Pt("".indexOf),ME=Pt("".replace),Gn=Pt("".slice),Kn=function(){var r=/a/,e=/b*/g;return Jr(wt,r,"a"),Jr(wt,e,"a"),r.lastIndex!==0||e.lastIndex!==0}(),yf=RE.BROKEN_CARET,Vn=/()??/.exec("")[1]!==void 0,$E=Kn||Vn||yf||jE||AE;$E&&(kn=function(e){var t=this,i=NE(t),n=PE(e),o=i.raw,s,u,f,v,y,b,m;if(o)return o.lastIndex=t.lastIndex,s=Jr(kn,o,n),t.lastIndex=o.lastIndex,s;var h=i.groups,E=yf&&t.sticky,w=Jr(xE,t),S=t.source,I=0,O=n;if(E&&(w=ME(w,"y",""),FE(w,"g")===-1&&(w+="g"),O=Gn(n,t.lastIndex),t.lastIndex>0&&(!t.multiline||t.multiline&&LE(n,t.lastIndex-1)!=="\n")&&(S="(?: "+S+")",O=" "+O,I++),u=new RegExp("^(?:"+S+")",w)),Vn&&(u=new RegExp("^"+S+"$(?!\\s)",w)),Kn&&(f=t.lastIndex),v=Jr(wt,E?u:t,O),E?v?(v.input=Gn(v.input,I),v[0]=Gn(v[0],I),v.index=t.lastIndex,t.lastIndex+=v[0].length):t.lastIndex=0:Kn&&v&&(t.lastIndex=t.global?v.index+v[0].length:f),Vn&&v&&v.length>1&&Jr(DE,v[0],u,function(){for(y=1;y=o?r?"":void 0:(s=hf(i,n),s<55296||s>56319||n+1===o||(u=hf(i,n+1))<56320||u>57343?r?KE(i,n):s:r?VE(i,n,n+2):(s-55296<<10)+(u-56320)+65536)}};Sf.exports={codeAt:gf(!1),charAt:gf(!0)}});var Ef=a(function(){"use strict";var YE=Hn().charAt,WE=ir(),mf=mr(),HE=rn(),bf=en(),Of="String Iterator",JE=mf.set,zE=mf.getterFor(Of);HE(String,"String",function(r){JE(this,{type:Of,string:WE(r),index:0})},function(){var e=zE(this),t=e.string,i=e.index,n;return i>=t.length?bf(void 0,!0):(n=YE(t,i),e.index+=n.length,bf(n,!1))})});var Rf=a(function(Rx,xf){"use strict";Yn();var If=D(),Tf=Z(),XE=xt(),wf=P(),Pf=_(),QE=Sr(),ZE=Pf("species"),Jn=RegExp.prototype;xf.exports=function(r,e,t,i){var n=Pf(r),o=!wf(function(){var v={};return v[n]=function(){return 7},""[r](v)!==7}),s=o&&!wf(function(){var v=!1,y=/a/;return r==="split"&&(y={},y.constructor={},y.constructor[ZE]=function(){return y},y.flags="",y[n]=/./[n]),y.exec=function(){return v=!0,null},y[n](""),!v});if(!o||!s||t){var u=/./[n],f=e(n,""[r],function(v,y,b,m,h){var E=y.exec;return E===XE||E===Jn.exec?o&&!h?{done:!0,value:If(u,y,b,m)}:{done:!0,value:If(v,b,y,m)}:{done:!1}});Tf(String.prototype,r,f[0]),Tf(Jn,n,f[1])}i&&QE(Jn[n],"sham",!0)}});var Cf=a(function(_x,_f){"use strict";var rI=Hn().charAt;_f.exports=function(r,e,t){return e+(t?rI(r,e).length:1)}});var jf=a(function(Cx,Nf){"use strict";var Qn=x(),eI=vr(),tI=Math.floor,zn=Qn("".charAt),iI=Qn("".replace),Xn=Qn("".slice),nI=/\$([$&'`]|\d{1,2}|<[^>]*>)/g,aI=/\$([$&'`]|\d{1,2})/g;Nf.exports=function(r,e,t,i,n,o){var s=t+r.length,u=i.length,f=aI;return n!==void 0&&(n=eI(n),f=nI),iI(o,f,function(v,y){var b;switch(zn(y,0)){case"$":return"$";case"&":return r;case"`":return Xn(e,0,t);case"'":return Xn(e,s);case"<":b=n[Xn(y,1,-1)];break;default:var m=+y;if(m===0)return v;if(m>u){var h=tI(m/10);return h===0?v:h<=u?i[h-1]===void 0?zn(y,1):i[h-1]+zn(y,1):v}b=i[m-1]}return b===void 0?"":b})}});var Lf=a(function(Nx,Df){"use strict";var Af=D(),oI=U(),uI=R(),sI=rr(),cI=xt(),vI=TypeError;Df.exports=function(r,e){var t=r.exec;if(uI(t)){var i=Af(t,r,e);return i!==null&&oI(i),i}if(sI(r)==="RegExp")return Af(cI,r,e);throw new vI("RegExp#exec called on incompatible receiver")}});var Bf=a(function(){"use strict";var lI=st(),Ff=D(),Rt=x(),fI=Rf(),pI=P(),yI=U(),dI=R(),qI=Rr(),hI=ve(),gI=fi(),zr=ir(),SI=ee(),bI=Cf(),mI=ae(),OI=jf(),EI=Lf(),II=_(),ra=II("replace"),TI=Math.max,wI=Math.min,PI=Rt([].concat),Zn=Rt([].push),Mf=Rt("".indexOf),$f=Rt("".slice),xI=function(r){return r===void 0?r:String(r)},RI=function(){return"a".replace(/./,"$0")==="$0"}(),Uf=function(){return/./[ra]?/./[ra]("a","$0")==="":!1}(),_I=!pI(function(){var r=/./;return r.exec=function(){var e=[];return e.groups={a:"7"},e},"".replace(r,"$")!=="7"});fI("replace",function(r,e,t){var i=Uf?"$":"$0";return[function(o,s){var u=SI(this),f=qI(o)?void 0:mI(o,ra);return f?Ff(f,o,u,s):Ff(e,zr(u),o,s)},function(n,o){var s=yI(this),u=zr(n);if(typeof o=="string"&&Mf(o,i)===-1&&Mf(o,"$<")===-1){var f=t(e,s,u,o);if(f.done)return f.value}var v=dI(o);v||(o=zr(o));var y=s.global,b;y&&(b=s.unicode,s.lastIndex=0);for(var m=[],h;h=EI(s,u),!(h===null||(Zn(m,h),!y));){var E=zr(h[0]);E===""&&(s.lastIndex=bI(u,gI(s.lastIndex),b))}for(var w="",S=0,I=0;I=S&&(w+=$f(u,S,A)+yr,S=A+O.length)}return w+$f(u,S)}]},!_I||!RI||Uf)});var ea=a(function(Dx,Gf){"use strict";Gf.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 ia=a(function(Lx,Kf){"use strict";var CI=oe(),ta=CI("span").classList,kf=ta&&ta.constructor&&ta.constructor.prototype;Kf.exports=kf===Object.prototype?void 0:kf});var Hf=a(function(){"use strict";var Vf=T(),Yf=ea(),NI=ia(),na=Ki(),jI=Sr(),Wf=function(r){if(r&&r.forEach!==na)try{jI(r,"forEach",na)}catch(e){r.forEach=na}};for(_t in Yf)Yf[_t]&&Wf(Vf[_t]&&Vf[_t].prototype);var _t;Wf(NI)});var Zf=a(function(){"use strict";var Jf=T(),Xf=ea(),AI=ia(),Ne=nn(),zf=Sr(),DI=nr(),LI=_(),aa=LI("iterator"),oa=Ne.values,Qf=function(r,e){if(r){if(r[aa]!==oa)try{zf(r,aa,oa)}catch(i){r[aa]=oa}if(DI(r,e,!0),Xf[e]){for(var t in Ne)if(r[t]!==Ne[t])try{zf(r,t,Ne[t])}catch(i){r[t]=Ne[t]}}}};for(Ct in Xf)Qf(Jf[Ct]&&Jf[Ct].prototype,Ct);var Ct;Qf(AI,"DOMTokenList")});var Bx=C(Ys()),Gx=C(Zs()),kx=C(rc()),Kx=C(ec()),Vx=C(tc()),Yx=C(vc()),Wx=C(dc()),Hx=C(nn()),Jx=C(Xc()),zx=C(rv()),Xx=C(nv()),Qx=C(av()),Zx=C(ov()),rR=C(sv()),eR=C(cv()),tR=C(fv()),iR=C(af()),nR=C(Yn()),aR=C(Ef()),oR=C(Bf()),uR=C(Hf()),sR=C(Zf());function Nt(r){return Nt=typeof Symbol=="function"&&typeof Symbol.iterator=="symbol"?function(e){return typeof e}:function(e){return e&&typeof Symbol=="function"&&e.constructor===Symbol&&e!==Symbol.prototype?"symbol":typeof e},Nt(r)}var Xr;function Pr(){"use strict";Pr=function(){return e};var r,e={},t=Object.prototype,i=t.hasOwnProperty,n=Object.defineProperty||function(p,c,l){p[c]=l.value},o=typeof Symbol=="function"?Symbol:{},s=o.iterator||"@@iterator",u=o.asyncIterator||"@@asyncIterator",f=o.toStringTag||"@@toStringTag";function v(p,c,l){return Object.defineProperty(p,c,{value:l,enumerable:!0,configurable:!0,writable:!0}),p[c]}try{v({},"")}catch(p){v=function(l,d,g){return l[d]=g}}function y(p,c,l,d){var g=c&&c.prototype instanceof I?c:I,q=Object.create(g.prototype),N=new At(d||[]);return n(q,"_invoke",{value:ep(p,l,N)}),q}function b(p,c,l){try{return{type:"normal",arg:p.call(c,l)}}catch(d){return{type:"throw",arg:d}}}e.wrap=y;var m="suspendedStart",h="suspendedYield",E="executing",w="completed",S={};function I(){}function O(){}function A(){}var H={};v(H,s,function(){return this});var yr=Object.getPrototypeOf,sr=yr&&yr(yr(Dt([])));sr&&sr!==t&&i.call(sr,s)&&(H=sr);var X=A.prototype=I.prototype=Object.create(H);function Qr(p){["next","throw","return"].forEach(function(c){v(p,c,function(l){return this._invoke(c,l)})})}function je(p,c){function l(g,q,N,$){var B=b(p[g],p,q);if(B.type!=="throw"){var dr=B.arg,cr=dr.value;return cr&&Nt(cr)=="object"&&i.call(cr,"__await")?c.resolve(cr.__await).then(function(qr){l("next",qr,N,$)},function(qr){l("throw",qr,N,$)}):c.resolve(cr).then(function(qr){dr.value=qr,N(dr)},function(qr){return l("throw",qr,N,$)})}$(B.arg)}var d;n(this,"_invoke",{value:function(q,N){function $(){return new c(function(B,dr){l(q,N,B,dr)})}return d=d?d.then($,$):$()}})}function ep(p,c,l){var d=m;return function(g,q){if(d===E)throw new Error("Generator is already running");if(d===w){if(g==="throw")throw q;return{value:r,done:!0}}for(l.method=g,l.arg=q;;){var N=l.delegate;if(N){var $=la(N,l);if($){if($===S)continue;return $}}if(l.method==="next")l.sent=l._sent=l.arg;else if(l.method==="throw"){if(d===m)throw d=w,l.arg;l.dispatchException(l.arg)}else l.method==="return"&&l.abrupt("return",l.arg);d=E;var B=b(p,c,l);if(B.type==="normal"){if(d=l.done?w:h,B.arg===S)continue;return{value:B.arg,done:l.done}}B.type==="throw"&&(d=w,l.method="throw",l.arg=B.arg)}}}function la(p,c){var l=c.method,d=p.iterator[l];if(d===r)return c.delegate=null,l==="throw"&&p.iterator.return&&(c.method="return",c.arg=r,la(p,c),c.method==="throw")||l!=="return"&&(c.method="throw",c.arg=new TypeError("The iterator does not provide a '"+l+"' method")),S;var g=b(d,p.iterator,c.arg);if(g.type==="throw")return c.method="throw",c.arg=g.arg,c.delegate=null,S;var q=g.arg;return q?q.done?(c[p.resultName]=q.value,c.next=p.nextLoc,c.method!=="return"&&(c.method="next",c.arg=r),c.delegate=null,S):q:(c.method="throw",c.arg=new TypeError("iterator result is not an object"),c.delegate=null,S)}function tp(p){var c={tryLoc:p[0]};1 in p&&(c.catchLoc=p[1]),2 in p&&(c.finallyLoc=p[2],c.afterLoc=p[3]),this.tryEntries.push(c)}function jt(p){var c=p.completion||{};c.type="normal",delete c.arg,p.completion=c}function At(p){this.tryEntries=[{tryLoc:"root"}],p.forEach(tp,this),this.reset(!0)}function Dt(p){if(p||p===""){var c=p[s];if(c)return c.call(p);if(typeof p.next=="function")return p;if(!isNaN(p.length)){var l=-1,d=function g(){for(;++l=0;--g){var q=this.tryEntries[g],N=q.completion;if(q.tryLoc==="root")return d("end");if(q.tryLoc<=this.prev){var $=i.call(q,"catchLoc"),B=i.call(q,"finallyLoc");if($&&B){if(this.prev=0;--d){var g=this.tryEntries[d];if(g.tryLoc<=this.prev&&i.call(g,"finallyLoc")&&this.prev=0;--l){var d=this.tryEntries[l];if(d.finallyLoc===c)return this.complete(d.completion,d.afterLoc),jt(d),S}},catch:function(c){for(var l=this.tryEntries.length-1;l>=0;--l){var d=this.tryEntries[l];if(d.tryLoc===c){var g=d.completion;if(g.type==="throw"){var q=g.arg;jt(d)}return q}}throw new Error("illegal catch attempt")},delegateYield:function(c,l,d){return this.delegate={iterator:Dt(c),resultName:l,nextLoc:d},this.method==="next"&&(this.arg=r),S}},e}function rp(r,e,t,i,n,o,s){try{var u=r[o](s),f=u.value}catch(v){t(v);return}u.done?e(f):Promise.resolve(f).then(i,n)}function va(r){return function(){var e=this,t=arguments;return new Promise(function(i,n){var o=r.apply(e,t);function s(f){rp(o,i,n,s,u,"next",f)}function u(f){rp(o,i,n,s,u,"throw",f)}s(void 0)})}}document.documentElement.classList.add("autoreload-enabled");var FI=window.location.protocol==="https:"?"wss:":"ws:",MI=window.location.pathname.replace(/\/?$/,"/")+"autoreload/",$I="".concat(FI,"//").concat(window.location.host).concat(MI),UI=((Xr=document.currentScript)===null||Xr===void 0||(Xr=Xr.dataset)===null||Xr===void 0?void 0:Xr.wsUrl)||$I;function BI(r){return ua.apply(this,arguments)}function ua(){return ua=va(Pr().mark(function r(e){var t,i;return Pr().wrap(function(o){for(;;)switch(o.prev=o.next){case 0:return t=new WebSocket(e),i=!1,o.abrupt("return",new Promise(function(s,u){t.onopen=function(){i=!0},t.onerror=function(f){u(f)},t.onclose=function(){i?s(!1):u(new Error("WebSocket connection failed"))},t.onmessage=function(f){f.data==="autoreload"&&s(!0)}}));case 3:case"end":return o.stop()}},r)})),ua.apply(this,arguments)}function GI(r){return sa.apply(this,arguments)}function sa(){return sa=va(Pr().mark(function r(e){return Pr().wrap(function(i){for(;;)switch(i.prev=i.next){case 0:return i.abrupt("return",new Promise(function(n){return setTimeout(n,e)}));case 1:case"end":return i.stop()}},r)})),sa.apply(this,arguments)}function kI(){return ca.apply(this,arguments)}function ca(){return ca=va(Pr().mark(function r(){return Pr().wrap(function(t){for(;;)switch(t.prev=t.next){case 0:return t.prev=1,t.next=4,BI(UI);case 4:if(!t.sent){t.next=7;break}return window.location.reload(),t.abrupt("return");case 7:t.next=13;break;case 9:return t.prev=9,t.t0=t.catch(1),console.debug("Giving up on autoreload"),t.abrupt("return");case 13:return t.next=15,GI(1e3);case 15:t.next=0;break;case 17:case"end":return t.stop()}},r,null,[[1,9]])})),ca.apply(this,arguments)}kI().catch(function(r){console.error(r)});})(); /*! regenerator-runtime -- Copyright (c) 2014-present, Facebook, Inc. -- license (MIT): https://github.com/facebook/regenerator/blob/main/LICENSE */ //# sourceMappingURL=shiny-autoreload.js.map diff --git a/inst/www/shared/shiny-autoreload.js.map b/inst/www/shared/shiny-autoreload.js.map index 9727a863c4..14a6b7b708 100644 --- a/inst/www/shared/shiny-autoreload.js.map +++ b/inst/www/shared/shiny-autoreload.js.map @@ -1,7 +1,7 @@ { "version": 3, - "sources": ["../../../node_modules/core-js/internals/global.js", "../../../node_modules/core-js/internals/fails.js", "../../../node_modules/core-js/internals/descriptors.js", "../../../node_modules/core-js/internals/function-bind-native.js", "../../../node_modules/core-js/internals/function-call.js", "../../../node_modules/core-js/internals/object-property-is-enumerable.js", "../../../node_modules/core-js/internals/create-property-descriptor.js", "../../../node_modules/core-js/internals/function-uncurry-this.js", "../../../node_modules/core-js/internals/classof-raw.js", "../../../node_modules/core-js/internals/indexed-object.js", "../../../node_modules/core-js/internals/is-null-or-undefined.js", "../../../node_modules/core-js/internals/require-object-coercible.js", "../../../node_modules/core-js/internals/to-indexed-object.js", "../../../node_modules/core-js/internals/document-all.js", "../../../node_modules/core-js/internals/is-callable.js", "../../../node_modules/core-js/internals/is-object.js", "../../../node_modules/core-js/internals/get-built-in.js", "../../../node_modules/core-js/internals/object-is-prototype-of.js", "../../../node_modules/core-js/internals/engine-user-agent.js", "../../../node_modules/core-js/internals/engine-v8-version.js", "../../../node_modules/core-js/internals/symbol-constructor-detection.js", "../../../node_modules/core-js/internals/use-symbol-as-uid.js", "../../../node_modules/core-js/internals/is-symbol.js", "../../../node_modules/core-js/internals/try-to-string.js", "../../../node_modules/core-js/internals/a-callable.js", "../../../node_modules/core-js/internals/get-method.js", "../../../node_modules/core-js/internals/ordinary-to-primitive.js", "../../../node_modules/core-js/internals/is-pure.js", "../../../node_modules/core-js/internals/define-global-property.js", "../../../node_modules/core-js/internals/shared-store.js", "../../../node_modules/core-js/internals/shared.js", "../../../node_modules/core-js/internals/to-object.js", "../../../node_modules/core-js/internals/has-own-property.js", "../../../node_modules/core-js/internals/uid.js", "../../../node_modules/core-js/internals/well-known-symbol.js", "../../../node_modules/core-js/internals/to-primitive.js", "../../../node_modules/core-js/internals/to-property-key.js", "../../../node_modules/core-js/internals/document-create-element.js", "../../../node_modules/core-js/internals/ie8-dom-define.js", "../../../node_modules/core-js/internals/object-get-own-property-descriptor.js", "../../../node_modules/core-js/internals/v8-prototype-define-bug.js", "../../../node_modules/core-js/internals/an-object.js", "../../../node_modules/core-js/internals/object-define-property.js", "../../../node_modules/core-js/internals/create-non-enumerable-property.js", "../../../node_modules/core-js/internals/function-name.js", "../../../node_modules/core-js/internals/inspect-source.js", "../../../node_modules/core-js/internals/weak-map-basic-detection.js", "../../../node_modules/core-js/internals/shared-key.js", "../../../node_modules/core-js/internals/hidden-keys.js", "../../../node_modules/core-js/internals/internal-state.js", "../../../node_modules/core-js/internals/make-built-in.js", "../../../node_modules/core-js/internals/define-built-in.js", "../../../node_modules/core-js/internals/math-trunc.js", "../../../node_modules/core-js/internals/to-integer-or-infinity.js", "../../../node_modules/core-js/internals/to-absolute-index.js", "../../../node_modules/core-js/internals/to-length.js", "../../../node_modules/core-js/internals/length-of-array-like.js", "../../../node_modules/core-js/internals/array-includes.js", "../../../node_modules/core-js/internals/object-keys-internal.js", "../../../node_modules/core-js/internals/enum-bug-keys.js", "../../../node_modules/core-js/internals/object-get-own-property-names.js", "../../../node_modules/core-js/internals/object-get-own-property-symbols.js", "../../../node_modules/core-js/internals/own-keys.js", "../../../node_modules/core-js/internals/copy-constructor-properties.js", "../../../node_modules/core-js/internals/is-forced.js", "../../../node_modules/core-js/internals/export.js", "../../../node_modules/core-js/internals/to-string-tag-support.js", "../../../node_modules/core-js/internals/classof.js", "../../../node_modules/core-js/internals/to-string.js", "../../../node_modules/core-js/internals/regexp-flags.js", "../../../node_modules/core-js/internals/regexp-sticky-helpers.js", "../../../node_modules/core-js/internals/object-keys.js", "../../../node_modules/core-js/internals/object-define-properties.js", "../../../node_modules/core-js/internals/html.js", "../../../node_modules/core-js/internals/object-create.js", "../../../node_modules/core-js/internals/regexp-unsupported-dot-all.js", "../../../node_modules/core-js/internals/regexp-unsupported-ncg.js", "../../../node_modules/core-js/internals/regexp-exec.js", "../../../node_modules/core-js/modules/es.regexp.exec.js", "../../../node_modules/core-js/internals/function-apply.js", "../../../node_modules/core-js/internals/function-uncurry-this-clause.js", "../../../node_modules/core-js/internals/fix-regexp-well-known-symbol-logic.js", "../../../node_modules/core-js/internals/string-multibyte.js", "../../../node_modules/core-js/internals/advance-string-index.js", "../../../node_modules/core-js/internals/get-substitution.js", "../../../node_modules/core-js/internals/regexp-exec-abstract.js", "../../../node_modules/core-js/internals/is-array.js", "../../../node_modules/core-js/internals/does-not-exceed-safe-integer.js", "../../../node_modules/core-js/internals/create-property.js", "../../../node_modules/core-js/internals/is-constructor.js", "../../../node_modules/core-js/internals/array-species-constructor.js", "../../../node_modules/core-js/internals/array-species-create.js", "../../../node_modules/core-js/internals/array-method-has-species-support.js", "../../../node_modules/core-js/internals/object-to-string.js", "../../../node_modules/core-js/internals/engine-is-node.js", "../../../node_modules/core-js/internals/function-uncurry-this-accessor.js", "../../../node_modules/core-js/internals/a-possible-prototype.js", "../../../node_modules/core-js/internals/object-set-prototype-of.js", "../../../node_modules/core-js/internals/set-to-string-tag.js", "../../../node_modules/core-js/internals/define-built-in-accessor.js", "../../../node_modules/core-js/internals/set-species.js", "../../../node_modules/core-js/internals/an-instance.js", "../../../node_modules/core-js/internals/a-constructor.js", "../../../node_modules/core-js/internals/species-constructor.js", "../../../node_modules/core-js/internals/function-bind-context.js", "../../../node_modules/core-js/internals/array-slice.js", "../../../node_modules/core-js/internals/validate-arguments-length.js", "../../../node_modules/core-js/internals/engine-is-ios.js", "../../../node_modules/core-js/internals/task.js", "../../../node_modules/core-js/internals/queue.js", "../../../node_modules/core-js/internals/engine-is-ios-pebble.js", "../../../node_modules/core-js/internals/engine-is-webos-webkit.js", "../../../node_modules/core-js/internals/microtask.js", "../../../node_modules/core-js/internals/host-report-errors.js", "../../../node_modules/core-js/internals/perform.js", "../../../node_modules/core-js/internals/promise-native-constructor.js", "../../../node_modules/core-js/internals/engine-is-deno.js", "../../../node_modules/core-js/internals/engine-is-browser.js", "../../../node_modules/core-js/internals/promise-constructor-detection.js", "../../../node_modules/core-js/internals/new-promise-capability.js", "../../../node_modules/core-js/modules/es.promise.constructor.js", "../../../node_modules/core-js/internals/iterators.js", "../../../node_modules/core-js/internals/is-array-iterator-method.js", "../../../node_modules/core-js/internals/get-iterator-method.js", "../../../node_modules/core-js/internals/get-iterator.js", "../../../node_modules/core-js/internals/iterator-close.js", "../../../node_modules/core-js/internals/iterate.js", "../../../node_modules/core-js/internals/check-correctness-of-iteration.js", "../../../node_modules/core-js/internals/promise-statics-incorrect-iteration.js", "../../../node_modules/core-js/modules/es.promise.all.js", "../../../node_modules/core-js/modules/es.promise.catch.js", "../../../node_modules/core-js/modules/es.promise.race.js", "../../../node_modules/core-js/modules/es.promise.reject.js", "../../../node_modules/core-js/internals/promise-resolve.js", "../../../node_modules/core-js/modules/es.promise.resolve.js", "../../../node_modules/core-js/internals/array-slice-simple.js", "../../../node_modules/core-js/internals/object-get-own-property-names-external.js", "../../../node_modules/core-js/internals/well-known-symbol-wrapped.js", "../../../node_modules/core-js/internals/path.js", "../../../node_modules/core-js/internals/well-known-symbol-define.js", "../../../node_modules/core-js/internals/symbol-define-to-primitive.js", "../../../node_modules/core-js/internals/array-iteration.js", "../../../node_modules/core-js/modules/es.symbol.constructor.js", "../../../node_modules/core-js/internals/symbol-registry-detection.js", "../../../node_modules/core-js/modules/es.symbol.for.js", "../../../node_modules/core-js/modules/es.symbol.key-for.js", "../../../node_modules/core-js/internals/get-json-replacer-function.js", "../../../node_modules/core-js/modules/es.json.stringify.js", "../../../node_modules/core-js/modules/es.object.get-own-property-symbols.js", "../../../node_modules/core-js/internals/add-to-unscopables.js", "../../../node_modules/core-js/internals/correct-prototype-getter.js", "../../../node_modules/core-js/internals/object-get-prototype-of.js", "../../../node_modules/core-js/internals/iterators-core.js", "../../../node_modules/core-js/internals/iterator-create-constructor.js", "../../../node_modules/core-js/internals/iterator-define.js", "../../../node_modules/core-js/internals/create-iter-result-object.js", "../../../node_modules/core-js/modules/es.array.iterator.js", "../../../node_modules/core-js/internals/dom-iterables.js", "../../../node_modules/core-js/internals/dom-token-list-prototype.js", "../../../node_modules/core-js/internals/array-method-is-strict.js", "../../../node_modules/core-js/internals/array-for-each.js", "../../../srcts/extras/shiny-autoreload.ts", "../../../node_modules/core-js/modules/es.string.replace.js", "../../../node_modules/core-js/modules/es.array.concat.js", "../../../node_modules/core-js/modules/es.object.to-string.js", "../../../node_modules/core-js/modules/es.promise.js", "../../../node_modules/core-js/modules/es.object.define-property.js", "../../../node_modules/core-js/modules/es.symbol.js", "../../../node_modules/core-js/modules/es.symbol.description.js", "../../../node_modules/core-js/modules/es.symbol.iterator.js", "../../../node_modules/core-js/modules/es.string.iterator.js", "../../../node_modules/core-js/modules/web.dom-collections.iterator.js", "../../../node_modules/core-js/modules/es.symbol.async-iterator.js", "../../../node_modules/core-js/modules/es.symbol.to-string-tag.js", "../../../node_modules/core-js/modules/es.json.to-string-tag.js", "../../../node_modules/core-js/modules/es.math.to-string-tag.js", "../../../node_modules/core-js/modules/es.object.get-prototype-of.js", "../../../node_modules/core-js/modules/es.array.for-each.js", "../../../node_modules/core-js/modules/web.dom-collections.for-each.js", "../../../node_modules/core-js/modules/es.function.name.js", "../../../node_modules/core-js/modules/es.object.set-prototype-of.js", "../../../node_modules/core-js/modules/es.array.reverse.js", "../../../node_modules/core-js/modules/es.array.slice.js"], - "sourcesContent": ["var check = function (it) {\n return it && it.Math == Math && it;\n};\n\n// https://github.com/zloirock/core-js/issues/86#issuecomment-115759028\nmodule.exports =\n // eslint-disable-next-line es/no-global-this -- safe\n check(typeof globalThis == 'object' && globalThis) ||\n check(typeof window == 'object' && window) ||\n // eslint-disable-next-line no-restricted-globals -- safe\n check(typeof self == 'object' && self) ||\n check(typeof global == 'object' && global) ||\n // eslint-disable-next-line no-new-func -- fallback\n (function () { return this; })() || Function('return this')();\n", "module.exports = function (exec) {\n try {\n return !!exec();\n } catch (error) {\n return true;\n }\n};\n", "var fails = require('../internals/fails');\n\n// Detect IE8's incomplete defineProperty implementation\nmodule.exports = !fails(function () {\n // eslint-disable-next-line es/no-object-defineproperty -- required for testing\n return Object.defineProperty({}, 1, { get: function () { return 7; } })[1] != 7;\n});\n", "var fails = require('../internals/fails');\n\nmodule.exports = !fails(function () {\n // eslint-disable-next-line es/no-function-prototype-bind -- safe\n var test = (function () { /* empty */ }).bind();\n // eslint-disable-next-line no-prototype-builtins -- safe\n return typeof test != 'function' || test.hasOwnProperty('prototype');\n});\n", "var NATIVE_BIND = require('../internals/function-bind-native');\n\nvar call = Function.prototype.call;\n\nmodule.exports = NATIVE_BIND ? call.bind(call) : function () {\n return call.apply(call, arguments);\n};\n", "'use strict';\nvar $propertyIsEnumerable = {}.propertyIsEnumerable;\n// eslint-disable-next-line es/no-object-getownpropertydescriptor -- safe\nvar getOwnPropertyDescriptor = Object.getOwnPropertyDescriptor;\n\n// Nashorn ~ JDK8 bug\nvar NASHORN_BUG = getOwnPropertyDescriptor && !$propertyIsEnumerable.call({ 1: 2 }, 1);\n\n// `Object.prototype.propertyIsEnumerable` method implementation\n// https://tc39.es/ecma262/#sec-object.prototype.propertyisenumerable\nexports.f = NASHORN_BUG ? function propertyIsEnumerable(V) {\n var descriptor = getOwnPropertyDescriptor(this, V);\n return !!descriptor && descriptor.enumerable;\n} : $propertyIsEnumerable;\n", "module.exports = function (bitmap, value) {\n return {\n enumerable: !(bitmap & 1),\n configurable: !(bitmap & 2),\n writable: !(bitmap & 4),\n value: value\n };\n};\n", "var NATIVE_BIND = require('../internals/function-bind-native');\n\nvar FunctionPrototype = Function.prototype;\nvar call = FunctionPrototype.call;\nvar uncurryThisWithBind = NATIVE_BIND && FunctionPrototype.bind.bind(call, call);\n\nmodule.exports = NATIVE_BIND ? uncurryThisWithBind : function (fn) {\n return function () {\n return call.apply(fn, arguments);\n };\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\n\nvar toString = uncurryThis({}.toString);\nvar stringSlice = uncurryThis(''.slice);\n\nmodule.exports = function (it) {\n return stringSlice(toString(it), 8, -1);\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar fails = require('../internals/fails');\nvar classof = require('../internals/classof-raw');\n\nvar $Object = Object;\nvar split = uncurryThis(''.split);\n\n// fallback for non-array-like ES3 and non-enumerable old V8 strings\nmodule.exports = fails(function () {\n // throws an error in rhino, see https://github.com/mozilla/rhino/issues/346\n // eslint-disable-next-line no-prototype-builtins -- safe\n return !$Object('z').propertyIsEnumerable(0);\n}) ? function (it) {\n return classof(it) == 'String' ? split(it, '') : $Object(it);\n} : $Object;\n", "// we can't use just `it == null` since of `document.all` special case\n// https://tc39.es/ecma262/#sec-IsHTMLDDA-internal-slot-aec\nmodule.exports = function (it) {\n return it === null || it === undefined;\n};\n", "var isNullOrUndefined = require('../internals/is-null-or-undefined');\n\nvar $TypeError = TypeError;\n\n// `RequireObjectCoercible` abstract operation\n// https://tc39.es/ecma262/#sec-requireobjectcoercible\nmodule.exports = function (it) {\n if (isNullOrUndefined(it)) throw $TypeError(\"Can't call method on \" + it);\n return it;\n};\n", "// toObject with fallback for non-array-like ES3 strings\nvar IndexedObject = require('../internals/indexed-object');\nvar requireObjectCoercible = require('../internals/require-object-coercible');\n\nmodule.exports = function (it) {\n return IndexedObject(requireObjectCoercible(it));\n};\n", "var documentAll = typeof document == 'object' && document.all;\n\n// https://tc39.es/ecma262/#sec-IsHTMLDDA-internal-slot\n// eslint-disable-next-line unicorn/no-typeof-undefined -- required for testing\nvar IS_HTMLDDA = typeof documentAll == 'undefined' && documentAll !== undefined;\n\nmodule.exports = {\n all: documentAll,\n IS_HTMLDDA: IS_HTMLDDA\n};\n", "var $documentAll = require('../internals/document-all');\n\nvar documentAll = $documentAll.all;\n\n// `IsCallable` abstract operation\n// https://tc39.es/ecma262/#sec-iscallable\nmodule.exports = $documentAll.IS_HTMLDDA ? function (argument) {\n return typeof argument == 'function' || argument === documentAll;\n} : function (argument) {\n return typeof argument == 'function';\n};\n", "var isCallable = require('../internals/is-callable');\nvar $documentAll = require('../internals/document-all');\n\nvar documentAll = $documentAll.all;\n\nmodule.exports = $documentAll.IS_HTMLDDA ? function (it) {\n return typeof it == 'object' ? it !== null : isCallable(it) || it === documentAll;\n} : function (it) {\n return typeof it == 'object' ? it !== null : isCallable(it);\n};\n", "var global = require('../internals/global');\nvar isCallable = require('../internals/is-callable');\n\nvar aFunction = function (argument) {\n return isCallable(argument) ? argument : undefined;\n};\n\nmodule.exports = function (namespace, method) {\n return arguments.length < 2 ? aFunction(global[namespace]) : global[namespace] && global[namespace][method];\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\n\nmodule.exports = uncurryThis({}.isPrototypeOf);\n", "module.exports = typeof navigator != 'undefined' && String(navigator.userAgent) || '';\n", "var global = require('../internals/global');\nvar userAgent = require('../internals/engine-user-agent');\n\nvar process = global.process;\nvar Deno = global.Deno;\nvar versions = process && process.versions || Deno && Deno.version;\nvar v8 = versions && versions.v8;\nvar match, version;\n\nif (v8) {\n match = v8.split('.');\n // in old Chrome, versions of V8 isn't V8 = Chrome / 10\n // but their correct versions are not interesting for us\n version = match[0] > 0 && match[0] < 4 ? 1 : +(match[0] + match[1]);\n}\n\n// BrowserFS NodeJS `process` polyfill incorrectly set `.v8` to `0.0`\n// so check `userAgent` even if `.v8` exists, but 0\nif (!version && userAgent) {\n match = userAgent.match(/Edge\\/(\\d+)/);\n if (!match || match[1] >= 74) {\n match = userAgent.match(/Chrome\\/(\\d+)/);\n if (match) version = +match[1];\n }\n}\n\nmodule.exports = version;\n", "/* eslint-disable es/no-symbol -- required for testing */\nvar V8_VERSION = require('../internals/engine-v8-version');\nvar fails = require('../internals/fails');\n\n// eslint-disable-next-line es/no-object-getownpropertysymbols -- required for testing\nmodule.exports = !!Object.getOwnPropertySymbols && !fails(function () {\n var symbol = Symbol();\n // Chrome 38 Symbol has incorrect toString conversion\n // `get-own-property-symbols` polyfill symbols converted to object are not Symbol instances\n return !String(symbol) || !(Object(symbol) instanceof Symbol) ||\n // Chrome 38-40 symbols are not inherited from DOM collections prototypes to instances\n !Symbol.sham && V8_VERSION && V8_VERSION < 41;\n});\n", "/* eslint-disable es/no-symbol -- required for testing */\nvar NATIVE_SYMBOL = require('../internals/symbol-constructor-detection');\n\nmodule.exports = NATIVE_SYMBOL\n && !Symbol.sham\n && typeof Symbol.iterator == 'symbol';\n", "var getBuiltIn = require('../internals/get-built-in');\nvar isCallable = require('../internals/is-callable');\nvar isPrototypeOf = require('../internals/object-is-prototype-of');\nvar USE_SYMBOL_AS_UID = require('../internals/use-symbol-as-uid');\n\nvar $Object = Object;\n\nmodule.exports = USE_SYMBOL_AS_UID ? function (it) {\n return typeof it == 'symbol';\n} : function (it) {\n var $Symbol = getBuiltIn('Symbol');\n return isCallable($Symbol) && isPrototypeOf($Symbol.prototype, $Object(it));\n};\n", "var $String = String;\n\nmodule.exports = function (argument) {\n try {\n return $String(argument);\n } catch (error) {\n return 'Object';\n }\n};\n", "var isCallable = require('../internals/is-callable');\nvar tryToString = require('../internals/try-to-string');\n\nvar $TypeError = TypeError;\n\n// `Assert: IsCallable(argument) is true`\nmodule.exports = function (argument) {\n if (isCallable(argument)) return argument;\n throw $TypeError(tryToString(argument) + ' is not a function');\n};\n", "var aCallable = require('../internals/a-callable');\nvar isNullOrUndefined = require('../internals/is-null-or-undefined');\n\n// `GetMethod` abstract operation\n// https://tc39.es/ecma262/#sec-getmethod\nmodule.exports = function (V, P) {\n var func = V[P];\n return isNullOrUndefined(func) ? undefined : aCallable(func);\n};\n", "var call = require('../internals/function-call');\nvar isCallable = require('../internals/is-callable');\nvar isObject = require('../internals/is-object');\n\nvar $TypeError = TypeError;\n\n// `OrdinaryToPrimitive` abstract operation\n// https://tc39.es/ecma262/#sec-ordinarytoprimitive\nmodule.exports = function (input, pref) {\n var fn, val;\n if (pref === 'string' && isCallable(fn = input.toString) && !isObject(val = call(fn, input))) return val;\n if (isCallable(fn = input.valueOf) && !isObject(val = call(fn, input))) return val;\n if (pref !== 'string' && isCallable(fn = input.toString) && !isObject(val = call(fn, input))) return val;\n throw $TypeError(\"Can't convert object to primitive value\");\n};\n", "module.exports = false;\n", "var global = require('../internals/global');\n\n// eslint-disable-next-line es/no-object-defineproperty -- safe\nvar defineProperty = Object.defineProperty;\n\nmodule.exports = function (key, value) {\n try {\n defineProperty(global, key, { value: value, configurable: true, writable: true });\n } catch (error) {\n global[key] = value;\n } return value;\n};\n", "var global = require('../internals/global');\nvar defineGlobalProperty = require('../internals/define-global-property');\n\nvar SHARED = '__core-js_shared__';\nvar store = global[SHARED] || defineGlobalProperty(SHARED, {});\n\nmodule.exports = store;\n", "var IS_PURE = require('../internals/is-pure');\nvar store = require('../internals/shared-store');\n\n(module.exports = function (key, value) {\n return store[key] || (store[key] = value !== undefined ? value : {});\n})('versions', []).push({\n version: '3.29.0',\n mode: IS_PURE ? 'pure' : 'global',\n copyright: '\u00A9 2014-2023 Denis Pushkarev (zloirock.ru)',\n license: 'https://github.com/zloirock/core-js/blob/v3.29.0/LICENSE',\n source: 'https://github.com/zloirock/core-js'\n});\n", "var requireObjectCoercible = require('../internals/require-object-coercible');\n\nvar $Object = Object;\n\n// `ToObject` abstract operation\n// https://tc39.es/ecma262/#sec-toobject\nmodule.exports = function (argument) {\n return $Object(requireObjectCoercible(argument));\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar toObject = require('../internals/to-object');\n\nvar hasOwnProperty = uncurryThis({}.hasOwnProperty);\n\n// `HasOwnProperty` abstract operation\n// https://tc39.es/ecma262/#sec-hasownproperty\n// eslint-disable-next-line es/no-object-hasown -- safe\nmodule.exports = Object.hasOwn || function hasOwn(it, key) {\n return hasOwnProperty(toObject(it), key);\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\n\nvar id = 0;\nvar postfix = Math.random();\nvar toString = uncurryThis(1.0.toString);\n\nmodule.exports = function (key) {\n return 'Symbol(' + (key === undefined ? '' : key) + ')_' + toString(++id + postfix, 36);\n};\n", "var global = require('../internals/global');\nvar shared = require('../internals/shared');\nvar hasOwn = require('../internals/has-own-property');\nvar uid = require('../internals/uid');\nvar NATIVE_SYMBOL = require('../internals/symbol-constructor-detection');\nvar USE_SYMBOL_AS_UID = require('../internals/use-symbol-as-uid');\n\nvar Symbol = global.Symbol;\nvar WellKnownSymbolsStore = shared('wks');\nvar createWellKnownSymbol = USE_SYMBOL_AS_UID ? Symbol['for'] || Symbol : Symbol && Symbol.withoutSetter || uid;\n\nmodule.exports = function (name) {\n if (!hasOwn(WellKnownSymbolsStore, name)) {\n WellKnownSymbolsStore[name] = NATIVE_SYMBOL && hasOwn(Symbol, name)\n ? Symbol[name]\n : createWellKnownSymbol('Symbol.' + name);\n } return WellKnownSymbolsStore[name];\n};\n", "var call = require('../internals/function-call');\nvar isObject = require('../internals/is-object');\nvar isSymbol = require('../internals/is-symbol');\nvar getMethod = require('../internals/get-method');\nvar ordinaryToPrimitive = require('../internals/ordinary-to-primitive');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar $TypeError = TypeError;\nvar TO_PRIMITIVE = wellKnownSymbol('toPrimitive');\n\n// `ToPrimitive` abstract operation\n// https://tc39.es/ecma262/#sec-toprimitive\nmodule.exports = function (input, pref) {\n if (!isObject(input) || isSymbol(input)) return input;\n var exoticToPrim = getMethod(input, TO_PRIMITIVE);\n var result;\n if (exoticToPrim) {\n if (pref === undefined) pref = 'default';\n result = call(exoticToPrim, input, pref);\n if (!isObject(result) || isSymbol(result)) return result;\n throw $TypeError(\"Can't convert object to primitive value\");\n }\n if (pref === undefined) pref = 'number';\n return ordinaryToPrimitive(input, pref);\n};\n", "var toPrimitive = require('../internals/to-primitive');\nvar isSymbol = require('../internals/is-symbol');\n\n// `ToPropertyKey` abstract operation\n// https://tc39.es/ecma262/#sec-topropertykey\nmodule.exports = function (argument) {\n var key = toPrimitive(argument, 'string');\n return isSymbol(key) ? key : key + '';\n};\n", "var global = require('../internals/global');\nvar isObject = require('../internals/is-object');\n\nvar document = global.document;\n// typeof document.createElement is 'object' in old IE\nvar EXISTS = isObject(document) && isObject(document.createElement);\n\nmodule.exports = function (it) {\n return EXISTS ? document.createElement(it) : {};\n};\n", "var DESCRIPTORS = require('../internals/descriptors');\nvar fails = require('../internals/fails');\nvar createElement = require('../internals/document-create-element');\n\n// Thanks to IE8 for its funny defineProperty\nmodule.exports = !DESCRIPTORS && !fails(function () {\n // eslint-disable-next-line es/no-object-defineproperty -- required for testing\n return Object.defineProperty(createElement('div'), 'a', {\n get: function () { return 7; }\n }).a != 7;\n});\n", "var DESCRIPTORS = require('../internals/descriptors');\nvar call = require('../internals/function-call');\nvar propertyIsEnumerableModule = require('../internals/object-property-is-enumerable');\nvar createPropertyDescriptor = require('../internals/create-property-descriptor');\nvar toIndexedObject = require('../internals/to-indexed-object');\nvar toPropertyKey = require('../internals/to-property-key');\nvar hasOwn = require('../internals/has-own-property');\nvar IE8_DOM_DEFINE = require('../internals/ie8-dom-define');\n\n// eslint-disable-next-line es/no-object-getownpropertydescriptor -- safe\nvar $getOwnPropertyDescriptor = Object.getOwnPropertyDescriptor;\n\n// `Object.getOwnPropertyDescriptor` method\n// https://tc39.es/ecma262/#sec-object.getownpropertydescriptor\nexports.f = DESCRIPTORS ? $getOwnPropertyDescriptor : function getOwnPropertyDescriptor(O, P) {\n O = toIndexedObject(O);\n P = toPropertyKey(P);\n if (IE8_DOM_DEFINE) try {\n return $getOwnPropertyDescriptor(O, P);\n } catch (error) { /* empty */ }\n if (hasOwn(O, P)) return createPropertyDescriptor(!call(propertyIsEnumerableModule.f, O, P), O[P]);\n};\n", "var DESCRIPTORS = require('../internals/descriptors');\nvar fails = require('../internals/fails');\n\n// V8 ~ Chrome 36-\n// https://bugs.chromium.org/p/v8/issues/detail?id=3334\nmodule.exports = DESCRIPTORS && fails(function () {\n // eslint-disable-next-line es/no-object-defineproperty -- required for testing\n return Object.defineProperty(function () { /* empty */ }, 'prototype', {\n value: 42,\n writable: false\n }).prototype != 42;\n});\n", "var isObject = require('../internals/is-object');\n\nvar $String = String;\nvar $TypeError = TypeError;\n\n// `Assert: Type(argument) is Object`\nmodule.exports = function (argument) {\n if (isObject(argument)) return argument;\n throw $TypeError($String(argument) + ' is not an object');\n};\n", "var DESCRIPTORS = require('../internals/descriptors');\nvar IE8_DOM_DEFINE = require('../internals/ie8-dom-define');\nvar V8_PROTOTYPE_DEFINE_BUG = require('../internals/v8-prototype-define-bug');\nvar anObject = require('../internals/an-object');\nvar toPropertyKey = require('../internals/to-property-key');\n\nvar $TypeError = TypeError;\n// eslint-disable-next-line es/no-object-defineproperty -- safe\nvar $defineProperty = Object.defineProperty;\n// eslint-disable-next-line es/no-object-getownpropertydescriptor -- safe\nvar $getOwnPropertyDescriptor = Object.getOwnPropertyDescriptor;\nvar ENUMERABLE = 'enumerable';\nvar CONFIGURABLE = 'configurable';\nvar WRITABLE = 'writable';\n\n// `Object.defineProperty` method\n// https://tc39.es/ecma262/#sec-object.defineproperty\nexports.f = DESCRIPTORS ? V8_PROTOTYPE_DEFINE_BUG ? function defineProperty(O, P, Attributes) {\n anObject(O);\n P = toPropertyKey(P);\n anObject(Attributes);\n if (typeof O === 'function' && P === 'prototype' && 'value' in Attributes && WRITABLE in Attributes && !Attributes[WRITABLE]) {\n var current = $getOwnPropertyDescriptor(O, P);\n if (current && current[WRITABLE]) {\n O[P] = Attributes.value;\n Attributes = {\n configurable: CONFIGURABLE in Attributes ? Attributes[CONFIGURABLE] : current[CONFIGURABLE],\n enumerable: ENUMERABLE in Attributes ? Attributes[ENUMERABLE] : current[ENUMERABLE],\n writable: false\n };\n }\n } return $defineProperty(O, P, Attributes);\n} : $defineProperty : function defineProperty(O, P, Attributes) {\n anObject(O);\n P = toPropertyKey(P);\n anObject(Attributes);\n if (IE8_DOM_DEFINE) try {\n return $defineProperty(O, P, Attributes);\n } catch (error) { /* empty */ }\n if ('get' in Attributes || 'set' in Attributes) throw $TypeError('Accessors not supported');\n if ('value' in Attributes) O[P] = Attributes.value;\n return O;\n};\n", "var DESCRIPTORS = require('../internals/descriptors');\nvar definePropertyModule = require('../internals/object-define-property');\nvar createPropertyDescriptor = require('../internals/create-property-descriptor');\n\nmodule.exports = DESCRIPTORS ? function (object, key, value) {\n return definePropertyModule.f(object, key, createPropertyDescriptor(1, value));\n} : function (object, key, value) {\n object[key] = value;\n return object;\n};\n", "var DESCRIPTORS = require('../internals/descriptors');\nvar hasOwn = require('../internals/has-own-property');\n\nvar FunctionPrototype = Function.prototype;\n// eslint-disable-next-line es/no-object-getownpropertydescriptor -- safe\nvar getDescriptor = DESCRIPTORS && Object.getOwnPropertyDescriptor;\n\nvar EXISTS = hasOwn(FunctionPrototype, 'name');\n// additional protection from minified / mangled / dropped function names\nvar PROPER = EXISTS && (function something() { /* empty */ }).name === 'something';\nvar CONFIGURABLE = EXISTS && (!DESCRIPTORS || (DESCRIPTORS && getDescriptor(FunctionPrototype, 'name').configurable));\n\nmodule.exports = {\n EXISTS: EXISTS,\n PROPER: PROPER,\n CONFIGURABLE: CONFIGURABLE\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar isCallable = require('../internals/is-callable');\nvar store = require('../internals/shared-store');\n\nvar functionToString = uncurryThis(Function.toString);\n\n// this helper broken in `core-js@3.4.1-3.4.4`, so we can't use `shared` helper\nif (!isCallable(store.inspectSource)) {\n store.inspectSource = function (it) {\n return functionToString(it);\n };\n}\n\nmodule.exports = store.inspectSource;\n", "var global = require('../internals/global');\nvar isCallable = require('../internals/is-callable');\n\nvar WeakMap = global.WeakMap;\n\nmodule.exports = isCallable(WeakMap) && /native code/.test(String(WeakMap));\n", "var shared = require('../internals/shared');\nvar uid = require('../internals/uid');\n\nvar keys = shared('keys');\n\nmodule.exports = function (key) {\n return keys[key] || (keys[key] = uid(key));\n};\n", "module.exports = {};\n", "var NATIVE_WEAK_MAP = require('../internals/weak-map-basic-detection');\nvar global = require('../internals/global');\nvar isObject = require('../internals/is-object');\nvar createNonEnumerableProperty = require('../internals/create-non-enumerable-property');\nvar hasOwn = require('../internals/has-own-property');\nvar shared = require('../internals/shared-store');\nvar sharedKey = require('../internals/shared-key');\nvar hiddenKeys = require('../internals/hidden-keys');\n\nvar OBJECT_ALREADY_INITIALIZED = 'Object already initialized';\nvar TypeError = global.TypeError;\nvar WeakMap = global.WeakMap;\nvar set, get, has;\n\nvar enforce = function (it) {\n return has(it) ? get(it) : set(it, {});\n};\n\nvar getterFor = function (TYPE) {\n return function (it) {\n var state;\n if (!isObject(it) || (state = get(it)).type !== TYPE) {\n throw TypeError('Incompatible receiver, ' + TYPE + ' required');\n } return state;\n };\n};\n\nif (NATIVE_WEAK_MAP || shared.state) {\n var store = shared.state || (shared.state = new WeakMap());\n /* eslint-disable no-self-assign -- prototype methods protection */\n store.get = store.get;\n store.has = store.has;\n store.set = store.set;\n /* eslint-enable no-self-assign -- prototype methods protection */\n set = function (it, metadata) {\n if (store.has(it)) throw TypeError(OBJECT_ALREADY_INITIALIZED);\n metadata.facade = it;\n store.set(it, metadata);\n return metadata;\n };\n get = function (it) {\n return store.get(it) || {};\n };\n has = function (it) {\n return store.has(it);\n };\n} else {\n var STATE = sharedKey('state');\n hiddenKeys[STATE] = true;\n set = function (it, metadata) {\n if (hasOwn(it, STATE)) throw TypeError(OBJECT_ALREADY_INITIALIZED);\n metadata.facade = it;\n createNonEnumerableProperty(it, STATE, metadata);\n return metadata;\n };\n get = function (it) {\n return hasOwn(it, STATE) ? it[STATE] : {};\n };\n has = function (it) {\n return hasOwn(it, STATE);\n };\n}\n\nmodule.exports = {\n set: set,\n get: get,\n has: has,\n enforce: enforce,\n getterFor: getterFor\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar fails = require('../internals/fails');\nvar isCallable = require('../internals/is-callable');\nvar hasOwn = require('../internals/has-own-property');\nvar DESCRIPTORS = require('../internals/descriptors');\nvar CONFIGURABLE_FUNCTION_NAME = require('../internals/function-name').CONFIGURABLE;\nvar inspectSource = require('../internals/inspect-source');\nvar InternalStateModule = require('../internals/internal-state');\n\nvar enforceInternalState = InternalStateModule.enforce;\nvar getInternalState = InternalStateModule.get;\nvar $String = String;\n// eslint-disable-next-line es/no-object-defineproperty -- safe\nvar defineProperty = Object.defineProperty;\nvar stringSlice = uncurryThis(''.slice);\nvar replace = uncurryThis(''.replace);\nvar join = uncurryThis([].join);\n\nvar CONFIGURABLE_LENGTH = DESCRIPTORS && !fails(function () {\n return defineProperty(function () { /* empty */ }, 'length', { value: 8 }).length !== 8;\n});\n\nvar TEMPLATE = String(String).split('String');\n\nvar makeBuiltIn = module.exports = function (value, name, options) {\n if (stringSlice($String(name), 0, 7) === 'Symbol(') {\n name = '[' + replace($String(name), /^Symbol\\(([^)]*)\\)/, '$1') + ']';\n }\n if (options && options.getter) name = 'get ' + name;\n if (options && options.setter) name = 'set ' + name;\n if (!hasOwn(value, 'name') || (CONFIGURABLE_FUNCTION_NAME && value.name !== name)) {\n if (DESCRIPTORS) defineProperty(value, 'name', { value: name, configurable: true });\n else value.name = name;\n }\n if (CONFIGURABLE_LENGTH && options && hasOwn(options, 'arity') && value.length !== options.arity) {\n defineProperty(value, 'length', { value: options.arity });\n }\n try {\n if (options && hasOwn(options, 'constructor') && options.constructor) {\n if (DESCRIPTORS) defineProperty(value, 'prototype', { writable: false });\n // in V8 ~ Chrome 53, prototypes of some methods, like `Array.prototype.values`, are non-writable\n } else if (value.prototype) value.prototype = undefined;\n } catch (error) { /* empty */ }\n var state = enforceInternalState(value);\n if (!hasOwn(state, 'source')) {\n state.source = join(TEMPLATE, typeof name == 'string' ? name : '');\n } return value;\n};\n\n// add fake Function#toString for correct work wrapped methods / constructors with methods like LoDash isNative\n// eslint-disable-next-line no-extend-native -- required\nFunction.prototype.toString = makeBuiltIn(function toString() {\n return isCallable(this) && getInternalState(this).source || inspectSource(this);\n}, 'toString');\n", "var isCallable = require('../internals/is-callable');\nvar definePropertyModule = require('../internals/object-define-property');\nvar makeBuiltIn = require('../internals/make-built-in');\nvar defineGlobalProperty = require('../internals/define-global-property');\n\nmodule.exports = function (O, key, value, options) {\n if (!options) options = {};\n var simple = options.enumerable;\n var name = options.name !== undefined ? options.name : key;\n if (isCallable(value)) makeBuiltIn(value, name, options);\n if (options.global) {\n if (simple) O[key] = value;\n else defineGlobalProperty(key, value);\n } else {\n try {\n if (!options.unsafe) delete O[key];\n else if (O[key]) simple = true;\n } catch (error) { /* empty */ }\n if (simple) O[key] = value;\n else definePropertyModule.f(O, key, {\n value: value,\n enumerable: false,\n configurable: !options.nonConfigurable,\n writable: !options.nonWritable\n });\n } return O;\n};\n", "var ceil = Math.ceil;\nvar floor = Math.floor;\n\n// `Math.trunc` method\n// https://tc39.es/ecma262/#sec-math.trunc\n// eslint-disable-next-line es/no-math-trunc -- safe\nmodule.exports = Math.trunc || function trunc(x) {\n var n = +x;\n return (n > 0 ? floor : ceil)(n);\n};\n", "var trunc = require('../internals/math-trunc');\n\n// `ToIntegerOrInfinity` abstract operation\n// https://tc39.es/ecma262/#sec-tointegerorinfinity\nmodule.exports = function (argument) {\n var number = +argument;\n // eslint-disable-next-line no-self-compare -- NaN check\n return number !== number || number === 0 ? 0 : trunc(number);\n};\n", "var toIntegerOrInfinity = require('../internals/to-integer-or-infinity');\n\nvar max = Math.max;\nvar min = Math.min;\n\n// Helper for a popular repeating case of the spec:\n// Let integer be ? ToInteger(index).\n// If integer < 0, let result be max((length + integer), 0); else let result be min(integer, length).\nmodule.exports = function (index, length) {\n var integer = toIntegerOrInfinity(index);\n return integer < 0 ? max(integer + length, 0) : min(integer, length);\n};\n", "var toIntegerOrInfinity = require('../internals/to-integer-or-infinity');\n\nvar min = Math.min;\n\n// `ToLength` abstract operation\n// https://tc39.es/ecma262/#sec-tolength\nmodule.exports = function (argument) {\n return argument > 0 ? min(toIntegerOrInfinity(argument), 0x1FFFFFFFFFFFFF) : 0; // 2 ** 53 - 1 == 9007199254740991\n};\n", "var toLength = require('../internals/to-length');\n\n// `LengthOfArrayLike` abstract operation\n// https://tc39.es/ecma262/#sec-lengthofarraylike\nmodule.exports = function (obj) {\n return toLength(obj.length);\n};\n", "var toIndexedObject = require('../internals/to-indexed-object');\nvar toAbsoluteIndex = require('../internals/to-absolute-index');\nvar lengthOfArrayLike = require('../internals/length-of-array-like');\n\n// `Array.prototype.{ indexOf, includes }` methods implementation\nvar createMethod = function (IS_INCLUDES) {\n return function ($this, el, fromIndex) {\n var O = toIndexedObject($this);\n var length = lengthOfArrayLike(O);\n var index = toAbsoluteIndex(fromIndex, length);\n var value;\n // Array#includes uses SameValueZero equality algorithm\n // eslint-disable-next-line no-self-compare -- NaN check\n if (IS_INCLUDES && el != el) while (length > index) {\n value = O[index++];\n // eslint-disable-next-line no-self-compare -- NaN check\n if (value != value) return true;\n // Array#indexOf ignores holes, Array#includes - not\n } else for (;length > index; index++) {\n if ((IS_INCLUDES || index in O) && O[index] === el) return IS_INCLUDES || index || 0;\n } return !IS_INCLUDES && -1;\n };\n};\n\nmodule.exports = {\n // `Array.prototype.includes` method\n // https://tc39.es/ecma262/#sec-array.prototype.includes\n includes: createMethod(true),\n // `Array.prototype.indexOf` method\n // https://tc39.es/ecma262/#sec-array.prototype.indexof\n indexOf: createMethod(false)\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar hasOwn = require('../internals/has-own-property');\nvar toIndexedObject = require('../internals/to-indexed-object');\nvar indexOf = require('../internals/array-includes').indexOf;\nvar hiddenKeys = require('../internals/hidden-keys');\n\nvar push = uncurryThis([].push);\n\nmodule.exports = function (object, names) {\n var O = toIndexedObject(object);\n var i = 0;\n var result = [];\n var key;\n for (key in O) !hasOwn(hiddenKeys, key) && hasOwn(O, key) && push(result, key);\n // Don't enum bug & hidden keys\n while (names.length > i) if (hasOwn(O, key = names[i++])) {\n ~indexOf(result, key) || push(result, key);\n }\n return result;\n};\n", "// IE8- don't enum bug keys\nmodule.exports = [\n 'constructor',\n 'hasOwnProperty',\n 'isPrototypeOf',\n 'propertyIsEnumerable',\n 'toLocaleString',\n 'toString',\n 'valueOf'\n];\n", "var internalObjectKeys = require('../internals/object-keys-internal');\nvar enumBugKeys = require('../internals/enum-bug-keys');\n\nvar hiddenKeys = enumBugKeys.concat('length', 'prototype');\n\n// `Object.getOwnPropertyNames` method\n// https://tc39.es/ecma262/#sec-object.getownpropertynames\n// eslint-disable-next-line es/no-object-getownpropertynames -- safe\nexports.f = Object.getOwnPropertyNames || function getOwnPropertyNames(O) {\n return internalObjectKeys(O, hiddenKeys);\n};\n", "// eslint-disable-next-line es/no-object-getownpropertysymbols -- safe\nexports.f = Object.getOwnPropertySymbols;\n", "var getBuiltIn = require('../internals/get-built-in');\nvar uncurryThis = require('../internals/function-uncurry-this');\nvar getOwnPropertyNamesModule = require('../internals/object-get-own-property-names');\nvar getOwnPropertySymbolsModule = require('../internals/object-get-own-property-symbols');\nvar anObject = require('../internals/an-object');\n\nvar concat = uncurryThis([].concat);\n\n// all object keys, includes non-enumerable and symbols\nmodule.exports = getBuiltIn('Reflect', 'ownKeys') || function ownKeys(it) {\n var keys = getOwnPropertyNamesModule.f(anObject(it));\n var getOwnPropertySymbols = getOwnPropertySymbolsModule.f;\n return getOwnPropertySymbols ? concat(keys, getOwnPropertySymbols(it)) : keys;\n};\n", "var hasOwn = require('../internals/has-own-property');\nvar ownKeys = require('../internals/own-keys');\nvar getOwnPropertyDescriptorModule = require('../internals/object-get-own-property-descriptor');\nvar definePropertyModule = require('../internals/object-define-property');\n\nmodule.exports = function (target, source, exceptions) {\n var keys = ownKeys(source);\n var defineProperty = definePropertyModule.f;\n var getOwnPropertyDescriptor = getOwnPropertyDescriptorModule.f;\n for (var i = 0; i < keys.length; i++) {\n var key = keys[i];\n if (!hasOwn(target, key) && !(exceptions && hasOwn(exceptions, key))) {\n defineProperty(target, key, getOwnPropertyDescriptor(source, key));\n }\n }\n};\n", "var fails = require('../internals/fails');\nvar isCallable = require('../internals/is-callable');\n\nvar replacement = /#|\\.prototype\\./;\n\nvar isForced = function (feature, detection) {\n var value = data[normalize(feature)];\n return value == POLYFILL ? true\n : value == NATIVE ? false\n : isCallable(detection) ? fails(detection)\n : !!detection;\n};\n\nvar normalize = isForced.normalize = function (string) {\n return String(string).replace(replacement, '.').toLowerCase();\n};\n\nvar data = isForced.data = {};\nvar NATIVE = isForced.NATIVE = 'N';\nvar POLYFILL = isForced.POLYFILL = 'P';\n\nmodule.exports = isForced;\n", "var global = require('../internals/global');\nvar getOwnPropertyDescriptor = require('../internals/object-get-own-property-descriptor').f;\nvar createNonEnumerableProperty = require('../internals/create-non-enumerable-property');\nvar defineBuiltIn = require('../internals/define-built-in');\nvar defineGlobalProperty = require('../internals/define-global-property');\nvar copyConstructorProperties = require('../internals/copy-constructor-properties');\nvar isForced = require('../internals/is-forced');\n\n/*\n options.target - name of the target object\n options.global - target is the global object\n options.stat - export as static methods of target\n options.proto - export as prototype methods of target\n options.real - real prototype method for the `pure` version\n options.forced - export even if the native feature is available\n options.bind - bind methods to the target, required for the `pure` version\n options.wrap - wrap constructors to preventing global pollution, required for the `pure` version\n options.unsafe - use the simple assignment of property instead of delete + defineProperty\n options.sham - add a flag to not completely full polyfills\n options.enumerable - export as enumerable property\n options.dontCallGetSet - prevent calling a getter on target\n options.name - the .name of the function if it does not match the key\n*/\nmodule.exports = function (options, source) {\n var TARGET = options.target;\n var GLOBAL = options.global;\n var STATIC = options.stat;\n var FORCED, target, key, targetProperty, sourceProperty, descriptor;\n if (GLOBAL) {\n target = global;\n } else if (STATIC) {\n target = global[TARGET] || defineGlobalProperty(TARGET, {});\n } else {\n target = (global[TARGET] || {}).prototype;\n }\n if (target) for (key in source) {\n sourceProperty = source[key];\n if (options.dontCallGetSet) {\n descriptor = getOwnPropertyDescriptor(target, key);\n targetProperty = descriptor && descriptor.value;\n } else targetProperty = target[key];\n FORCED = isForced(GLOBAL ? key : TARGET + (STATIC ? '.' : '#') + key, options.forced);\n // contained in target\n if (!FORCED && targetProperty !== undefined) {\n if (typeof sourceProperty == typeof targetProperty) continue;\n copyConstructorProperties(sourceProperty, targetProperty);\n }\n // add a flag to not completely full polyfills\n if (options.sham || (targetProperty && targetProperty.sham)) {\n createNonEnumerableProperty(sourceProperty, 'sham', true);\n }\n defineBuiltIn(target, key, sourceProperty, options);\n }\n};\n", "var wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar TO_STRING_TAG = wellKnownSymbol('toStringTag');\nvar test = {};\n\ntest[TO_STRING_TAG] = 'z';\n\nmodule.exports = String(test) === '[object z]';\n", "var TO_STRING_TAG_SUPPORT = require('../internals/to-string-tag-support');\nvar isCallable = require('../internals/is-callable');\nvar classofRaw = require('../internals/classof-raw');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar TO_STRING_TAG = wellKnownSymbol('toStringTag');\nvar $Object = Object;\n\n// ES3 wrong here\nvar CORRECT_ARGUMENTS = classofRaw(function () { return arguments; }()) == 'Arguments';\n\n// fallback for IE11 Script Access Denied error\nvar tryGet = function (it, key) {\n try {\n return it[key];\n } catch (error) { /* empty */ }\n};\n\n// getting tag from ES6+ `Object.prototype.toString`\nmodule.exports = TO_STRING_TAG_SUPPORT ? classofRaw : function (it) {\n var O, tag, result;\n return it === undefined ? 'Undefined' : it === null ? 'Null'\n // @@toStringTag case\n : typeof (tag = tryGet(O = $Object(it), TO_STRING_TAG)) == 'string' ? tag\n // builtinTag case\n : CORRECT_ARGUMENTS ? classofRaw(O)\n // ES3 arguments fallback\n : (result = classofRaw(O)) == 'Object' && isCallable(O.callee) ? 'Arguments' : result;\n};\n", "var classof = require('../internals/classof');\n\nvar $String = String;\n\nmodule.exports = function (argument) {\n if (classof(argument) === 'Symbol') throw TypeError('Cannot convert a Symbol value to a string');\n return $String(argument);\n};\n", "'use strict';\nvar anObject = require('../internals/an-object');\n\n// `RegExp.prototype.flags` getter implementation\n// https://tc39.es/ecma262/#sec-get-regexp.prototype.flags\nmodule.exports = function () {\n var that = anObject(this);\n var result = '';\n if (that.hasIndices) result += 'd';\n if (that.global) result += 'g';\n if (that.ignoreCase) result += 'i';\n if (that.multiline) result += 'm';\n if (that.dotAll) result += 's';\n if (that.unicode) result += 'u';\n if (that.unicodeSets) result += 'v';\n if (that.sticky) result += 'y';\n return result;\n};\n", "var fails = require('../internals/fails');\nvar global = require('../internals/global');\n\n// babel-minify and Closure Compiler transpiles RegExp('a', 'y') -> /a/y and it causes SyntaxError\nvar $RegExp = global.RegExp;\n\nvar UNSUPPORTED_Y = fails(function () {\n var re = $RegExp('a', 'y');\n re.lastIndex = 2;\n return re.exec('abcd') != null;\n});\n\n// UC Browser bug\n// https://github.com/zloirock/core-js/issues/1008\nvar MISSED_STICKY = UNSUPPORTED_Y || fails(function () {\n return !$RegExp('a', 'y').sticky;\n});\n\nvar BROKEN_CARET = UNSUPPORTED_Y || fails(function () {\n // https://bugzilla.mozilla.org/show_bug.cgi?id=773687\n var re = $RegExp('^r', 'gy');\n re.lastIndex = 2;\n return re.exec('str') != null;\n});\n\nmodule.exports = {\n BROKEN_CARET: BROKEN_CARET,\n MISSED_STICKY: MISSED_STICKY,\n UNSUPPORTED_Y: UNSUPPORTED_Y\n};\n", "var internalObjectKeys = require('../internals/object-keys-internal');\nvar enumBugKeys = require('../internals/enum-bug-keys');\n\n// `Object.keys` method\n// https://tc39.es/ecma262/#sec-object.keys\n// eslint-disable-next-line es/no-object-keys -- safe\nmodule.exports = Object.keys || function keys(O) {\n return internalObjectKeys(O, enumBugKeys);\n};\n", "var DESCRIPTORS = require('../internals/descriptors');\nvar V8_PROTOTYPE_DEFINE_BUG = require('../internals/v8-prototype-define-bug');\nvar definePropertyModule = require('../internals/object-define-property');\nvar anObject = require('../internals/an-object');\nvar toIndexedObject = require('../internals/to-indexed-object');\nvar objectKeys = require('../internals/object-keys');\n\n// `Object.defineProperties` method\n// https://tc39.es/ecma262/#sec-object.defineproperties\n// eslint-disable-next-line es/no-object-defineproperties -- safe\nexports.f = DESCRIPTORS && !V8_PROTOTYPE_DEFINE_BUG ? Object.defineProperties : function defineProperties(O, Properties) {\n anObject(O);\n var props = toIndexedObject(Properties);\n var keys = objectKeys(Properties);\n var length = keys.length;\n var index = 0;\n var key;\n while (length > index) definePropertyModule.f(O, key = keys[index++], props[key]);\n return O;\n};\n", "var getBuiltIn = require('../internals/get-built-in');\n\nmodule.exports = getBuiltIn('document', 'documentElement');\n", "/* global ActiveXObject -- old IE, WSH */\nvar anObject = require('../internals/an-object');\nvar definePropertiesModule = require('../internals/object-define-properties');\nvar enumBugKeys = require('../internals/enum-bug-keys');\nvar hiddenKeys = require('../internals/hidden-keys');\nvar html = require('../internals/html');\nvar documentCreateElement = require('../internals/document-create-element');\nvar sharedKey = require('../internals/shared-key');\n\nvar GT = '>';\nvar LT = '<';\nvar PROTOTYPE = 'prototype';\nvar SCRIPT = 'script';\nvar IE_PROTO = sharedKey('IE_PROTO');\n\nvar EmptyConstructor = function () { /* empty */ };\n\nvar scriptTag = function (content) {\n return LT + SCRIPT + GT + content + LT + '/' + SCRIPT + GT;\n};\n\n// Create object with fake `null` prototype: use ActiveX Object with cleared prototype\nvar NullProtoObjectViaActiveX = function (activeXDocument) {\n activeXDocument.write(scriptTag(''));\n activeXDocument.close();\n var temp = activeXDocument.parentWindow.Object;\n activeXDocument = null; // avoid memory leak\n return temp;\n};\n\n// Create object with fake `null` prototype: use iframe Object with cleared prototype\nvar NullProtoObjectViaIFrame = function () {\n // Thrash, waste and sodomy: IE GC bug\n var iframe = documentCreateElement('iframe');\n var JS = 'java' + SCRIPT + ':';\n var iframeDocument;\n iframe.style.display = 'none';\n html.appendChild(iframe);\n // https://github.com/zloirock/core-js/issues/475\n iframe.src = String(JS);\n iframeDocument = iframe.contentWindow.document;\n iframeDocument.open();\n iframeDocument.write(scriptTag('document.F=Object'));\n iframeDocument.close();\n return iframeDocument.F;\n};\n\n// Check for document.domain and active x support\n// No need to use active x approach when document.domain is not set\n// see https://github.com/es-shims/es5-shim/issues/150\n// variation of https://github.com/kitcambridge/es5-shim/commit/4f738ac066346\n// avoid IE GC bug\nvar activeXDocument;\nvar NullProtoObject = function () {\n try {\n activeXDocument = new ActiveXObject('htmlfile');\n } catch (error) { /* ignore */ }\n NullProtoObject = typeof document != 'undefined'\n ? document.domain && activeXDocument\n ? NullProtoObjectViaActiveX(activeXDocument) // old IE\n : NullProtoObjectViaIFrame()\n : NullProtoObjectViaActiveX(activeXDocument); // WSH\n var length = enumBugKeys.length;\n while (length--) delete NullProtoObject[PROTOTYPE][enumBugKeys[length]];\n return NullProtoObject();\n};\n\nhiddenKeys[IE_PROTO] = true;\n\n// `Object.create` method\n// https://tc39.es/ecma262/#sec-object.create\n// eslint-disable-next-line es/no-object-create -- safe\nmodule.exports = Object.create || function create(O, Properties) {\n var result;\n if (O !== null) {\n EmptyConstructor[PROTOTYPE] = anObject(O);\n result = new EmptyConstructor();\n EmptyConstructor[PROTOTYPE] = null;\n // add \"__proto__\" for Object.getPrototypeOf polyfill\n result[IE_PROTO] = O;\n } else result = NullProtoObject();\n return Properties === undefined ? result : definePropertiesModule.f(result, Properties);\n};\n", "var fails = require('../internals/fails');\nvar global = require('../internals/global');\n\n// babel-minify and Closure Compiler transpiles RegExp('.', 's') -> /./s and it causes SyntaxError\nvar $RegExp = global.RegExp;\n\nmodule.exports = fails(function () {\n var re = $RegExp('.', 's');\n return !(re.dotAll && re.exec('\\n') && re.flags === 's');\n});\n", "var fails = require('../internals/fails');\nvar global = require('../internals/global');\n\n// babel-minify and Closure Compiler transpiles RegExp('(?b)', 'g') -> /(?b)/g and it causes SyntaxError\nvar $RegExp = global.RegExp;\n\nmodule.exports = fails(function () {\n var re = $RegExp('(?b)', 'g');\n return re.exec('b').groups.a !== 'b' ||\n 'b'.replace(re, '$c') !== 'bc';\n});\n", "'use strict';\n/* eslint-disable regexp/no-empty-capturing-group, regexp/no-empty-group, regexp/no-lazy-ends -- testing */\n/* eslint-disable regexp/no-useless-quantifier -- testing */\nvar call = require('../internals/function-call');\nvar uncurryThis = require('../internals/function-uncurry-this');\nvar toString = require('../internals/to-string');\nvar regexpFlags = require('../internals/regexp-flags');\nvar stickyHelpers = require('../internals/regexp-sticky-helpers');\nvar shared = require('../internals/shared');\nvar create = require('../internals/object-create');\nvar getInternalState = require('../internals/internal-state').get;\nvar UNSUPPORTED_DOT_ALL = require('../internals/regexp-unsupported-dot-all');\nvar UNSUPPORTED_NCG = require('../internals/regexp-unsupported-ncg');\n\nvar nativeReplace = shared('native-string-replace', String.prototype.replace);\nvar nativeExec = RegExp.prototype.exec;\nvar patchedExec = nativeExec;\nvar charAt = uncurryThis(''.charAt);\nvar indexOf = uncurryThis(''.indexOf);\nvar replace = uncurryThis(''.replace);\nvar stringSlice = uncurryThis(''.slice);\n\nvar UPDATES_LAST_INDEX_WRONG = (function () {\n var re1 = /a/;\n var re2 = /b*/g;\n call(nativeExec, re1, 'a');\n call(nativeExec, re2, 'a');\n return re1.lastIndex !== 0 || re2.lastIndex !== 0;\n})();\n\nvar UNSUPPORTED_Y = stickyHelpers.BROKEN_CARET;\n\n// nonparticipating capturing group, copied from es5-shim's String#split patch.\nvar NPCG_INCLUDED = /()??/.exec('')[1] !== undefined;\n\nvar PATCH = UPDATES_LAST_INDEX_WRONG || NPCG_INCLUDED || UNSUPPORTED_Y || UNSUPPORTED_DOT_ALL || UNSUPPORTED_NCG;\n\nif (PATCH) {\n patchedExec = function exec(string) {\n var re = this;\n var state = getInternalState(re);\n var str = toString(string);\n var raw = state.raw;\n var result, reCopy, lastIndex, match, i, object, group;\n\n if (raw) {\n raw.lastIndex = re.lastIndex;\n result = call(patchedExec, raw, str);\n re.lastIndex = raw.lastIndex;\n return result;\n }\n\n var groups = state.groups;\n var sticky = UNSUPPORTED_Y && re.sticky;\n var flags = call(regexpFlags, re);\n var source = re.source;\n var charsAdded = 0;\n var strCopy = str;\n\n if (sticky) {\n flags = replace(flags, 'y', '');\n if (indexOf(flags, 'g') === -1) {\n flags += 'g';\n }\n\n strCopy = stringSlice(str, re.lastIndex);\n // Support anchored sticky behavior.\n if (re.lastIndex > 0 && (!re.multiline || re.multiline && charAt(str, re.lastIndex - 1) !== '\\n')) {\n source = '(?: ' + source + ')';\n strCopy = ' ' + strCopy;\n charsAdded++;\n }\n // ^(? + rx + ) is needed, in combination with some str slicing, to\n // simulate the 'y' flag.\n reCopy = new RegExp('^(?:' + source + ')', flags);\n }\n\n if (NPCG_INCLUDED) {\n reCopy = new RegExp('^' + source + '$(?!\\\\s)', flags);\n }\n if (UPDATES_LAST_INDEX_WRONG) lastIndex = re.lastIndex;\n\n match = call(nativeExec, sticky ? reCopy : re, strCopy);\n\n if (sticky) {\n if (match) {\n match.input = stringSlice(match.input, charsAdded);\n match[0] = stringSlice(match[0], charsAdded);\n match.index = re.lastIndex;\n re.lastIndex += match[0].length;\n } else re.lastIndex = 0;\n } else if (UPDATES_LAST_INDEX_WRONG && match) {\n re.lastIndex = re.global ? match.index + match[0].length : lastIndex;\n }\n if (NPCG_INCLUDED && match && match.length > 1) {\n // Fix browsers whose `exec` methods don't consistently return `undefined`\n // for NPCG, like IE8. NOTE: This doesn't work for /(.?)?/\n call(nativeReplace, match[0], reCopy, function () {\n for (i = 1; i < arguments.length - 2; i++) {\n if (arguments[i] === undefined) match[i] = undefined;\n }\n });\n }\n\n if (match && groups) {\n match.groups = object = create(null);\n for (i = 0; i < groups.length; i++) {\n group = groups[i];\n object[group[0]] = match[group[1]];\n }\n }\n\n return match;\n };\n}\n\nmodule.exports = patchedExec;\n", "'use strict';\nvar $ = require('../internals/export');\nvar exec = require('../internals/regexp-exec');\n\n// `RegExp.prototype.exec` method\n// https://tc39.es/ecma262/#sec-regexp.prototype.exec\n$({ target: 'RegExp', proto: true, forced: /./.exec !== exec }, {\n exec: exec\n});\n", "var NATIVE_BIND = require('../internals/function-bind-native');\n\nvar FunctionPrototype = Function.prototype;\nvar apply = FunctionPrototype.apply;\nvar call = FunctionPrototype.call;\n\n// eslint-disable-next-line es/no-reflect -- safe\nmodule.exports = typeof Reflect == 'object' && Reflect.apply || (NATIVE_BIND ? call.bind(apply) : function () {\n return call.apply(apply, arguments);\n});\n", "var classofRaw = require('../internals/classof-raw');\nvar uncurryThis = require('../internals/function-uncurry-this');\n\nmodule.exports = function (fn) {\n // Nashorn bug:\n // https://github.com/zloirock/core-js/issues/1128\n // https://github.com/zloirock/core-js/issues/1130\n if (classofRaw(fn) === 'Function') return uncurryThis(fn);\n};\n", "'use strict';\n// TODO: Remove from `core-js@4` since it's moved to entry points\nrequire('../modules/es.regexp.exec');\nvar uncurryThis = require('../internals/function-uncurry-this-clause');\nvar defineBuiltIn = require('../internals/define-built-in');\nvar regexpExec = require('../internals/regexp-exec');\nvar fails = require('../internals/fails');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar createNonEnumerableProperty = require('../internals/create-non-enumerable-property');\n\nvar SPECIES = wellKnownSymbol('species');\nvar RegExpPrototype = RegExp.prototype;\n\nmodule.exports = function (KEY, exec, FORCED, SHAM) {\n var SYMBOL = wellKnownSymbol(KEY);\n\n var DELEGATES_TO_SYMBOL = !fails(function () {\n // String methods call symbol-named RegEp methods\n var O = {};\n O[SYMBOL] = function () { return 7; };\n return ''[KEY](O) != 7;\n });\n\n var DELEGATES_TO_EXEC = DELEGATES_TO_SYMBOL && !fails(function () {\n // Symbol-named RegExp methods call .exec\n var execCalled = false;\n var re = /a/;\n\n if (KEY === 'split') {\n // We can't use real regex here since it causes deoptimization\n // and serious performance degradation in V8\n // https://github.com/zloirock/core-js/issues/306\n re = {};\n // RegExp[@@split] doesn't call the regex's exec method, but first creates\n // a new one. We need to return the patched regex when creating the new one.\n re.constructor = {};\n re.constructor[SPECIES] = function () { return re; };\n re.flags = '';\n re[SYMBOL] = /./[SYMBOL];\n }\n\n re.exec = function () { execCalled = true; return null; };\n\n re[SYMBOL]('');\n return !execCalled;\n });\n\n if (\n !DELEGATES_TO_SYMBOL ||\n !DELEGATES_TO_EXEC ||\n FORCED\n ) {\n var uncurriedNativeRegExpMethod = uncurryThis(/./[SYMBOL]);\n var methods = exec(SYMBOL, ''[KEY], function (nativeMethod, regexp, str, arg2, forceStringMethod) {\n var uncurriedNativeMethod = uncurryThis(nativeMethod);\n var $exec = regexp.exec;\n if ($exec === regexpExec || $exec === RegExpPrototype.exec) {\n if (DELEGATES_TO_SYMBOL && !forceStringMethod) {\n // The native String method already delegates to @@method (this\n // polyfilled function), leasing to infinite recursion.\n // We avoid it by directly calling the native @@method method.\n return { done: true, value: uncurriedNativeRegExpMethod(regexp, str, arg2) };\n }\n return { done: true, value: uncurriedNativeMethod(str, regexp, arg2) };\n }\n return { done: false };\n });\n\n defineBuiltIn(String.prototype, KEY, methods[0]);\n defineBuiltIn(RegExpPrototype, SYMBOL, methods[1]);\n }\n\n if (SHAM) createNonEnumerableProperty(RegExpPrototype[SYMBOL], 'sham', true);\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar toIntegerOrInfinity = require('../internals/to-integer-or-infinity');\nvar toString = require('../internals/to-string');\nvar requireObjectCoercible = require('../internals/require-object-coercible');\n\nvar charAt = uncurryThis(''.charAt);\nvar charCodeAt = uncurryThis(''.charCodeAt);\nvar stringSlice = uncurryThis(''.slice);\n\nvar createMethod = function (CONVERT_TO_STRING) {\n return function ($this, pos) {\n var S = toString(requireObjectCoercible($this));\n var position = toIntegerOrInfinity(pos);\n var size = S.length;\n var first, second;\n if (position < 0 || position >= size) return CONVERT_TO_STRING ? '' : undefined;\n first = charCodeAt(S, position);\n return first < 0xD800 || first > 0xDBFF || position + 1 === size\n || (second = charCodeAt(S, position + 1)) < 0xDC00 || second > 0xDFFF\n ? CONVERT_TO_STRING\n ? charAt(S, position)\n : first\n : CONVERT_TO_STRING\n ? stringSlice(S, position, position + 2)\n : (first - 0xD800 << 10) + (second - 0xDC00) + 0x10000;\n };\n};\n\nmodule.exports = {\n // `String.prototype.codePointAt` method\n // https://tc39.es/ecma262/#sec-string.prototype.codepointat\n codeAt: createMethod(false),\n // `String.prototype.at` method\n // https://github.com/mathiasbynens/String.prototype.at\n charAt: createMethod(true)\n};\n", "'use strict';\nvar charAt = require('../internals/string-multibyte').charAt;\n\n// `AdvanceStringIndex` abstract operation\n// https://tc39.es/ecma262/#sec-advancestringindex\nmodule.exports = function (S, index, unicode) {\n return index + (unicode ? charAt(S, index).length : 1);\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar toObject = require('../internals/to-object');\n\nvar floor = Math.floor;\nvar charAt = uncurryThis(''.charAt);\nvar replace = uncurryThis(''.replace);\nvar stringSlice = uncurryThis(''.slice);\n// eslint-disable-next-line redos/no-vulnerable -- safe\nvar SUBSTITUTION_SYMBOLS = /\\$([$&'`]|\\d{1,2}|<[^>]*>)/g;\nvar SUBSTITUTION_SYMBOLS_NO_NAMED = /\\$([$&'`]|\\d{1,2})/g;\n\n// `GetSubstitution` abstract operation\n// https://tc39.es/ecma262/#sec-getsubstitution\nmodule.exports = function (matched, str, position, captures, namedCaptures, replacement) {\n var tailPos = position + matched.length;\n var m = captures.length;\n var symbols = SUBSTITUTION_SYMBOLS_NO_NAMED;\n if (namedCaptures !== undefined) {\n namedCaptures = toObject(namedCaptures);\n symbols = SUBSTITUTION_SYMBOLS;\n }\n return replace(replacement, symbols, function (match, ch) {\n var capture;\n switch (charAt(ch, 0)) {\n case '$': return '$';\n case '&': return matched;\n case '`': return stringSlice(str, 0, position);\n case \"'\": return stringSlice(str, tailPos);\n case '<':\n capture = namedCaptures[stringSlice(ch, 1, -1)];\n break;\n default: // \\d\\d?\n var n = +ch;\n if (n === 0) return match;\n if (n > m) {\n var f = floor(n / 10);\n if (f === 0) return match;\n if (f <= m) return captures[f - 1] === undefined ? charAt(ch, 1) : captures[f - 1] + charAt(ch, 1);\n return match;\n }\n capture = captures[n - 1];\n }\n return capture === undefined ? '' : capture;\n });\n};\n", "var call = require('../internals/function-call');\nvar anObject = require('../internals/an-object');\nvar isCallable = require('../internals/is-callable');\nvar classof = require('../internals/classof-raw');\nvar regexpExec = require('../internals/regexp-exec');\n\nvar $TypeError = TypeError;\n\n// `RegExpExec` abstract operation\n// https://tc39.es/ecma262/#sec-regexpexec\nmodule.exports = function (R, S) {\n var exec = R.exec;\n if (isCallable(exec)) {\n var result = call(exec, R, S);\n if (result !== null) anObject(result);\n return result;\n }\n if (classof(R) === 'RegExp') return call(regexpExec, R, S);\n throw $TypeError('RegExp#exec called on incompatible receiver');\n};\n", "var classof = require('../internals/classof-raw');\n\n// `IsArray` abstract operation\n// https://tc39.es/ecma262/#sec-isarray\n// eslint-disable-next-line es/no-array-isarray -- safe\nmodule.exports = Array.isArray || function isArray(argument) {\n return classof(argument) == 'Array';\n};\n", "var $TypeError = TypeError;\nvar MAX_SAFE_INTEGER = 0x1FFFFFFFFFFFFF; // 2 ** 53 - 1 == 9007199254740991\n\nmodule.exports = function (it) {\n if (it > MAX_SAFE_INTEGER) throw $TypeError('Maximum allowed index exceeded');\n return it;\n};\n", "'use strict';\nvar toPropertyKey = require('../internals/to-property-key');\nvar definePropertyModule = require('../internals/object-define-property');\nvar createPropertyDescriptor = require('../internals/create-property-descriptor');\n\nmodule.exports = function (object, key, value) {\n var propertyKey = toPropertyKey(key);\n if (propertyKey in object) definePropertyModule.f(object, propertyKey, createPropertyDescriptor(0, value));\n else object[propertyKey] = value;\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar fails = require('../internals/fails');\nvar isCallable = require('../internals/is-callable');\nvar classof = require('../internals/classof');\nvar getBuiltIn = require('../internals/get-built-in');\nvar inspectSource = require('../internals/inspect-source');\n\nvar noop = function () { /* empty */ };\nvar empty = [];\nvar construct = getBuiltIn('Reflect', 'construct');\nvar constructorRegExp = /^\\s*(?:class|function)\\b/;\nvar exec = uncurryThis(constructorRegExp.exec);\nvar INCORRECT_TO_STRING = !constructorRegExp.exec(noop);\n\nvar isConstructorModern = function isConstructor(argument) {\n if (!isCallable(argument)) return false;\n try {\n construct(noop, empty, argument);\n return true;\n } catch (error) {\n return false;\n }\n};\n\nvar isConstructorLegacy = function isConstructor(argument) {\n if (!isCallable(argument)) return false;\n switch (classof(argument)) {\n case 'AsyncFunction':\n case 'GeneratorFunction':\n case 'AsyncGeneratorFunction': return false;\n }\n try {\n // we can't check .prototype since constructors produced by .bind haven't it\n // `Function#toString` throws on some built-it function in some legacy engines\n // (for example, `DOMQuad` and similar in FF41-)\n return INCORRECT_TO_STRING || !!exec(constructorRegExp, inspectSource(argument));\n } catch (error) {\n return true;\n }\n};\n\nisConstructorLegacy.sham = true;\n\n// `IsConstructor` abstract operation\n// https://tc39.es/ecma262/#sec-isconstructor\nmodule.exports = !construct || fails(function () {\n var called;\n return isConstructorModern(isConstructorModern.call)\n || !isConstructorModern(Object)\n || !isConstructorModern(function () { called = true; })\n || called;\n}) ? isConstructorLegacy : isConstructorModern;\n", "var isArray = require('../internals/is-array');\nvar isConstructor = require('../internals/is-constructor');\nvar isObject = require('../internals/is-object');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar SPECIES = wellKnownSymbol('species');\nvar $Array = Array;\n\n// a part of `ArraySpeciesCreate` abstract operation\n// https://tc39.es/ecma262/#sec-arrayspeciescreate\nmodule.exports = function (originalArray) {\n var C;\n if (isArray(originalArray)) {\n C = originalArray.constructor;\n // cross-realm fallback\n if (isConstructor(C) && (C === $Array || isArray(C.prototype))) C = undefined;\n else if (isObject(C)) {\n C = C[SPECIES];\n if (C === null) C = undefined;\n }\n } return C === undefined ? $Array : C;\n};\n", "var arraySpeciesConstructor = require('../internals/array-species-constructor');\n\n// `ArraySpeciesCreate` abstract operation\n// https://tc39.es/ecma262/#sec-arrayspeciescreate\nmodule.exports = function (originalArray, length) {\n return new (arraySpeciesConstructor(originalArray))(length === 0 ? 0 : length);\n};\n", "var fails = require('../internals/fails');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar V8_VERSION = require('../internals/engine-v8-version');\n\nvar SPECIES = wellKnownSymbol('species');\n\nmodule.exports = function (METHOD_NAME) {\n // We can't use this feature detection in V8 since it causes\n // deoptimization and serious performance degradation\n // https://github.com/zloirock/core-js/issues/677\n return V8_VERSION >= 51 || !fails(function () {\n var array = [];\n var constructor = array.constructor = {};\n constructor[SPECIES] = function () {\n return { foo: 1 };\n };\n return array[METHOD_NAME](Boolean).foo !== 1;\n });\n};\n", "'use strict';\nvar TO_STRING_TAG_SUPPORT = require('../internals/to-string-tag-support');\nvar classof = require('../internals/classof');\n\n// `Object.prototype.toString` method implementation\n// https://tc39.es/ecma262/#sec-object.prototype.tostring\nmodule.exports = TO_STRING_TAG_SUPPORT ? {}.toString : function toString() {\n return '[object ' + classof(this) + ']';\n};\n", "var classof = require('../internals/classof-raw');\n\nmodule.exports = typeof process != 'undefined' && classof(process) == 'process';\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar aCallable = require('../internals/a-callable');\n\nmodule.exports = function (object, key, method) {\n try {\n // eslint-disable-next-line es/no-object-getownpropertydescriptor -- safe\n return uncurryThis(aCallable(Object.getOwnPropertyDescriptor(object, key)[method]));\n } catch (error) { /* empty */ }\n};\n", "var isCallable = require('../internals/is-callable');\n\nvar $String = String;\nvar $TypeError = TypeError;\n\nmodule.exports = function (argument) {\n if (typeof argument == 'object' || isCallable(argument)) return argument;\n throw $TypeError(\"Can't set \" + $String(argument) + ' as a prototype');\n};\n", "/* eslint-disable no-proto -- safe */\nvar uncurryThisAccessor = require('../internals/function-uncurry-this-accessor');\nvar anObject = require('../internals/an-object');\nvar aPossiblePrototype = require('../internals/a-possible-prototype');\n\n// `Object.setPrototypeOf` method\n// https://tc39.es/ecma262/#sec-object.setprototypeof\n// Works with __proto__ only. Old v8 can't work with null proto objects.\n// eslint-disable-next-line es/no-object-setprototypeof -- safe\nmodule.exports = Object.setPrototypeOf || ('__proto__' in {} ? function () {\n var CORRECT_SETTER = false;\n var test = {};\n var setter;\n try {\n setter = uncurryThisAccessor(Object.prototype, '__proto__', 'set');\n setter(test, []);\n CORRECT_SETTER = test instanceof Array;\n } catch (error) { /* empty */ }\n return function setPrototypeOf(O, proto) {\n anObject(O);\n aPossiblePrototype(proto);\n if (CORRECT_SETTER) setter(O, proto);\n else O.__proto__ = proto;\n return O;\n };\n}() : undefined);\n", "var defineProperty = require('../internals/object-define-property').f;\nvar hasOwn = require('../internals/has-own-property');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar TO_STRING_TAG = wellKnownSymbol('toStringTag');\n\nmodule.exports = function (target, TAG, STATIC) {\n if (target && !STATIC) target = target.prototype;\n if (target && !hasOwn(target, TO_STRING_TAG)) {\n defineProperty(target, TO_STRING_TAG, { configurable: true, value: TAG });\n }\n};\n", "var makeBuiltIn = require('../internals/make-built-in');\nvar defineProperty = require('../internals/object-define-property');\n\nmodule.exports = function (target, name, descriptor) {\n if (descriptor.get) makeBuiltIn(descriptor.get, name, { getter: true });\n if (descriptor.set) makeBuiltIn(descriptor.set, name, { setter: true });\n return defineProperty.f(target, name, descriptor);\n};\n", "'use strict';\nvar getBuiltIn = require('../internals/get-built-in');\nvar defineBuiltInAccessor = require('../internals/define-built-in-accessor');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar DESCRIPTORS = require('../internals/descriptors');\n\nvar SPECIES = wellKnownSymbol('species');\n\nmodule.exports = function (CONSTRUCTOR_NAME) {\n var Constructor = getBuiltIn(CONSTRUCTOR_NAME);\n\n if (DESCRIPTORS && Constructor && !Constructor[SPECIES]) {\n defineBuiltInAccessor(Constructor, SPECIES, {\n configurable: true,\n get: function () { return this; }\n });\n }\n};\n", "var isPrototypeOf = require('../internals/object-is-prototype-of');\n\nvar $TypeError = TypeError;\n\nmodule.exports = function (it, Prototype) {\n if (isPrototypeOf(Prototype, it)) return it;\n throw $TypeError('Incorrect invocation');\n};\n", "var isConstructor = require('../internals/is-constructor');\nvar tryToString = require('../internals/try-to-string');\n\nvar $TypeError = TypeError;\n\n// `Assert: IsConstructor(argument) is true`\nmodule.exports = function (argument) {\n if (isConstructor(argument)) return argument;\n throw $TypeError(tryToString(argument) + ' is not a constructor');\n};\n", "var anObject = require('../internals/an-object');\nvar aConstructor = require('../internals/a-constructor');\nvar isNullOrUndefined = require('../internals/is-null-or-undefined');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar SPECIES = wellKnownSymbol('species');\n\n// `SpeciesConstructor` abstract operation\n// https://tc39.es/ecma262/#sec-speciesconstructor\nmodule.exports = function (O, defaultConstructor) {\n var C = anObject(O).constructor;\n var S;\n return C === undefined || isNullOrUndefined(S = anObject(C)[SPECIES]) ? defaultConstructor : aConstructor(S);\n};\n", "var uncurryThis = require('../internals/function-uncurry-this-clause');\nvar aCallable = require('../internals/a-callable');\nvar NATIVE_BIND = require('../internals/function-bind-native');\n\nvar bind = uncurryThis(uncurryThis.bind);\n\n// optional / simple context binding\nmodule.exports = function (fn, that) {\n aCallable(fn);\n return that === undefined ? fn : NATIVE_BIND ? bind(fn, that) : function (/* ...args */) {\n return fn.apply(that, arguments);\n };\n};\n", "var uncurryThis = require('../internals/function-uncurry-this');\n\nmodule.exports = uncurryThis([].slice);\n", "var $TypeError = TypeError;\n\nmodule.exports = function (passed, required) {\n if (passed < required) throw $TypeError('Not enough arguments');\n return passed;\n};\n", "var userAgent = require('../internals/engine-user-agent');\n\n// eslint-disable-next-line redos/no-vulnerable -- safe\nmodule.exports = /(?:ipad|iphone|ipod).*applewebkit/i.test(userAgent);\n", "var global = require('../internals/global');\nvar apply = require('../internals/function-apply');\nvar bind = require('../internals/function-bind-context');\nvar isCallable = require('../internals/is-callable');\nvar hasOwn = require('../internals/has-own-property');\nvar fails = require('../internals/fails');\nvar html = require('../internals/html');\nvar arraySlice = require('../internals/array-slice');\nvar createElement = require('../internals/document-create-element');\nvar validateArgumentsLength = require('../internals/validate-arguments-length');\nvar IS_IOS = require('../internals/engine-is-ios');\nvar IS_NODE = require('../internals/engine-is-node');\n\nvar set = global.setImmediate;\nvar clear = global.clearImmediate;\nvar process = global.process;\nvar Dispatch = global.Dispatch;\nvar Function = global.Function;\nvar MessageChannel = global.MessageChannel;\nvar String = global.String;\nvar counter = 0;\nvar queue = {};\nvar ONREADYSTATECHANGE = 'onreadystatechange';\nvar $location, defer, channel, port;\n\nfails(function () {\n // Deno throws a ReferenceError on `location` access without `--location` flag\n $location = global.location;\n});\n\nvar run = function (id) {\n if (hasOwn(queue, id)) {\n var fn = queue[id];\n delete queue[id];\n fn();\n }\n};\n\nvar runner = function (id) {\n return function () {\n run(id);\n };\n};\n\nvar eventListener = function (event) {\n run(event.data);\n};\n\nvar globalPostMessageDefer = function (id) {\n // old engines have not location.origin\n global.postMessage(String(id), $location.protocol + '//' + $location.host);\n};\n\n// Node.js 0.9+ & IE10+ has setImmediate, otherwise:\nif (!set || !clear) {\n set = function setImmediate(handler) {\n validateArgumentsLength(arguments.length, 1);\n var fn = isCallable(handler) ? handler : Function(handler);\n var args = arraySlice(arguments, 1);\n queue[++counter] = function () {\n apply(fn, undefined, args);\n };\n defer(counter);\n return counter;\n };\n clear = function clearImmediate(id) {\n delete queue[id];\n };\n // Node.js 0.8-\n if (IS_NODE) {\n defer = function (id) {\n process.nextTick(runner(id));\n };\n // Sphere (JS game engine) Dispatch API\n } else if (Dispatch && Dispatch.now) {\n defer = function (id) {\n Dispatch.now(runner(id));\n };\n // Browsers with MessageChannel, includes WebWorkers\n // except iOS - https://github.com/zloirock/core-js/issues/624\n } else if (MessageChannel && !IS_IOS) {\n channel = new MessageChannel();\n port = channel.port2;\n channel.port1.onmessage = eventListener;\n defer = bind(port.postMessage, port);\n // Browsers with postMessage, skip WebWorkers\n // IE8 has postMessage, but it's sync & typeof its postMessage is 'object'\n } else if (\n global.addEventListener &&\n isCallable(global.postMessage) &&\n !global.importScripts &&\n $location && $location.protocol !== 'file:' &&\n !fails(globalPostMessageDefer)\n ) {\n defer = globalPostMessageDefer;\n global.addEventListener('message', eventListener, false);\n // IE8-\n } else if (ONREADYSTATECHANGE in createElement('script')) {\n defer = function (id) {\n html.appendChild(createElement('script'))[ONREADYSTATECHANGE] = function () {\n html.removeChild(this);\n run(id);\n };\n };\n // Rest old browsers\n } else {\n defer = function (id) {\n setTimeout(runner(id), 0);\n };\n }\n}\n\nmodule.exports = {\n set: set,\n clear: clear\n};\n", "var Queue = function () {\n this.head = null;\n this.tail = null;\n};\n\nQueue.prototype = {\n add: function (item) {\n var entry = { item: item, next: null };\n var tail = this.tail;\n if (tail) tail.next = entry;\n else this.head = entry;\n this.tail = entry;\n },\n get: function () {\n var entry = this.head;\n if (entry) {\n var next = this.head = entry.next;\n if (next === null) this.tail = null;\n return entry.item;\n }\n }\n};\n\nmodule.exports = Queue;\n", "var userAgent = require('../internals/engine-user-agent');\n\nmodule.exports = /ipad|iphone|ipod/i.test(userAgent) && typeof Pebble != 'undefined';\n", "var userAgent = require('../internals/engine-user-agent');\n\nmodule.exports = /web0s(?!.*chrome)/i.test(userAgent);\n", "var global = require('../internals/global');\nvar bind = require('../internals/function-bind-context');\nvar getOwnPropertyDescriptor = require('../internals/object-get-own-property-descriptor').f;\nvar macrotask = require('../internals/task').set;\nvar Queue = require('../internals/queue');\nvar IS_IOS = require('../internals/engine-is-ios');\nvar IS_IOS_PEBBLE = require('../internals/engine-is-ios-pebble');\nvar IS_WEBOS_WEBKIT = require('../internals/engine-is-webos-webkit');\nvar IS_NODE = require('../internals/engine-is-node');\n\nvar MutationObserver = global.MutationObserver || global.WebKitMutationObserver;\nvar document = global.document;\nvar process = global.process;\nvar Promise = global.Promise;\n// Node.js 11 shows ExperimentalWarning on getting `queueMicrotask`\nvar queueMicrotaskDescriptor = getOwnPropertyDescriptor(global, 'queueMicrotask');\nvar microtask = queueMicrotaskDescriptor && queueMicrotaskDescriptor.value;\nvar notify, toggle, node, promise, then;\n\n// modern engines have queueMicrotask method\nif (!microtask) {\n var queue = new Queue();\n\n var flush = function () {\n var parent, fn;\n if (IS_NODE && (parent = process.domain)) parent.exit();\n while (fn = queue.get()) try {\n fn();\n } catch (error) {\n if (queue.head) notify();\n throw error;\n }\n if (parent) parent.enter();\n };\n\n // browsers with MutationObserver, except iOS - https://github.com/zloirock/core-js/issues/339\n // also except WebOS Webkit https://github.com/zloirock/core-js/issues/898\n if (!IS_IOS && !IS_NODE && !IS_WEBOS_WEBKIT && MutationObserver && document) {\n toggle = true;\n node = document.createTextNode('');\n new MutationObserver(flush).observe(node, { characterData: true });\n notify = function () {\n node.data = toggle = !toggle;\n };\n // environments with maybe non-completely correct, but existent Promise\n } else if (!IS_IOS_PEBBLE && Promise && Promise.resolve) {\n // Promise.resolve without an argument throws an error in LG WebOS 2\n promise = Promise.resolve(undefined);\n // workaround of WebKit ~ iOS Safari 10.1 bug\n promise.constructor = Promise;\n then = bind(promise.then, promise);\n notify = function () {\n then(flush);\n };\n // Node.js without promises\n } else if (IS_NODE) {\n notify = function () {\n process.nextTick(flush);\n };\n // for other environments - macrotask based on:\n // - setImmediate\n // - MessageChannel\n // - window.postMessage\n // - onreadystatechange\n // - setTimeout\n } else {\n // `webpack` dev server bug on IE global methods - use bind(fn, global)\n macrotask = bind(macrotask, global);\n notify = function () {\n macrotask(flush);\n };\n }\n\n microtask = function (fn) {\n if (!queue.head) notify();\n queue.add(fn);\n };\n}\n\nmodule.exports = microtask;\n", "module.exports = function (a, b) {\n try {\n // eslint-disable-next-line no-console -- safe\n arguments.length == 1 ? console.error(a) : console.error(a, b);\n } catch (error) { /* empty */ }\n};\n", "module.exports = function (exec) {\n try {\n return { error: false, value: exec() };\n } catch (error) {\n return { error: true, value: error };\n }\n};\n", "var global = require('../internals/global');\n\nmodule.exports = global.Promise;\n", "/* global Deno -- Deno case */\nmodule.exports = typeof Deno == 'object' && Deno && typeof Deno.version == 'object';\n", "var IS_DENO = require('../internals/engine-is-deno');\nvar IS_NODE = require('../internals/engine-is-node');\n\nmodule.exports = !IS_DENO && !IS_NODE\n && typeof window == 'object'\n && typeof document == 'object';\n", "var global = require('../internals/global');\nvar NativePromiseConstructor = require('../internals/promise-native-constructor');\nvar isCallable = require('../internals/is-callable');\nvar isForced = require('../internals/is-forced');\nvar inspectSource = require('../internals/inspect-source');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar IS_BROWSER = require('../internals/engine-is-browser');\nvar IS_DENO = require('../internals/engine-is-deno');\nvar IS_PURE = require('../internals/is-pure');\nvar V8_VERSION = require('../internals/engine-v8-version');\n\nvar NativePromisePrototype = NativePromiseConstructor && NativePromiseConstructor.prototype;\nvar SPECIES = wellKnownSymbol('species');\nvar SUBCLASSING = false;\nvar NATIVE_PROMISE_REJECTION_EVENT = isCallable(global.PromiseRejectionEvent);\n\nvar FORCED_PROMISE_CONSTRUCTOR = isForced('Promise', function () {\n var PROMISE_CONSTRUCTOR_SOURCE = inspectSource(NativePromiseConstructor);\n var GLOBAL_CORE_JS_PROMISE = PROMISE_CONSTRUCTOR_SOURCE !== String(NativePromiseConstructor);\n // V8 6.6 (Node 10 and Chrome 66) have a bug with resolving custom thenables\n // https://bugs.chromium.org/p/chromium/issues/detail?id=830565\n // We can't detect it synchronously, so just check versions\n if (!GLOBAL_CORE_JS_PROMISE && V8_VERSION === 66) return true;\n // We need Promise#{ catch, finally } in the pure version for preventing prototype pollution\n if (IS_PURE && !(NativePromisePrototype['catch'] && NativePromisePrototype['finally'])) return true;\n // We can't use @@species feature detection in V8 since it causes\n // deoptimization and performance degradation\n // https://github.com/zloirock/core-js/issues/679\n if (!V8_VERSION || V8_VERSION < 51 || !/native code/.test(PROMISE_CONSTRUCTOR_SOURCE)) {\n // Detect correctness of subclassing with @@species support\n var promise = new NativePromiseConstructor(function (resolve) { resolve(1); });\n var FakePromise = function (exec) {\n exec(function () { /* empty */ }, function () { /* empty */ });\n };\n var constructor = promise.constructor = {};\n constructor[SPECIES] = FakePromise;\n SUBCLASSING = promise.then(function () { /* empty */ }) instanceof FakePromise;\n if (!SUBCLASSING) return true;\n // Unhandled rejections tracking support, NodeJS Promise without it fails @@species test\n } return !GLOBAL_CORE_JS_PROMISE && (IS_BROWSER || IS_DENO) && !NATIVE_PROMISE_REJECTION_EVENT;\n});\n\nmodule.exports = {\n CONSTRUCTOR: FORCED_PROMISE_CONSTRUCTOR,\n REJECTION_EVENT: NATIVE_PROMISE_REJECTION_EVENT,\n SUBCLASSING: SUBCLASSING\n};\n", "'use strict';\nvar aCallable = require('../internals/a-callable');\n\nvar $TypeError = TypeError;\n\nvar PromiseCapability = function (C) {\n var resolve, reject;\n this.promise = new C(function ($$resolve, $$reject) {\n if (resolve !== undefined || reject !== undefined) throw $TypeError('Bad Promise constructor');\n resolve = $$resolve;\n reject = $$reject;\n });\n this.resolve = aCallable(resolve);\n this.reject = aCallable(reject);\n};\n\n// `NewPromiseCapability` abstract operation\n// https://tc39.es/ecma262/#sec-newpromisecapability\nmodule.exports.f = function (C) {\n return new PromiseCapability(C);\n};\n", "'use strict';\nvar $ = require('../internals/export');\nvar IS_PURE = require('../internals/is-pure');\nvar IS_NODE = require('../internals/engine-is-node');\nvar global = require('../internals/global');\nvar call = require('../internals/function-call');\nvar defineBuiltIn = require('../internals/define-built-in');\nvar setPrototypeOf = require('../internals/object-set-prototype-of');\nvar setToStringTag = require('../internals/set-to-string-tag');\nvar setSpecies = require('../internals/set-species');\nvar aCallable = require('../internals/a-callable');\nvar isCallable = require('../internals/is-callable');\nvar isObject = require('../internals/is-object');\nvar anInstance = require('../internals/an-instance');\nvar speciesConstructor = require('../internals/species-constructor');\nvar task = require('../internals/task').set;\nvar microtask = require('../internals/microtask');\nvar hostReportErrors = require('../internals/host-report-errors');\nvar perform = require('../internals/perform');\nvar Queue = require('../internals/queue');\nvar InternalStateModule = require('../internals/internal-state');\nvar NativePromiseConstructor = require('../internals/promise-native-constructor');\nvar PromiseConstructorDetection = require('../internals/promise-constructor-detection');\nvar newPromiseCapabilityModule = require('../internals/new-promise-capability');\n\nvar PROMISE = 'Promise';\nvar FORCED_PROMISE_CONSTRUCTOR = PromiseConstructorDetection.CONSTRUCTOR;\nvar NATIVE_PROMISE_REJECTION_EVENT = PromiseConstructorDetection.REJECTION_EVENT;\nvar NATIVE_PROMISE_SUBCLASSING = PromiseConstructorDetection.SUBCLASSING;\nvar getInternalPromiseState = InternalStateModule.getterFor(PROMISE);\nvar setInternalState = InternalStateModule.set;\nvar NativePromisePrototype = NativePromiseConstructor && NativePromiseConstructor.prototype;\nvar PromiseConstructor = NativePromiseConstructor;\nvar PromisePrototype = NativePromisePrototype;\nvar TypeError = global.TypeError;\nvar document = global.document;\nvar process = global.process;\nvar newPromiseCapability = newPromiseCapabilityModule.f;\nvar newGenericPromiseCapability = newPromiseCapability;\n\nvar DISPATCH_EVENT = !!(document && document.createEvent && global.dispatchEvent);\nvar UNHANDLED_REJECTION = 'unhandledrejection';\nvar REJECTION_HANDLED = 'rejectionhandled';\nvar PENDING = 0;\nvar FULFILLED = 1;\nvar REJECTED = 2;\nvar HANDLED = 1;\nvar UNHANDLED = 2;\n\nvar Internal, OwnPromiseCapability, PromiseWrapper, nativeThen;\n\n// helpers\nvar isThenable = function (it) {\n var then;\n return isObject(it) && isCallable(then = it.then) ? then : false;\n};\n\nvar callReaction = function (reaction, state) {\n var value = state.value;\n var ok = state.state == FULFILLED;\n var handler = ok ? reaction.ok : reaction.fail;\n var resolve = reaction.resolve;\n var reject = reaction.reject;\n var domain = reaction.domain;\n var result, then, exited;\n try {\n if (handler) {\n if (!ok) {\n if (state.rejection === UNHANDLED) onHandleUnhandled(state);\n state.rejection = HANDLED;\n }\n if (handler === true) result = value;\n else {\n if (domain) domain.enter();\n result = handler(value); // can throw\n if (domain) {\n domain.exit();\n exited = true;\n }\n }\n if (result === reaction.promise) {\n reject(TypeError('Promise-chain cycle'));\n } else if (then = isThenable(result)) {\n call(then, result, resolve, reject);\n } else resolve(result);\n } else reject(value);\n } catch (error) {\n if (domain && !exited) domain.exit();\n reject(error);\n }\n};\n\nvar notify = function (state, isReject) {\n if (state.notified) return;\n state.notified = true;\n microtask(function () {\n var reactions = state.reactions;\n var reaction;\n while (reaction = reactions.get()) {\n callReaction(reaction, state);\n }\n state.notified = false;\n if (isReject && !state.rejection) onUnhandled(state);\n });\n};\n\nvar dispatchEvent = function (name, promise, reason) {\n var event, handler;\n if (DISPATCH_EVENT) {\n event = document.createEvent('Event');\n event.promise = promise;\n event.reason = reason;\n event.initEvent(name, false, true);\n global.dispatchEvent(event);\n } else event = { promise: promise, reason: reason };\n if (!NATIVE_PROMISE_REJECTION_EVENT && (handler = global['on' + name])) handler(event);\n else if (name === UNHANDLED_REJECTION) hostReportErrors('Unhandled promise rejection', reason);\n};\n\nvar onUnhandled = function (state) {\n call(task, global, function () {\n var promise = state.facade;\n var value = state.value;\n var IS_UNHANDLED = isUnhandled(state);\n var result;\n if (IS_UNHANDLED) {\n result = perform(function () {\n if (IS_NODE) {\n process.emit('unhandledRejection', value, promise);\n } else dispatchEvent(UNHANDLED_REJECTION, promise, value);\n });\n // Browsers should not trigger `rejectionHandled` event if it was handled here, NodeJS - should\n state.rejection = IS_NODE || isUnhandled(state) ? UNHANDLED : HANDLED;\n if (result.error) throw result.value;\n }\n });\n};\n\nvar isUnhandled = function (state) {\n return state.rejection !== HANDLED && !state.parent;\n};\n\nvar onHandleUnhandled = function (state) {\n call(task, global, function () {\n var promise = state.facade;\n if (IS_NODE) {\n process.emit('rejectionHandled', promise);\n } else dispatchEvent(REJECTION_HANDLED, promise, state.value);\n });\n};\n\nvar bind = function (fn, state, unwrap) {\n return function (value) {\n fn(state, value, unwrap);\n };\n};\n\nvar internalReject = function (state, value, unwrap) {\n if (state.done) return;\n state.done = true;\n if (unwrap) state = unwrap;\n state.value = value;\n state.state = REJECTED;\n notify(state, true);\n};\n\nvar internalResolve = function (state, value, unwrap) {\n if (state.done) return;\n state.done = true;\n if (unwrap) state = unwrap;\n try {\n if (state.facade === value) throw TypeError(\"Promise can't be resolved itself\");\n var then = isThenable(value);\n if (then) {\n microtask(function () {\n var wrapper = { done: false };\n try {\n call(then, value,\n bind(internalResolve, wrapper, state),\n bind(internalReject, wrapper, state)\n );\n } catch (error) {\n internalReject(wrapper, error, state);\n }\n });\n } else {\n state.value = value;\n state.state = FULFILLED;\n notify(state, false);\n }\n } catch (error) {\n internalReject({ done: false }, error, state);\n }\n};\n\n// constructor polyfill\nif (FORCED_PROMISE_CONSTRUCTOR) {\n // 25.4.3.1 Promise(executor)\n PromiseConstructor = function Promise(executor) {\n anInstance(this, PromisePrototype);\n aCallable(executor);\n call(Internal, this);\n var state = getInternalPromiseState(this);\n try {\n executor(bind(internalResolve, state), bind(internalReject, state));\n } catch (error) {\n internalReject(state, error);\n }\n };\n\n PromisePrototype = PromiseConstructor.prototype;\n\n // eslint-disable-next-line no-unused-vars -- required for `.length`\n Internal = function Promise(executor) {\n setInternalState(this, {\n type: PROMISE,\n done: false,\n notified: false,\n parent: false,\n reactions: new Queue(),\n rejection: false,\n state: PENDING,\n value: undefined\n });\n };\n\n // `Promise.prototype.then` method\n // https://tc39.es/ecma262/#sec-promise.prototype.then\n Internal.prototype = defineBuiltIn(PromisePrototype, 'then', function then(onFulfilled, onRejected) {\n var state = getInternalPromiseState(this);\n var reaction = newPromiseCapability(speciesConstructor(this, PromiseConstructor));\n state.parent = true;\n reaction.ok = isCallable(onFulfilled) ? onFulfilled : true;\n reaction.fail = isCallable(onRejected) && onRejected;\n reaction.domain = IS_NODE ? process.domain : undefined;\n if (state.state == PENDING) state.reactions.add(reaction);\n else microtask(function () {\n callReaction(reaction, state);\n });\n return reaction.promise;\n });\n\n OwnPromiseCapability = function () {\n var promise = new Internal();\n var state = getInternalPromiseState(promise);\n this.promise = promise;\n this.resolve = bind(internalResolve, state);\n this.reject = bind(internalReject, state);\n };\n\n newPromiseCapabilityModule.f = newPromiseCapability = function (C) {\n return C === PromiseConstructor || C === PromiseWrapper\n ? new OwnPromiseCapability(C)\n : newGenericPromiseCapability(C);\n };\n\n if (!IS_PURE && isCallable(NativePromiseConstructor) && NativePromisePrototype !== Object.prototype) {\n nativeThen = NativePromisePrototype.then;\n\n if (!NATIVE_PROMISE_SUBCLASSING) {\n // make `Promise#then` return a polyfilled `Promise` for native promise-based APIs\n defineBuiltIn(NativePromisePrototype, 'then', function then(onFulfilled, onRejected) {\n var that = this;\n return new PromiseConstructor(function (resolve, reject) {\n call(nativeThen, that, resolve, reject);\n }).then(onFulfilled, onRejected);\n // https://github.com/zloirock/core-js/issues/640\n }, { unsafe: true });\n }\n\n // make `.constructor === Promise` work for native promise-based APIs\n try {\n delete NativePromisePrototype.constructor;\n } catch (error) { /* empty */ }\n\n // make `instanceof Promise` work for native promise-based APIs\n if (setPrototypeOf) {\n setPrototypeOf(NativePromisePrototype, PromisePrototype);\n }\n }\n}\n\n$({ global: true, constructor: true, wrap: true, forced: FORCED_PROMISE_CONSTRUCTOR }, {\n Promise: PromiseConstructor\n});\n\nsetToStringTag(PromiseConstructor, PROMISE, false, true);\nsetSpecies(PROMISE);\n", "module.exports = {};\n", "var wellKnownSymbol = require('../internals/well-known-symbol');\nvar Iterators = require('../internals/iterators');\n\nvar ITERATOR = wellKnownSymbol('iterator');\nvar ArrayPrototype = Array.prototype;\n\n// check on default Array iterator\nmodule.exports = function (it) {\n return it !== undefined && (Iterators.Array === it || ArrayPrototype[ITERATOR] === it);\n};\n", "var classof = require('../internals/classof');\nvar getMethod = require('../internals/get-method');\nvar isNullOrUndefined = require('../internals/is-null-or-undefined');\nvar Iterators = require('../internals/iterators');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar ITERATOR = wellKnownSymbol('iterator');\n\nmodule.exports = function (it) {\n if (!isNullOrUndefined(it)) return getMethod(it, ITERATOR)\n || getMethod(it, '@@iterator')\n || Iterators[classof(it)];\n};\n", "var call = require('../internals/function-call');\nvar aCallable = require('../internals/a-callable');\nvar anObject = require('../internals/an-object');\nvar tryToString = require('../internals/try-to-string');\nvar getIteratorMethod = require('../internals/get-iterator-method');\n\nvar $TypeError = TypeError;\n\nmodule.exports = function (argument, usingIterator) {\n var iteratorMethod = arguments.length < 2 ? getIteratorMethod(argument) : usingIterator;\n if (aCallable(iteratorMethod)) return anObject(call(iteratorMethod, argument));\n throw $TypeError(tryToString(argument) + ' is not iterable');\n};\n", "var call = require('../internals/function-call');\nvar anObject = require('../internals/an-object');\nvar getMethod = require('../internals/get-method');\n\nmodule.exports = function (iterator, kind, value) {\n var innerResult, innerError;\n anObject(iterator);\n try {\n innerResult = getMethod(iterator, 'return');\n if (!innerResult) {\n if (kind === 'throw') throw value;\n return value;\n }\n innerResult = call(innerResult, iterator);\n } catch (error) {\n innerError = true;\n innerResult = error;\n }\n if (kind === 'throw') throw value;\n if (innerError) throw innerResult;\n anObject(innerResult);\n return value;\n};\n", "var bind = require('../internals/function-bind-context');\nvar call = require('../internals/function-call');\nvar anObject = require('../internals/an-object');\nvar tryToString = require('../internals/try-to-string');\nvar isArrayIteratorMethod = require('../internals/is-array-iterator-method');\nvar lengthOfArrayLike = require('../internals/length-of-array-like');\nvar isPrototypeOf = require('../internals/object-is-prototype-of');\nvar getIterator = require('../internals/get-iterator');\nvar getIteratorMethod = require('../internals/get-iterator-method');\nvar iteratorClose = require('../internals/iterator-close');\n\nvar $TypeError = TypeError;\n\nvar Result = function (stopped, result) {\n this.stopped = stopped;\n this.result = result;\n};\n\nvar ResultPrototype = Result.prototype;\n\nmodule.exports = function (iterable, unboundFunction, options) {\n var that = options && options.that;\n var AS_ENTRIES = !!(options && options.AS_ENTRIES);\n var IS_RECORD = !!(options && options.IS_RECORD);\n var IS_ITERATOR = !!(options && options.IS_ITERATOR);\n var INTERRUPTED = !!(options && options.INTERRUPTED);\n var fn = bind(unboundFunction, that);\n var iterator, iterFn, index, length, result, next, step;\n\n var stop = function (condition) {\n if (iterator) iteratorClose(iterator, 'normal', condition);\n return new Result(true, condition);\n };\n\n var callFn = function (value) {\n if (AS_ENTRIES) {\n anObject(value);\n return INTERRUPTED ? fn(value[0], value[1], stop) : fn(value[0], value[1]);\n } return INTERRUPTED ? fn(value, stop) : fn(value);\n };\n\n if (IS_RECORD) {\n iterator = iterable.iterator;\n } else if (IS_ITERATOR) {\n iterator = iterable;\n } else {\n iterFn = getIteratorMethod(iterable);\n if (!iterFn) throw $TypeError(tryToString(iterable) + ' is not iterable');\n // optimisation for array iterators\n if (isArrayIteratorMethod(iterFn)) {\n for (index = 0, length = lengthOfArrayLike(iterable); length > index; index++) {\n result = callFn(iterable[index]);\n if (result && isPrototypeOf(ResultPrototype, result)) return result;\n } return new Result(false);\n }\n iterator = getIterator(iterable, iterFn);\n }\n\n next = IS_RECORD ? iterable.next : iterator.next;\n while (!(step = call(next, iterator)).done) {\n try {\n result = callFn(step.value);\n } catch (error) {\n iteratorClose(iterator, 'throw', error);\n }\n if (typeof result == 'object' && result && isPrototypeOf(ResultPrototype, result)) return result;\n } return new Result(false);\n};\n", "var wellKnownSymbol = require('../internals/well-known-symbol');\n\nvar ITERATOR = wellKnownSymbol('iterator');\nvar SAFE_CLOSING = false;\n\ntry {\n var called = 0;\n var iteratorWithReturn = {\n next: function () {\n return { done: !!called++ };\n },\n 'return': function () {\n SAFE_CLOSING = true;\n }\n };\n iteratorWithReturn[ITERATOR] = function () {\n return this;\n };\n // eslint-disable-next-line es/no-array-from, no-throw-literal -- required for testing\n Array.from(iteratorWithReturn, function () { throw 2; });\n} catch (error) { /* empty */ }\n\nmodule.exports = function (exec, SKIP_CLOSING) {\n if (!SKIP_CLOSING && !SAFE_CLOSING) return false;\n var ITERATION_SUPPORT = false;\n try {\n var object = {};\n object[ITERATOR] = function () {\n return {\n next: function () {\n return { done: ITERATION_SUPPORT = true };\n }\n };\n };\n exec(object);\n } catch (error) { /* empty */ }\n return ITERATION_SUPPORT;\n};\n", "var NativePromiseConstructor = require('../internals/promise-native-constructor');\nvar checkCorrectnessOfIteration = require('../internals/check-correctness-of-iteration');\nvar FORCED_PROMISE_CONSTRUCTOR = require('../internals/promise-constructor-detection').CONSTRUCTOR;\n\nmodule.exports = FORCED_PROMISE_CONSTRUCTOR || !checkCorrectnessOfIteration(function (iterable) {\n NativePromiseConstructor.all(iterable).then(undefined, function () { /* empty */ });\n});\n", "'use strict';\nvar $ = require('../internals/export');\nvar call = require('../internals/function-call');\nvar aCallable = require('../internals/a-callable');\nvar newPromiseCapabilityModule = require('../internals/new-promise-capability');\nvar perform = require('../internals/perform');\nvar iterate = require('../internals/iterate');\nvar PROMISE_STATICS_INCORRECT_ITERATION = require('../internals/promise-statics-incorrect-iteration');\n\n// `Promise.all` method\n// https://tc39.es/ecma262/#sec-promise.all\n$({ target: 'Promise', stat: true, forced: PROMISE_STATICS_INCORRECT_ITERATION }, {\n all: function all(iterable) {\n var C = this;\n var capability = newPromiseCapabilityModule.f(C);\n var resolve = capability.resolve;\n var reject = capability.reject;\n var result = perform(function () {\n var $promiseResolve = aCallable(C.resolve);\n var values = [];\n var counter = 0;\n var remaining = 1;\n iterate(iterable, function (promise) {\n var index = counter++;\n var alreadyCalled = false;\n remaining++;\n call($promiseResolve, C, promise).then(function (value) {\n if (alreadyCalled) return;\n alreadyCalled = true;\n values[index] = value;\n --remaining || resolve(values);\n }, reject);\n });\n --remaining || resolve(values);\n });\n if (result.error) reject(result.value);\n return capability.promise;\n }\n});\n", "'use strict';\nvar $ = require('../internals/export');\nvar IS_PURE = require('../internals/is-pure');\nvar FORCED_PROMISE_CONSTRUCTOR = require('../internals/promise-constructor-detection').CONSTRUCTOR;\nvar NativePromiseConstructor = require('../internals/promise-native-constructor');\nvar getBuiltIn = require('../internals/get-built-in');\nvar isCallable = require('../internals/is-callable');\nvar defineBuiltIn = require('../internals/define-built-in');\n\nvar NativePromisePrototype = NativePromiseConstructor && NativePromiseConstructor.prototype;\n\n// `Promise.prototype.catch` method\n// https://tc39.es/ecma262/#sec-promise.prototype.catch\n$({ target: 'Promise', proto: true, forced: FORCED_PROMISE_CONSTRUCTOR, real: true }, {\n 'catch': function (onRejected) {\n return this.then(undefined, onRejected);\n }\n});\n\n// makes sure that native promise-based APIs `Promise#catch` properly works with patched `Promise#then`\nif (!IS_PURE && isCallable(NativePromiseConstructor)) {\n var method = getBuiltIn('Promise').prototype['catch'];\n if (NativePromisePrototype['catch'] !== method) {\n defineBuiltIn(NativePromisePrototype, 'catch', method, { unsafe: true });\n }\n}\n", "'use strict';\nvar $ = require('../internals/export');\nvar call = require('../internals/function-call');\nvar aCallable = require('../internals/a-callable');\nvar newPromiseCapabilityModule = require('../internals/new-promise-capability');\nvar perform = require('../internals/perform');\nvar iterate = require('../internals/iterate');\nvar PROMISE_STATICS_INCORRECT_ITERATION = require('../internals/promise-statics-incorrect-iteration');\n\n// `Promise.race` method\n// https://tc39.es/ecma262/#sec-promise.race\n$({ target: 'Promise', stat: true, forced: PROMISE_STATICS_INCORRECT_ITERATION }, {\n race: function race(iterable) {\n var C = this;\n var capability = newPromiseCapabilityModule.f(C);\n var reject = capability.reject;\n var result = perform(function () {\n var $promiseResolve = aCallable(C.resolve);\n iterate(iterable, function (promise) {\n call($promiseResolve, C, promise).then(capability.resolve, reject);\n });\n });\n if (result.error) reject(result.value);\n return capability.promise;\n }\n});\n", "'use strict';\nvar $ = require('../internals/export');\nvar call = require('../internals/function-call');\nvar newPromiseCapabilityModule = require('../internals/new-promise-capability');\nvar FORCED_PROMISE_CONSTRUCTOR = require('../internals/promise-constructor-detection').CONSTRUCTOR;\n\n// `Promise.reject` method\n// https://tc39.es/ecma262/#sec-promise.reject\n$({ target: 'Promise', stat: true, forced: FORCED_PROMISE_CONSTRUCTOR }, {\n reject: function reject(r) {\n var capability = newPromiseCapabilityModule.f(this);\n call(capability.reject, undefined, r);\n return capability.promise;\n }\n});\n", "var anObject = require('../internals/an-object');\nvar isObject = require('../internals/is-object');\nvar newPromiseCapability = require('../internals/new-promise-capability');\n\nmodule.exports = function (C, x) {\n anObject(C);\n if (isObject(x) && x.constructor === C) return x;\n var promiseCapability = newPromiseCapability.f(C);\n var resolve = promiseCapability.resolve;\n resolve(x);\n return promiseCapability.promise;\n};\n", "'use strict';\nvar $ = require('../internals/export');\nvar getBuiltIn = require('../internals/get-built-in');\nvar IS_PURE = require('../internals/is-pure');\nvar NativePromiseConstructor = require('../internals/promise-native-constructor');\nvar FORCED_PROMISE_CONSTRUCTOR = require('../internals/promise-constructor-detection').CONSTRUCTOR;\nvar promiseResolve = require('../internals/promise-resolve');\n\nvar PromiseConstructorWrapper = getBuiltIn('Promise');\nvar CHECK_WRAPPER = IS_PURE && !FORCED_PROMISE_CONSTRUCTOR;\n\n// `Promise.resolve` method\n// https://tc39.es/ecma262/#sec-promise.resolve\n$({ target: 'Promise', stat: true, forced: IS_PURE || FORCED_PROMISE_CONSTRUCTOR }, {\n resolve: function resolve(x) {\n return promiseResolve(CHECK_WRAPPER && this === PromiseConstructorWrapper ? NativePromiseConstructor : this, x);\n }\n});\n", "var toAbsoluteIndex = require('../internals/to-absolute-index');\nvar lengthOfArrayLike = require('../internals/length-of-array-like');\nvar createProperty = require('../internals/create-property');\n\nvar $Array = Array;\nvar max = Math.max;\n\nmodule.exports = function (O, start, end) {\n var length = lengthOfArrayLike(O);\n var k = toAbsoluteIndex(start, length);\n var fin = toAbsoluteIndex(end === undefined ? length : end, length);\n var result = $Array(max(fin - k, 0));\n for (var n = 0; k < fin; k++, n++) createProperty(result, n, O[k]);\n result.length = n;\n return result;\n};\n", "/* eslint-disable es/no-object-getownpropertynames -- safe */\nvar classof = require('../internals/classof-raw');\nvar toIndexedObject = require('../internals/to-indexed-object');\nvar $getOwnPropertyNames = require('../internals/object-get-own-property-names').f;\nvar arraySlice = require('../internals/array-slice-simple');\n\nvar windowNames = typeof window == 'object' && window && Object.getOwnPropertyNames\n ? Object.getOwnPropertyNames(window) : [];\n\nvar getWindowNames = function (it) {\n try {\n return $getOwnPropertyNames(it);\n } catch (error) {\n return arraySlice(windowNames);\n }\n};\n\n// fallback for IE11 buggy Object.getOwnPropertyNames with iframe and window\nmodule.exports.f = function getOwnPropertyNames(it) {\n return windowNames && classof(it) == 'Window'\n ? getWindowNames(it)\n : $getOwnPropertyNames(toIndexedObject(it));\n};\n", "var wellKnownSymbol = require('../internals/well-known-symbol');\n\nexports.f = wellKnownSymbol;\n", "var global = require('../internals/global');\n\nmodule.exports = global;\n", "var path = require('../internals/path');\nvar hasOwn = require('../internals/has-own-property');\nvar wrappedWellKnownSymbolModule = require('../internals/well-known-symbol-wrapped');\nvar defineProperty = require('../internals/object-define-property').f;\n\nmodule.exports = function (NAME) {\n var Symbol = path.Symbol || (path.Symbol = {});\n if (!hasOwn(Symbol, NAME)) defineProperty(Symbol, NAME, {\n value: wrappedWellKnownSymbolModule.f(NAME)\n });\n};\n", "var call = require('../internals/function-call');\nvar getBuiltIn = require('../internals/get-built-in');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar defineBuiltIn = require('../internals/define-built-in');\n\nmodule.exports = function () {\n var Symbol = getBuiltIn('Symbol');\n var SymbolPrototype = Symbol && Symbol.prototype;\n var valueOf = SymbolPrototype && SymbolPrototype.valueOf;\n var TO_PRIMITIVE = wellKnownSymbol('toPrimitive');\n\n if (SymbolPrototype && !SymbolPrototype[TO_PRIMITIVE]) {\n // `Symbol.prototype[@@toPrimitive]` method\n // https://tc39.es/ecma262/#sec-symbol.prototype-@@toprimitive\n // eslint-disable-next-line no-unused-vars -- required for .length\n defineBuiltIn(SymbolPrototype, TO_PRIMITIVE, function (hint) {\n return call(valueOf, this);\n }, { arity: 1 });\n }\n};\n", "var bind = require('../internals/function-bind-context');\nvar uncurryThis = require('../internals/function-uncurry-this');\nvar IndexedObject = require('../internals/indexed-object');\nvar toObject = require('../internals/to-object');\nvar lengthOfArrayLike = require('../internals/length-of-array-like');\nvar arraySpeciesCreate = require('../internals/array-species-create');\n\nvar push = uncurryThis([].push);\n\n// `Array.prototype.{ forEach, map, filter, some, every, find, findIndex, filterReject }` methods implementation\nvar createMethod = function (TYPE) {\n var IS_MAP = TYPE == 1;\n var IS_FILTER = TYPE == 2;\n var IS_SOME = TYPE == 3;\n var IS_EVERY = TYPE == 4;\n var IS_FIND_INDEX = TYPE == 6;\n var IS_FILTER_REJECT = TYPE == 7;\n var NO_HOLES = TYPE == 5 || IS_FIND_INDEX;\n return function ($this, callbackfn, that, specificCreate) {\n var O = toObject($this);\n var self = IndexedObject(O);\n var boundFunction = bind(callbackfn, that);\n var length = lengthOfArrayLike(self);\n var index = 0;\n var create = specificCreate || arraySpeciesCreate;\n var target = IS_MAP ? create($this, length) : IS_FILTER || IS_FILTER_REJECT ? create($this, 0) : undefined;\n var value, result;\n for (;length > index; index++) if (NO_HOLES || index in self) {\n value = self[index];\n result = boundFunction(value, index, O);\n if (TYPE) {\n if (IS_MAP) target[index] = result; // map\n else if (result) switch (TYPE) {\n case 3: return true; // some\n case 5: return value; // find\n case 6: return index; // findIndex\n case 2: push(target, value); // filter\n } else switch (TYPE) {\n case 4: return false; // every\n case 7: push(target, value); // filterReject\n }\n }\n }\n return IS_FIND_INDEX ? -1 : IS_SOME || IS_EVERY ? IS_EVERY : target;\n };\n};\n\nmodule.exports = {\n // `Array.prototype.forEach` method\n // https://tc39.es/ecma262/#sec-array.prototype.foreach\n forEach: createMethod(0),\n // `Array.prototype.map` method\n // https://tc39.es/ecma262/#sec-array.prototype.map\n map: createMethod(1),\n // `Array.prototype.filter` method\n // https://tc39.es/ecma262/#sec-array.prototype.filter\n filter: createMethod(2),\n // `Array.prototype.some` method\n // https://tc39.es/ecma262/#sec-array.prototype.some\n some: createMethod(3),\n // `Array.prototype.every` method\n // https://tc39.es/ecma262/#sec-array.prototype.every\n every: createMethod(4),\n // `Array.prototype.find` method\n // https://tc39.es/ecma262/#sec-array.prototype.find\n find: createMethod(5),\n // `Array.prototype.findIndex` method\n // https://tc39.es/ecma262/#sec-array.prototype.findIndex\n findIndex: createMethod(6),\n // `Array.prototype.filterReject` method\n // https://github.com/tc39/proposal-array-filtering\n filterReject: createMethod(7)\n};\n", "'use strict';\nvar $ = require('../internals/export');\nvar global = require('../internals/global');\nvar call = require('../internals/function-call');\nvar uncurryThis = require('../internals/function-uncurry-this');\nvar IS_PURE = require('../internals/is-pure');\nvar DESCRIPTORS = require('../internals/descriptors');\nvar NATIVE_SYMBOL = require('../internals/symbol-constructor-detection');\nvar fails = require('../internals/fails');\nvar hasOwn = require('../internals/has-own-property');\nvar isPrototypeOf = require('../internals/object-is-prototype-of');\nvar anObject = require('../internals/an-object');\nvar toIndexedObject = require('../internals/to-indexed-object');\nvar toPropertyKey = require('../internals/to-property-key');\nvar $toString = require('../internals/to-string');\nvar createPropertyDescriptor = require('../internals/create-property-descriptor');\nvar nativeObjectCreate = require('../internals/object-create');\nvar objectKeys = require('../internals/object-keys');\nvar getOwnPropertyNamesModule = require('../internals/object-get-own-property-names');\nvar getOwnPropertyNamesExternal = require('../internals/object-get-own-property-names-external');\nvar getOwnPropertySymbolsModule = require('../internals/object-get-own-property-symbols');\nvar getOwnPropertyDescriptorModule = require('../internals/object-get-own-property-descriptor');\nvar definePropertyModule = require('../internals/object-define-property');\nvar definePropertiesModule = require('../internals/object-define-properties');\nvar propertyIsEnumerableModule = require('../internals/object-property-is-enumerable');\nvar defineBuiltIn = require('../internals/define-built-in');\nvar defineBuiltInAccessor = require('../internals/define-built-in-accessor');\nvar shared = require('../internals/shared');\nvar sharedKey = require('../internals/shared-key');\nvar hiddenKeys = require('../internals/hidden-keys');\nvar uid = require('../internals/uid');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar wrappedWellKnownSymbolModule = require('../internals/well-known-symbol-wrapped');\nvar defineWellKnownSymbol = require('../internals/well-known-symbol-define');\nvar defineSymbolToPrimitive = require('../internals/symbol-define-to-primitive');\nvar setToStringTag = require('../internals/set-to-string-tag');\nvar InternalStateModule = require('../internals/internal-state');\nvar $forEach = require('../internals/array-iteration').forEach;\n\nvar HIDDEN = sharedKey('hidden');\nvar SYMBOL = 'Symbol';\nvar PROTOTYPE = 'prototype';\n\nvar setInternalState = InternalStateModule.set;\nvar getInternalState = InternalStateModule.getterFor(SYMBOL);\n\nvar ObjectPrototype = Object[PROTOTYPE];\nvar $Symbol = global.Symbol;\nvar SymbolPrototype = $Symbol && $Symbol[PROTOTYPE];\nvar TypeError = global.TypeError;\nvar QObject = global.QObject;\nvar nativeGetOwnPropertyDescriptor = getOwnPropertyDescriptorModule.f;\nvar nativeDefineProperty = definePropertyModule.f;\nvar nativeGetOwnPropertyNames = getOwnPropertyNamesExternal.f;\nvar nativePropertyIsEnumerable = propertyIsEnumerableModule.f;\nvar push = uncurryThis([].push);\n\nvar AllSymbols = shared('symbols');\nvar ObjectPrototypeSymbols = shared('op-symbols');\nvar WellKnownSymbolsStore = shared('wks');\n\n// Don't use setters in Qt Script, https://github.com/zloirock/core-js/issues/173\nvar USE_SETTER = !QObject || !QObject[PROTOTYPE] || !QObject[PROTOTYPE].findChild;\n\n// fallback for old Android, https://code.google.com/p/v8/issues/detail?id=687\nvar setSymbolDescriptor = DESCRIPTORS && fails(function () {\n return nativeObjectCreate(nativeDefineProperty({}, 'a', {\n get: function () { return nativeDefineProperty(this, 'a', { value: 7 }).a; }\n })).a != 7;\n}) ? function (O, P, Attributes) {\n var ObjectPrototypeDescriptor = nativeGetOwnPropertyDescriptor(ObjectPrototype, P);\n if (ObjectPrototypeDescriptor) delete ObjectPrototype[P];\n nativeDefineProperty(O, P, Attributes);\n if (ObjectPrototypeDescriptor && O !== ObjectPrototype) {\n nativeDefineProperty(ObjectPrototype, P, ObjectPrototypeDescriptor);\n }\n} : nativeDefineProperty;\n\nvar wrap = function (tag, description) {\n var symbol = AllSymbols[tag] = nativeObjectCreate(SymbolPrototype);\n setInternalState(symbol, {\n type: SYMBOL,\n tag: tag,\n description: description\n });\n if (!DESCRIPTORS) symbol.description = description;\n return symbol;\n};\n\nvar $defineProperty = function defineProperty(O, P, Attributes) {\n if (O === ObjectPrototype) $defineProperty(ObjectPrototypeSymbols, P, Attributes);\n anObject(O);\n var key = toPropertyKey(P);\n anObject(Attributes);\n if (hasOwn(AllSymbols, key)) {\n if (!Attributes.enumerable) {\n if (!hasOwn(O, HIDDEN)) nativeDefineProperty(O, HIDDEN, createPropertyDescriptor(1, {}));\n O[HIDDEN][key] = true;\n } else {\n if (hasOwn(O, HIDDEN) && O[HIDDEN][key]) O[HIDDEN][key] = false;\n Attributes = nativeObjectCreate(Attributes, { enumerable: createPropertyDescriptor(0, false) });\n } return setSymbolDescriptor(O, key, Attributes);\n } return nativeDefineProperty(O, key, Attributes);\n};\n\nvar $defineProperties = function defineProperties(O, Properties) {\n anObject(O);\n var properties = toIndexedObject(Properties);\n var keys = objectKeys(properties).concat($getOwnPropertySymbols(properties));\n $forEach(keys, function (key) {\n if (!DESCRIPTORS || call($propertyIsEnumerable, properties, key)) $defineProperty(O, key, properties[key]);\n });\n return O;\n};\n\nvar $create = function create(O, Properties) {\n return Properties === undefined ? nativeObjectCreate(O) : $defineProperties(nativeObjectCreate(O), Properties);\n};\n\nvar $propertyIsEnumerable = function propertyIsEnumerable(V) {\n var P = toPropertyKey(V);\n var enumerable = call(nativePropertyIsEnumerable, this, P);\n if (this === ObjectPrototype && hasOwn(AllSymbols, P) && !hasOwn(ObjectPrototypeSymbols, P)) return false;\n return enumerable || !hasOwn(this, P) || !hasOwn(AllSymbols, P) || hasOwn(this, HIDDEN) && this[HIDDEN][P]\n ? enumerable : true;\n};\n\nvar $getOwnPropertyDescriptor = function getOwnPropertyDescriptor(O, P) {\n var it = toIndexedObject(O);\n var key = toPropertyKey(P);\n if (it === ObjectPrototype && hasOwn(AllSymbols, key) && !hasOwn(ObjectPrototypeSymbols, key)) return;\n var descriptor = nativeGetOwnPropertyDescriptor(it, key);\n if (descriptor && hasOwn(AllSymbols, key) && !(hasOwn(it, HIDDEN) && it[HIDDEN][key])) {\n descriptor.enumerable = true;\n }\n return descriptor;\n};\n\nvar $getOwnPropertyNames = function getOwnPropertyNames(O) {\n var names = nativeGetOwnPropertyNames(toIndexedObject(O));\n var result = [];\n $forEach(names, function (key) {\n if (!hasOwn(AllSymbols, key) && !hasOwn(hiddenKeys, key)) push(result, key);\n });\n return result;\n};\n\nvar $getOwnPropertySymbols = function (O) {\n var IS_OBJECT_PROTOTYPE = O === ObjectPrototype;\n var names = nativeGetOwnPropertyNames(IS_OBJECT_PROTOTYPE ? ObjectPrototypeSymbols : toIndexedObject(O));\n var result = [];\n $forEach(names, function (key) {\n if (hasOwn(AllSymbols, key) && (!IS_OBJECT_PROTOTYPE || hasOwn(ObjectPrototype, key))) {\n push(result, AllSymbols[key]);\n }\n });\n return result;\n};\n\n// `Symbol` constructor\n// https://tc39.es/ecma262/#sec-symbol-constructor\nif (!NATIVE_SYMBOL) {\n $Symbol = function Symbol() {\n if (isPrototypeOf(SymbolPrototype, this)) throw TypeError('Symbol is not a constructor');\n var description = !arguments.length || arguments[0] === undefined ? undefined : $toString(arguments[0]);\n var tag = uid(description);\n var setter = function (value) {\n if (this === ObjectPrototype) call(setter, ObjectPrototypeSymbols, value);\n if (hasOwn(this, HIDDEN) && hasOwn(this[HIDDEN], tag)) this[HIDDEN][tag] = false;\n setSymbolDescriptor(this, tag, createPropertyDescriptor(1, value));\n };\n if (DESCRIPTORS && USE_SETTER) setSymbolDescriptor(ObjectPrototype, tag, { configurable: true, set: setter });\n return wrap(tag, description);\n };\n\n SymbolPrototype = $Symbol[PROTOTYPE];\n\n defineBuiltIn(SymbolPrototype, 'toString', function toString() {\n return getInternalState(this).tag;\n });\n\n defineBuiltIn($Symbol, 'withoutSetter', function (description) {\n return wrap(uid(description), description);\n });\n\n propertyIsEnumerableModule.f = $propertyIsEnumerable;\n definePropertyModule.f = $defineProperty;\n definePropertiesModule.f = $defineProperties;\n getOwnPropertyDescriptorModule.f = $getOwnPropertyDescriptor;\n getOwnPropertyNamesModule.f = getOwnPropertyNamesExternal.f = $getOwnPropertyNames;\n getOwnPropertySymbolsModule.f = $getOwnPropertySymbols;\n\n wrappedWellKnownSymbolModule.f = function (name) {\n return wrap(wellKnownSymbol(name), name);\n };\n\n if (DESCRIPTORS) {\n // https://github.com/tc39/proposal-Symbol-description\n defineBuiltInAccessor(SymbolPrototype, 'description', {\n configurable: true,\n get: function description() {\n return getInternalState(this).description;\n }\n });\n if (!IS_PURE) {\n defineBuiltIn(ObjectPrototype, 'propertyIsEnumerable', $propertyIsEnumerable, { unsafe: true });\n }\n }\n}\n\n$({ global: true, constructor: true, wrap: true, forced: !NATIVE_SYMBOL, sham: !NATIVE_SYMBOL }, {\n Symbol: $Symbol\n});\n\n$forEach(objectKeys(WellKnownSymbolsStore), function (name) {\n defineWellKnownSymbol(name);\n});\n\n$({ target: SYMBOL, stat: true, forced: !NATIVE_SYMBOL }, {\n useSetter: function () { USE_SETTER = true; },\n useSimple: function () { USE_SETTER = false; }\n});\n\n$({ target: 'Object', stat: true, forced: !NATIVE_SYMBOL, sham: !DESCRIPTORS }, {\n // `Object.create` method\n // https://tc39.es/ecma262/#sec-object.create\n create: $create,\n // `Object.defineProperty` method\n // https://tc39.es/ecma262/#sec-object.defineproperty\n defineProperty: $defineProperty,\n // `Object.defineProperties` method\n // https://tc39.es/ecma262/#sec-object.defineproperties\n defineProperties: $defineProperties,\n // `Object.getOwnPropertyDescriptor` method\n // https://tc39.es/ecma262/#sec-object.getownpropertydescriptors\n getOwnPropertyDescriptor: $getOwnPropertyDescriptor\n});\n\n$({ target: 'Object', stat: true, forced: !NATIVE_SYMBOL }, {\n // `Object.getOwnPropertyNames` method\n // https://tc39.es/ecma262/#sec-object.getownpropertynames\n getOwnPropertyNames: $getOwnPropertyNames\n});\n\n// `Symbol.prototype[@@toPrimitive]` method\n// https://tc39.es/ecma262/#sec-symbol.prototype-@@toprimitive\ndefineSymbolToPrimitive();\n\n// `Symbol.prototype[@@toStringTag]` property\n// https://tc39.es/ecma262/#sec-symbol.prototype-@@tostringtag\nsetToStringTag($Symbol, SYMBOL);\n\nhiddenKeys[HIDDEN] = true;\n", "var NATIVE_SYMBOL = require('../internals/symbol-constructor-detection');\n\n/* eslint-disable es/no-symbol -- safe */\nmodule.exports = NATIVE_SYMBOL && !!Symbol['for'] && !!Symbol.keyFor;\n", "var $ = require('../internals/export');\nvar getBuiltIn = require('../internals/get-built-in');\nvar hasOwn = require('../internals/has-own-property');\nvar toString = require('../internals/to-string');\nvar shared = require('../internals/shared');\nvar NATIVE_SYMBOL_REGISTRY = require('../internals/symbol-registry-detection');\n\nvar StringToSymbolRegistry = shared('string-to-symbol-registry');\nvar SymbolToStringRegistry = shared('symbol-to-string-registry');\n\n// `Symbol.for` method\n// https://tc39.es/ecma262/#sec-symbol.for\n$({ target: 'Symbol', stat: true, forced: !NATIVE_SYMBOL_REGISTRY }, {\n 'for': function (key) {\n var string = toString(key);\n if (hasOwn(StringToSymbolRegistry, string)) return StringToSymbolRegistry[string];\n var symbol = getBuiltIn('Symbol')(string);\n StringToSymbolRegistry[string] = symbol;\n SymbolToStringRegistry[symbol] = string;\n return symbol;\n }\n});\n", "var $ = require('../internals/export');\nvar hasOwn = require('../internals/has-own-property');\nvar isSymbol = require('../internals/is-symbol');\nvar tryToString = require('../internals/try-to-string');\nvar shared = require('../internals/shared');\nvar NATIVE_SYMBOL_REGISTRY = require('../internals/symbol-registry-detection');\n\nvar SymbolToStringRegistry = shared('symbol-to-string-registry');\n\n// `Symbol.keyFor` method\n// https://tc39.es/ecma262/#sec-symbol.keyfor\n$({ target: 'Symbol', stat: true, forced: !NATIVE_SYMBOL_REGISTRY }, {\n keyFor: function keyFor(sym) {\n if (!isSymbol(sym)) throw TypeError(tryToString(sym) + ' is not a symbol');\n if (hasOwn(SymbolToStringRegistry, sym)) return SymbolToStringRegistry[sym];\n }\n});\n", "var uncurryThis = require('../internals/function-uncurry-this');\nvar isArray = require('../internals/is-array');\nvar isCallable = require('../internals/is-callable');\nvar classof = require('../internals/classof-raw');\nvar toString = require('../internals/to-string');\n\nvar push = uncurryThis([].push);\n\nmodule.exports = function (replacer) {\n if (isCallable(replacer)) return replacer;\n if (!isArray(replacer)) return;\n var rawLength = replacer.length;\n var keys = [];\n for (var i = 0; i < rawLength; i++) {\n var element = replacer[i];\n if (typeof element == 'string') push(keys, element);\n else if (typeof element == 'number' || classof(element) == 'Number' || classof(element) == 'String') push(keys, toString(element));\n }\n var keysLength = keys.length;\n var root = true;\n return function (key, value) {\n if (root) {\n root = false;\n return value;\n }\n if (isArray(this)) return value;\n for (var j = 0; j < keysLength; j++) if (keys[j] === key) return value;\n };\n};\n", "var $ = require('../internals/export');\nvar getBuiltIn = require('../internals/get-built-in');\nvar apply = require('../internals/function-apply');\nvar call = require('../internals/function-call');\nvar uncurryThis = require('../internals/function-uncurry-this');\nvar fails = require('../internals/fails');\nvar isCallable = require('../internals/is-callable');\nvar isSymbol = require('../internals/is-symbol');\nvar arraySlice = require('../internals/array-slice');\nvar getReplacerFunction = require('../internals/get-json-replacer-function');\nvar NATIVE_SYMBOL = require('../internals/symbol-constructor-detection');\n\nvar $String = String;\nvar $stringify = getBuiltIn('JSON', 'stringify');\nvar exec = uncurryThis(/./.exec);\nvar charAt = uncurryThis(''.charAt);\nvar charCodeAt = uncurryThis(''.charCodeAt);\nvar replace = uncurryThis(''.replace);\nvar numberToString = uncurryThis(1.0.toString);\n\nvar tester = /[\\uD800-\\uDFFF]/g;\nvar low = /^[\\uD800-\\uDBFF]$/;\nvar hi = /^[\\uDC00-\\uDFFF]$/;\n\nvar WRONG_SYMBOLS_CONVERSION = !NATIVE_SYMBOL || fails(function () {\n var symbol = getBuiltIn('Symbol')();\n // MS Edge converts symbol values to JSON as {}\n return $stringify([symbol]) != '[null]'\n // WebKit converts symbol values to JSON as null\n || $stringify({ a: symbol }) != '{}'\n // V8 throws on boxed symbols\n || $stringify(Object(symbol)) != '{}';\n});\n\n// https://github.com/tc39/proposal-well-formed-stringify\nvar ILL_FORMED_UNICODE = fails(function () {\n return $stringify('\\uDF06\\uD834') !== '\"\\\\udf06\\\\ud834\"'\n || $stringify('\\uDEAD') !== '\"\\\\udead\"';\n});\n\nvar stringifyWithSymbolsFix = function (it, replacer) {\n var args = arraySlice(arguments);\n var $replacer = getReplacerFunction(replacer);\n if (!isCallable($replacer) && (it === undefined || isSymbol(it))) return; // IE8 returns string on undefined\n args[1] = function (key, value) {\n // some old implementations (like WebKit) could pass numbers as keys\n if (isCallable($replacer)) value = call($replacer, this, $String(key), value);\n if (!isSymbol(value)) return value;\n };\n return apply($stringify, null, args);\n};\n\nvar fixIllFormed = function (match, offset, string) {\n var prev = charAt(string, offset - 1);\n var next = charAt(string, offset + 1);\n if ((exec(low, match) && !exec(hi, next)) || (exec(hi, match) && !exec(low, prev))) {\n return '\\\\u' + numberToString(charCodeAt(match, 0), 16);\n } return match;\n};\n\nif ($stringify) {\n // `JSON.stringify` method\n // https://tc39.es/ecma262/#sec-json.stringify\n $({ target: 'JSON', stat: true, arity: 3, forced: WRONG_SYMBOLS_CONVERSION || ILL_FORMED_UNICODE }, {\n // eslint-disable-next-line no-unused-vars -- required for `.length`\n stringify: function stringify(it, replacer, space) {\n var args = arraySlice(arguments);\n var result = apply(WRONG_SYMBOLS_CONVERSION ? stringifyWithSymbolsFix : $stringify, null, args);\n return ILL_FORMED_UNICODE && typeof result == 'string' ? replace(result, tester, fixIllFormed) : result;\n }\n });\n}\n", "var $ = require('../internals/export');\nvar NATIVE_SYMBOL = require('../internals/symbol-constructor-detection');\nvar fails = require('../internals/fails');\nvar getOwnPropertySymbolsModule = require('../internals/object-get-own-property-symbols');\nvar toObject = require('../internals/to-object');\n\n// V8 ~ Chrome 38 and 39 `Object.getOwnPropertySymbols` fails on primitives\n// https://bugs.chromium.org/p/v8/issues/detail?id=3443\nvar FORCED = !NATIVE_SYMBOL || fails(function () { getOwnPropertySymbolsModule.f(1); });\n\n// `Object.getOwnPropertySymbols` method\n// https://tc39.es/ecma262/#sec-object.getownpropertysymbols\n$({ target: 'Object', stat: true, forced: FORCED }, {\n getOwnPropertySymbols: function getOwnPropertySymbols(it) {\n var $getOwnPropertySymbols = getOwnPropertySymbolsModule.f;\n return $getOwnPropertySymbols ? $getOwnPropertySymbols(toObject(it)) : [];\n }\n});\n", "var wellKnownSymbol = require('../internals/well-known-symbol');\nvar create = require('../internals/object-create');\nvar defineProperty = require('../internals/object-define-property').f;\n\nvar UNSCOPABLES = wellKnownSymbol('unscopables');\nvar ArrayPrototype = Array.prototype;\n\n// Array.prototype[@@unscopables]\n// https://tc39.es/ecma262/#sec-array.prototype-@@unscopables\nif (ArrayPrototype[UNSCOPABLES] == undefined) {\n defineProperty(ArrayPrototype, UNSCOPABLES, {\n configurable: true,\n value: create(null)\n });\n}\n\n// add a key to Array.prototype[@@unscopables]\nmodule.exports = function (key) {\n ArrayPrototype[UNSCOPABLES][key] = true;\n};\n", "var fails = require('../internals/fails');\n\nmodule.exports = !fails(function () {\n function F() { /* empty */ }\n F.prototype.constructor = null;\n // eslint-disable-next-line es/no-object-getprototypeof -- required for testing\n return Object.getPrototypeOf(new F()) !== F.prototype;\n});\n", "var hasOwn = require('../internals/has-own-property');\nvar isCallable = require('../internals/is-callable');\nvar toObject = require('../internals/to-object');\nvar sharedKey = require('../internals/shared-key');\nvar CORRECT_PROTOTYPE_GETTER = require('../internals/correct-prototype-getter');\n\nvar IE_PROTO = sharedKey('IE_PROTO');\nvar $Object = Object;\nvar ObjectPrototype = $Object.prototype;\n\n// `Object.getPrototypeOf` method\n// https://tc39.es/ecma262/#sec-object.getprototypeof\n// eslint-disable-next-line es/no-object-getprototypeof -- safe\nmodule.exports = CORRECT_PROTOTYPE_GETTER ? $Object.getPrototypeOf : function (O) {\n var object = toObject(O);\n if (hasOwn(object, IE_PROTO)) return object[IE_PROTO];\n var constructor = object.constructor;\n if (isCallable(constructor) && object instanceof constructor) {\n return constructor.prototype;\n } return object instanceof $Object ? ObjectPrototype : null;\n};\n", "'use strict';\nvar fails = require('../internals/fails');\nvar isCallable = require('../internals/is-callable');\nvar isObject = require('../internals/is-object');\nvar create = require('../internals/object-create');\nvar getPrototypeOf = require('../internals/object-get-prototype-of');\nvar defineBuiltIn = require('../internals/define-built-in');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar IS_PURE = require('../internals/is-pure');\n\nvar ITERATOR = wellKnownSymbol('iterator');\nvar BUGGY_SAFARI_ITERATORS = false;\n\n// `%IteratorPrototype%` object\n// https://tc39.es/ecma262/#sec-%iteratorprototype%-object\nvar IteratorPrototype, PrototypeOfArrayIteratorPrototype, arrayIterator;\n\n/* eslint-disable es/no-array-prototype-keys -- safe */\nif ([].keys) {\n arrayIterator = [].keys();\n // Safari 8 has buggy iterators w/o `next`\n if (!('next' in arrayIterator)) BUGGY_SAFARI_ITERATORS = true;\n else {\n PrototypeOfArrayIteratorPrototype = getPrototypeOf(getPrototypeOf(arrayIterator));\n if (PrototypeOfArrayIteratorPrototype !== Object.prototype) IteratorPrototype = PrototypeOfArrayIteratorPrototype;\n }\n}\n\nvar NEW_ITERATOR_PROTOTYPE = !isObject(IteratorPrototype) || fails(function () {\n var test = {};\n // FF44- legacy iterators case\n return IteratorPrototype[ITERATOR].call(test) !== test;\n});\n\nif (NEW_ITERATOR_PROTOTYPE) IteratorPrototype = {};\nelse if (IS_PURE) IteratorPrototype = create(IteratorPrototype);\n\n// `%IteratorPrototype%[@@iterator]()` method\n// https://tc39.es/ecma262/#sec-%iteratorprototype%-@@iterator\nif (!isCallable(IteratorPrototype[ITERATOR])) {\n defineBuiltIn(IteratorPrototype, ITERATOR, function () {\n return this;\n });\n}\n\nmodule.exports = {\n IteratorPrototype: IteratorPrototype,\n BUGGY_SAFARI_ITERATORS: BUGGY_SAFARI_ITERATORS\n};\n", "'use strict';\nvar IteratorPrototype = require('../internals/iterators-core').IteratorPrototype;\nvar create = require('../internals/object-create');\nvar createPropertyDescriptor = require('../internals/create-property-descriptor');\nvar setToStringTag = require('../internals/set-to-string-tag');\nvar Iterators = require('../internals/iterators');\n\nvar returnThis = function () { return this; };\n\nmodule.exports = function (IteratorConstructor, NAME, next, ENUMERABLE_NEXT) {\n var TO_STRING_TAG = NAME + ' Iterator';\n IteratorConstructor.prototype = create(IteratorPrototype, { next: createPropertyDescriptor(+!ENUMERABLE_NEXT, next) });\n setToStringTag(IteratorConstructor, TO_STRING_TAG, false, true);\n Iterators[TO_STRING_TAG] = returnThis;\n return IteratorConstructor;\n};\n", "'use strict';\nvar $ = require('../internals/export');\nvar call = require('../internals/function-call');\nvar IS_PURE = require('../internals/is-pure');\nvar FunctionName = require('../internals/function-name');\nvar isCallable = require('../internals/is-callable');\nvar createIteratorConstructor = require('../internals/iterator-create-constructor');\nvar getPrototypeOf = require('../internals/object-get-prototype-of');\nvar setPrototypeOf = require('../internals/object-set-prototype-of');\nvar setToStringTag = require('../internals/set-to-string-tag');\nvar createNonEnumerableProperty = require('../internals/create-non-enumerable-property');\nvar defineBuiltIn = require('../internals/define-built-in');\nvar wellKnownSymbol = require('../internals/well-known-symbol');\nvar Iterators = require('../internals/iterators');\nvar IteratorsCore = require('../internals/iterators-core');\n\nvar PROPER_FUNCTION_NAME = FunctionName.PROPER;\nvar CONFIGURABLE_FUNCTION_NAME = FunctionName.CONFIGURABLE;\nvar IteratorPrototype = IteratorsCore.IteratorPrototype;\nvar BUGGY_SAFARI_ITERATORS = IteratorsCore.BUGGY_SAFARI_ITERATORS;\nvar ITERATOR = wellKnownSymbol('iterator');\nvar KEYS = 'keys';\nvar VALUES = 'values';\nvar ENTRIES = 'entries';\n\nvar returnThis = function () { return this; };\n\nmodule.exports = function (Iterable, NAME, IteratorConstructor, next, DEFAULT, IS_SET, FORCED) {\n createIteratorConstructor(IteratorConstructor, NAME, next);\n\n var getIterationMethod = function (KIND) {\n if (KIND === DEFAULT && defaultIterator) return defaultIterator;\n if (!BUGGY_SAFARI_ITERATORS && KIND in IterablePrototype) return IterablePrototype[KIND];\n switch (KIND) {\n case KEYS: return function keys() { return new IteratorConstructor(this, KIND); };\n case VALUES: return function values() { return new IteratorConstructor(this, KIND); };\n case ENTRIES: return function entries() { return new IteratorConstructor(this, KIND); };\n } return function () { return new IteratorConstructor(this); };\n };\n\n var TO_STRING_TAG = NAME + ' Iterator';\n var INCORRECT_VALUES_NAME = false;\n var IterablePrototype = Iterable.prototype;\n var nativeIterator = IterablePrototype[ITERATOR]\n || IterablePrototype['@@iterator']\n || DEFAULT && IterablePrototype[DEFAULT];\n var defaultIterator = !BUGGY_SAFARI_ITERATORS && nativeIterator || getIterationMethod(DEFAULT);\n var anyNativeIterator = NAME == 'Array' ? IterablePrototype.entries || nativeIterator : nativeIterator;\n var CurrentIteratorPrototype, methods, KEY;\n\n // fix native\n if (anyNativeIterator) {\n CurrentIteratorPrototype = getPrototypeOf(anyNativeIterator.call(new Iterable()));\n if (CurrentIteratorPrototype !== Object.prototype && CurrentIteratorPrototype.next) {\n if (!IS_PURE && getPrototypeOf(CurrentIteratorPrototype) !== IteratorPrototype) {\n if (setPrototypeOf) {\n setPrototypeOf(CurrentIteratorPrototype, IteratorPrototype);\n } else if (!isCallable(CurrentIteratorPrototype[ITERATOR])) {\n defineBuiltIn(CurrentIteratorPrototype, ITERATOR, returnThis);\n }\n }\n // Set @@toStringTag to native iterators\n setToStringTag(CurrentIteratorPrototype, TO_STRING_TAG, true, true);\n if (IS_PURE) Iterators[TO_STRING_TAG] = returnThis;\n }\n }\n\n // fix Array.prototype.{ values, @@iterator }.name in V8 / FF\n if (PROPER_FUNCTION_NAME && DEFAULT == VALUES && nativeIterator && nativeIterator.name !== VALUES) {\n if (!IS_PURE && CONFIGURABLE_FUNCTION_NAME) {\n createNonEnumerableProperty(IterablePrototype, 'name', VALUES);\n } else {\n INCORRECT_VALUES_NAME = true;\n defaultIterator = function values() { return call(nativeIterator, this); };\n }\n }\n\n // export additional methods\n if (DEFAULT) {\n methods = {\n values: getIterationMethod(VALUES),\n keys: IS_SET ? defaultIterator : getIterationMethod(KEYS),\n entries: getIterationMethod(ENTRIES)\n };\n if (FORCED) for (KEY in methods) {\n if (BUGGY_SAFARI_ITERATORS || INCORRECT_VALUES_NAME || !(KEY in IterablePrototype)) {\n defineBuiltIn(IterablePrototype, KEY, methods[KEY]);\n }\n } else $({ target: NAME, proto: true, forced: BUGGY_SAFARI_ITERATORS || INCORRECT_VALUES_NAME }, methods);\n }\n\n // define iterator\n if ((!IS_PURE || FORCED) && IterablePrototype[ITERATOR] !== defaultIterator) {\n defineBuiltIn(IterablePrototype, ITERATOR, defaultIterator, { name: DEFAULT });\n }\n Iterators[NAME] = defaultIterator;\n\n return methods;\n};\n", "// `CreateIterResultObject` abstract operation\n// https://tc39.es/ecma262/#sec-createiterresultobject\nmodule.exports = function (value, done) {\n return { value: value, done: done };\n};\n", "'use strict';\nvar toIndexedObject = require('../internals/to-indexed-object');\nvar addToUnscopables = require('../internals/add-to-unscopables');\nvar Iterators = require('../internals/iterators');\nvar InternalStateModule = require('../internals/internal-state');\nvar defineProperty = require('../internals/object-define-property').f;\nvar defineIterator = require('../internals/iterator-define');\nvar createIterResultObject = require('../internals/create-iter-result-object');\nvar IS_PURE = require('../internals/is-pure');\nvar DESCRIPTORS = require('../internals/descriptors');\n\nvar ARRAY_ITERATOR = 'Array Iterator';\nvar setInternalState = InternalStateModule.set;\nvar getInternalState = InternalStateModule.getterFor(ARRAY_ITERATOR);\n\n// `Array.prototype.entries` method\n// https://tc39.es/ecma262/#sec-array.prototype.entries\n// `Array.prototype.keys` method\n// https://tc39.es/ecma262/#sec-array.prototype.keys\n// `Array.prototype.values` method\n// https://tc39.es/ecma262/#sec-array.prototype.values\n// `Array.prototype[@@iterator]` method\n// https://tc39.es/ecma262/#sec-array.prototype-@@iterator\n// `CreateArrayIterator` internal method\n// https://tc39.es/ecma262/#sec-createarrayiterator\nmodule.exports = defineIterator(Array, 'Array', function (iterated, kind) {\n setInternalState(this, {\n type: ARRAY_ITERATOR,\n target: toIndexedObject(iterated), // target\n index: 0, // next index\n kind: kind // kind\n });\n// `%ArrayIteratorPrototype%.next` method\n// https://tc39.es/ecma262/#sec-%arrayiteratorprototype%.next\n}, function () {\n var state = getInternalState(this);\n var target = state.target;\n var kind = state.kind;\n var index = state.index++;\n if (!target || index >= target.length) {\n state.target = undefined;\n return createIterResultObject(undefined, true);\n }\n if (kind == 'keys') return createIterResultObject(index, false);\n if (kind == 'values') return createIterResultObject(target[index], false);\n return createIterResultObject([index, target[index]], false);\n}, 'values');\n\n// argumentsList[@@iterator] is %ArrayProto_values%\n// https://tc39.es/ecma262/#sec-createunmappedargumentsobject\n// https://tc39.es/ecma262/#sec-createmappedargumentsobject\nvar values = Iterators.Arguments = Iterators.Array;\n\n// https://tc39.es/ecma262/#sec-array.prototype-@@unscopables\naddToUnscopables('keys');\naddToUnscopables('values');\naddToUnscopables('entries');\n\n// V8 ~ Chrome 45- bug\nif (!IS_PURE && DESCRIPTORS && values.name !== 'values') try {\n defineProperty(values, 'name', { value: 'values' });\n} catch (error) { /* empty */ }\n", "// iterable DOM collections\n// flag - `iterable` interface - 'entries', 'keys', 'values', 'forEach' methods\nmodule.exports = {\n CSSRuleList: 0,\n CSSStyleDeclaration: 0,\n CSSValueList: 0,\n ClientRectList: 0,\n DOMRectList: 0,\n DOMStringList: 0,\n DOMTokenList: 1,\n DataTransferItemList: 0,\n FileList: 0,\n HTMLAllCollection: 0,\n HTMLCollection: 0,\n HTMLFormElement: 0,\n HTMLSelectElement: 0,\n MediaList: 0,\n MimeTypeArray: 0,\n NamedNodeMap: 0,\n NodeList: 1,\n PaintRequestList: 0,\n Plugin: 0,\n PluginArray: 0,\n SVGLengthList: 0,\n SVGNumberList: 0,\n SVGPathSegList: 0,\n SVGPointList: 0,\n SVGStringList: 0,\n SVGTransformList: 0,\n SourceBufferList: 0,\n StyleSheetList: 0,\n TextTrackCueList: 0,\n TextTrackList: 0,\n TouchList: 0\n};\n", "// in old WebKit versions, `element.classList` is not an instance of global `DOMTokenList`\nvar documentCreateElement = require('../internals/document-create-element');\n\nvar classList = documentCreateElement('span').classList;\nvar DOMTokenListPrototype = classList && classList.constructor && classList.constructor.prototype;\n\nmodule.exports = DOMTokenListPrototype === Object.prototype ? undefined : DOMTokenListPrototype;\n", "'use strict';\nvar fails = require('../internals/fails');\n\nmodule.exports = function (METHOD_NAME, argument) {\n var method = [][METHOD_NAME];\n return !!method && fails(function () {\n // eslint-disable-next-line no-useless-call -- required for testing\n method.call(null, argument || function () { return 1; }, 1);\n });\n};\n", "'use strict';\nvar $forEach = require('../internals/array-iteration').forEach;\nvar arrayMethodIsStrict = require('../internals/array-method-is-strict');\n\nvar STRICT_METHOD = arrayMethodIsStrict('forEach');\n\n// `Array.prototype.forEach` method implementation\n// https://tc39.es/ecma262/#sec-array.prototype.foreach\nmodule.exports = !STRICT_METHOD ? function forEach(callbackfn /* , thisArg */) {\n return $forEach(this, callbackfn, arguments.length > 1 ? arguments[1] : undefined);\n// eslint-disable-next-line es/no-array-prototype-foreach -- safe\n} : [].forEach;\n", "function _typeof(obj) { \"@babel/helpers - typeof\"; return _typeof = \"function\" == typeof Symbol && \"symbol\" == typeof Symbol.iterator ? function (obj) { return typeof obj; } : function (obj) { return obj && \"function\" == typeof Symbol && obj.constructor === Symbol && obj !== Symbol.prototype ? \"symbol\" : typeof obj; }, _typeof(obj); }\nvar _document$currentScri, _document$currentScri2;\nfunction _regeneratorRuntime() { \"use strict\"; /*! regenerator-runtime -- Copyright (c) 2014-present, Facebook, Inc. -- license (MIT): https://github.com/facebook/regenerator/blob/main/LICENSE */ _regeneratorRuntime = function _regeneratorRuntime() { return exports; }; var exports = {}, Op = Object.prototype, hasOwn = Op.hasOwnProperty, defineProperty = Object.defineProperty || function (obj, key, desc) { obj[key] = desc.value; }, $Symbol = \"function\" == typeof Symbol ? Symbol : {}, iteratorSymbol = $Symbol.iterator || \"@@iterator\", asyncIteratorSymbol = $Symbol.asyncIterator || \"@@asyncIterator\", toStringTagSymbol = $Symbol.toStringTag || \"@@toStringTag\"; function define(obj, key, value) { return Object.defineProperty(obj, key, { value: value, enumerable: !0, configurable: !0, writable: !0 }), obj[key]; } try { define({}, \"\"); } catch (err) { define = function define(obj, key, value) { return obj[key] = value; }; } function wrap(innerFn, outerFn, self, tryLocsList) { var protoGenerator = outerFn && outerFn.prototype instanceof Generator ? outerFn : Generator, generator = Object.create(protoGenerator.prototype), context = new Context(tryLocsList || []); return defineProperty(generator, \"_invoke\", { value: makeInvokeMethod(innerFn, self, context) }), generator; } function tryCatch(fn, obj, arg) { try { return { type: \"normal\", arg: fn.call(obj, arg) }; } catch (err) { return { type: \"throw\", arg: err }; } } exports.wrap = wrap; var ContinueSentinel = {}; function Generator() {} function GeneratorFunction() {} function GeneratorFunctionPrototype() {} var IteratorPrototype = {}; define(IteratorPrototype, iteratorSymbol, function () { return this; }); var getProto = Object.getPrototypeOf, NativeIteratorPrototype = getProto && getProto(getProto(values([]))); NativeIteratorPrototype && NativeIteratorPrototype !== Op && hasOwn.call(NativeIteratorPrototype, iteratorSymbol) && (IteratorPrototype = NativeIteratorPrototype); var Gp = GeneratorFunctionPrototype.prototype = Generator.prototype = Object.create(IteratorPrototype); function defineIteratorMethods(prototype) { [\"next\", \"throw\", \"return\"].forEach(function (method) { define(prototype, method, function (arg) { return this._invoke(method, arg); }); }); } function AsyncIterator(generator, PromiseImpl) { function invoke(method, arg, resolve, reject) { var record = tryCatch(generator[method], generator, arg); if (\"throw\" !== record.type) { var result = record.arg, value = result.value; return value && \"object\" == _typeof(value) && hasOwn.call(value, \"__await\") ? PromiseImpl.resolve(value.__await).then(function (value) { invoke(\"next\", value, resolve, reject); }, function (err) { invoke(\"throw\", err, resolve, reject); }) : PromiseImpl.resolve(value).then(function (unwrapped) { result.value = unwrapped, resolve(result); }, function (error) { return invoke(\"throw\", error, resolve, reject); }); } reject(record.arg); } var previousPromise; defineProperty(this, \"_invoke\", { value: function value(method, arg) { function callInvokeWithMethodAndArg() { return new PromiseImpl(function (resolve, reject) { invoke(method, arg, resolve, reject); }); } return previousPromise = previousPromise ? previousPromise.then(callInvokeWithMethodAndArg, callInvokeWithMethodAndArg) : callInvokeWithMethodAndArg(); } }); } function makeInvokeMethod(innerFn, self, context) { var state = \"suspendedStart\"; return function (method, arg) { if (\"executing\" === state) throw new Error(\"Generator is already running\"); if (\"completed\" === state) { if (\"throw\" === method) throw arg; return doneResult(); } for (context.method = method, context.arg = arg;;) { var delegate = context.delegate; if (delegate) { var delegateResult = maybeInvokeDelegate(delegate, context); if (delegateResult) { if (delegateResult === ContinueSentinel) continue; return delegateResult; } } if (\"next\" === context.method) context.sent = context._sent = context.arg;else if (\"throw\" === context.method) { if (\"suspendedStart\" === state) throw state = \"completed\", context.arg; context.dispatchException(context.arg); } else \"return\" === context.method && context.abrupt(\"return\", context.arg); state = \"executing\"; var record = tryCatch(innerFn, self, context); if (\"normal\" === record.type) { if (state = context.done ? \"completed\" : \"suspendedYield\", record.arg === ContinueSentinel) continue; return { value: record.arg, done: context.done }; } \"throw\" === record.type && (state = \"completed\", context.method = \"throw\", context.arg = record.arg); } }; } function maybeInvokeDelegate(delegate, context) { var methodName = context.method, method = delegate.iterator[methodName]; if (undefined === method) return context.delegate = null, \"throw\" === methodName && delegate.iterator.return && (context.method = \"return\", context.arg = undefined, maybeInvokeDelegate(delegate, context), \"throw\" === context.method) || \"return\" !== methodName && (context.method = \"throw\", context.arg = new TypeError(\"The iterator does not provide a '\" + methodName + \"' method\")), ContinueSentinel; var record = tryCatch(method, delegate.iterator, context.arg); if (\"throw\" === record.type) return context.method = \"throw\", context.arg = record.arg, context.delegate = null, ContinueSentinel; var info = record.arg; return info ? info.done ? (context[delegate.resultName] = info.value, context.next = delegate.nextLoc, \"return\" !== context.method && (context.method = \"next\", context.arg = undefined), context.delegate = null, ContinueSentinel) : info : (context.method = \"throw\", context.arg = new TypeError(\"iterator result is not an object\"), context.delegate = null, ContinueSentinel); } function pushTryEntry(locs) { var entry = { tryLoc: locs[0] }; 1 in locs && (entry.catchLoc = locs[1]), 2 in locs && (entry.finallyLoc = locs[2], entry.afterLoc = locs[3]), this.tryEntries.push(entry); } function resetTryEntry(entry) { var record = entry.completion || {}; record.type = \"normal\", delete record.arg, entry.completion = record; } function Context(tryLocsList) { this.tryEntries = [{ tryLoc: \"root\" }], tryLocsList.forEach(pushTryEntry, this), this.reset(!0); } function values(iterable) { if (iterable) { var iteratorMethod = iterable[iteratorSymbol]; if (iteratorMethod) return iteratorMethod.call(iterable); if (\"function\" == typeof iterable.next) return iterable; if (!isNaN(iterable.length)) { var i = -1, next = function next() { for (; ++i < iterable.length;) if (hasOwn.call(iterable, i)) return next.value = iterable[i], next.done = !1, next; return next.value = undefined, next.done = !0, next; }; return next.next = next; } } return { next: doneResult }; } function doneResult() { return { value: undefined, done: !0 }; } return GeneratorFunction.prototype = GeneratorFunctionPrototype, defineProperty(Gp, \"constructor\", { value: GeneratorFunctionPrototype, configurable: !0 }), defineProperty(GeneratorFunctionPrototype, \"constructor\", { value: GeneratorFunction, configurable: !0 }), GeneratorFunction.displayName = define(GeneratorFunctionPrototype, toStringTagSymbol, \"GeneratorFunction\"), exports.isGeneratorFunction = function (genFun) { var ctor = \"function\" == typeof genFun && genFun.constructor; return !!ctor && (ctor === GeneratorFunction || \"GeneratorFunction\" === (ctor.displayName || ctor.name)); }, exports.mark = function (genFun) { return Object.setPrototypeOf ? Object.setPrototypeOf(genFun, GeneratorFunctionPrototype) : (genFun.__proto__ = GeneratorFunctionPrototype, define(genFun, toStringTagSymbol, \"GeneratorFunction\")), genFun.prototype = Object.create(Gp), genFun; }, exports.awrap = function (arg) { return { __await: arg }; }, defineIteratorMethods(AsyncIterator.prototype), define(AsyncIterator.prototype, asyncIteratorSymbol, function () { return this; }), exports.AsyncIterator = AsyncIterator, exports.async = function (innerFn, outerFn, self, tryLocsList, PromiseImpl) { void 0 === PromiseImpl && (PromiseImpl = Promise); var iter = new AsyncIterator(wrap(innerFn, outerFn, self, tryLocsList), PromiseImpl); return exports.isGeneratorFunction(outerFn) ? iter : iter.next().then(function (result) { return result.done ? result.value : iter.next(); }); }, defineIteratorMethods(Gp), define(Gp, toStringTagSymbol, \"Generator\"), define(Gp, iteratorSymbol, function () { return this; }), define(Gp, \"toString\", function () { return \"[object Generator]\"; }), exports.keys = function (val) { var object = Object(val), keys = []; for (var key in object) keys.push(key); return keys.reverse(), function next() { for (; keys.length;) { var key = keys.pop(); if (key in object) return next.value = key, next.done = !1, next; } return next.done = !0, next; }; }, exports.values = values, Context.prototype = { constructor: Context, reset: function reset(skipTempReset) { if (this.prev = 0, this.next = 0, this.sent = this._sent = undefined, this.done = !1, this.delegate = null, this.method = \"next\", this.arg = undefined, this.tryEntries.forEach(resetTryEntry), !skipTempReset) for (var name in this) \"t\" === name.charAt(0) && hasOwn.call(this, name) && !isNaN(+name.slice(1)) && (this[name] = undefined); }, stop: function stop() { this.done = !0; var rootRecord = this.tryEntries[0].completion; if (\"throw\" === rootRecord.type) throw rootRecord.arg; return this.rval; }, dispatchException: function dispatchException(exception) { if (this.done) throw exception; var context = this; function handle(loc, caught) { return record.type = \"throw\", record.arg = exception, context.next = loc, caught && (context.method = \"next\", context.arg = undefined), !!caught; } for (var i = this.tryEntries.length - 1; i >= 0; --i) { var entry = this.tryEntries[i], record = entry.completion; if (\"root\" === entry.tryLoc) return handle(\"end\"); if (entry.tryLoc <= this.prev) { var hasCatch = hasOwn.call(entry, \"catchLoc\"), hasFinally = hasOwn.call(entry, \"finallyLoc\"); if (hasCatch && hasFinally) { if (this.prev < entry.catchLoc) return handle(entry.catchLoc, !0); if (this.prev < entry.finallyLoc) return handle(entry.finallyLoc); } else if (hasCatch) { if (this.prev < entry.catchLoc) return handle(entry.catchLoc, !0); } else { if (!hasFinally) throw new Error(\"try statement without catch or finally\"); if (this.prev < entry.finallyLoc) return handle(entry.finallyLoc); } } } }, abrupt: function abrupt(type, arg) { for (var i = this.tryEntries.length - 1; i >= 0; --i) { var entry = this.tryEntries[i]; if (entry.tryLoc <= this.prev && hasOwn.call(entry, \"finallyLoc\") && this.prev < entry.finallyLoc) { var finallyEntry = entry; break; } } finallyEntry && (\"break\" === type || \"continue\" === type) && finallyEntry.tryLoc <= arg && arg <= finallyEntry.finallyLoc && (finallyEntry = null); var record = finallyEntry ? finallyEntry.completion : {}; return record.type = type, record.arg = arg, finallyEntry ? (this.method = \"next\", this.next = finallyEntry.finallyLoc, ContinueSentinel) : this.complete(record); }, complete: function complete(record, afterLoc) { if (\"throw\" === record.type) throw record.arg; return \"break\" === record.type || \"continue\" === record.type ? this.next = record.arg : \"return\" === record.type ? (this.rval = this.arg = record.arg, this.method = \"return\", this.next = \"end\") : \"normal\" === record.type && afterLoc && (this.next = afterLoc), ContinueSentinel; }, finish: function finish(finallyLoc) { for (var i = this.tryEntries.length - 1; i >= 0; --i) { var entry = this.tryEntries[i]; if (entry.finallyLoc === finallyLoc) return this.complete(entry.completion, entry.afterLoc), resetTryEntry(entry), ContinueSentinel; } }, catch: function _catch(tryLoc) { for (var i = this.tryEntries.length - 1; i >= 0; --i) { var entry = this.tryEntries[i]; if (entry.tryLoc === tryLoc) { var record = entry.completion; if (\"throw\" === record.type) { var thrown = record.arg; resetTryEntry(entry); } return thrown; } } throw new Error(\"illegal catch attempt\"); }, delegateYield: function delegateYield(iterable, resultName, nextLoc) { return this.delegate = { iterator: values(iterable), resultName: resultName, nextLoc: nextLoc }, \"next\" === this.method && (this.arg = undefined), ContinueSentinel; } }, exports; }\nfunction asyncGeneratorStep(gen, resolve, reject, _next, _throw, key, arg) { try { var info = gen[key](arg); var value = info.value; } catch (error) { reject(error); return; } if (info.done) { resolve(value); } else { Promise.resolve(value).then(_next, _throw); } }\nfunction _asyncToGenerator(fn) { return function () { var self = this, args = arguments; return new Promise(function (resolve, reject) { var gen = fn.apply(self, args); function _next(value) { asyncGeneratorStep(gen, resolve, reject, _next, _throw, \"next\", value); } function _throw(err) { asyncGeneratorStep(gen, resolve, reject, _next, _throw, \"throw\", err); } _next(undefined); }); }; }\nimport \"core-js/modules/es.regexp.exec.js\";\nimport \"core-js/modules/es.string.replace.js\";\nimport \"core-js/modules/es.array.concat.js\";\nimport \"core-js/modules/es.object.to-string.js\";\nimport \"core-js/modules/es.promise.js\";\nimport \"core-js/modules/es.object.define-property.js\";\nimport \"core-js/modules/es.symbol.js\";\nimport \"core-js/modules/es.symbol.description.js\";\nimport \"core-js/modules/es.symbol.iterator.js\";\nimport \"core-js/modules/es.array.iterator.js\";\nimport \"core-js/modules/es.string.iterator.js\";\nimport \"core-js/modules/web.dom-collections.iterator.js\";\nimport \"core-js/modules/es.symbol.async-iterator.js\";\nimport \"core-js/modules/es.symbol.to-string-tag.js\";\nimport \"core-js/modules/es.json.to-string-tag.js\";\nimport \"core-js/modules/es.math.to-string-tag.js\";\nimport \"core-js/modules/es.object.get-prototype-of.js\";\nimport \"core-js/modules/es.array.for-each.js\";\nimport \"core-js/modules/web.dom-collections.for-each.js\";\nimport \"core-js/modules/es.function.name.js\";\nimport \"core-js/modules/es.object.set-prototype-of.js\";\nimport \"core-js/modules/es.array.reverse.js\";\nimport \"core-js/modules/es.array.slice.js\";\n/* eslint-disable unicorn/filename-case */\n\ndocument.documentElement.classList.add(\"autoreload-enabled\");\nvar protocol = window.location.protocol === \"https:\" ? \"wss:\" : \"ws:\";\n// Add trailing slash to path, if necessary, before appending \"autoreload\"\nvar defaultPath = window.location.pathname.replace(/\\/?$/, \"/\") + \"autoreload/\";\nvar defaultUrl = \"\".concat(protocol, \"//\").concat(window.location.host).concat(defaultPath);\n\n// By default, use the defaultUrl. But if there's a data-ws-url attribute on our\n//