diff --git a/.Rbuildignore b/.Rbuildignore index 405e09fc3..74750c402 100644 --- a/.Rbuildignore +++ b/.Rbuildignore @@ -7,6 +7,7 @@ ^docs$ ^pkgdown$ ^\.github$ +^\.devcontainer$ ^vignettes/ui-editor-live-demo\.Rmd$ ^\.hintrc$ ^\.yarnrc\.yml$ @@ -19,6 +20,7 @@ ^yarn\.lock$ ^inst\/editor\/(?!build).+$ ^inst\/build-utils$ +^inst\/ast-parsing$ ^inst\/communication-types$ ^inst\/communication-types$ ^inst\/vscode-extension$ diff --git a/DESCRIPTION b/DESCRIPTION index ed1ac6ffa..563f0ef18 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: shinyuieditor Title: Build and Modify your Shiny UI, visually -Version: 0.3.2 +Version: 0.4.0 Authors@R: person(given = "Nick", family = "Strayer", @@ -20,7 +20,6 @@ Imports: later, rlang, shiny, - styler, utils, gridlayout (>= 0.1.0), Suggests: diff --git a/NAMESPACE b/NAMESPACE index cbb746d36..eddc8353c 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,4 +1,3 @@ # Generated by roxygen2: do not edit by hand export(launch_editor) -export(parse_ui_fn) diff --git a/NEWS.md b/NEWS.md index 944658af4..2162c1b04 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,3 +1,14 @@ +# shinyuieditor 0.4.0 + +### Major new features and improvements + +- VSCode extension can now highlight output definitions and input uses in the server code. +- In embedded mode (on the main website) the ui editor now provides full code to reproduce the current app. + +### Minor new features and improvements + +### Bug fixes + # shinyuieditor 0.3.3 ### Major new features and improvements diff --git a/R/FileChangeWatcher.R b/R/FileChangeWatcher.R index 1ddae9e07..aa4ad4838 100644 --- a/R/FileChangeWatcher.R +++ b/R/FileChangeWatcher.R @@ -1,35 +1,45 @@ -FileChangeWatcher <- function() { +FileChangeWatcher <- function(dir_root) { watcher_subscription <- NULL - file_path <- NULL + file_root <- fs::dir_create(dir_root) + watched_files <- NULL last_known_edit <- NULL get_last_edit_time <- function() { - if (is.null(file_path)) { + if (is.null(watched_files)) { return(NULL) } - fs::file_info(file_path)$modification_time + max(file.mtime(watched_files)) } - update_last_known_edit <- function() { + update_last_known_edit_time <- function() { last_known_edit <<- get_last_edit_time() } - start_watching <- function(path_to_watch, on_update) { + set_watched_files <- function(files_to_watch) { + # Make sure files exist + watched_files <<- fs::file_create(fs::path(file_root, files_to_watch)) + names(watched_files) <<- files_to_watch + } + + get_file_contents <- function() { + lapply(watched_files, readLines) + } + start_watching <- function(on_update) { # Make sure we cleanup any old watchers if they exist cleanup() - file_path <<- path_to_watch - update_last_known_edit() + if (is.null(watched_files)) { + stop("File path to watch is uninitialized") + } + update_last_known_edit_time() watcher_subscription <<- create_output_subscribers( source_fn = get_last_edit_time, filter_fn = function(last_edited_new) { - time_delta <- as.numeric(last_known_edit - last_edited_new) - edited_since_last_known <- time_delta != 0 - - edited_since_last_known + no_changes_to_file <- identical(last_known_edit, last_edited_new) + return(!no_changes_to_file) }, delay = 0.25 ) @@ -38,12 +48,50 @@ FileChangeWatcher <- function() { function(last_edited_new) { on_update() # Update the last edit time so this doesn't get called twice - update_last_known_edit() + update_last_known_edit_time() } ) } - + update_files <- function(named_contents) { + for (file_name in names(named_contents)) { + path_to_file <- watched_files[paste0(file_name, ".R")] + if (is.null(path_to_file)) { + stop("Tried to update an unwatched file") + } + writeLines( + text = named_contents[[file_name]], + con = path_to_file + ) + } + + update_last_known_edit_time() + } + + # Delete the files and stop watching them as well + delete_files <- function(delete_root = FALSE) { + if (is.null(watched_files)) { + return() + } + cleanup() + fs::file_delete(watched_files) + + if (!delete_root) { + return() + } + + root_dir_now_empty <- identical(length(fs::dir_ls(file_root)), 0L) + + # We don't want to delete our current working directory on accident, so + # check that + root_dir_is_cwd <- identical(file_root, ".") || + identical(getwd(), file_root) + + if (root_dir_now_empty && !root_dir_is_cwd) { + fs::dir_delete(file_root) + } + } + cleanup <- function() { if (!is.null(watcher_subscription)) { watcher_subscription$cancel_all() @@ -52,8 +100,11 @@ FileChangeWatcher <- function() { } list( + "set_watched_files" = set_watched_files, + "get_file_contents" = get_file_contents, "start_watching" = start_watching, - "update_last_edit_time" = update_last_known_edit, + "update_files" = update_files, + "delete_files" = delete_files, "cleanup" = cleanup ) } diff --git a/R/app_file_helpers.R b/R/app_file_helpers.R deleted file mode 100644 index a82ad49e5..000000000 --- a/R/app_file_helpers.R +++ /dev/null @@ -1,88 +0,0 @@ -# Helper functions related to file paths and apps - - -# Convert a app file type from abstract name to R specific file name -file_type_to_name <- list( - "app" = "app.r", - "ui" = "ui.r", - "server" = "server.r" -) - - - -#' Get the file defining the ui for a shiny app directory -#' -#' @param app_loc Path to a shiny app @param error_on_missing Should the lack of -#' app ui file trigger an error? If not returns a type of "missing" and no path -#' -#' @return Path to either the `app.R` file in directory in the case of -#' single-file apps, or `ui.R` in the case of multi-file apps. If both exist -#' then `app.R` will take precedence -#' -#' @keywords internal -#' -get_app_ui_file <- function(app_loc, error_on_missing = FALSE) { - - if (fs::file_exists(fs::path(app_loc, "app.r"))) { - return( - list(path = fs::path(app_loc, "app.r"), type = "SINGLE-FILE") - ) - } - if (fs::file_exists(fs::path(app_loc, "app.R"))) { - return( - list(path = fs::path(app_loc, "app.R"), type = "SINGLE-FILE") - ) - } - - - if (fs::file_exists(fs::path(app_loc, "ui.r"))) { - return( - list(path = fs::path(app_loc, "ui.r"), type = "MULTI-FILE") - ) - } - if (fs::file_exists(fs::path(app_loc, "ui.R"))) { - return( - list(path = fs::path(app_loc, "ui.R"), type = "MULTI-FILE") - ) - } - - if (error_on_missing) { - stop( - "Can't find an app.R or ui.R file in the provided app_loc. ", - "Make sure your working directory is properly set" - ) - } - - list(type = "missing") -} - - - -#' Write app script to a file -#' -#' @param app_lines Character vector containing the code for the given script. -#' Will be concatinated with new lines -#' @param app_loc Location of folder where script will be written to -#' @param file_type Type of file being written. Can either be "app" for writing -#' an "app.R", or "ui"/"server" for writing the two scripts of a multi-file -#' app. -#' -#' @return NULL -#' @keywords internal -write_app_file <- function(app_lines, app_loc, file_type) { - - # Ensure the path to the app is valid - app_file_path <- fs::file_create( - fs::dir_create(app_loc), - file_type_to_name[file_type] - ) - - writeLines( - text = app_lines, - con = app_file_path - ) -} - -remove_app_file <- function(app_loc, file_type) { - fs::file_delete(fs::path(app_loc, file_type_to_name[file_type])) -} diff --git a/R/deparse_ui_fn.R b/R/deparse_ui_fn.R deleted file mode 100644 index 27b552f32..000000000 --- a/R/deparse_ui_fn.R +++ /dev/null @@ -1,91 +0,0 @@ -#' Deparse ui function tree to expression -#' -#' @param ui_tree Valid ui tree intermediate representation of an apps ui -#' @param remove_namespace Should the generated code have the namespaces removed -#' or should generated function calls take the form of `pkg::fn()` -#' -#' @return A list with `call`: language expression of the generated code, and -#' `namespaces_removed`: a character vector of all the namespaces that were -#' stripped from the ui functions (only has elements if `remove_namespaces = -#' TRUE`) -#' -#' @keywords internal -#' -deparse_ui_fn <- function(ui_tree, remove_namespace = FALSE) { - namespaces_removed <- list() - deparse_ui_fn_internal <- function(ui_tree) { - - # Is the tree node just a primitive value? In that case we don't need to do - # any special parsing - if (!is.list(ui_tree)) { - return(ui_tree) - } - - # Just mirror back whatever the unknown function call was - if (is_unknown_code(ui_tree)) { - return(unknown_code_unwrap(ui_tree)) - } - - # An argument that is not a primitive type must be a (potentially named) - # list. In the future this may need to be expanded to more things like plain - # arrays but right now lists are the only things that make it past - if (!is_ui_tree_node(ui_tree, throw_error = FALSE)) { - return(plain_list_to_expr(ui_tree)) - } - - # If we've made if this far we should be in a full-blown ui node - - # We can then recurse through the arguments/children to build up the proper - # argument structure to be reconstructed with call2 - deparsed_arguments <- lapply( - ui_tree$uiArguments, - deparse_ui_fn_internal - ) - deparsed_children <- lapply( - ui_tree$uiChildren, - deparse_ui_fn_internal - ) - - ui_fn_name <- ui_tree$uiName - if (remove_namespace) { - namespace_and_fn <- known_ui_fns[[ui_fn_name]] - - namespaces_removed[namespace_and_fn$namespace] <<- TRUE - ui_fn_name <- namespace_and_fn$fn - } - - # Now we can reconstruct the original function call with names attached - rlang::call2( - parse(text = ui_fn_name)[[1]], - !!!deparsed_arguments, - !!!deparsed_children - ) - } - - list( - call = deparse_ui_fn_internal(ui_tree), - namespaces_removed = names(namespaces_removed) - ) -} - -plain_list_to_expr <- function(x) { - rlang::call2("list", !!!x) -} - - -is_ui_tree_node <- function(node, throw_error = FALSE) { - if (is.null(node$uiName)) { - if (throw_error) { - stop("Improperly formatted ui tree found - missing uiName property") - return(FALSE) - } - } - if (is.null(node$uiArguments)) { - if (throw_error) { - stop("Improperly formatted ui tree found - missing uiArguments property") - } - return(FALSE) - } - - TRUE -} diff --git a/R/get_app_file_type.R b/R/get_app_file_type.R new file mode 100644 index 000000000..529490dfc --- /dev/null +++ b/R/get_app_file_type.R @@ -0,0 +1,40 @@ +#' Get the file type a shiny app directory +#' +#' @param app_loc Path to a shiny app +#' @param error_on_missing Should the lack of +#' app ui file trigger an error? If not returns a type of "missing" and no path +#' +#' @return either "SINGLE-FILE" (`app.R``), "MULTI-FILE" (`ui.R` and +#' `server.R`), or "MISSING" (empty directory) +#' +#' @keywords internal +#' +get_app_file_type <- function(app_loc, error_on_missing = FALSE) { + if ( + fs::file_exists(fs::path(app_loc, "app.r")) || + fs::file_exists(fs::path(app_loc, "app.R")) + ) { + return("SINGLE-FILE") + } + + if ( + fs::file_exists(fs::path(app_loc, "ui.r")) || + fs::file_exists(fs::path(app_loc, "ui.R")) + ) { + return("MULTI-FILE") + } + + if (error_on_missing) { + stop( + "Can't find an app.R or ui.R file in the provided app_loc. ", + "Make sure your working directory is properly set" + ) + } + + "MISSING" +} + +app_type_to_files <- list( + "SINGLE-FILE" = "app.R", + "MULTI-FILE" = c("ui.R", "server.R") +) diff --git a/R/get_app_info.R b/R/get_app_info.R new file mode 100644 index 000000000..23ed582b8 --- /dev/null +++ b/R/get_app_info.R @@ -0,0 +1,44 @@ +#' Get info about Shiny app for editor +#' +#' Gets pointed at an app containing directory and returns one of two +#' datastructures depending on if it's a single- or multi-file app. +#' +#' @param app_loc Path the the app location +#' +#' @return If it's a +#' single file app its a list with `app_type = "SINGLE-FILE"` and a property +#' `app` that contains `script` (the raw file text for `app.R`) and `ast` which +#' is the serialized ast for that script. +#' +#' If it's a multi-file app its `type="MULTI-FILE` and `ui` and `server` +#' properties with the same script + ast combo as `app` in the single-file case +#' +#' @keywords internal +#' +get_app_info <- function(app_loc) { + app_type <- get_app_file_type(app_loc) + + if (identical(app_type, "SINGLE-FILE")) { + list( + app_type = "SINGLE-FILE", + app = parse_app_script(fs::path(app_loc, "app.R")) + ) + } else { + list( + app_type = "MULTI-FILE", + ui = parse_app_script(fs::path(app_loc, "ui.R")), + server = parse_app_script(fs::path(app_loc, "server.R")) + ) + } +} + + +parse_app_script <- function(script_loc) { + file_lines <- readLines(script_loc) + parsed <- parse(text = file_lines, keep.source = TRUE) + + list( + script = paste(file_lines, collapse = "\n"), + ast = serialize_ast(parsed) + ) +} diff --git a/R/get_file_ui_definition_info.R b/R/get_file_ui_definition_info.R deleted file mode 100644 index 52735dd1c..000000000 --- a/R/get_file_ui_definition_info.R +++ /dev/null @@ -1,154 +0,0 @@ -#' Get app ui information from script -#' -#' @param file_lines Character vector of the lines of the file that defines a -#' shiny app's ui (as from `readLines()`). -#' @param type Is the app a SINGLE-FILE app? E.g. app is container entirely in -#' `app.R`? Or is it `MULTI-FILE`? -#' -#' -#' @return List with both the `type` and `file_lines` mirrored from the -#' arguments of the same name. Along with this the `ui_bounds` containing the -#' start and end lines of the file section that defines the app's ui, the -#' `ui_tree` IR that defines that ui, and `loaded_libraries`: libraries loaded -#' via `library()` calls in the script. -#' -#' -#' @examples -#' -#' # Note the use of the triple colon, this function is not exported -#' # shinyuieditor:::get_file_ui_definition_info(...) -#' -#' # Can handle single-file app.R -#' app_loc <- system.file( -#' "app-templates/geyser/app.R", -#' package = "shinyuieditor" -#' ) -#' shinyuieditor:::get_file_ui_definition_info(readLines(app_loc), type = "SINGLE-FILE") -#' -#' # Also handles multi-file apps -#' app_loc <- system.file("app-templates/geyser_multi-file/ui.R", package = "shinyuieditor") -#' shinyuieditor:::get_file_ui_definition_info(readLines(app_loc), type = "MULTI-FILE") -#' -get_file_ui_definition_info <- function(file_lines, type = "SINGLE-FILE") { - parsed <- parse(text = file_lines, keep.source = TRUE) - - idx <- 0 - if (type == "SINGLE-FILE") { - for (i in seq_len(length(parsed))) { - node <- parsed[[i]] - if (inherits(node, "<-") && identical(node[[2]], as.name("ui"))) { - idx <- i - break - } - } - - if (idx == 0) { - return(NULL) - } - - # Pluck out the expression for the ui for parsing into the IR. Since the - # expression is an assignment we need to get the third element of the AST - # to get the actual ui definition - ui_expr <- parsed[[idx]][[3]] - } else if (type == "MULTI-FILE"){ - # Last node in parsed file should be the ui definition - idx <- length(parsed) - ui_expr <- parsed[[idx]] - } else { - stop("Unknown app type", type, "Options include \"SINGLE-FILE\" and \"MULTI-FILE\"") - } - - ui_srcref <- attr(parsed, "srcref")[[idx]] - - loaded_libraries <- get_loaded_libraries(file_lines) - list( - type = type, - file_lines = file_lines, - ui_bounds = list( - start = ui_srcref[[1]], - end = ui_srcref[[3]] - ), - ui_tree = ui_code_to_tree(ui_expr, loaded_libraries), - loaded_libraries = loaded_libraries - ) -} - -#' Grab libraries loaded via library() calls -#' -#' Gather the name of all libraries loaded with calls to `library()` in a given -#' app -#' -#' @param file_lines lines of an R scripto -#' -#' @return character vector of libraries loaded with library() call -#' -#' @keywords internal -#' -#' @examples -#' file_lines <- c( -#' "library(gridlayout) ", -#' "# hi there I'm a comment", -#' " library(testing)", -#' "#library(commentedOut)", -#' "ui <- grid_page()" -#' ) -#' -#' shinyuieditor:::get_loaded_libraries(file_lines) -#' -get_loaded_libraries <- function(file_lines) { - regmatches( - x = file_lines, - m = regexpr(text = file_lines, pattern = "(?<=library\\()(\\w+)(?=\\))", perl = TRUE) - ) -} - - -#' Update the ui definition for a given ui-defining file -#' -#' @param file_info Info on the ui-defining file as obtained by -#' `shinyuieditor:::get_file_ui_definition_info` -#' @param new_ui_tree The new UI IR tree defining the new ui for the file -#' @param remove_namespace Should the new ui be generated with namespaces -#' stripped and `library()` calls added for any non-defined namespaces? -#' -#' -#' @return A new character vector containing the lines of the ui-defining file -#' with the layout updated to match the `new_ui_tree`. -#' -update_ui_definition <- function(file_info, new_ui_tree, remove_namespace = TRUE) { - new_ui <- ui_tree_to_code(new_ui_tree, remove_namespace = remove_namespace) - ui_libraries <- new_ui$namespaces_removed - new_ui_lines <- new_ui$text - - - file_lines <- file_info$file_lines - num_lines <- length(file_lines) - ui_start <- file_info$ui_bounds$start - ui_end <- file_info$ui_bounds$end - - before_ui_def <- file_lines[1:ui_start - 1] - - # use seq() instead of a simpler range because if the ui def ends at the final - # line of the file the range will still return a single value whereas we want - # an empty array in that case - after_ui_def <- file_lines[seq.int( - from = ui_end + 1L, - length.out = num_lines - ui_end - )] - - # Do we need to add any libraries to the app? - libraries_to_add <- ui_libraries[!ui_libraries %in% file_info$loaded_libraries] - additional_library_lines <- create_library_calls(libraries_to_add) - - # Our new ui text doesn't have the assignment on it so we need to add that - if (file_info$type == "SINGLE-FILE") { - new_ui_lines[1] <- paste("ui <-", new_ui_lines[1]) - } - - c( - additional_library_lines, - before_ui_def, - new_ui_lines, - after_ui_def - ) -} diff --git a/R/gridlayout_tree_updaters.R b/R/gridlayout_tree_updaters.R deleted file mode 100644 index 1c7e668d9..000000000 --- a/R/gridlayout_tree_updaters.R +++ /dev/null @@ -1,17 +0,0 @@ -is_grid_container_node <- function(node) { - node$uiName %in% c("gridlayout::grid_page", "gridlayout::grid_container") -} - -simplify_gridlayout_args <- function(node) { - if (!is_grid_container_node(node)) { - return(node) - } - - # Keep things as arrays and not lists - node$uiArguments$layout <- simplify2array(node$uiArguments$layout) - node$uiArguments$row_sizes <- simplify2array(node$uiArguments$row_sizes) - node$uiArguments$col_sizes <- simplify2array(node$uiArguments$col_sizes) - node$uiArguments$gap_size <- simplify2array(node$uiArguments$gap_size) - - node -} diff --git a/R/known_ui_fns.R b/R/known_ui_fns.R deleted file mode 100644 index d44871842..000000000 --- a/R/known_ui_fns.R +++ /dev/null @@ -1,81 +0,0 @@ -# This list should be kept up to date with `shinyUiNodeInfo` in uiNodeTypes.ts -ui_fn_names_namespaced <- c( - "shiny::plotOutput", - "shiny::sliderInput", - "shiny::numericInput", - "shiny::textInput", - "shiny::radioButtons", - "shiny::checkboxInput", - "shiny::checkboxGroupInput", - "shiny::selectInput", - "shiny::actionButton", - "shiny::uiOutput", - "shiny::textOutput", - "shiny::navbarPage", - "shiny::tabsetPanel", - "shiny::tabPanel", - "gridlayout::grid_page", - "gridlayout::grid_container", - "gridlayout::grid_card", - "gridlayout::grid_card_text", - "gridlayout::grid_card_plot", - "gridlayout::grid_card", - "DT::DTOutput", - "plotly::plotlyOutput" -) - -# These nodes define layouts we have support for in the editor. Used to validate -# tree structure -valid_root_nodes <- c("shiny::navbarPage", "gridlayout::grid_page") - -# Ui names without namespace attached -ui_fn_names_bare <- gsub( - pattern = "\\w+::", - replacement = "", - x = ui_fn_names_namespaced, - perl = TRUE -) - -# List of each functions namespace (`namespace`), un-namespaced name (`fn`) and -# the full namespaced name (`full`) -ui_fn_names_and_namespaces <- lapply( - ui_fn_names_namespaced, - FUN = function(full_name) { - split_name <- strsplit(full_name, split = "::")[[1]] - list( - namespace = split_name[1], - fn = split_name[2], - full = full_name - ) - } -) - -# A list keyed by either the namespaced or un-namespaced name of a ui function -# that gives the info defined in ui_fn_names_and_namespaces back. Used to -# standardize code if namespaced or not -known_ui_fns <- c(ui_fn_names_and_namespaces, ui_fn_names_and_namespaces) -names(known_ui_fns) <- c(ui_fn_names_namespaced, ui_fn_names_bare) - - -#' Namespace a ui function -#' -#' Throws an error if the function is not in the list of known ui functions -#' -#' @param ui_name Namespaced (`pkg::fn`) or un-namespaced (`fn`) function name -#' of known ui functions -#' -#' @return Function name in namespaced format -#' -#' @keywords internal -#' -#' @examples -#' shinyuieditor:::namespace_ui_fn("gridlayout::grid_page") -#' shinyuieditor:::namespace_ui_fn("grid_page") -#' -namespace_ui_fn <- function(ui_name) { - info <- known_ui_fns[[ui_name]] - if (is.null(info)) { - stop("The ui function ", ui_name, " is not in the list of known functions.") - } - info$full -} diff --git a/R/launch_editor.R b/R/launch_editor.R index d522a0459..ae42ae151 100644 --- a/R/launch_editor.R +++ b/R/launch_editor.R @@ -13,11 +13,6 @@ #' will then be written to the location specified. #' @param shiny_background_port Port to launch the shiny app preview on. #' Typically not necessary to set manually. -#' @param remove_namespace Should namespaces (`library::` prefixes) be stripped -#' from the generated UI code? Set to `FALSE` if you prefer the style of -#' `shiny::sliderInput()` to `sliderInput()`. If set to `TRUE`, then any -#' libraries needed for the nodes will be loaded at the top of your `app.R` or -#' `ui.R`. #' @param app_preview Should a live version of the Shiny app being edited run #' and auto-show updates made? You may want to disable this if the app has #' long-running or processor intensive initialization steps. @@ -54,7 +49,6 @@ launch_editor <- function(app_loc, host = "127.0.0.1", port = httpuv::randomPort(), shiny_background_port = httpuv::randomPort(), - remove_namespace = TRUE, app_preview = TRUE, show_logs = TRUE, show_preview_app_logs = TRUE, @@ -69,27 +63,23 @@ launch_editor <- function(app_loc, # Make sure environment will allow features to work properly check_for_url_issues() - # ---------------------------------------------------------------------------- # State variables to keep track of app location etc.. # ---------------------------------------------------------------------------- - # file info is a list that has both the path to the app's ui (app.r for - # single-file or ui.r for multi-file) and the type of the app (i.e - # "single-file" or "multi-file") - file_info <- NULL - # Basic mode of server. Can either be "initializing" | "template-chooser" | # "editing-app". This is used to know what to do on close server_mode <- "initializing" + # Type of app we're in. Can be "SINGLE-FILE", "MULTI-FILE", or "MISSING" + app_type <- get_app_file_type(app_loc) # ---------------------------------------------------------------------------- # Initialize classes for controling app preview and polling for updates # ---------------------------------------------------------------------------- # Object that will watch for changes to the app script - file_change_watcher <- FileChangeWatcher() + file_change_watcher <- FileChangeWatcher(app_loc) # Empty function so variable can always be called even if the timeout hasn't # been initialized @@ -118,96 +108,90 @@ launch_editor <- function(app_loc, } } + shutdown_app_preview <- function() { + if (app_preview) { + writeLog("Stopping app preview") + app_preview_obj$stop_app() + } + } + + setup_new_app_type <- function(new_app_type = app_type) { + app_type <<- new_app_type + shutdown_app_preview() + file_change_watcher$delete_files() + + if (!identical(new_app_type, "MISSING")) { + file_change_watcher$set_watched_files(app_type_to_files[[new_app_type]]) + } + } + # ---------------------------------------------------------------------------- # Main logic for responding to messages from the client. Messages have a path # used for routing and an optional payload. A method of responding is provided # with a send_msg callback # ---------------------------------------------------------------------------- setup_msg_handlers <- function(send_msg) { - request_template_chooser <- function() { - send_msg("TEMPLATE_CHOOSER", "USER-CHOICE") - server_mode <<- "template-chooser" - } - - update_ui_tree_on_client <- function(ui_tree) { - send_msg("UPDATED-TREE", ui_tree) + send_app_info_to_client <- function() { + send_msg("APP-INFO", get_app_info(app_loc)) } load_new_app <- function() { - writeLog("=> Loading app ui and sending to ui editor") - - file_info <<- get_app_ui_file(app_loc, error_on_missing = TRUE) - - ui_tree <- get_app_ui_tree(app_loc) - if (!ui_tree$uiName %in% valid_root_nodes) { - err_msg <- paste( - "Invalid app ui. App needs to start with one of", - paste(valid_root_nodes, collapse = ", ") - ) - send_msg( - "BACKEND-ERROR", - payload = list(context = "parsing app", msg = err_msg) - ) - stop(err_msg) + if (identical(app_type, "MISSING")) { + send_msg("TEMPLATE_CHOOSER", "USER-CHOICE") + server_mode <<- "template-chooser" + return() } - update_ui_tree_on_client(ui_tree) - startup_app_preview() + writeLog("=> Loading app ui and sending to ui editor") file_change_watcher$start_watching( - path_to_watch = file_info$path, on_update = function() { writeLog("=> Sending user updated ui to editor") - update_ui_tree_on_client(get_app_ui_tree(app_loc)) + send_app_info_to_client() } ) server_mode <<- "editing-app" + startup_app_preview() + send_app_info_to_client() } - # State variable to keep track of written templates. - previous_template_type <- NULL - load_app_template <- function(template_info) { - writeLog("<= Loading app template") + # Handles message from client with new app info + handle_updated_app <- function(update_payload) { + update_type <- update_payload$app_type - # If we've written a template previously of another output type, we need - # to do a few housekeeping things... - switched_template_output_types <- !is.null(previous_template_type) && - !identical(template_info$outputType, previous_template_type) - - if (switched_template_output_types) { - # Stopping the app preview will avoid it getting confused when all of a - # sudden the file it's watching dissapears - app_preview_obj$stop_app() - - # Finally we need to remove the old template files themselves, again to - # not confused the app preview not leave around unused files - remove_app_template( - app_loc = app_loc, - app_type = previous_template_type - ) + # If the file update doesn't match the existing app type, remove the old + # files and update the app type + changed_app_type <- !identical(update_type, app_type) + if (changed_app_type) { + setup_new_app_type(update_type) } - write_app_template(template_info, app_loc) - load_new_app() - previous_template_type <<- template_info$outputType - } + updated_scripts <- switch(update_type, + "SINGLE-FILE" = { + list(app = update_payload$app) + }, + "MULTI-FILE" = { + list(ui = update_payload$ui, server = update_payload$server) + }, + { + stop("Don't know how to deal with that type...") + } + ) + file_change_watcher$update_files(updated_scripts) - write_new_ui <- function(new_ui_tree) { - update_app_ui( - file_info = file_info, - new_ui_tree = new_ui_tree, - remove_namespace = remove_namespace - ) - file_change_watcher$update_last_edit_time() - writeLog("<= Saved new ui state from client") + # If we're coming from the server mode or a new app type, then we need to + # load the new app as well + if (changed_app_type || identical(server_mode, "template-chooser")) { + # Setup files + load_new_app() + } } - # Return a callback that takes in a message and reacts to it function(msg) { - writeLog("Message from backend", msg$path) + writeLog("Message from client", msg$path) switch(msg$path, "APP-PREVIEW-REQUEST" = { send_msg("APP-PREVIEW-STATUS", payload = "LOADING") @@ -216,7 +200,7 @@ launch_editor <- function(app_loc, # Once the background preview app is up and running, we can # send over the URL to the react app send_msg( - "APP-PREVIEW-STATUS", + "APP-PREVIEW-STATUS", payload = list(url = app_preview_obj$url) ) }, @@ -235,22 +219,15 @@ launch_editor <- function(app_loc, app_preview_obj$stop_app() }, "READY-FOR-STATE" = { - # Route to the proper starting screen based on if there's an existing - # app or not - if (get_app_ui_file(app_loc)$type == "missing") { - request_template_chooser() - } else { - load_new_app() - } + setup_new_app_type() + load_new_app() }, - "UPDATED-TREE" = { - write_new_ui(msg$payload) + "UPDATED-APP" = { + handle_updated_app(msg$payload) }, "ENTERED-TEMPLATE-SELECTOR" = { + writeLog("Template chooser mode") server_mode <<- "template-chooser" - }, - "TEMPLATE-SELECTION" = { - load_app_template(msg$payload) } ) } @@ -264,7 +241,7 @@ launch_editor <- function(app_loc, app_close_watcher$cleanup() if (server_mode == "template-chooser") { - remove_app_template(app_loc = app_loc, app_type = file_info$type) + file_change_watcher$delete_files(delete_root = TRUE) } }) @@ -277,17 +254,16 @@ launch_editor <- function(app_loc, host = host, port = port, app = list( onWSOpen = function(ws) { - # Cancel any app close timeouts that may have been caused by the # user refreshing the page app_close_watcher$connection_opened() # Setup function to respond to client - send_msg <- function(path, payload) { - ws$send(format_outgoing_msg(path, payload)) - } - - handle_incoming_msg <- setup_msg_handlers(send_msg) + handle_incoming_msg <- setup_msg_handlers( + send_msg = function(path, payload) { + ws$send(format_outgoing_msg(path, payload)) + } + ) # The ws object is a WebSocket object ws$onMessage(function(binary, raw_msg) { @@ -312,18 +288,4 @@ launch_editor <- function(app_loc, ) ) ) -} - - - - -announce_location_of_editor <- function(port, launch_browser) { - location_of_editor <- paste0("http://localhost:", port) - cat(crayon::bold(ascii_box( - paste("Live editor running at", location_of_editor) - ))) - - if (launch_browser) { - utils::browseURL(location_of_editor) - } -} +} \ No newline at end of file diff --git a/R/parse_ui_fn.R b/R/parse_ui_fn.R deleted file mode 100644 index 4ac69da69..000000000 --- a/R/parse_ui_fn.R +++ /dev/null @@ -1,167 +0,0 @@ -#' Parse UI function node -#' -#' Function to recursively parse a Shiny UI definition. Will build a nested list -#' of known UI functions and their arguments. -#' @param ui_node_expr A language object representing the call of a known Shiny -#' UI function. -#' -#' @return A nested list describing the UI of the app for use in the ui editor -#' @export -#' -#' @keywords internal -#' -#' @examples -#' -#' app_expr <- rlang::expr( -#' gridlayout::grid_page( -#' layout = " -#' | 1rem | 250px | 1fr | -#' |------|---------|------| -#' | 1fr | sidebar | plot |", -#' gridlayout::grid_card( -#' area = "sidebar", -#' shiny::sliderInput( -#' inputId = "bins", -#' label = "Num Bins", -#' min = 10L, -#' max = 100L, -#' value = 40L -#' ) -#' ), -#' gridlayout::grid_card( -#' area = "plot", -#' shiny::plotOutput( -#' outputId = "distPlot", -#' height = "100%" -#' ) -#' ) -#' ) -#' ) -#' parse_ui_fn(app_expr) -#' -parse_ui_fn <- function(ui_node_expr) { - namespaced_fn_name <- tryCatch( - { - namespace_ui_fn(name_of_called_fn(ui_node_expr)) - }, - error = function(e) { - "unknown" - } - ) - - if (namespaced_fn_name == "unknown") { - return(unknown_code_wrap(ui_node_expr)) - } - - # Fill in all the names of unnamed arguments - ui_node_expr <- tryCatch( - { - rlang::call_standardise(ui_node_expr) - }, - error = function(e) { - stop( - paste0( - "Problem with arguments supplied to ", - namespaced_fn_name, - "().\nError msg: \"", - e$message, - "\"" - ), - call. = FALSE - ) - } - ) - - # Now we can move onto dealing with the arguments of the current ui node - call_args <- parse_call_args(ui_node_expr) - - parsed <- list( - uiName = namespaced_fn_name, - uiArguments = list() - ) - # Only need the uiChildren property if children exist in the call - if (call_args$has_children) { - parsed$uiChildren <- c() - } - - # If we have function with no arguments we're done - if (call_args$count == 0L) { - return(parsed) - } - - for (i in 1:call_args$count) { - arg_name <- call_args$names[[i]] - arg_val <- call_args$values[[i]] - is_child <- call_args$is_child[[i]] - - if (is_child) { - parsed$uiChildren <- append(parsed$uiChildren, list(parse_ui_fn(arg_val))) - } else { - parsed$uiArguments[[arg_name]] <- parse_argument(arg_val) - } - } - - parsed -} - - -# Extracts arguments from function call ast node and makes sure the names and -# child status are properly reflected -parse_call_args <- function(ui_node_expr) { - # Since first element of the AST is the function call itself, it makes our - # life easier going forward if we remove it before walking through arguments - call_arguments <- utils::tail(as.list(ui_node_expr), -1) - - num_args <- length(call_arguments) - - arg_names <- names(call_arguments) - - if(is.null(arg_names) && num_args > 0) { - # If there's no argument names but there are arguments that means we have a - # node with just children nodes. Because we use the empty character as a way - # to distinguish a child node below we need to make the arg_names vector - # manually - arg_names <- rep_len("", num_args) - } - - is_child <- arg_names == "" - - list( - count = num_args, - values = call_arguments, - names = arg_names, - is_child = is_child, - has_children = length(is_child) > 0 - ) -} - - - -# Handle named arguments of a ui function. This is needed for handling special -# cases like lists and arrays that are not primative but we need to handle for -# things like radio inputs etc.. -parse_argument <- function(arg_expr) { - # First check if we should even try and parsing this node. If it's a constant - # like a string just return that. - if (!is.call(arg_expr)) { - return(arg_expr) - } - - func_name <- name_of_called_fn(arg_expr) - - # We know how to handle just a few types of function calls, so make sure that - # we're working with one of those before proceeding - if (func_name == "list" | func_name == "c") { - list_val <- eval(arg_expr) - - # If we have a named vector then the names will be swallowed in conversion - # to JSON unless we explicitly make it a list - if (!identical(names(list_val), NULL)) { - list_val <- as.list(list_val) - } - - return(list_val) - } - - unknown_code_wrap(arg_expr) -} diff --git a/R/serialize_ast.R b/R/serialize_ast.R new file mode 100644 index 000000000..89b92cae8 --- /dev/null +++ b/R/serialize_ast.R @@ -0,0 +1,154 @@ +# Take a parsed R expression and turn it into a fully serializable ast +# representation. +serialize_ast <- function(raw_expr) { + + if (!is_serializable_node(raw_expr)) { + stop( + "Unknown expression type, can't parse. typeof(node) = ", + typeof(raw_expr) + ) + } + + # Call any library calls so we know we have the proper environment to run + # argument matching + if (is_library_call(raw_expr)) { + eval(raw_expr) + } + + # Fill in all the names of unnamed arguments + expr <- if (is.call(raw_expr)) { + tryCatch({ + rlang::call_match(call = raw_expr, fn = eval(raw_expr[[1]])) + }, + error = function(e) { + stop( + paste0( + "Problem with standardizing arguments supplied to expression.", + "\nError msg: \"", + e$message, + "\"" + ), + call. = FALSE + ) + } + ) + } else { + raw_expr + } + + node_names <- names(expr) + + ast_node <- c() + + # We use a for loop here instead of an apply function because we need access + # to the index for querying source refs + for (i in seq_along(expr)) { + + val <- parse_ast_node_value( + x = expr[[i]], + name = node_names[i], + node_pos = get_source_position(attr(expr, "srcref")[[i]]) + ) + + if (length(val) > 0) { + ast_node[[length(ast_node) + 1]] <- val + } + } + + ast_node +} + + + +# Types key: "m" = missing, "s" = symbol, "n" = numeric/number, "b" = +# boolean/logical, "c" = string/character, "u" = unknown, "e" = expression/ast +# node + +parse_ast_node_value <- function(x, name, node_pos) { + + # If the node is a call with named args and unnamed ones then we may have an + # empty character as the name, which we should treat as missing + if (identical(name, "")) { + name <- NULL + } + + + val_type <- "u" + # Things like df[,1] will have a "missing" node in the ast for the first + # argument of `[`, + val <- if (missing(x) || identical(class(x), "srcref")) { + val_type <- "m" + NULL + } else if (is.atomic(x)) { + # Numbers, and characters etc.. + val_type <- if (is.character((x))) { + "c" + } else if (is.numeric(x)) { + "n" + } else if (is.logical(x)) { + "b" + } else { + "u" + } + x + } else if (is.symbol(x) || is_namespace_call(x)) { + # Things like variable names and other syntactically relevant symbols + val_type <- "s" + deparse(x) + } else { + # This will error if we give it a non-ast-valid node so no need to do + # exhaustive checks in this logic + val_type <- "e" + serialize_ast(x) + } + + node <- list() + node$name <- name + node$val <- val + node$type <- val_type + node$pos <- node_pos + + # If we have an unnamed argument that has an empty value then it's missing + # and is probably caused by a trailing comma or something. We just remove + # these + if (identical(node$val, "") && is.null(node$name)) { + return(NULL) + } + + # Empty missing nodes just get removed. + if (identical(val_type, "m") && is.null(node$name)) { + return(NULL) + } + + node +} + +# Translate the raw integer array into meaningful position values. +# Tuple is (line#, column#) +get_source_position <- function(source_ref) { + if (is.null(source_ref)) { + NULL + } else { + start_row <- source_ref[[1]] + start_col <- source_ref[[5]] + end_row <- source_ref[[3]] + end_col <- source_ref[[6]] + c(start_row, start_col, end_row, end_col) + } +} + +is_namespace_call <- function(expr) { + identical(as.character(expr[[1]]), "::") +} + +is_serializable_node <- function(x) { + node_type <- typeof(x) + identical(node_type, "pairlist") || + identical(node_type, "language") || + identical(node_type, "expression") +} + +is_library_call <- function(expr) { + identical(typeof(expr[[1]]), "symbol") && + identical(rlang::as_string(expr[[1]]), "library") +} \ No newline at end of file diff --git a/R/simplify_tree.R b/R/simplify_tree.R deleted file mode 100644 index 624d541bd..000000000 --- a/R/simplify_tree.R +++ /dev/null @@ -1,29 +0,0 @@ -# These sit on the other side of the conversion from update_ui_nodes() and -# operate on the text-based-IR tree before it gets converted into valid R code -# again. - -# [Ui code] -> update_ui_nodes() -> [JS App] -> simplify_ui_nodes() -> [Ui code] - -# Recursively update the ui tree with values that update the arguments -simplify_tree <- function(ui_node) { - - # First run any updater functions for this node if they exist - for (updater_fn in tree_simplifiers) { - ui_node <- updater_fn(ui_node) - } - - # Next walk through all the children and do the same - if (!is.null(ui_node$uiChildren)) { - ui_node$uiChildren <- lapply(ui_node$uiChildren, FUN = simplify_tree) - } - - ui_node -} - - - - -# Any function that can modify a node go here, each get run on each node -tree_simplifiers <- list( - simplify_gridlayout_args -) diff --git a/R/start_background_shiny_app.R b/R/start_background_shiny_app.R index a581093a1..07c538db7 100644 --- a/R/start_background_shiny_app.R +++ b/R/start_background_shiny_app.R @@ -1,6 +1,10 @@ - - -start_background_shiny_app <- function(app_loc, host, port, writeLog, show_preview_app_logs) { +start_background_shiny_app <- function( + app_loc, + host, + port, + writeLog, + show_preview_app_logs +) { start_app <- function() { writeLog("Starting up background shiny app") p <- callr::r_bg( @@ -13,7 +17,10 @@ start_background_shiny_app <- function(app_loc, host, port, writeLog, show_previ args = list(app_loc, host, port), supervise = TRUE # Extra security for process being cleaned up properly ) - writeLog("Started Shiny preview app: ", crayon::red("App PID:", p$get_pid())) + writeLog( + "Started Shiny preview app: ", + crayon::red("App PID:", p$get_pid()) + ) p } p <- start_app() diff --git a/R/ui_code_to_tree.R b/R/ui_code_to_tree.R deleted file mode 100644 index e04a0b7c1..000000000 --- a/R/ui_code_to_tree.R +++ /dev/null @@ -1,40 +0,0 @@ -#' Convert ui code expression to ui tree IR -#' -#' @param ui_expr Language object containing code generate an app ui -#' @param packages List of any packages that need to be loaded into the -#' namespace when evaluating the `ui_expr` -#' -#' @return A UI tree intermediate representation that can be sent to ui editor -#' front-end -#' -#' @examples -#' # Takes optional list of libraries needed to accurately parse file -#' ui_expr <- rlang::expr( -#' grid_card( -#' area = "plot", -#' plotOutput("distPlot",height = "100%") -#' ) -#' ) -#' -#' shinyuieditor:::ui_code_to_tree(ui_expr, packages = c("shiny", "gridlayout")) -#' -#' -#' # If all functions are namespaced then the packages can be omited -#' ui_expr <- rlang::expr( -#' gridlayout::grid_card( -#' area = "plot", -#' shiny::plotOutput("distPlot", height = "100%") -#' ) -#' ) -#' -#' shinyuieditor:::ui_code_to_tree(ui_expr) -#' -ui_code_to_tree <- function(ui_expr, packages = c()) { - - # Setup an environment for parsing that has the proper libraries in it - for (pkg in packages) { - library(pkg, character.only = TRUE) - } - - parse_ui_fn(ui_expr) -} diff --git a/R/ui_tree_getter_and_setter.R b/R/ui_tree_getter_and_setter.R deleted file mode 100644 index 07ef4f5de..000000000 --- a/R/ui_tree_getter_and_setter.R +++ /dev/null @@ -1,32 +0,0 @@ - -get_app_ui_tree <- function(app_loc) { - file_info <- get_app_ui_file(app_loc, error_on_missing = TRUE) - file_path <- file_info$path - type <- file_info$type - - app_info <- get_file_ui_definition_info( - file_lines = readLines(file_path), - type = type - ) - - app_info$ui_tree -} - -update_app_ui <- function(file_info, new_ui_tree, remove_namespace) { - - file_path <- file_info$path - - updated_script <- update_ui_definition( - file_info = get_file_ui_definition_info( - file_lines = readLines(file_path), - type = file_info$type - ), - new_ui_tree = new_ui_tree, - remove_namespace = remove_namespace - ) - writeLines( - text = updated_script, - con = file_path - ) - -} \ No newline at end of file diff --git a/R/ui_tree_to_code.R b/R/ui_tree_to_code.R deleted file mode 100644 index 8bc290302..000000000 --- a/R/ui_tree_to_code.R +++ /dev/null @@ -1,47 +0,0 @@ -#' Convert ui tree IR to code text -#' -#' @inheritParams deparse_ui_fn -#' -#' @return A list with `text`: lines of the generated code, and -#' `namespaces_removed`: a character vector of all the namespaces that were -#' stripped from the ui functions (only has elements if `remove_namespaces = -#' TRUE`) -#' -#' @keywords internal -#' -ui_tree_to_code <- function(ui_tree, remove_namespace = TRUE) { - ui_expression <- deparse_ui_fn( - ui_tree = simplify_tree(ui_tree), - remove_namespace = remove_namespace - ) - - ui_def_text <- rlang::expr_text(ui_expression$call) - - ui_def_text <- str_replace_all( - ui_def_text, - pattern = "),", - replacement = "),\n", - fixed = TRUE - ) - - ui_def_text <- str_replace_all( - ui_def_text, - pattern = ", ", - replacement = ",\n", - fixed = TRUE - ) - - ui_def_text <- str_replace_all( - ui_def_text, - pattern = "\\n", - replacement = "\n", - fixed = TRUE - ) - - ui_def_text <- styler::style_text(ui_def_text, scope = "tokens") - - list( - text = ui_def_text, - namespaces_removed = ui_expression$namespaces_removed - ) -} diff --git a/R/unknown_code_wrapping.R b/R/unknown_code_wrapping.R deleted file mode 100644 index 14254768c..000000000 --- a/R/unknown_code_wrapping.R +++ /dev/null @@ -1,20 +0,0 @@ - -# When we can't parse a bit of the UI we place it into an unknown box that will -# be preserved in both parsing and un-parsing -unknown_code_wrap <- function(code_expr) { - list( - uiName = "unknownUiFunction", - uiArguments = list( - text = rlang::expr_text(code_expr) - ) - ) -} - -unknown_code_unwrap <- function(unknown_code_box) { - # TODO: Replace with a more portable function - str2lang(unknown_code_box$uiArguments$text) -} - -is_unknown_code <- function(ui_node) { - is.list(ui_node) && identical(ui_node$uiName, "unknownUiFunction") -} diff --git a/R/utils.R b/R/utils.R index 15c8b31a7..540fa9221 100644 --- a/R/utils.R +++ b/R/utils.R @@ -1,25 +1,3 @@ - -# Pull out name of call from an AST node in plain text -name_of_called_fn <- function(x) { - deparse(x[[1]]) -} - -str_replace_all <- function(text, pattern, replacement, fixed = FALSE) { - gsub(pattern = pattern, replacement = replacement, x = text, perl = !fixed, fixed = fixed) -} - - -# Via https://stackoverflow.com/questions/10022436/do-call-in-combination-with -do_call_namespaced <- function(what, args, ...) { - if (is.function(what)) { - what <- deparse(as.list(match.call())$what) - } - myfuncall <- parse(text = what)[[1]] - mycall <- as.call(c(list(myfuncall), args)) - eval(mycall, ...) -} - - # Wrap a single line of text in an ascii character box to draw attention to it ascii_box <- function(msg) { horizontal_line <- paste(rep("-", nchar(msg) + 2), collapse = "") @@ -32,22 +10,6 @@ ascii_box <- function(msg) { ) } -ask_question <- function(..., answers) { - cat(cat(paste0(..., collapse = ""))) - answers[utils::menu(answers)] -} - - -# Generate a series of lines loading an array of libraries -create_library_calls <- function(libraries) { - vapply( - X = libraries, - FUN = function(l) paste0("library(", l, ")"), - FUN.VALUE = character(1L) - ) -} - - # Format outgoing message into JSON to be read by client format_outgoing_msg <- function(path, payload) { jsonlite::toJSON( @@ -63,4 +25,15 @@ parse_incoming_msg <- function(raw_msg) { rawToChar(raw_msg), simplifyVector = FALSE ) +} + +announce_location_of_editor <- function(port, launch_browser) { + location_of_editor <- paste0("http://localhost:", port) + cat(crayon::bold(ascii_box( + paste("Live editor running at", location_of_editor) + ))) + + if (launch_browser) { + utils::browseURL(location_of_editor) + } } \ No newline at end of file diff --git a/R/write_app_template.R b/R/write_app_template.R deleted file mode 100644 index b8799bc6c..000000000 --- a/R/write_app_template.R +++ /dev/null @@ -1,182 +0,0 @@ - -#' Setup app from template -#' -#' Takes a template object as provided by the front-end and generates a single -#' or multi-file app in provided location. -#' -#' -#' @inheritParams deparse_ui_fn -#' @inheritParams launch_editor -#' @inheritParams generate_app_template_files -#' -#' @return NULL -#' -#' @keywords internal -#' -write_app_template <- function(app_template, app_loc, remove_namespace = TRUE) { - - app_files <- generate_app_template_files( - app_template = app_template, - remove_namespace = remove_namespace - ) - - if (!is.null(app_files$app_file)) { - write_app_file( - app_lines = app_files$app_file, - app_loc = app_loc, - file_type = "app" - ) - } - - if (!is.null(app_files$ui_file)) { - write_app_file( - app_lines = app_files$ui_file, - app_loc = app_loc, - file_type = "ui" - ) - } - - if (!is.null(app_files$server_file)) { - write_app_file( - app_lines = app_files$server_file, - app_loc = app_loc, - file_type = "server" - ) - } -} - -remove_app_template <- function(app_loc, app_type) { - - # If the app type is "none" this means we never added anything so there's - # nothing to remove - if (identical(app_type, "none")) return() - - if (identical(app_type, "SINGLE-FILE")) { - remove_app_file(app_loc = app_loc, file_type = "app") - } else if (identical(app_type, "MULTI-FILE")) { - remove_app_file(app_loc = app_loc, file_type = "ui") - remove_app_file(app_loc = app_loc, file_type = "server") - } else { - stop(paste("Improper specification of template app output: ", app_type)) - } - - app_loc_now_empty <- identical(length(fs::dir_ls(app_loc)), 0L) - app_loc_is_cwd <- identical(app_loc, ".") || identical(getwd(), app_loc) - - if (app_loc_now_empty && !app_loc_is_cwd) { - fs::dir_delete(app_loc) - } -} - -#' Generate code for app files from a template -#' -#' @param app_template Template object. See details for format. -#' @param remove_namespace -#' -#' @details Template object -#' The app template has the following information attached to it -#' uiTree: ui AST node; -#' outputType: "SINGLE-FILE" | "MULTI-FILE" -#' otherCode: { -#' # Extra code that will be coppied unchanged above the ui definition -#' uiExtra?: string; -#' -#' # List of libraries that need to be loaded in server code -#' serverLibraries?: string[]; -#' -#' # Extra code that will be copied unchanged above server -#' # function definition -#' serverExtra?: string; -#' -#' # Body of server function. This will be wrapped in the code -#' # `function(input, output){....}` -#' serverFunctionBody?: string; -#' }; -#' -#' @return A list with either a single "app_file" field on it when a single-file -#' app has been requested, or both a "ui_file" and "server_file" on it for -#' both scripts of a multi-file app -#' -#' @keywords internal -#' -generate_app_template_files <- function(app_template, remove_namespace = TRUE) { - - uiTree <- app_template$uiTree - outputType <- app_template$outputType - - # Extract other code info into variables so it's easier to type/remember - # what's available - otherCode <- app_template$otherCode - uiExtra <- otherCode$uiExtra - serverLibraries <- otherCode$serverLibraries - serverExtra <- otherCode$serverExtra - serverFunctionBody <- otherCode$serverFunctionBody - - ui_dfn_code <- ui_tree_to_code(uiTree, remove_namespace) - - ui_libraries <- if (remove_namespace) ui_dfn_code$namespaces_removed else NULL - - server_def <- paste0( - "function(input, output) {", - serverFunctionBody, - "}", sep = "\n") - - output_files <- list() - - # Single-file mode will build with - if (outputType == "SINGLE-FILE") { - - all_libraries <- unique(c(ui_libraries, serverLibraries)) - - library_calls <- collapsed_library_calls(all_libraries) - - ui_def_text <- paste0("ui <- ", paste(ui_dfn_code$text, collapse = "\n")) - - server_def_text <- paste0("server <- ", server_def) - - app_file <- paste( - library_calls, - uiExtra, - ui_def_text, - serverExtra, - server_def_text, - "shinyApp(ui, server)", - sep = "\n" - ) - - output_files$app_file <- format_code(app_file) - } else if (outputType == "MULTI-FILE") { - - ui_def_text <- paste(ui_dfn_code$text, collapse = "\n") - - output_files$ui_file <- format_code( - paste( - collapsed_library_calls(ui_libraries), - uiExtra, - ui_def_text, - sep = "\n" - ) - ) - - output_files$server_file <- format_code( - paste( - collapsed_library_calls(serverLibraries), - serverExtra, - server_def, - sep = "\n" - ) - ) - } else { - stop(paste("Improper specification of template app output: ", outputType)) - } - - output_files -} - - -format_code <- function(txt) { - styler::style_text(txt, scope = "tokens") -} -collapsed_library_calls <- function(libraries) { - paste(create_library_calls(libraries), collapse = "\n") -} \ No newline at end of file diff --git a/_pkgdown.yml b/_pkgdown.yml index 0b1d7ba67..4a8cde1d4 100644 --- a/_pkgdown.yml +++ b/_pkgdown.yml @@ -32,10 +32,3 @@ reference: Run the `shinyuieditor`. The only function you'll probably use. - contents: - launch_editor - - title: Advanced - desc: > - Functions used behind the scenes to parse app ui into a tree structure. These are provided for context if one chooses to extend the editor, but will almost never be used directly. - - contents: - - get_file_ui_definition_info - - update_ui_definition - - ui_code_to_tree diff --git a/docs/404.html b/docs/404.html deleted file mode 100644 index 9e822b1a8..000000000 --- a/docs/404.html +++ /dev/null @@ -1,144 +0,0 @@ - - - - - - - -Page not found (404) • shinyuieditor - - - - - - - - - - - - - -
-
- - - - -
-
- - -Content not found. Please use links in the navbar. - -
- - - -
- - - - -
- - - - - - - - diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html deleted file mode 100644 index 6516c400c..000000000 --- a/docs/LICENSE-text.html +++ /dev/null @@ -1,119 +0,0 @@ - -License • shinyuieditor - - -
-
- - - -
-
- - -
YEAR: 2022
-COPYRIGHT HOLDER: Shiny Ui Editor authors
-
- -
- - - -
- - - -
- - - - - - - - diff --git a/docs/LICENSE.html b/docs/LICENSE.html deleted file mode 100644 index dae9ea722..000000000 --- a/docs/LICENSE.html +++ /dev/null @@ -1,123 +0,0 @@ - -MIT License • shinyuieditor - - -
-
- - - -
-
- - -
- -

Copyright (c) 2022 Shiny Ui Editor authors

-

Permission is hereby granted, free of charge, to any person obtaining a copy of this software and associated documentation files (the “Software”), to deal in the Software without restriction, including without limitation the rights to use, copy, modify, merge, publish, distribute, sublicense, and/or sell copies of the Software, and to permit persons to whom the Software is furnished to do so, subject to the following conditions:

-

The above copyright notice and this permission notice shall be included in all copies or substantial portions of the Software.

-

THE SOFTWARE IS PROVIDED “AS IS”, WITHOUT WARRANTY OF ANY KIND, EXPRESS OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS IN THE SOFTWARE.

-
- -
- - - -
- - - -
- - - - - - - - diff --git a/docs/ace-1.2.3/ace.js b/docs/ace-1.2.3/ace.js deleted file mode 100755 index 2923ef0c4..000000000 --- a/docs/ace-1.2.3/ace.js +++ /dev/null @@ -1,11 +0,0 @@ -(function(){function o(n){var i=e;n&&(e[n]||(e[n]={}),i=e[n]);if(!i.define||!i.define.packaged)t.original=i.define,i.define=t,i.define.packaged=!0;if(!i.require||!i.require.packaged)r.original=i.require,i.require=r,i.require.packaged=!0}var ACE_NAMESPACE = "ace",e=function(){return this}();!e&&typeof window!="undefined"&&(e=window);if(!ACE_NAMESPACE&&typeof requirejs!="undefined")return;var t=function(e,n,r){if(typeof e!="string"){t.original?t.original.apply(this,arguments):(console.error("dropping module because define wasn't a string."),console.trace());return}arguments.length==2&&(r=n),t.modules[e]||(t.payloads[e]=r,t.modules[e]=null)};t.modules={},t.payloads={};var n=function(e,t,n){if(typeof t=="string"){var i=s(e,t);if(i!=undefined)return n&&n(),i}else if(Object.prototype.toString.call(t)==="[object Array]"){var o=[];for(var u=0,a=t.length;u1&&u(t,"")>-1&&(a=RegExp(this.source,r.replace.call(o(this),"g","")),r.replace.call(e.slice(t.index),a,function(){for(var e=1;et.index&&this.lastIndex--}return t},s||(RegExp.prototype.test=function(e){var t=r.exec.call(this,e);return t&&this.global&&!t[0].length&&this.lastIndex>t.index&&this.lastIndex--,!!t})}),ace.define("ace/lib/es5-shim",["require","exports","module"],function(e,t,n){function r(){}function w(e){try{return Object.defineProperty(e,"sentinel",{}),"sentinel"in e}catch(t){}}function H(e){return e=+e,e!==e?e=0:e!==0&&e!==1/0&&e!==-1/0&&(e=(e>0||-1)*Math.floor(Math.abs(e))),e}function B(e){var t=typeof e;return e===null||t==="undefined"||t==="boolean"||t==="number"||t==="string"}function j(e){var t,n,r;if(B(e))return e;n=e.valueOf;if(typeof n=="function"){t=n.call(e);if(B(t))return t}r=e.toString;if(typeof r=="function"){t=r.call(e);if(B(t))return t}throw new TypeError}Function.prototype.bind||(Function.prototype.bind=function(t){var n=this;if(typeof n!="function")throw new TypeError("Function.prototype.bind called on incompatible "+n);var i=u.call(arguments,1),s=function(){if(this instanceof s){var e=n.apply(this,i.concat(u.call(arguments)));return Object(e)===e?e:this}return n.apply(t,i.concat(u.call(arguments)))};return n.prototype&&(r.prototype=n.prototype,s.prototype=new r,r.prototype=null),s});var i=Function.prototype.call,s=Array.prototype,o=Object.prototype,u=s.slice,a=i.bind(o.toString),f=i.bind(o.hasOwnProperty),l,c,h,p,d;if(d=f(o,"__defineGetter__"))l=i.bind(o.__defineGetter__),c=i.bind(o.__defineSetter__),h=i.bind(o.__lookupGetter__),p=i.bind(o.__lookupSetter__);if([1,2].splice(0).length!=2)if(!function(){function e(e){var t=new Array(e+2);return t[0]=t[1]=0,t}var t=[],n;t.splice.apply(t,e(20)),t.splice.apply(t,e(26)),n=t.length,t.splice(5,0,"XXX"),n+1==t.length;if(n+1==t.length)return!0}())Array.prototype.splice=function(e,t){var n=this.length;e>0?e>n&&(e=n):e==void 0?e=0:e<0&&(e=Math.max(n+e,0)),e+ta)for(h=l;h--;)this[f+h]=this[a+h];if(s&&e===c)this.length=c,this.push.apply(this,i);else{this.length=c+s;for(h=0;h>>0;if(a(t)!="[object Function]")throw new TypeError;while(++s>>0,s=Array(i),o=arguments[1];if(a(t)!="[object Function]")throw new TypeError(t+" is not a function");for(var u=0;u>>0,s=[],o,u=arguments[1];if(a(t)!="[object Function]")throw new TypeError(t+" is not a function");for(var f=0;f>>0,s=arguments[1];if(a(t)!="[object Function]")throw new TypeError(t+" is not a function");for(var o=0;o>>0,s=arguments[1];if(a(t)!="[object Function]")throw new TypeError(t+" is not a function");for(var o=0;o>>0;if(a(t)!="[object Function]")throw new TypeError(t+" is not a function");if(!i&&arguments.length==1)throw new TypeError("reduce of empty array with no initial value");var s=0,o;if(arguments.length>=2)o=arguments[1];else do{if(s in r){o=r[s++];break}if(++s>=i)throw new TypeError("reduce of empty array with no initial value")}while(!0);for(;s>>0;if(a(t)!="[object Function]")throw new TypeError(t+" is not a function");if(!i&&arguments.length==1)throw new TypeError("reduceRight of empty array with no initial value");var s,o=i-1;if(arguments.length>=2)s=arguments[1];else do{if(o in r){s=r[o--];break}if(--o<0)throw new TypeError("reduceRight of empty array with no initial value")}while(!0);do o in this&&(s=t.call(void 0,s,r[o],o,n));while(o--);return s});if(!Array.prototype.indexOf||[0,1].indexOf(1,2)!=-1)Array.prototype.indexOf=function(t){var n=g&&a(this)=="[object String]"?this.split(""):F(this),r=n.length>>>0;if(!r)return-1;var i=0;arguments.length>1&&(i=H(arguments[1])),i=i>=0?i:Math.max(0,r+i);for(;i>>0;if(!r)return-1;var i=r-1;arguments.length>1&&(i=Math.min(i,H(arguments[1]))),i=i>=0?i:r-Math.abs(i);for(;i>=0;i--)if(i in n&&t===n[i])return i;return-1};Object.getPrototypeOf||(Object.getPrototypeOf=function(t){return t.__proto__||(t.constructor?t.constructor.prototype:o)});if(!Object.getOwnPropertyDescriptor){var y="Object.getOwnPropertyDescriptor called on a non-object: ";Object.getOwnPropertyDescriptor=function(t,n){if(typeof t!="object"&&typeof t!="function"||t===null)throw new TypeError(y+t);if(!f(t,n))return;var r,i,s;r={enumerable:!0,configurable:!0};if(d){var u=t.__proto__;t.__proto__=o;var i=h(t,n),s=p(t,n);t.__proto__=u;if(i||s)return i&&(r.get=i),s&&(r.set=s),r}return r.value=t[n],r}}Object.getOwnPropertyNames||(Object.getOwnPropertyNames=function(t){return Object.keys(t)});if(!Object.create){var b;Object.prototype.__proto__===null?b=function(){return{__proto__:null}}:b=function(){var e={};for(var t in e)e[t]=null;return e.constructor=e.hasOwnProperty=e.propertyIsEnumerable=e.isPrototypeOf=e.toLocaleString=e.toString=e.valueOf=e.__proto__=null,e},Object.create=function(t,n){var r;if(t===null)r=b();else{if(typeof t!="object")throw new TypeError("typeof prototype["+typeof t+"] != 'object'");var i=function(){};i.prototype=t,r=new i,r.__proto__=t}return n!==void 0&&Object.defineProperties(r,n),r}}if(Object.defineProperty){var E=w({}),S=typeof document=="undefined"||w(document.createElement("div"));if(!E||!S)var x=Object.defineProperty}if(!Object.defineProperty||x){var T="Property description must be an object: ",N="Object.defineProperty called on non-object: ",C="getters & setters can not be defined on this javascript engine";Object.defineProperty=function(t,n,r){if(typeof t!="object"&&typeof t!="function"||t===null)throw new TypeError(N+t);if(typeof r!="object"&&typeof r!="function"||r===null)throw new TypeError(T+r);if(x)try{return x.call(Object,t,n,r)}catch(i){}if(f(r,"value"))if(d&&(h(t,n)||p(t,n))){var s=t.__proto__;t.__proto__=o,delete t[n],t[n]=r.value,t.__proto__=s}else t[n]=r.value;else{if(!d)throw new TypeError(C);f(r,"get")&&l(t,n,r.get),f(r,"set")&&c(t,n,r.set)}return t}}Object.defineProperties||(Object.defineProperties=function(t,n){for(var r in n)f(n,r)&&Object.defineProperty(t,r,n[r]);return t}),Object.seal||(Object.seal=function(t){return t}),Object.freeze||(Object.freeze=function(t){return t});try{Object.freeze(function(){})}catch(k){Object.freeze=function(t){return function(n){return typeof n=="function"?n:t(n)}}(Object.freeze)}Object.preventExtensions||(Object.preventExtensions=function(t){return t}),Object.isSealed||(Object.isSealed=function(t){return!1}),Object.isFrozen||(Object.isFrozen=function(t){return!1}),Object.isExtensible||(Object.isExtensible=function(t){if(Object(t)===t)throw new TypeError;var n="";while(f(t,n))n+="?";t[n]=!0;var r=f(t,n);return delete t[n],r});if(!Object.keys){var L=!0,A=["toString","toLocaleString","valueOf","hasOwnProperty","isPrototypeOf","propertyIsEnumerable","constructor"],O=A.length;for(var M in{toString:null})L=!1;Object.keys=function I(e){if(typeof e!="object"&&typeof e!="function"||e===null)throw new TypeError("Object.keys called on a non-object");var I=[];for(var t in e)f(e,t)&&I.push(t);if(L)for(var n=0,r=O;n=0?parseFloat((i.match(/(?:MSIE |Trident\/[0-9]+[\.0-9]+;.*rv:)([0-9]+[\.0-9]+)/)||[])[1]):parseFloat((i.match(/(?:Trident\/[0-9]+[\.0-9]+;.*rv:)([0-9]+[\.0-9]+)/)||[])[1]),t.isOldIE=t.isIE&&t.isIE<9,t.isGecko=t.isMozilla=(window.Controllers||window.controllers)&&window.navigator.product==="Gecko",t.isOldGecko=t.isGecko&&parseInt((i.match(/rv\:(\d+)/)||[])[1],10)<4,t.isOpera=window.opera&&Object.prototype.toString.call(window.opera)=="[object Opera]",t.isWebKit=parseFloat(i.split("WebKit/")[1])||undefined,t.isChrome=parseFloat(i.split(" Chrome/")[1])||undefined,t.isAIR=i.indexOf("AdobeAIR")>=0,t.isIPad=i.indexOf("iPad")>=0,t.isTouchPad=i.indexOf("TouchPad")>=0,t.isChromeOS=i.indexOf(" CrOS ")>=0}),ace.define("ace/lib/event",["require","exports","module","ace/lib/keys","ace/lib/useragent"],function(e,t,n){"use strict";function a(e,t,n){var a=u(t);if(!i.isMac&&s){s.OSKey&&(a|=8);if(s.altGr){if((3&a)==3)return;s.altGr=0}if(n===18||n===17){var f="location"in t?t.location:t.keyLocation;if(n===17&&f===1)s[n]==1&&(o=t.timeStamp);else if(n===18&&a===3&&f===2){var l=t.timeStamp-o;l<50&&(s.altGr=!0)}}}n in r.MODIFIER_KEYS&&(n=-1),a&8&&n>=91&&n<=93&&(n=-1);if(!a&&n===13){var f="location"in t?t.location:t.keyLocation;if(f===3){e(t,a,-n);if(t.defaultPrevented)return}}if(i.isChromeOS&&a&8){e(t,a,n);if(t.defaultPrevented)return;a&=-9}return!!a||n in r.FUNCTION_KEYS||n in r.PRINTABLE_KEYS?e(t,a,n):!1}function f(){s=Object.create(null),s.count=0,s.lastT=0}var r=e("./keys"),i=e("./useragent"),s=null,o=0;t.addListener=function(e,t,n){if(e.addEventListener)return e.addEventListener(t,n,!1);if(e.attachEvent){var r=function(){n.call(e,window.event)};n._wrapper=r,e.attachEvent("on"+t,r)}},t.removeListener=function(e,t,n){if(e.removeEventListener)return e.removeEventListener(t,n,!1);e.detachEvent&&e.detachEvent("on"+t,n._wrapper||n)},t.stopEvent=function(e){return t.stopPropagation(e),t.preventDefault(e),!1},t.stopPropagation=function(e){e.stopPropagation?e.stopPropagation():e.cancelBubble=!0},t.preventDefault=function(e){e.preventDefault?e.preventDefault():e.returnValue=!1},t.getButton=function(e){return e.type=="dblclick"?0:e.type=="contextmenu"||i.isMac&&e.ctrlKey&&!e.altKey&&!e.shiftKey?2:e.preventDefault?e.button:{1:0,2:2,4:1}[e.button]},t.capture=function(e,n,r){function i(e){n&&n(e),r&&r(e),t.removeListener(document,"mousemove",n,!0),t.removeListener(document,"mouseup",i,!0),t.removeListener(document,"dragstart",i,!0)}return t.addListener(document,"mousemove",n,!0),t.addListener(document,"mouseup",i,!0),t.addListener(document,"dragstart",i,!0),i},t.addTouchMoveListener=function(e,n){if("ontouchmove"in e){var r,i;t.addListener(e,"touchstart",function(e){var t=e.changedTouches[0];r=t.clientX,i=t.clientY}),t.addListener(e,"touchmove",function(e){var t=1,s=e.changedTouches[0];e.wheelX=-(s.clientX-r)/t,e.wheelY=-(s.clientY-i)/t,r=s.clientX,i=s.clientY,n(e)})}},t.addMouseWheelListener=function(e,n){"onmousewheel"in e?t.addListener(e,"mousewheel",function(e){var t=8;e.wheelDeltaX!==undefined?(e.wheelX=-e.wheelDeltaX/t,e.wheelY=-e.wheelDeltaY/t):(e.wheelX=0,e.wheelY=-e.wheelDelta/t),n(e)}):"onwheel"in e?t.addListener(e,"wheel",function(e){var t=.35;switch(e.deltaMode){case e.DOM_DELTA_PIXEL:e.wheelX=e.deltaX*t||0,e.wheelY=e.deltaY*t||0;break;case e.DOM_DELTA_LINE:case e.DOM_DELTA_PAGE:e.wheelX=(e.deltaX||0)*5,e.wheelY=(e.deltaY||0)*5}n(e)}):t.addListener(e,"DOMMouseScroll",function(e){e.axis&&e.axis==e.HORIZONTAL_AXIS?(e.wheelX=(e.detail||0)*5,e.wheelY=0):(e.wheelX=0,e.wheelY=(e.detail||0)*5),n(e)})},t.addMultiMouseDownListener=function(e,n,r,s){function c(e){t.getButton(e)!==0?o=0:e.detail>1?(o++,o>4&&(o=1)):o=1;if(i.isIE){var c=Math.abs(e.clientX-u)>5||Math.abs(e.clientY-a)>5;if(!f||c)o=1;f&&clearTimeout(f),f=setTimeout(function(){f=null},n[o-1]||600),o==1&&(u=e.clientX,a=e.clientY)}e._clicks=o,r[s]("mousedown",e);if(o>4)o=0;else if(o>1)return r[s](l[o],e)}function h(e){o=2,f&&clearTimeout(f),f=setTimeout(function(){f=null},n[o-1]||600),r[s]("mousedown",e),r[s](l[o],e)}var o=0,u,a,f,l={2:"dblclick",3:"tripleclick",4:"quadclick"};Array.isArray(e)||(e=[e]),e.forEach(function(e){t.addListener(e,"mousedown",c),i.isOldIE&&t.addListener(e,"dblclick",h)})};var u=!i.isMac||!i.isOpera||"KeyboardEvent"in window?function(e){return 0|(e.ctrlKey?1:0)|(e.altKey?2:0)|(e.shiftKey?4:0)|(e.metaKey?8:0)}:function(e){return 0|(e.metaKey?1:0)|(e.altKey?2:0)|(e.shiftKey?4:0)|(e.ctrlKey?8:0)};t.getModifierString=function(e){return r.KEY_MODS[u(e)]},t.addCommandKeyListener=function(e,n){var r=t.addListener;if(i.isOldGecko||i.isOpera&&!("KeyboardEvent"in window)){var o=null;r(e,"keydown",function(e){o=e.keyCode}),r(e,"keypress",function(e){return a(n,e,o)})}else{var u=null;r(e,"keydown",function(e){var t=e.keyCode;s[t]=(s[t]||0)+1,t==91||t==92?s.OSKey=!0:s.OSKey&&e.timeStamp-s.lastT>200&&s.count==1&&f(),s[t]==1&&s.count++,s.lastT=e.timeStamp;var r=a(n,e,t);return u=e.defaultPrevented,r}),r(e,"keypress",function(e){u&&(e.ctrlKey||e.altKey||e.shiftKey||e.metaKey)&&(t.stopEvent(e),u=null)}),r(e,"keyup",function(e){var t=e.keyCode;s[t]?s.count=Math.max(s.count-1,0):f();if(t==91||t==92)s.OSKey=!1;s[t]=null}),s||(f(),r(window,"focus",f))}};if(typeof window=="object"&&window.postMessage&&!i.isOldIE){var l=1;t.nextTick=function(e,n){n=n||window;var r="zero-timeout-message-"+l;t.addListener(n,"message",function i(s){s.data==r&&(t.stopPropagation(s),t.removeListener(n,"message",i),e())}),n.postMessage(r,"*")}}t.nextFrame=typeof window=="object"&&(window.requestAnimationFrame||window.mozRequestAnimationFrame||window.webkitRequestAnimationFrame||window.msRequestAnimationFrame||window.oRequestAnimationFrame),t.nextFrame?t.nextFrame=t.nextFrame.bind(window):t.nextFrame=function(e){setTimeout(e,17)}}),ace.define("ace/lib/lang",["require","exports","module"],function(e,t,n){"use strict";t.last=function(e){return e[e.length-1]},t.stringReverse=function(e){return e.split("").reverse().join("")},t.stringRepeat=function(e,t){var n="";while(t>0){t&1&&(n+=e);if(t>>=1)e+=e}return n};var r=/^\s\s*/,i=/\s\s*$/;t.stringTrimLeft=function(e){return e.replace(r,"")},t.stringTrimRight=function(e){return e.replace(i,"")},t.copyObject=function(e){var t={};for(var n in e)t[n]=e[n];return t},t.copyArray=function(e){var t=[];for(var n=0,r=e.length;n1),e.preventDefault()},this.startSelect=function(e,t){e=e||this.editor.renderer.screenToTextCoordinates(this.x,this.y);var n=this.editor;n.$blockScrolling++,this.mousedownEvent.getShiftKey()?n.selection.selectToPosition(e):t||n.selection.moveToPosition(e),t||this.select(),n.renderer.scroller.setCapture&&n.renderer.scroller.setCapture(),n.setStyle("ace_selecting"),this.setState("select"),n.$blockScrolling--},this.select=function(){var e,t=this.editor,n=t.renderer.screenToTextCoordinates(this.x,this.y);t.$blockScrolling++;if(this.$clickSelection){var r=this.$clickSelection.comparePoint(n);if(r==-1)e=this.$clickSelection.end;else if(r==1)e=this.$clickSelection.start;else{var i=f(this.$clickSelection,n);n=i.cursor,e=i.anchor}t.selection.setSelectionAnchor(e.row,e.column)}t.selection.selectToPosition(n),t.$blockScrolling--,t.renderer.scrollCursorIntoView()},this.extendSelectionBy=function(e){var t,n=this.editor,r=n.renderer.screenToTextCoordinates(this.x,this.y),i=n.selection[e](r.row,r.column);n.$blockScrolling++;if(this.$clickSelection){var s=this.$clickSelection.comparePoint(i.start),o=this.$clickSelection.comparePoint(i.end);if(s==-1&&o<=0){t=this.$clickSelection.end;if(i.end.row!=r.row||i.end.column!=r.column)r=i.start}else if(o==1&&s>=0){t=this.$clickSelection.start;if(i.start.row!=r.row||i.start.column!=r.column)r=i.end}else if(s==-1&&o==1)r=i.end,t=i.start;else{var u=f(this.$clickSelection,r);r=u.cursor,t=u.anchor}n.selection.setSelectionAnchor(t.row,t.column)}n.selection.selectToPosition(r),n.$blockScrolling--,n.renderer.scrollCursorIntoView()},this.selectEnd=this.selectAllEnd=this.selectByWordsEnd=this.selectByLinesEnd=function(){this.$clickSelection=null,this.editor.unsetStyle("ace_selecting"),this.editor.renderer.scroller.releaseCapture&&this.editor.renderer.scroller.releaseCapture()},this.focusWait=function(){var e=a(this.mousedownEvent.x,this.mousedownEvent.y,this.x,this.y),t=Date.now();(e>o||t-this.mousedownEvent.time>this.$focusTimout)&&this.startSelect(this.mousedownEvent.getDocumentPosition())},this.onDoubleClick=function(e){var t=e.getDocumentPosition(),n=this.editor,r=n.session,i=r.getBracketRange(t);i?(i.isEmpty()&&(i.start.column--,i.end.column++),this.setState("select")):(i=n.selection.getWordRange(t.row,t.column),this.setState("selectByWords")),this.$clickSelection=i,this.select()},this.onTripleClick=function(e){var t=e.getDocumentPosition(),n=this.editor;this.setState("selectByLines");var r=n.getSelectionRange();r.isMultiLine()&&r.contains(t.row,t.column)?(this.$clickSelection=n.selection.getLineRange(r.start.row),this.$clickSelection.end=n.selection.getLineRange(r.end.row).end):this.$clickSelection=n.selection.getLineRange(t.row),this.select()},this.onQuadClick=function(e){var t=this.editor;t.selectAll(),this.$clickSelection=t.getSelectionRange(),this.setState("selectAll")},this.onMouseWheel=function(e){if(e.getAccelKey())return;e.getShiftKey()&&e.wheelY&&!e.wheelX&&(e.wheelX=e.wheelY,e.wheelY=0);var t=e.domEvent.timeStamp,n=t-(this.$lastScrollTime||0),r=this.editor,i=r.renderer.isScrollableBy(e.wheelX*e.speed,e.wheelY*e.speed);if(i||n<200)return this.$lastScrollTime=t,r.renderer.scrollBy(e.wheelX*e.speed,e.wheelY*e.speed),e.stop()},this.onTouchMove=function(e){var t=e.domEvent.timeStamp,n=t-(this.$lastScrollTime||0),r=this.editor,i=r.renderer.isScrollableBy(e.wheelX*e.speed,e.wheelY*e.speed);if(i||n<200)return this.$lastScrollTime=t,r.renderer.scrollBy(e.wheelX*e.speed,e.wheelY*e.speed),e.stop()}}).call(u.prototype),t.DefaultHandlers=u}),ace.define("ace/tooltip",["require","exports","module","ace/lib/oop","ace/lib/dom"],function(e,t,n){"use strict";function s(e){this.isOpen=!1,this.$element=null,this.$parentNode=e}var r=e("./lib/oop"),i=e("./lib/dom");(function(){this.$init=function(){return this.$element=i.createElement("div"),this.$element.className="ace_tooltip",this.$element.style.display="none",this.$parentNode.appendChild(this.$element),this.$element},this.getElement=function(){return this.$element||this.$init()},this.setText=function(e){i.setInnerText(this.getElement(),e)},this.setHtml=function(e){this.getElement().innerHTML=e},this.setPosition=function(e,t){this.getElement().style.left=e+"px",this.getElement().style.top=t+"px"},this.setClassName=function(e){i.addCssClass(this.getElement(),e)},this.show=function(e,t,n){e!=null&&this.setText(e),t!=null&&n!=null&&this.setPosition(t,n),this.isOpen||(this.getElement().style.display="block",this.isOpen=!0)},this.hide=function(){this.isOpen&&(this.getElement().style.display="none",this.isOpen=!1)},this.getHeight=function(){return this.getElement().offsetHeight},this.getWidth=function(){return this.getElement().offsetWidth}}).call(s.prototype),t.Tooltip=s}),ace.define("ace/mouse/default_gutter_handler",["require","exports","module","ace/lib/dom","ace/lib/oop","ace/lib/event","ace/tooltip"],function(e,t,n){"use strict";function u(e){function l(){var r=u.getDocumentPosition().row,s=n.$annotations[r];if(!s)return c();var o=t.session.getLength();if(r==o){var a=t.renderer.pixelToScreenCoordinates(0,u.y).row,l=u.$pos;if(a>t.session.documentToScreenRow(l.row,l.column))return c()}if(f==s)return;f=s.text.join("
"),i.setHtml(f),i.show(),t.on("mousewheel",c);if(e.$tooltipFollowsMouse)h(u);else{var p=u.domEvent.target,d=p.getBoundingClientRect(),v=i.getElement().style;v.left=d.right+"px",v.top=d.bottom+"px"}}function c(){o&&(o=clearTimeout(o)),f&&(i.hide(),f=null,t.removeEventListener("mousewheel",c))}function h(e){i.setPosition(e.x,e.y)}var t=e.editor,n=t.renderer.$gutterLayer,i=new a(t.container);e.editor.setDefaultHandler("guttermousedown",function(r){if(!t.isFocused()||r.getButton()!=0)return;var i=n.getRegion(r);if(i=="foldWidgets")return;var s=r.getDocumentPosition().row,o=t.session.selection;if(r.getShiftKey())o.selectTo(s,0);else{if(r.domEvent.detail==2)return t.selectAll(),r.preventDefault();e.$clickSelection=t.selection.getLineRange(s)}return e.setState("selectByLines"),e.captureMouse(r),r.preventDefault()});var o,u,f;e.editor.setDefaultHandler("guttermousemove",function(t){var n=t.domEvent.target||t.domEvent.srcElement;if(r.hasCssClass(n,"ace_fold-widget"))return c();f&&e.$tooltipFollowsMouse&&h(t),u=t;if(o)return;o=setTimeout(function(){o=null,u&&!e.isMousePressed?l():c()},50)}),s.addListener(t.renderer.$gutter,"mouseout",function(e){u=null;if(!f||o)return;o=setTimeout(function(){o=null,c()},50)}),t.on("changeSession",c)}function a(e){o.call(this,e)}var r=e("../lib/dom"),i=e("../lib/oop"),s=e("../lib/event"),o=e("../tooltip").Tooltip;i.inherits(a,o),function(){this.setPosition=function(e,t){var n=window.innerWidth||document.documentElement.clientWidth,r=window.innerHeight||document.documentElement.clientHeight,i=this.getWidth(),s=this.getHeight();e+=15,t+=15,e+i>n&&(e-=e+i-n),t+s>r&&(t-=20+s),o.prototype.setPosition.call(this,e,t)}}.call(a.prototype),t.GutterHandler=u}),ace.define("ace/mouse/mouse_event",["require","exports","module","ace/lib/event","ace/lib/useragent"],function(e,t,n){"use strict";var r=e("../lib/event"),i=e("../lib/useragent"),s=t.MouseEvent=function(e,t){this.domEvent=e,this.editor=t,this.x=this.clientX=e.clientX,this.y=this.clientY=e.clientY,this.$pos=null,this.$inSelection=null,this.propagationStopped=!1,this.defaultPrevented=!1};(function(){this.stopPropagation=function(){r.stopPropagation(this.domEvent),this.propagationStopped=!0},this.preventDefault=function(){r.preventDefault(this.domEvent),this.defaultPrevented=!0},this.stop=function(){this.stopPropagation(),this.preventDefault()},this.getDocumentPosition=function(){return this.$pos?this.$pos:(this.$pos=this.editor.renderer.screenToTextCoordinates(this.clientX,this.clientY),this.$pos)},this.inSelection=function(){if(this.$inSelection!==null)return this.$inSelection;var e=this.editor,t=e.getSelectionRange();if(t.isEmpty())this.$inSelection=!1;else{var n=this.getDocumentPosition();this.$inSelection=t.contains(n.row,n.column)}return this.$inSelection},this.getButton=function(){return r.getButton(this.domEvent)},this.getShiftKey=function(){return this.domEvent.shiftKey},this.getAccelKey=i.isMac?function(){return this.domEvent.metaKey}:function(){return this.domEvent.ctrlKey}}).call(s.prototype)}),ace.define("ace/mouse/dragdrop_handler",["require","exports","module","ace/lib/dom","ace/lib/event","ace/lib/useragent"],function(e,t,n){"use strict";function f(e){function T(e,n){var r=Date.now(),i=!n||e.row!=n.row,s=!n||e.column!=n.column;if(!S||i||s)t.$blockScrolling+=1,t.moveCursorToPosition(e),t.$blockScrolling-=1,S=r,x={x:p,y:d};else{var o=l(x.x,x.y,p,d);o>a?S=null:r-S>=u&&(t.renderer.scrollCursorIntoView(),S=null)}}function N(e,n){var r=Date.now(),i=t.renderer.layerConfig.lineHeight,s=t.renderer.layerConfig.characterWidth,u=t.renderer.scroller.getBoundingClientRect(),a={x:{left:p-u.left,right:u.right-p},y:{top:d-u.top,bottom:u.bottom-d}},f=Math.min(a.x.left,a.x.right),l=Math.min(a.y.top,a.y.bottom),c={row:e.row,column:e.column};f/s<=2&&(c.column+=a.x.left=o&&t.renderer.scrollCursorIntoView(c):E=r:E=null}function C(){var e=g;g=t.renderer.screenToTextCoordinates(p,d),T(g,e),N(g,e)}function k(){m=t.selection.toOrientedRange(),h=t.session.addMarker(m,"ace_selection",t.getSelectionStyle()),t.clearSelection(),t.isFocused()&&t.renderer.$cursorLayer.setBlinking(!1),clearInterval(v),C(),v=setInterval(C,20),y=0,i.addListener(document,"mousemove",O)}function L(){clearInterval(v),t.session.removeMarker(h),h=null,t.$blockScrolling+=1,t.selection.fromOrientedRange(m),t.$blockScrolling-=1,t.isFocused()&&!w&&t.renderer.$cursorLayer.setBlinking(!t.getReadOnly()),m=null,g=null,y=0,E=null,S=null,i.removeListener(document,"mousemove",O)}function O(){A==null&&(A=setTimeout(function(){A!=null&&h&&L()},20))}function M(e){var t=e.types;return!t||Array.prototype.some.call(t,function(e){return e=="text/plain"||e=="Text"})}function _(e){var t=["copy","copymove","all","uninitialized"],n=["move","copymove","linkmove","all","uninitialized"],r=s.isMac?e.altKey:e.ctrlKey,i="uninitialized";try{i=e.dataTransfer.effectAllowed.toLowerCase()}catch(e){}var o="none";return r&&t.indexOf(i)>=0?o="copy":n.indexOf(i)>=0?o="move":t.indexOf(i)>=0&&(o="copy"),o}var t=e.editor,n=r.createElement("img");n.src="data:image/gif;base64,R0lGODlhAQABAAAAACH5BAEKAAEALAAAAAABAAEAAAICTAEAOw==",s.isOpera&&(n.style.cssText="width:1px;height:1px;position:fixed;top:0;left:0;z-index:2147483647;opacity:0;");var f=["dragWait","dragWaitEnd","startDrag","dragReadyEnd","onMouseDrag"];f.forEach(function(t){e[t]=this[t]},this),t.addEventListener("mousedown",this.onMouseDown.bind(e));var c=t.container,h,p,d,v,m,g,y=0,b,w,E,S,x;this.onDragStart=function(e){if(this.cancelDrag||!c.draggable){var r=this;return setTimeout(function(){r.startSelect(),r.captureMouse(e)},0),e.preventDefault()}m=t.getSelectionRange();var i=e.dataTransfer;i.effectAllowed=t.getReadOnly()?"copy":"copyMove",s.isOpera&&(t.container.appendChild(n),n.scrollTop=0),i.setDragImage&&i.setDragImage(n,0,0),s.isOpera&&t.container.removeChild(n),i.clearData(),i.setData("Text",t.session.getTextRange()),w=!0,this.setState("drag")},this.onDragEnd=function(e){c.draggable=!1,w=!1,this.setState(null);if(!t.getReadOnly()){var n=e.dataTransfer.dropEffect;!b&&n=="move"&&t.session.remove(t.getSelectionRange()),t.renderer.$cursorLayer.setBlinking(!0)}this.editor.unsetStyle("ace_dragging"),this.editor.renderer.setCursorStyle("")},this.onDragEnter=function(e){if(t.getReadOnly()||!M(e.dataTransfer))return;return p=e.clientX,d=e.clientY,h||k(),y++,e.dataTransfer.dropEffect=b=_(e),i.preventDefault(e)},this.onDragOver=function(e){if(t.getReadOnly()||!M(e.dataTransfer))return;return p=e.clientX,d=e.clientY,h||(k(),y++),A!==null&&(A=null),e.dataTransfer.dropEffect=b=_(e),i.preventDefault(e)},this.onDragLeave=function(e){y--;if(y<=0&&h)return L(),b=null,i.preventDefault(e)},this.onDrop=function(e){if(!g)return;var n=e.dataTransfer;if(w)switch(b){case"move":m.contains(g.row,g.column)?m={start:g,end:g}:m=t.moveText(m,g);break;case"copy":m=t.moveText(m,g,!0)}else{var r=n.getData("Text");m={start:g,end:t.session.insert(g,r)},t.focus(),b=null}return L(),i.preventDefault(e)},i.addListener(c,"dragstart",this.onDragStart.bind(e)),i.addListener(c,"dragend",this.onDragEnd.bind(e)),i.addListener(c,"dragenter",this.onDragEnter.bind(e)),i.addListener(c,"dragover",this.onDragOver.bind(e)),i.addListener(c,"dragleave",this.onDragLeave.bind(e)),i.addListener(c,"drop",this.onDrop.bind(e));var A=null}function l(e,t,n,r){return Math.sqrt(Math.pow(n-e,2)+Math.pow(r-t,2))}var r=e("../lib/dom"),i=e("../lib/event"),s=e("../lib/useragent"),o=200,u=200,a=5;(function(){this.dragWait=function(){var e=Date.now()-this.mousedownEvent.time;e>this.editor.getDragDelay()&&this.startDrag()},this.dragWaitEnd=function(){var e=this.editor.container;e.draggable=!1,this.startSelect(this.mousedownEvent.getDocumentPosition()),this.selectEnd()},this.dragReadyEnd=function(e){this.editor.renderer.$cursorLayer.setBlinking(!this.editor.getReadOnly()),this.editor.unsetStyle("ace_dragging"),this.editor.renderer.setCursorStyle(""),this.dragWaitEnd()},this.startDrag=function(){this.cancelDrag=!1;var e=this.editor,t=e.container;t.draggable=!0,e.renderer.$cursorLayer.setBlinking(!1),e.setStyle("ace_dragging");var n=s.isWin?"default":"move";e.renderer.setCursorStyle(n),this.setState("dragReady")},this.onMouseDrag=function(e){var t=this.editor.container;if(s.isIE&&this.state=="dragReady"){var n=l(this.mousedownEvent.x,this.mousedownEvent.y,this.x,this.y);n>3&&t.dragDrop()}if(this.state==="dragWait"){var n=l(this.mousedownEvent.x,this.mousedownEvent.y,this.x,this.y);n>0&&(t.draggable=!1,this.startSelect(this.mousedownEvent.getDocumentPosition()))}},this.onMouseDown=function(e){if(!this.$dragEnabled)return;this.mousedownEvent=e;var t=this.editor,n=e.inSelection(),r=e.getButton(),i=e.domEvent.detail||1;if(i===1&&r===0&&n){if(e.editor.inMultiSelectMode&&(e.getAccelKey()||e.getShiftKey()))return;this.mousedownEvent.time=Date.now();var o=e.domEvent.target||e.domEvent.srcElement;"unselectable"in o&&(o.unselectable="on");if(t.getDragDelay()){if(s.isWebKit){this.cancelDrag=!0;var u=t.container;u.draggable=!0}this.setState("dragWait")}else this.startDrag();this.captureMouse(e,this.onMouseDrag.bind(this)),e.defaultPrevented=!0}}}).call(f.prototype),t.DragdropHandler=f}),ace.define("ace/lib/net",["require","exports","module","ace/lib/dom"],function(e,t,n){"use strict";var r=e("./dom");t.get=function(e,t){var n=new XMLHttpRequest;n.open("GET",e,!0),n.onreadystatechange=function(){n.readyState===4&&t(n.responseText)},n.send(null)},t.loadScript=function(e,t){var n=r.getDocumentHead(),i=document.createElement("script");i.src=e,n.appendChild(i),i.onload=i.onreadystatechange=function(e,n){if(n||!i.readyState||i.readyState=="loaded"||i.readyState=="complete")i=i.onload=i.onreadystatechange=null,n||t()}},t.qualifyURL=function(e){var t=document.createElement("a");return t.href=e,t.href}}),ace.define("ace/lib/event_emitter",["require","exports","module"],function(e,t,n){"use strict";var r={},i=function(){this.propagationStopped=!0},s=function(){this.defaultPrevented=!0};r._emit=r._dispatchEvent=function(e,t){this._eventRegistry||(this._eventRegistry={}),this._defaultHandlers||(this._defaultHandlers={});var n=this._eventRegistry[e]||[],r=this._defaultHandlers[e];if(!n.length&&!r)return;if(typeof t!="object"||!t)t={};t.type||(t.type=e),t.stopPropagation||(t.stopPropagation=i),t.preventDefault||(t.preventDefault=s),n=n.slice();for(var o=0;o1&&(i=n[n.length-2]);var o=a[t+"Path"];return o==null?o=a.basePath:r=="/"&&(t=r=""),o&&o.slice(-1)!="/"&&(o+="/"),o+t+r+i+this.get("suffix")},t.setModuleUrl=function(e,t){return a.$moduleUrls[e]=t},t.$loading={},t.loadModule=function(n,r){var i,o;Array.isArray(n)&&(o=n[0],n=n[1]);try{i=e(n)}catch(u){}if(i&&!t.$loading[n])return r&&r(i);t.$loading[n]||(t.$loading[n]=[]),t.$loading[n].push(r);if(t.$loading[n].length>1)return;var a=function(){e([n],function(e){t._emit("load.module",{name:n,module:e});var r=t.$loading[n];t.$loading[n]=null,r.forEach(function(t){t&&t(e)})})};if(!t.get("packaged"))return a();s.loadScript(t.moduleUrl(n,o),a)},t.init=f}),ace.define("ace/mouse/mouse_handler",["require","exports","module","ace/lib/event","ace/lib/useragent","ace/mouse/default_handlers","ace/mouse/default_gutter_handler","ace/mouse/mouse_event","ace/mouse/dragdrop_handler","ace/config"],function(e,t,n){"use strict";var r=e("../lib/event"),i=e("../lib/useragent"),s=e("./default_handlers").DefaultHandlers,o=e("./default_gutter_handler").GutterHandler,u=e("./mouse_event").MouseEvent,a=e("./dragdrop_handler").DragdropHandler,f=e("../config"),l=function(e){var t=this;this.editor=e,new s(this),new o(this),new a(this);var n=function(t){var n=!document.hasFocus||!document.hasFocus()||!e.isFocused()&&document.activeElement==(e.textInput&&e.textInput.getElement());n&&window.focus(),e.focus()},u=e.renderer.getMouseEventTarget();r.addListener(u,"click",this.onMouseEvent.bind(this,"click")),r.addListener(u,"mousemove",this.onMouseMove.bind(this,"mousemove")),r.addMultiMouseDownListener([u,e.renderer.scrollBarV&&e.renderer.scrollBarV.inner,e.renderer.scrollBarH&&e.renderer.scrollBarH.inner,e.textInput&&e.textInput.getElement()].filter(Boolean),[400,300,250],this,"onMouseEvent"),r.addMouseWheelListener(e.container,this.onMouseWheel.bind(this,"mousewheel")),r.addTouchMoveListener(e.container,this.onTouchMove.bind(this,"touchmove"));var f=e.renderer.$gutter;r.addListener(f,"mousedown",this.onMouseEvent.bind(this,"guttermousedown")),r.addListener(f,"click",this.onMouseEvent.bind(this,"gutterclick")),r.addListener(f,"dblclick",this.onMouseEvent.bind(this,"gutterdblclick")),r.addListener(f,"mousemove",this.onMouseEvent.bind(this,"guttermousemove")),r.addListener(u,"mousedown",n),r.addListener(f,"mousedown",n),i.isIE&&e.renderer.scrollBarV&&(r.addListener(e.renderer.scrollBarV.element,"mousedown",n),r.addListener(e.renderer.scrollBarH.element,"mousedown",n)),e.on("mousemove",function(n){if(t.state||t.$dragDelay||!t.$dragEnabled)return;var r=e.renderer.screenToTextCoordinates(n.x,n.y),i=e.session.selection.getRange(),s=e.renderer;!i.isEmpty()&&i.insideStart(r.row,r.column)?s.setCursorStyle("default"):s.setCursorStyle("")})};(function(){this.onMouseEvent=function(e,t){this.editor._emit(e,new u(t,this.editor))},this.onMouseMove=function(e,t){var n=this.editor._eventRegistry&&this.editor._eventRegistry.mousemove;if(!n||!n.length)return;this.editor._emit(e,new u(t,this.editor))},this.onMouseWheel=function(e,t){var n=new u(t,this.editor);n.speed=this.$scrollSpeed*2,n.wheelX=t.wheelX,n.wheelY=t.wheelY,this.editor._emit(e,n)},this.onTouchMove=function(e,t){var n=new u(t,this.editor);n.speed=1,n.wheelX=t.wheelX,n.wheelY=t.wheelY,this.editor._emit(e,n)},this.setState=function(e){this.state=e},this.captureMouse=function(e,t){this.x=e.x,this.y=e.y,this.isMousePressed=!0;var n=this.editor.renderer;n.$keepTextAreaAtCursor&&(n.$keepTextAreaAtCursor=null);var s=this,o=function(e){if(!e)return;if(i.isWebKit&&!e.which&&s.releaseMouse)return s.releaseMouse();s.x=e.clientX,s.y=e.clientY,t&&t(e),s.mouseEvent=new u(e,s.editor),s.$mouseMoved=!0},a=function(e){clearInterval(l),f(),s[s.state+"End"]&&s[s.state+"End"](e),s.state="",n.$keepTextAreaAtCursor==null&&(n.$keepTextAreaAtCursor=!0,n.$moveTextAreaToCursor()),s.isMousePressed=!1,s.$onCaptureMouseMove=s.releaseMouse=null,e&&s.onMouseEvent("mouseup",e)},f=function(){s[s.state]&&s[s.state](),s.$mouseMoved=!1};if(i.isOldIE&&e.domEvent.type=="dblclick")return setTimeout(function(){a(e)});s.$onCaptureMouseMove=o,s.releaseMouse=r.capture(this.editor.container,o,a);var l=setInterval(f,20)},this.releaseMouse=null,this.cancelContextMenu=function(){var e=function(t){if(t&&t.domEvent&&t.domEvent.type!="contextmenu")return;this.editor.off("nativecontextmenu",e),t&&t.domEvent&&r.stopEvent(t.domEvent)}.bind(this);setTimeout(e,10),this.editor.on("nativecontextmenu",e)}}).call(l.prototype),f.defineOptions(l.prototype,"mouseHandler",{scrollSpeed:{initialValue:2},dragDelay:{initialValue:i.isMac?150:0},dragEnabled:{initialValue:!0},focusTimout:{initialValue:0},tooltipFollowsMouse:{initialValue:!0}}),t.MouseHandler=l}),ace.define("ace/mouse/fold_handler",["require","exports","module"],function(e,t,n){"use strict";function r(e){e.on("click",function(t){var n=t.getDocumentPosition(),r=e.session,i=r.getFoldAt(n.row,n.column,1);i&&(t.getAccelKey()?r.removeFold(i):r.expandFold(i),t.stop())}),e.on("gutterclick",function(t){var n=e.renderer.$gutterLayer.getRegion(t);if(n=="foldWidgets"){var r=t.getDocumentPosition().row,i=e.session;i.foldWidgets&&i.foldWidgets[r]&&e.session.onFoldWidgetClick(r,t),e.isFocused()||e.focus(),t.stop()}}),e.on("gutterdblclick",function(t){var n=e.renderer.$gutterLayer.getRegion(t);if(n=="foldWidgets"){var r=t.getDocumentPosition().row,i=e.session,s=i.getParentFoldRangeData(r,!0),o=s.range||s.firstRange;if(o){r=o.start.row;var u=i.getFoldAt(r,i.getLine(r).length,1);u?i.removeFold(u):(i.addFold("...",o),e.renderer.scrollCursorIntoView({row:o.start.row,column:0}))}t.stop()}})}t.FoldHandler=r}),ace.define("ace/keyboard/keybinding",["require","exports","module","ace/lib/keys","ace/lib/event"],function(e,t,n){"use strict";var r=e("../lib/keys"),i=e("../lib/event"),s=function(e){this.$editor=e,this.$data={editor:e},this.$handlers=[],this.setDefaultHandler(e.commands)};(function(){this.setDefaultHandler=function(e){this.removeKeyboardHandler(this.$defaultHandler),this.$defaultHandler=e,this.addKeyboardHandler(e,0)},this.setKeyboardHandler=function(e){var t=this.$handlers;if(t[t.length-1]==e)return;while(t[t.length-1]&&t[t.length-1]!=this.$defaultHandler)this.removeKeyboardHandler(t[t.length-1]);this.addKeyboardHandler(e,1)},this.addKeyboardHandler=function(e,t){if(!e)return;typeof e=="function"&&!e.handleKeyboard&&(e.handleKeyboard=e);var n=this.$handlers.indexOf(e);n!=-1&&this.$handlers.splice(n,1),t==undefined?this.$handlers.push(e):this.$handlers.splice(t,0,e),n==-1&&e.attach&&e.attach(this.$editor)},this.removeKeyboardHandler=function(e){var t=this.$handlers.indexOf(e);return t==-1?!1:(this.$handlers.splice(t,1),e.detach&&e.detach(this.$editor),!0)},this.getKeyboardHandler=function(){return this.$handlers[this.$handlers.length-1]},this.getStatusText=function(){var e=this.$data,t=e.editor;return this.$handlers.map(function(n){return n.getStatusText&&n.getStatusText(t,e)||""}).filter(Boolean).join(" ")},this.$callKeyboardHandlers=function(e,t,n,r){var s,o=!1,u=this.$editor.commands;for(var a=this.$handlers.length;a--;){s=this.$handlers[a].handleKeyboard(this.$data,e,t,n,r);if(!s||!s.command)continue;s.command=="null"?o=!0:o=u.exec(s.command,this.$editor,s.args,r),o&&r&&e!=-1&&s.passEvent!=1&&s.command.passEvent!=1&&i.stopEvent(r);if(o)break}return!o&&e==-1&&(s={command:"insertstring"},o=u.exec("insertstring",this.$editor,t)),o&&this.$editor._signal("keyboardActivity",s),o},this.onCommandKey=function(e,t,n){var i=r.keyCodeToString(n);this.$callKeyboardHandlers(t,i,n,e)},this.onTextInput=function(e){this.$callKeyboardHandlers(-1,e)}}).call(s.prototype),t.KeyBinding=s}),ace.define("ace/range",["require","exports","module"],function(e,t,n){"use strict";var r=function(e,t){return e.row-t.row||e.column-t.column},i=function(e,t,n,r){this.start={row:e,column:t},this.end={row:n,column:r}};(function(){this.isEqual=function(e){return this.start.row===e.start.row&&this.end.row===e.end.row&&this.start.column===e.start.column&&this.end.column===e.end.column},this.toString=function(){return"Range: ["+this.start.row+"/"+this.start.column+"] -> ["+this.end.row+"/"+this.end.column+"]"},this.contains=function(e,t){return this.compare(e,t)==0},this.compareRange=function(e){var t,n=e.end,r=e.start;return t=this.compare(n.row,n.column),t==1?(t=this.compare(r.row,r.column),t==1?2:t==0?1:0):t==-1?-2:(t=this.compare(r.row,r.column),t==-1?-1:t==1?42:0)},this.comparePoint=function(e){return this.compare(e.row,e.column)},this.containsRange=function(e){return this.comparePoint(e.start)==0&&this.comparePoint(e.end)==0},this.intersects=function(e){var t=this.compareRange(e);return t==-1||t==0||t==1},this.isEnd=function(e,t){return this.end.row==e&&this.end.column==t},this.isStart=function(e,t){return this.start.row==e&&this.start.column==t},this.setStart=function(e,t){typeof e=="object"?(this.start.column=e.column,this.start.row=e.row):(this.start.row=e,this.start.column=t)},this.setEnd=function(e,t){typeof e=="object"?(this.end.column=e.column,this.end.row=e.row):(this.end.row=e,this.end.column=t)},this.inside=function(e,t){return this.compare(e,t)==0?this.isEnd(e,t)||this.isStart(e,t)?!1:!0:!1},this.insideStart=function(e,t){return this.compare(e,t)==0?this.isEnd(e,t)?!1:!0:!1},this.insideEnd=function(e,t){return this.compare(e,t)==0?this.isStart(e,t)?!1:!0:!1},this.compare=function(e,t){return!this.isMultiLine()&&e===this.start.row?tthis.end.column?1:0:ethis.end.row?1:this.start.row===e?t>=this.start.column?0:-1:this.end.row===e?t<=this.end.column?0:1:0},this.compareStart=function(e,t){return this.start.row==e&&this.start.column==t?-1:this.compare(e,t)},this.compareEnd=function(e,t){return this.end.row==e&&this.end.column==t?1:this.compare(e,t)},this.compareInside=function(e,t){return this.end.row==e&&this.end.column==t?1:this.start.row==e&&this.start.column==t?-1:this.compare(e,t)},this.clipRows=function(e,t){if(this.end.row>t)var n={row:t+1,column:0};else if(this.end.rowt)var r={row:t+1,column:0};else if(this.start.rowt.row||e.row==t.row&&e.column>t.column},this.getRange=function(){var e=this.anchor,t=this.lead;return this.isEmpty()?o.fromPoints(t,t):this.isBackwards()?o.fromPoints(t,e):o.fromPoints(e,t)},this.clearSelection=function(){this.$isEmpty||(this.$isEmpty=!0,this._emit("changeSelection"))},this.selectAll=function(){var e=this.doc.getLength()-1;this.setSelectionAnchor(0,0),this.moveCursorTo(e,this.doc.getLine(e).length)},this.setRange=this.setSelectionRange=function(e,t){t?(this.setSelectionAnchor(e.end.row,e.end.column),this.selectTo(e.start.row,e.start.column)):(this.setSelectionAnchor(e.start.row,e.start.column),this.selectTo(e.end.row,e.end.column)),this.getRange().isEmpty()&&(this.$isEmpty=!0),this.$desiredColumn=null},this.$moveSelection=function(e){var t=this.lead;this.$isEmpty&&this.setSelectionAnchor(t.row,t.column),e.call(this)},this.selectTo=function(e,t){this.$moveSelection(function(){this.moveCursorTo(e,t)})},this.selectToPosition=function(e){this.$moveSelection(function(){this.moveCursorToPosition(e)})},this.moveTo=function(e,t){this.clearSelection(),this.moveCursorTo(e,t)},this.moveToPosition=function(e){this.clearSelection(),this.moveCursorToPosition(e)},this.selectUp=function(){this.$moveSelection(this.moveCursorUp)},this.selectDown=function(){this.$moveSelection(this.moveCursorDown)},this.selectRight=function(){this.$moveSelection(this.moveCursorRight)},this.selectLeft=function(){this.$moveSelection(this.moveCursorLeft)},this.selectLineStart=function(){this.$moveSelection(this.moveCursorLineStart)},this.selectLineEnd=function(){this.$moveSelection(this.moveCursorLineEnd)},this.selectFileEnd=function(){this.$moveSelection(this.moveCursorFileEnd)},this.selectFileStart=function(){this.$moveSelection(this.moveCursorFileStart)},this.selectWordRight=function(){this.$moveSelection(this.moveCursorWordRight)},this.selectWordLeft=function(){this.$moveSelection(this.moveCursorWordLeft)},this.getWordRange=function(e,t){if(typeof t=="undefined"){var n=e||this.lead;e=n.row,t=n.column}return this.session.getWordRange(e,t)},this.selectWord=function(){this.setSelectionRange(this.getWordRange())},this.selectAWord=function(){var e=this.getCursor(),t=this.session.getAWordRange(e.row,e.column);this.setSelectionRange(t)},this.getLineRange=function(e,t){var n=typeof e=="number"?e:this.lead.row,r,i=this.session.getFoldLine(n);return i?(n=i.start.row,r=i.end.row):r=n,t===!0?new o(n,0,r,this.session.getLine(r).length):new o(n,0,r+1,0)},this.selectLine=function(){this.setSelectionRange(this.getLineRange())},this.moveCursorUp=function(){this.moveCursorBy(-1,0)},this.moveCursorDown=function(){this.moveCursorBy(1,0)},this.moveCursorLeft=function(){var e=this.lead.getPosition(),t;if(t=this.session.getFoldAt(e.row,e.column,-1))this.moveCursorTo(t.start.row,t.start.column);else if(e.column===0)e.row>0&&this.moveCursorTo(e.row-1,this.doc.getLine(e.row-1).length);else{var n=this.session.getTabSize();this.session.isTabStop(e)&&this.doc.getLine(e.row).slice(e.column-n,e.column).split(" ").length-1==n?this.moveCursorBy(0,-n):this.moveCursorBy(0,-1)}},this.moveCursorRight=function(){var e=this.lead.getPosition(),t;if(t=this.session.getFoldAt(e.row,e.column,1))this.moveCursorTo(t.end.row,t.end.column);else if(this.lead.column==this.doc.getLine(this.lead.row).length)this.lead.row0&&(t.column=r)}}this.moveCursorTo(t.row,t.column)},this.moveCursorFileEnd=function(){var e=this.doc.getLength()-1,t=this.doc.getLine(e).length;this.moveCursorTo(e,t)},this.moveCursorFileStart=function(){this.moveCursorTo(0,0)},this.moveCursorLongWordRight=function(){var e=this.lead.row,t=this.lead.column,n=this.doc.getLine(e),r=n.substring(t),i;this.session.nonTokenRe.lastIndex=0,this.session.tokenRe.lastIndex=0;var s=this.session.getFoldAt(e,t,1);if(s){this.moveCursorTo(s.end.row,s.end.column);return}if(i=this.session.nonTokenRe.exec(r))t+=this.session.nonTokenRe.lastIndex,this.session.nonTokenRe.lastIndex=0,r=n.substring(t);if(t>=n.length){this.moveCursorTo(e,n.length),this.moveCursorRight(),e0&&this.moveCursorWordLeft();return}if(o=this.session.tokenRe.exec(s))t-=this.session.tokenRe.lastIndex,this.session.tokenRe.lastIndex=0;this.moveCursorTo(e,t)},this.$shortWordEndIndex=function(e){var t,n=0,r,i=/\s/,s=this.session.tokenRe;s.lastIndex=0;if(t=this.session.tokenRe.exec(e))n=this.session.tokenRe.lastIndex;else{while((r=e[n])&&i.test(r))n++;if(n<1){s.lastIndex=0;while((r=e[n])&&!s.test(r)){s.lastIndex=0,n++;if(i.test(r)){if(n>2){n--;break}while((r=e[n])&&i.test(r))n++;if(n>2)break}}}}return s.lastIndex=0,n},this.moveCursorShortWordRight=function(){var e=this.lead.row,t=this.lead.column,n=this.doc.getLine(e),r=n.substring(t),i=this.session.getFoldAt(e,t,1);if(i)return this.moveCursorTo(i.end.row,i.end.column);if(t==n.length){var s=this.doc.getLength();do e++,r=this.doc.getLine(e);while(e0&&/^\s*$/.test(r));t=r.length,/\s+$/.test(r)||(r="")}var s=i.stringReverse(r),o=this.$shortWordEndIndex(s);return this.moveCursorTo(e,t-o)},this.moveCursorWordRight=function(){this.session.$selectLongWords?this.moveCursorLongWordRight():this.moveCursorShortWordRight()},this.moveCursorWordLeft=function(){this.session.$selectLongWords?this.moveCursorLongWordLeft():this.moveCursorShortWordLeft()},this.moveCursorBy=function(e,t){var n=this.session.documentToScreenPosition(this.lead.row,this.lead.column);t===0&&(this.$desiredColumn?n.column=this.$desiredColumn:this.$desiredColumn=n.column);var r=this.session.screenToDocumentPosition(n.row+e,n.column);e!==0&&t===0&&r.row===this.lead.row&&r.column===this.lead.column&&this.session.lineWidgets&&this.session.lineWidgets[r.row]&&(r.row>0||e>0)&&r.row++,this.moveCursorTo(r.row,r.column+t,t===0)},this.moveCursorToPosition=function(e){this.moveCursorTo(e.row,e.column)},this.moveCursorTo=function(e,t,n){var r=this.session.getFoldAt(e,t,1);r&&(e=r.start.row,t=r.start.column),this.$keepDesiredColumnOnChange=!0,this.lead.setPosition(e,t),this.$keepDesiredColumnOnChange=!1,n||(this.$desiredColumn=null)},this.moveCursorToScreen=function(e,t,n){var r=this.session.screenToDocumentPosition(e,t);this.moveCursorTo(r.row,r.column,n)},this.detach=function(){this.lead.detach(),this.anchor.detach(),this.session=this.doc=null},this.fromOrientedRange=function(e){this.setSelectionRange(e,e.cursor==e.start),this.$desiredColumn=e.desiredColumn||this.$desiredColumn},this.toOrientedRange=function(e){var t=this.getRange();return e?(e.start.column=t.start.column,e.start.row=t.start.row,e.end.column=t.end.column,e.end.row=t.end.row):e=t,e.cursor=this.isBackwards()?e.start:e.end,e.desiredColumn=this.$desiredColumn,e},this.getRangeOfMovements=function(e){var t=this.getCursor();try{e(this);var n=this.getCursor();return o.fromPoints(t,n)}catch(r){return o.fromPoints(t,t)}finally{this.moveCursorToPosition(t)}},this.toJSON=function(){if(this.rangeCount)var e=this.ranges.map(function(e){var t=e.clone();return t.isBackwards=e.cursor==e.start,t});else{var e=this.getRange();e.isBackwards=this.isBackwards()}return e},this.fromJSON=function(e){if(e.start==undefined){if(this.rangeList){this.toSingleRange(e[0]);for(var t=e.length;t--;){var n=o.fromPoints(e[t].start,e[t].end);e[t].isBackwards&&(n.cursor=n.start),this.addRange(n,!0)}return}e=e[0]}this.rangeList&&this.toSingleRange(e),this.setSelectionRange(e,e.isBackwards)},this.isEqual=function(e){if((e.length||this.rangeCount)&&e.length!=this.rangeCount)return!1;if(!e.length||!this.ranges)return this.getRange().isEqual(e);for(var t=this.ranges.length;t--;)if(!this.ranges[t].isEqual(e[t]))return!1;return!0}}).call(u.prototype),t.Selection=u}),ace.define("ace/tokenizer",["require","exports","module","ace/config"],function(e,t,n){"use strict";var r=e("./config"),i=2e3,s=function(e){this.states=e,this.regExps={},this.matchMappings={};for(var t in this.states){var n=this.states[t],r=[],i=0,s=this.matchMappings[t]={defaultToken:"text"},o="g",u=[];for(var a=0;a1?f.onMatch=this.$applyToken:f.onMatch=f.token),c>1&&(/\\\d/.test(f.regex)?l=f.regex.replace(/\\([0-9]+)/g,function(e,t){return"\\"+(parseInt(t,10)+i+1)}):(c=1,l=this.removeCapturingGroups(f.regex)),!f.splitRegex&&typeof f.token!="string"&&u.push(f)),s[i]=a,i+=c,r.push(l),f.onMatch||(f.onMatch=null)}r.length||(s[0]=0,r.push("$")),u.forEach(function(e){e.splitRegex=this.createSplitterRegexp(e.regex,o)},this),this.regExps[t]=new RegExp("("+r.join(")|(")+")|($)",o)}};(function(){this.$setMaxTokenCount=function(e){i=e|0},this.$applyToken=function(e){var t=this.splitRegex.exec(e).slice(1),n=this.token.apply(this,t);if(typeof n=="string")return[{type:n,value:e}];var r=[];for(var i=0,s=n.length;il){var g=e.substring(l,m-v.length);h.type==p?h.value+=g:(h.type&&f.push(h),h={type:p,value:g})}for(var y=0;yi){c>2*e.length&&this.reportError("infinite loop with in ace tokenizer",{startState:t,line:e});while(l1&&n[0]!==r&&n.unshift("#tmp",r),{tokens:f,state:n.length?n:r}},this.reportError=r.reportError}).call(s.prototype),t.Tokenizer=s}),ace.define("ace/mode/text_highlight_rules",["require","exports","module","ace/lib/lang"],function(e,t,n){"use strict";var r=e("../lib/lang"),i=function(){this.$rules={start:[{token:"empty_line",regex:"^$"},{defaultToken:"text"}]}};(function(){this.addRules=function(e,t){if(!t){for(var n in e)this.$rules[n]=e[n];return}for(var n in e){var r=e[n];for(var i=0;i=this.$rowTokens.length){this.$row+=1,e||(e=this.$session.getLength());if(this.$row>=e)return this.$row=e-1,null;this.$rowTokens=this.$session.getTokens(this.$row),this.$tokenIndex=0}return this.$rowTokens[this.$tokenIndex]},this.getCurrentToken=function(){return this.$rowTokens[this.$tokenIndex]},this.getCurrentTokenRow=function(){return this.$row},this.getCurrentTokenColumn=function(){var e=this.$rowTokens,t=this.$tokenIndex,n=e[t].start;if(n!==undefined)return n;n=0;while(t>0)t-=1,n+=e[t].value.length;return n},this.getCurrentTokenPosition=function(){return{row:this.$row,column:this.getCurrentTokenColumn()}}}).call(r.prototype),t.TokenIterator=r}),ace.define("ace/mode/text",["require","exports","module","ace/tokenizer","ace/mode/text_highlight_rules","ace/mode/behaviour","ace/unicode","ace/lib/lang","ace/token_iterator","ace/range"],function(e,t,n){"use strict";var r=e("../tokenizer").Tokenizer,i=e("./text_highlight_rules").TextHighlightRules,s=e("./behaviour").Behaviour,o=e("../unicode"),u=e("../lib/lang"),a=e("../token_iterator").TokenIterator,f=e("../range").Range,l=function(){this.HighlightRules=i,this.$behaviour=new s};(function(){this.tokenRe=new RegExp("^["+o.packages.L+o.packages.Mn+o.packages.Mc+o.packages.Nd+o.packages.Pc+"\\$_]+","g"),this.nonTokenRe=new RegExp("^(?:[^"+o.packages.L+o.packages.Mn+o.packages.Mc+o.packages.Nd+o.packages.Pc+"\\$_]|\\s])+","g"),this.getTokenizer=function(){return this.$tokenizer||(this.$highlightRules=this.$highlightRules||new this.HighlightRules,this.$tokenizer=new r(this.$highlightRules.getRules())),this.$tokenizer},this.lineCommentStart="",this.blockComment="",this.toggleCommentLines=function(e,t,n,r){function w(e){for(var t=n;t<=r;t++)e(i.getLine(t),t)}var i=t.doc,s=!0,o=!0,a=Infinity,f=t.getTabSize(),l=!1;if(!this.lineCommentStart){if(!this.blockComment)return!1;var c=this.blockComment.start,h=this.blockComment.end,p=new RegExp("^(\\s*)(?:"+u.escapeRegExp(c)+")"),d=new RegExp("(?:"+u.escapeRegExp(h)+")\\s*$"),v=function(e,t){if(g(e,t))return;if(!s||/\S/.test(e))i.insertInLine({row:t,column:e.length},h),i.insertInLine({row:t,column:a},c)},m=function(e,t){var n;(n=e.match(d))&&i.removeInLine(t,e.length-n[0].length,e.length),(n=e.match(p))&&i.removeInLine(t,n[1].length,n[0].length)},g=function(e,n){if(p.test(e))return!0;var r=t.getTokens(n);for(var i=0;i2?r%f!=f-1:r%f==0}}var E=Infinity;w(function(e,t){var n=e.search(/\S/);n!==-1?(ne.length&&(E=e.length)}),a==Infinity&&(a=E,s=!1,o=!1),l&&a%f!=0&&(a=Math.floor(a/f)*f),w(o?m:v)},this.toggleBlockComment=function(e,t,n,r){var i=this.blockComment;if(!i)return;!i.start&&i[0]&&(i=i[0]);var s=new a(t,r.row,r.column),o=s.getCurrentToken(),u=t.selection,l=t.selection.toOrientedRange(),c,h;if(o&&/comment/.test(o.type)){var p,d;while(o&&/comment/.test(o.type)){var v=o.value.indexOf(i.start);if(v!=-1){var m=s.getCurrentTokenRow(),g=s.getCurrentTokenColumn()+v;p=new f(m,g,m,g+i.start.length);break}o=s.stepBackward()}var s=new a(t,r.row,r.column),o=s.getCurrentToken();while(o&&/comment/.test(o.type)){var v=o.value.indexOf(i.end);if(v!=-1){var m=s.getCurrentTokenRow(),g=s.getCurrentTokenColumn()+v;d=new f(m,g,m,g+i.end.length);break}o=s.stepForward()}d&&t.remove(d),p&&(t.remove(p),c=p.start.row,h=-i.start.length)}else h=i.start.length,c=n.start.row,t.insert(n.end,i.end),t.insert(n.start,i.start);l.start.row==c&&(l.start.column+=h),l.end.row==c&&(l.end.column+=h),t.selection.fromOrientedRange(l)},this.getNextLineIndent=function(e,t,n){return this.$getIndent(t)},this.checkOutdent=function(e,t,n){return!1},this.autoOutdent=function(e,t,n){},this.$getIndent=function(e){return e.match(/^\s*/)[0]},this.createWorker=function(e){return null},this.createModeDelegates=function(e){this.$embeds=[],this.$modes={};for(var t in e)e[t]&&(this.$embeds.push(t),this.$modes[t]=new e[t]);var n=["toggleBlockComment","toggleCommentLines","getNextLineIndent","checkOutdent","autoOutdent","transformAction","getCompletions"];for(var t=0;t=0&&t.row=0&&t.column<=e[t.row].length}function s(e,t){t.action!="insert"&&t.action!="remove"&&r(t,"delta.action must be 'insert' or 'remove'"),t.lines instanceof Array||r(t,"delta.lines must be an Array"),(!t.start||!t.end)&&r(t,"delta.start/end must be an present");var n=t.start;i(e,t.start)||r(t,"delta.start must be contained in document");var s=t.end;t.action=="remove"&&!i(e,s)&&r(t,"delta.end must contained in document for 'remove' actions");var o=s.row-n.row,u=s.column-(o==0?n.column:0);(o!=t.lines.length-1||t.lines[o].length!=u)&&r(t,"delta.range must match delta lines")}t.applyDelta=function(e,t,n){var r=t.start.row,i=t.start.column,s=e[r]||"";switch(t.action){case"insert":var o=t.lines;if(o.length===1)e[r]=s.substring(0,i)+t.lines[0]+s.substring(i);else{var u=[r,1].concat(t.lines);e.splice.apply(e,u),e[r]=s.substring(0,i)+e[r],e[r+t.lines.length-1]+=s.substring(i)}break;case"remove":var a=t.end.column,f=t.end.row;r===f?e[r]=s.substring(0,i)+s.substring(a):e.splice(r,f-r+1,s.substring(0,i)+e[f].substring(a))}}}),ace.define("ace/anchor",["require","exports","module","ace/lib/oop","ace/lib/event_emitter"],function(e,t,n){"use strict";var r=e("./lib/oop"),i=e("./lib/event_emitter").EventEmitter,s=t.Anchor=function(e,t,n){this.$onChange=this.onChange.bind(this),this.attach(e),typeof n=="undefined"?this.setPosition(t.row,t.column):this.setPosition(t,n)};(function(){function e(e,t,n){var r=n?e.column<=t.column:e.columnthis.row)return;var n=t(e,{row:this.row,column:this.column},this.$insertRight);this.setPosition(n.row,n.column,!0)},this.setPosition=function(e,t,n){var r;n?r={row:e,column:t}:r=this.$clipPositionToDocument(e,t);if(this.row==r.row&&this.column==r.column)return;var i={row:this.row,column:this.column};this.row=r.row,this.column=r.column,this._signal("change",{old:i,value:r})},this.detach=function(){this.document.removeEventListener("change",this.$onChange)},this.attach=function(e){this.document=e||this.document,this.document.on("change",this.$onChange)},this.$clipPositionToDocument=function(e,t){var n={};return e>=this.document.getLength()?(n.row=Math.max(0,this.document.getLength()-1),n.column=this.document.getLine(n.row).length):e<0?(n.row=0,n.column=0):(n.row=e,n.column=Math.min(this.document.getLine(n.row).length,Math.max(0,t))),t<0&&(n.column=0),n}}).call(s.prototype)}),ace.define("ace/document",["require","exports","module","ace/lib/oop","ace/apply_delta","ace/lib/event_emitter","ace/range","ace/anchor"],function(e,t,n){"use strict";var r=e("./lib/oop"),i=e("./apply_delta").applyDelta,s=e("./lib/event_emitter").EventEmitter,o=e("./range").Range,u=e("./anchor").Anchor,a=function(e){this.$lines=[""],e.length===0?this.$lines=[""]:Array.isArray(e)?this.insertMergedLines({row:0,column:0},e):this.insert({row:0,column:0},e)};(function(){r.implement(this,s),this.setValue=function(e){var t=this.getLength()-1;this.remove(new o(0,0,t,this.getLine(t).length)),this.insert({row:0,column:0},e)},this.getValue=function(){return this.getAllLines().join(this.getNewLineCharacter())},this.createAnchor=function(e,t){return new u(this,e,t)},"aaa".split(/a/).length===0?this.$split=function(e){return e.replace(/\r\n|\r/g,"\n").split("\n")}:this.$split=function(e){return e.split(/\r\n|\r|\n/)},this.$detectNewLine=function(e){var t=e.match(/^.*?(\r\n|\r|\n)/m);this.$autoNewLine=t?t[1]:"\n",this._signal("changeNewLineMode")},this.getNewLineCharacter=function(){switch(this.$newLineMode){case"windows":return"\r\n";case"unix":return"\n";default:return this.$autoNewLine||"\n"}},this.$autoNewLine="",this.$newLineMode="auto",this.setNewLineMode=function(e){if(this.$newLineMode===e)return;this.$newLineMode=e,this._signal("changeNewLineMode")},this.getNewLineMode=function(){return this.$newLineMode},this.isNewLine=function(e){return e=="\r\n"||e=="\r"||e=="\n"},this.getLine=function(e){return this.$lines[e]||""},this.getLines=function(e,t){return this.$lines.slice(e,t+1)},this.getAllLines=function(){return this.getLines(0,this.getLength())},this.getLength=function(){return this.$lines.length},this.getTextRange=function(e){return this.getLinesForRange(e).join(this.getNewLineCharacter())},this.getLinesForRange=function(e){var t;if(e.start.row===e.end.row)t=[this.getLine(e.start.row).substring(e.start.column,e.end.column)];else{t=this.getLines(e.start.row,e.end.row),t[0]=(t[0]||"").substring(e.start.column);var n=t.length-1;e.end.row-e.start.row==n&&(t[n]=t[n].substring(0,e.end.column))}return t},this.insertLines=function(e,t){return console.warn("Use of document.insertLines is deprecated. Use the insertFullLines method instead."),this.insertFullLines(e,t)},this.removeLines=function(e,t){return console.warn("Use of document.removeLines is deprecated. Use the removeFullLines method instead."),this.removeFullLines(e,t)},this.insertNewLine=function(e){return console.warn("Use of document.insertNewLine is deprecated. Use insertMergedLines(position, ['', '']) instead."),this.insertMergedLines(e,["",""])},this.insert=function(e,t){return this.getLength()<=1&&this.$detectNewLine(t),this.insertMergedLines(e,this.$split(t))},this.insertInLine=function(e,t){var n=this.clippedPos(e.row,e.column),r=this.pos(e.row,e.column+t.length);return this.applyDelta({start:n,end:r,action:"insert",lines:[t]},!0),this.clonePos(r)},this.clippedPos=function(e,t){var n=this.getLength();e===undefined?e=n:e<0?e=0:e>=n&&(e=n-1,t=undefined);var r=this.getLine(e);return t==undefined&&(t=r.length),t=Math.min(Math.max(t,0),r.length),{row:e,column:t}},this.clonePos=function(e){return{row:e.row,column:e.column}},this.pos=function(e,t){return{row:e,column:t}},this.$clipPosition=function(e){var t=this.getLength();return e.row>=t?(e.row=Math.max(0,t-1),e.column=this.getLine(t-1).length):(e.row=Math.max(0,e.row),e.column=Math.min(Math.max(e.column,0),this.getLine(e.row).length)),e},this.insertFullLines=function(e,t){e=Math.min(Math.max(e,0),this.getLength());var n=0;e0,r=t=0&&this.applyDelta({start:this.pos(e,this.getLine(e).length),end:this.pos(e+1,0),action:"remove",lines:["",""]})},this.replace=function(e,t){e instanceof o||(e=o.fromPoints(e.start,e.end));if(t.length===0&&e.isEmpty())return e.start;if(t==this.getTextRange(e))return e.end;this.remove(e);var n;return t?n=this.insert(e.start,t):n=e.start,n},this.applyDeltas=function(e){for(var t=0;t=0;t--)this.revertDelta(e[t])},this.applyDelta=function(e,t){var n=e.action=="insert";if(n?e.lines.length<=1&&!e.lines[0]:!o.comparePoints(e.start,e.end))return;n&&e.lines.length>2e4&&this.$splitAndapplyLargeDelta(e,2e4),i(this.$lines,e,t),this._signal("change",e)},this.$splitAndapplyLargeDelta=function(e,t){var n=e.lines,r=n.length,i=e.start.row,s=e.start.column,o=0,u=0;do{o=u,u+=t-1;var a=n.slice(o,u);if(u>r){e.lines=a,e.start.row=i+o,e.start.column=s;break}a.push(""),this.applyDelta({start:this.pos(i+o,s),end:this.pos(i+u,s=0),action:e.action,lines:a},!0)}while(!0)},this.revertDelta=function(e){this.applyDelta({start:this.clonePos(e.start),end:this.clonePos(e.end),action:e.action=="insert"?"remove":"insert",lines:e.lines.slice()})},this.indexToPosition=function(e,t){var n=this.$lines||this.getAllLines(),r=this.getNewLineCharacter().length;for(var i=t||0,s=n.length;i20){n.running=setTimeout(n.$worker,20);break}}n.currentLine=t,s<=r&&n.fireUpdateEvent(s,r)}};(function(){r.implement(this,i),this.setTokenizer=function(e){this.tokenizer=e,this.lines=[],this.states=[],this.start(0)},this.setDocument=function(e){this.doc=e,this.lines=[],this.states=[],this.stop()},this.fireUpdateEvent=function(e,t){var n={first:e,last:t};this._signal("update",{data:n})},this.start=function(e){this.currentLine=Math.min(e||0,this.currentLine,this.doc.getLength()),this.lines.splice(this.currentLine,this.lines.length),this.states.splice(this.currentLine,this.states.length),this.stop(),this.running=setTimeout(this.$worker,700)},this.scheduleStart=function(){this.running||(this.running=setTimeout(this.$worker,700))},this.$updateOnChange=function(e){var t=e.start.row,n=e.end.row-t;if(n===0)this.lines[t]=null;else if(e.action=="remove")this.lines.splice(t,n+1,null),this.states.splice(t,n+1,null);else{var r=Array(n+1);r.unshift(t,1),this.lines.splice.apply(this.lines,r),this.states.splice.apply(this.states,r)}this.currentLine=Math.min(t,this.currentLine,this.doc.getLength()),this.stop()},this.stop=function(){this.running&&clearTimeout(this.running),this.running=!1},this.getTokens=function(e){return this.lines[e]||this.$tokenizeRow(e)},this.getState=function(e){return this.currentLine==e&&this.$tokenizeRow(e),this.states[e]||"start"},this.$tokenizeRow=function(e){var t=this.doc.getLine(e),n=this.states[e-1],r=this.tokenizer.getLineTokens(t,n,e);return this.states[e]+""!=r.state+""?(this.states[e]=r.state,this.lines[e+1]=null,this.currentLine>e+1&&(this.currentLine=e+1)):this.currentLine==e&&(this.currentLine=e+1),this.lines[e]=r.tokens}}).call(s.prototype),t.BackgroundTokenizer=s}),ace.define("ace/search_highlight",["require","exports","module","ace/lib/lang","ace/lib/oop","ace/range"],function(e,t,n){"use strict";var r=e("./lib/lang"),i=e("./lib/oop"),s=e("./range").Range,o=function(e,t,n){this.setRegexp(e),this.clazz=t,this.type=n||"text"};(function(){this.MAX_RANGES=500,this.setRegexp=function(e){if(this.regExp+""==e+"")return;this.regExp=e,this.cache=[]},this.update=function(e,t,n,i){if(!this.regExp)return;var o=i.firstRow,u=i.lastRow;for(var a=o;a<=u;a++){var f=this.cache[a];f==null&&(f=r.getMatchOffsets(n.getLine(a),this.regExp),f.length>this.MAX_RANGES&&(f=f.slice(0,this.MAX_RANGES)),f=f.map(function(e){return new s(a,e.offset,a,e.offset+e.length)}),this.cache[a]=f.length?f:"");for(var l=f.length;l--;)t.drawSingleLineMarker(e,f[l].toScreenRange(n),this.clazz,i)}}}).call(o.prototype),t.SearchHighlight=o}),ace.define("ace/edit_session/fold_line",["require","exports","module","ace/range"],function(e,t,n){"use strict";function i(e,t){this.foldData=e,Array.isArray(t)?this.folds=t:t=this.folds=[t];var n=t[t.length-1];this.range=new r(t[0].start.row,t[0].start.column,n.end.row,n.end.column),this.start=this.range.start,this.end=this.range.end,this.folds.forEach(function(e){e.setFoldLine(this)},this)}var r=e("../range").Range;(function(){this.shiftRow=function(e){this.start.row+=e,this.end.row+=e,this.folds.forEach(function(t){t.start.row+=e,t.end.row+=e})},this.addFold=function(e){if(e.sameRow){if(e.start.rowthis.endRow)throw new Error("Can't add a fold to this FoldLine as it has no connection");this.folds.push(e),this.folds.sort(function(e,t){return-e.range.compareEnd(t.start.row,t.start.column)}),this.range.compareEnd(e.start.row,e.start.column)>0?(this.end.row=e.end.row,this.end.column=e.end.column):this.range.compareStart(e.end.row,e.end.column)<0&&(this.start.row=e.start.row,this.start.column=e.start.column)}else if(e.start.row==this.end.row)this.folds.push(e),this.end.row=e.end.row,this.end.column=e.end.column;else{if(e.end.row!=this.start.row)throw new Error("Trying to add fold to FoldRow that doesn't have a matching row");this.folds.unshift(e),this.start.row=e.start.row,this.start.column=e.start.column}e.foldLine=this},this.containsRow=function(e){return e>=this.start.row&&e<=this.end.row},this.walk=function(e,t,n){var r=0,i=this.folds,s,o,u,a=!0;t==null&&(t=this.end.row,n=this.end.column);for(var f=0;f0)continue;var a=i(e,o.start);return u===0?t&&a!==0?-s-2:s:a>0||a===0&&!t?s:-s-1}return-s-1},this.add=function(e){var t=!e.isEmpty(),n=this.pointIndex(e.start,t);n<0&&(n=-n-1);var r=this.pointIndex(e.end,t,n);return r<0?r=-r-1:r++,this.ranges.splice(n,r-n,e)},this.addList=function(e){var t=[];for(var n=e.length;n--;)t.push.apply(t,this.add(e[n]));return t},this.substractPoint=function(e){var t=this.pointIndex(e);if(t>=0)return this.ranges.splice(t,1)},this.merge=function(){var e=[],t=this.ranges;t=t.sort(function(e,t){return i(e.start,t.start)});var n=t[0],r;for(var s=1;s=0},this.containsPoint=function(e){return this.pointIndex(e)>=0},this.rangeAtPoint=function(e){var t=this.pointIndex(e);if(t>=0)return this.ranges[t]},this.clipRows=function(e,t){var n=this.ranges;if(n[0].start.row>t||n[n.length-1].start.rowr)break;l.start.row==r&&l.start.column>=t.column&&(l.start.column!=t.column||!this.$insertRight)&&(l.start.column+=o,l.start.row+=s);if(l.end.row==r&&l.end.column>=t.column){if(l.end.column==t.column&&this.$insertRight)continue;l.end.column==t.column&&o>0&&al.start.column&&l.end.column==u[a+1].start.column&&(l.end.column-=o),l.end.column+=o,l.end.row+=s}}if(s!=0&&a=e)return i;if(i.end.row>e)return null}return null},this.getNextFoldLine=function(e,t){var n=this.$foldData,r=0;t&&(r=n.indexOf(t)),r==-1&&(r=0);for(r;r=e)return i}return null},this.getFoldedRowCount=function(e,t){var n=this.$foldData,r=t-e+1;for(var i=0;i=t){u=e?r-=t-u:r=0);break}o>=e&&(u>=e?r-=o-u:r-=o-e+1)}return r},this.$addFoldLine=function(e){return this.$foldData.push(e),this.$foldData.sort(function(e,t){return e.start.row-t.start.row}),e},this.addFold=function(e,t){var n=this.$foldData,r=!1,o;e instanceof s?o=e:(o=new s(t,e),o.collapseChildren=t.collapseChildren),this.$clipRangeToDocument(o.range);var u=o.start.row,a=o.start.column,f=o.end.row,l=o.end.column;if(u0&&(this.removeFolds(p),p.forEach(function(e){o.addSubFold(e)}));for(var d=0;d0&&this.foldAll(e.start.row+1,e.end.row,e.collapseChildren-1),e.subFolds=[]},this.expandFolds=function(e){e.forEach(function(e){this.expandFold(e)},this)},this.unfold=function(e,t){var n,i;e==null?(n=new r(0,0,this.getLength(),0),t=!0):typeof e=="number"?n=new r(e,0,e,this.getLine(e).length):"row"in e?n=r.fromPoints(e,e):n=e,i=this.getFoldsInRangeList(n);if(t)this.removeFolds(i);else{var s=i;while(s.length)this.expandFolds(s),s=this.getFoldsInRangeList(n)}if(i.length)return i},this.isRowFolded=function(e,t){return!!this.getFoldLine(e,t)},this.getRowFoldEnd=function(e,t){var n=this.getFoldLine(e,t);return n?n.end.row:e},this.getRowFoldStart=function(e,t){var n=this.getFoldLine(e,t);return n?n.start.row:e},this.getFoldDisplayLine=function(e,t,n,r,i){r==null&&(r=e.start.row),i==null&&(i=0),t==null&&(t=e.end.row),n==null&&(n=this.getLine(t).length);var s=this.doc,o="";return e.walk(function(e,t,n,u){if(t=e){i=s.end.row;try{var o=this.addFold("...",s);o&&(o.collapseChildren=n)}catch(u){}}}},this.$foldStyles={manual:1,markbegin:1,markbeginend:1},this.$foldStyle="markbegin",this.setFoldStyle=function(e){if(!this.$foldStyles[e])throw new Error("invalid fold style: "+e+"["+Object.keys(this.$foldStyles).join(", ")+"]");if(this.$foldStyle==e)return;this.$foldStyle=e,e=="manual"&&this.unfold();var t=this.$foldMode;this.$setFolding(null),this.$setFolding(t)},this.$setFolding=function(e){if(this.$foldMode==e)return;this.$foldMode=e,this.off("change",this.$updateFoldWidgets),this.off("tokenizerUpdate",this.$tokenizerUpdateFoldWidgets),this._signal("changeAnnotation");if(!e||this.$foldStyle=="manual"){this.foldWidgets=null;return}this.foldWidgets=[],this.getFoldWidget=e.getFoldWidget.bind(e,this,this.$foldStyle),this.getFoldWidgetRange=e.getFoldWidgetRange.bind(e,this,this.$foldStyle),this.$updateFoldWidgets=this.updateFoldWidgets.bind(this),this.$tokenizerUpdateFoldWidgets=this.tokenizerUpdateFoldWidgets.bind(this),this.on("change",this.$updateFoldWidgets),this.on("tokenizerUpdate",this.$tokenizerUpdateFoldWidgets)},this.getParentFoldRangeData=function(e,t){var n=this.foldWidgets;if(!n||t&&n[e])return{};var r=e-1,i;while(r>=0){var s=n[r];s==null&&(s=n[r]=this.getFoldWidget(r));if(s=="start"){var o=this.getFoldWidgetRange(r);i||(i=o);if(o&&o.end.row>=e)break}r--}return{range:r!==-1&&o,firstRange:i}},this.onFoldWidgetClick=function(e,t){t=t.domEvent;var n={children:t.shiftKey,all:t.ctrlKey||t.metaKey,siblings:t.altKey},r=this.$toggleFoldWidget(e,n);if(!r){var i=t.target||t.srcElement;i&&/ace_fold-widget/.test(i.className)&&(i.className+=" ace_invalid")}},this.$toggleFoldWidget=function(e,t){if(!this.getFoldWidget)return;var n=this.getFoldWidget(e),r=this.getLine(e),i=n==="end"?-1:1,s=this.getFoldAt(e,i===-1?0:r.length,i);if(s){t.children||t.all?this.removeFold(s):this.expandFold(s);return}var o=this.getFoldWidgetRange(e,!0);if(o&&!o.isMultiLine()){s=this.getFoldAt(o.start.row,o.start.column,1);if(s&&o.isEqual(s.range)){this.removeFold(s);return}}if(t.siblings){var u=this.getParentFoldRangeData(e);if(u.range)var a=u.range.start.row+1,f=u.range.end.row;this.foldAll(a,f,t.all?1e4:0)}else t.children?(f=o?o.end.row:this.getLength(),this.foldAll(e+1,f,t.all?1e4:0)):o&&(t.all&&(o.collapseChildren=1e4),this.addFold("...",o));return o},this.toggleFoldWidget=function(e){var t=this.selection.getCursor().row;t=this.getRowFoldStart(t);var n=this.$toggleFoldWidget(t,{});if(n)return;var r=this.getParentFoldRangeData(t,!0);n=r.range||r.firstRange;if(n){t=n.start.row;var i=this.getFoldAt(t,this.getLine(t).length,1);i?this.removeFold(i):this.addFold("...",n)}},this.updateFoldWidgets=function(e){var t=e.start.row,n=e.end.row-t;if(n===0)this.foldWidgets[t]=null;else if(e.action=="remove")this.foldWidgets.splice(t,n+1,null);else{var r=Array(n+1);r.unshift(t,1),this.foldWidgets.splice.apply(this.foldWidgets,r)}},this.tokenizerUpdateFoldWidgets=function(e){var t=e.data;t.first!=t.last&&this.foldWidgets.length>t.first&&this.foldWidgets.splice(t.first,this.foldWidgets.length)}}var r=e("../range").Range,i=e("./fold_line").FoldLine,s=e("./fold").Fold,o=e("../token_iterator").TokenIterator;t.Folding=u}),ace.define("ace/edit_session/bracket_match",["require","exports","module","ace/token_iterator","ace/range"],function(e,t,n){"use strict";function s(){this.findMatchingBracket=function(e,t){if(e.column==0)return null;var n=t||this.getLine(e.row).charAt(e.column-1);if(n=="")return null;var r=n.match(/([\(\[\{])|([\)\]\}])/);return r?r[1]?this.$findClosingBracket(r[1],e):this.$findOpeningBracket(r[2],e):null},this.getBracketRange=function(e){var t=this.getLine(e.row),n=!0,r,s=t.charAt(e.column-1),o=s&&s.match(/([\(\[\{])|([\)\]\}])/);o||(s=t.charAt(e.column),e={row:e.row,column:e.column+1},o=s&&s.match(/([\(\[\{])|([\)\]\}])/),n=!1);if(!o)return null;if(o[1]){var u=this.$findClosingBracket(o[1],e);if(!u)return null;r=i.fromPoints(e,u),n||(r.end.column++,r.start.column--),r.cursor=r.end}else{var u=this.$findOpeningBracket(o[2],e);if(!u)return null;r=i.fromPoints(u,e),n||(r.start.column++,r.end.column--),r.cursor=r.start}return r},this.$brackets={")":"(","(":")","]":"[","[":"]","{":"}","}":"{"},this.$findOpeningBracket=function(e,t,n){var i=this.$brackets[e],s=1,o=new r(this,t.row,t.column),u=o.getCurrentToken();u||(u=o.stepForward());if(!u)return;n||(n=new RegExp("(\\.?"+u.type.replace(".","\\.").replace("rparen",".paren").replace(/\b(?:end)\b/,"(?:start|begin|end)")+")+"));var a=t.column-o.getCurrentTokenColumn()-2,f=u.value;for(;;){while(a>=0){var l=f.charAt(a);if(l==i){s-=1;if(s==0)return{row:o.getCurrentTokenRow(),column:a+o.getCurrentTokenColumn()}}else l==e&&(s+=1);a-=1}do u=o.stepBackward();while(u&&!n.test(u.type));if(u==null)break;f=u.value,a=f.length-1}return null},this.$findClosingBracket=function(e,t,n){var i=this.$brackets[e],s=1,o=new r(this,t.row,t.column),u=o.getCurrentToken();u||(u=o.stepForward());if(!u)return;n||(n=new RegExp("(\\.?"+u.type.replace(".","\\.").replace("lparen",".paren").replace(/\b(?:start|begin)\b/,"(?:start|begin|end)")+")+"));var a=t.column-o.getCurrentTokenColumn();for(;;){var f=u.value,l=f.length;while(a=4352&&e<=4447||e>=4515&&e<=4519||e>=4602&&e<=4607||e>=9001&&e<=9002||e>=11904&&e<=11929||e>=11931&&e<=12019||e>=12032&&e<=12245||e>=12272&&e<=12283||e>=12288&&e<=12350||e>=12353&&e<=12438||e>=12441&&e<=12543||e>=12549&&e<=12589||e>=12593&&e<=12686||e>=12688&&e<=12730||e>=12736&&e<=12771||e>=12784&&e<=12830||e>=12832&&e<=12871||e>=12880&&e<=13054||e>=13056&&e<=19903||e>=19968&&e<=42124||e>=42128&&e<=42182||e>=43360&&e<=43388||e>=44032&&e<=55203||e>=55216&&e<=55238||e>=55243&&e<=55291||e>=63744&&e<=64255||e>=65040&&e<=65049||e>=65072&&e<=65106||e>=65108&&e<=65126||e>=65128&&e<=65131||e>=65281&&e<=65376||e>=65504&&e<=65510}r.implement(this,o),this.setDocument=function(e){this.doc&&this.doc.removeListener("change",this.$onChange),this.doc=e,e.on("change",this.$onChange),this.bgTokenizer&&this.bgTokenizer.setDocument(this.getDocument()),this.resetCaches()},this.getDocument=function(){return this.doc},this.$resetRowCache=function(e){if(!e){this.$docRowCache=[],this.$screenRowCache=[];return}var t=this.$docRowCache.length,n=this.$getRowCacheIndex(this.$docRowCache,e)+1;t>n&&(this.$docRowCache.splice(n,t),this.$screenRowCache.splice(n,t))},this.$getRowCacheIndex=function(e,t){var n=0,r=e.length-1;while(n<=r){var i=n+r>>1,s=e[i];if(t>s)n=i+1;else{if(!(t=t)break}return r=n[s],r?(r.index=s,r.start=i-r.value.length,r):null},this.setUndoManager=function(e){this.$undoManager=e,this.$deltas=[],this.$deltasDoc=[],this.$deltasFold=[],this.$informUndoManager&&this.$informUndoManager.cancel();if(e){var t=this;this.$syncInformUndoManager=function(){t.$informUndoManager.cancel(),t.$deltasFold.length&&(t.$deltas.push({group:"fold",deltas:t.$deltasFold}),t.$deltasFold=[]),t.$deltasDoc.length&&(t.$deltas.push({group:"doc",deltas:t.$deltasDoc}),t.$deltasDoc=[]),t.$deltas.length>0&&e.execute({action:"aceupdate",args:[t.$deltas,t],merge:t.mergeUndoDeltas}),t.mergeUndoDeltas=!1,t.$deltas=[]},this.$informUndoManager=i.delayedCall(this.$syncInformUndoManager)}},this.markUndoGroup=function(){this.$syncInformUndoManager&&this.$syncInformUndoManager()},this.$defaultUndoManager={undo:function(){},redo:function(){},reset:function(){}},this.getUndoManager=function(){return this.$undoManager||this.$defaultUndoManager},this.getTabString=function(){return this.getUseSoftTabs()?i.stringRepeat(" ",this.getTabSize()):" "},this.setUseSoftTabs=function(e){this.setOption("useSoftTabs",e)},this.getUseSoftTabs=function(){return this.$useSoftTabs&&!this.$mode.$indentWithTabs},this.setTabSize=function(e){this.setOption("tabSize",e)},this.getTabSize=function(){return this.$tabSize},this.isTabStop=function(e){return this.$useSoftTabs&&e.column%this.$tabSize===0},this.$overwrite=!1,this.setOverwrite=function(e){this.setOption("overwrite",e)},this.getOverwrite=function(){return this.$overwrite},this.toggleOverwrite=function(){this.setOverwrite(!this.$overwrite)},this.addGutterDecoration=function(e,t){this.$decorations[e]||(this.$decorations[e]=""),this.$decorations[e]+=" "+t,this._signal("changeBreakpoint",{})},this.removeGutterDecoration=function(e,t){this.$decorations[e]=(this.$decorations[e]||"").replace(" "+t,""),this._signal("changeBreakpoint",{})},this.getBreakpoints=function(){return this.$breakpoints},this.setBreakpoints=function(e){this.$breakpoints=[];for(var t=0;t0&&(r=!!n.charAt(t-1).match(this.tokenRe)),r||(r=!!n.charAt(t).match(this.tokenRe));if(r)var i=this.tokenRe;else if(/^\s+$/.test(n.slice(t-1,t+1)))var i=/\s/;else var i=this.nonTokenRe;var s=t;if(s>0){do s--;while(s>=0&&n.charAt(s).match(i));s++}var o=t;while(oe&&(e=t.screenWidth)}),this.lineWidgetWidth=e},this.$computeWidth=function(e){if(this.$modified||e){this.$modified=!1;if(this.$useWrapMode)return this.screenWidth=this.$wrapLimit;var t=this.doc.getAllLines(),n=this.$rowLengthCache,r=0,i=0,s=this.$foldData[i],o=s?s.start.row:Infinity,u=t.length;for(var a=0;ao){a=s.end.row+1;if(a>=u)break;s=this.$foldData[i++],o=s?s.start.row:Infinity}n[a]==null&&(n[a]=this.$getStringScreenWidth(t[a])[0]),n[a]>r&&(r=n[a])}this.screenWidth=r}},this.getLine=function(e){return this.doc.getLine(e)},this.getLines=function(e,t){return this.doc.getLines(e,t)},this.getLength=function(){return this.doc.getLength()},this.getTextRange=function(e){return this.doc.getTextRange(e||this.selection.getRange())},this.insert=function(e,t){return this.doc.insert(e,t)},this.remove=function(e){return this.doc.remove(e)},this.removeFullLines=function(e,t){return this.doc.removeFullLines(e,t)},this.undoChanges=function(e,t){if(!e.length)return;this.$fromUndo=!0;var n=null;for(var r=e.length-1;r!=-1;r--){var i=e[r];i.group=="doc"?(this.doc.revertDeltas(i.deltas),n=this.$getUndoSelection(i.deltas,!0,n)):i.deltas.forEach(function(e){this.addFolds(e.folds)},this)}return this.$fromUndo=!1,n&&this.$undoSelect&&!t&&this.selection.setSelectionRange(n),n},this.redoChanges=function(e,t){if(!e.length)return;this.$fromUndo=!0;var n=null;for(var r=0;re.end.column&&(s.start.column+=u),s.end.row==e.end.row&&s.end.column>e.end.column&&(s.end.column+=u)),o&&s.start.row>=e.end.row&&(s.start.row+=o,s.end.row+=o)}s.end=this.insert(s.start,r);if(i.length){var a=e.start,l=s.start,o=l.row-a.row,u=l.column-a.column;this.addFolds(i.map(function(e){return e=e.clone(),e.start.row==a.row&&(e.start.column+=u),e.end.row==a.row&&(e.end.column+=u),e.start.row+=o,e.end.row+=o,e}))}return s},this.indentRows=function(e,t,n){n=n.replace(/\t/g,this.getTabString());for(var r=e;r<=t;r++)this.doc.insertInLine({row:r,column:0},n)},this.outdentRows=function(e){var t=e.collapseRows(),n=new f(0,0,0,0),r=this.getTabSize();for(var i=t.start.row;i<=t.end.row;++i){var s=this.getLine(i);n.start.row=i,n.end.row=i;for(var o=0;o0){var r=this.getRowFoldEnd(t+n);if(r>this.doc.getLength()-1)return 0;var i=r-t}else{e=this.$clipRowToDocument(e),t=this.$clipRowToDocument(t);var i=t-e+1}var s=new f(e,0,t,Number.MAX_VALUE),o=this.getFoldsInRange(s).map(function(e){return e=e.clone(),e.start.row+=i,e.end.row+=i,e}),u=n==0?this.doc.getLines(e,t):this.doc.removeFullLines(e,t);return this.doc.insertFullLines(e+i,u),o.length&&this.addFolds(o),i},this.moveLinesUp=function(e,t){return this.$moveLines(e,t,-1)},this.moveLinesDown=function(e,t){return this.$moveLines(e,t,1)},this.duplicateLines=function(e,t){return this.$moveLines(e,t,0)},this.$clipRowToDocument=function(e){return Math.max(0,Math.min(e,this.doc.getLength()-1))},this.$clipColumnToRow=function(e,t){return t<0?0:Math.min(this.doc.getLine(e).length,t)},this.$clipPositionToDocument=function(e,t){t=Math.max(0,t);if(e<0)e=0,t=0;else{var n=this.doc.getLength();e>=n?(e=n-1,t=this.doc.getLine(n-1).length):t=Math.min(this.doc.getLine(e).length,t)}return{row:e,column:t}},this.$clipRangeToDocument=function(e){e.start.row<0?(e.start.row=0,e.start.column=0):e.start.column=this.$clipColumnToRow(e.start.row,e.start.column);var t=this.doc.getLength()-1;return e.end.row>t?(e.end.row=t,e.end.column=this.doc.getLine(t).length):e.end.column=this.$clipColumnToRow(e.end.row,e.end.column),e},this.$wrapLimit=80,this.$useWrapMode=!1,this.$wrapLimitRange={min:null,max:null},this.setUseWrapMode=function(e){if(e!=this.$useWrapMode){this.$useWrapMode=e,this.$modified=!0,this.$resetRowCache(0);if(e){var t=this.getLength();this.$wrapData=Array(t),this.$updateWrapData(0,t-1)}this._signal("changeWrapMode")}},this.getUseWrapMode=function(){return this.$useWrapMode},this.setWrapLimitRange=function(e,t){if(this.$wrapLimitRange.min!==e||this.$wrapLimitRange.max!==t)this.$wrapLimitRange={min:e,max:t},this.$modified=!0,this.$useWrapMode&&this._signal("changeWrapMode")},this.adjustWrapLimit=function(e,t){var n=this.$wrapLimitRange;n.max<0&&(n={min:t,max:t});var r=this.$constrainWrapLimit(e,n.min,n.max);return r!=this.$wrapLimit&&r>1?(this.$wrapLimit=r,this.$modified=!0,this.$useWrapMode&&(this.$updateWrapData(0,this.getLength()-1),this.$resetRowCache(0),this._signal("changeWrapLimit")),!0):!1},this.$constrainWrapLimit=function(e,t,n){return t&&(e=Math.max(t,e)),n&&(e=Math.min(n,e)),e},this.getWrapLimit=function(){return this.$wrapLimit},this.setWrapLimit=function(e){this.setWrapLimitRange(e,e)},this.getWrapLimitRange=function(){return{min:this.$wrapLimitRange.min,max:this.$wrapLimitRange.max}},this.$updateInternalDataOnChange=function(e){var t=this.$useWrapMode,n=e.action,r=e.start,i=e.end,s=r.row,o=i.row,u=o-s,a=null;this.$updating=!0;if(u!=0)if(n==="remove"){this[t?"$wrapData":"$rowLengthCache"].splice(s,u);var f=this.$foldData;a=this.getFoldsInRange(e),this.removeFolds(a);var l=this.getFoldLine(i.row),c=0;if(l){l.addRemoveChars(i.row,i.column,r.column-i.column),l.shiftRow(-u);var h=this.getFoldLine(s);h&&h!==l&&(h.merge(l),l=h),c=f.indexOf(l)+1}for(c;c=i.row&&l.shiftRow(-u)}o=s}else{var p=Array(u);p.unshift(s,0);var d=t?this.$wrapData:this.$rowLengthCache;d.splice.apply(d,p);var f=this.$foldData,l=this.getFoldLine(s),c=0;if(l){var v=l.range.compareInside(r.row,r.column);v==0?(l=l.split(r.row,r.column),l&&(l.shiftRow(u),l.addRemoveChars(o,0,i.column-r.column))):v==-1&&(l.addRemoveChars(s,0,i.column-r.column),l.shiftRow(u)),c=f.indexOf(l)+1}for(c;c=s&&l.shiftRow(u)}}else{u=Math.abs(e.start.column-e.end.column),n==="remove"&&(a=this.getFoldsInRange(e),this.removeFolds(a),u=-u);var l=this.getFoldLine(s);l&&l.addRemoveChars(s,r.column,u)}return t&&this.$wrapData.length!=this.doc.getLength()&&console.error("doc.getLength() and $wrapData.length have to be the same!"),this.$updating=!1,t?this.$updateWrapData(s,o):this.$updateRowLengthCache(s,o),a},this.$updateRowLengthCache=function(e,t,n){this.$rowLengthCache[e]=null,this.$rowLengthCache[t]=null},this.$updateWrapData=function(e,t){var r=this.doc.getAllLines(),i=this.getTabSize(),s=this.$wrapData,o=this.$wrapLimit,a,f,l=e;t=Math.min(t,r.length-1);while(l<=t)f=this.getFoldLine(l,f),f?(a=[],f.walk(function(e,t,i,s){var o;if(e!=null){o=this.$getDisplayTokens(e,a.length),o[0]=n;for(var f=1;fr-b){var w=a+r-b;if(e[w-1]>=p&&e[w]>=p){y(w);continue}if(e[w]==n||e[w]==u){for(w;w!=a-1;w--)if(e[w]==n)break;if(w>a){y(w);continue}w=a+r;for(w;w>2)),a-1);while(w>E&&e[w]E&&e[w]E&&e[w]==l)w--}else while(w>E&&e[w]E){y(++w);continue}w=a+r,e[w]==t&&w--,y(w-b)}return s},this.$getDisplayTokens=function(n,r){var i=[],s;r=r||0;for(var o=0;o39&&u<48||u>57&&u<64?i.push(l):u>=4352&&m(u)?i.push(e,t):i.push(e)}return i},this.$getStringScreenWidth=function(e,t,n){if(t==0)return[0,0];t==null&&(t=Infinity),n=n||0;var r,i;for(i=0;i=4352&&m(r)?n+=2:n+=1;if(n>t)break}return[n,i]},this.lineWidgets=null,this.getRowLength=function(e){if(this.lineWidgets)var t=this.lineWidgets[e]&&this.lineWidgets[e].rowCount||0;else t=0;return!this.$useWrapMode||!this.$wrapData[e]?1+t:this.$wrapData[e].length+1+t},this.getRowLineCount=function(e){return!this.$useWrapMode||!this.$wrapData[e]?1:this.$wrapData[e].length+1},this.getRowWrapIndent=function(e){if(this.$useWrapMode){var t=this.screenToDocumentPosition(e,Number.MAX_VALUE),n=this.$wrapData[t.row];return n.length&&n[0]=0)var o=a[f],r=this.$docRowCache[f],c=e>a[l-1];else var c=!l;var h=this.getLength()-1,p=this.getNextFoldLine(r),d=p?p.start.row:Infinity;while(o<=e){u=this.getRowLength(r);if(o+u>e||r>=h)break;o+=u,r++,r>d&&(r=p.end.row+1,p=this.getNextFoldLine(r,p),d=p?p.start.row:Infinity),c&&(this.$docRowCache.push(r),this.$screenRowCache.push(o))}if(p&&p.start.row<=r)n=this.getFoldDisplayLine(p),r=p.start.row;else{if(o+u<=e||r>h)return{row:h,column:this.getLine(h).length};n=this.getLine(r),p=null}var v=0;if(this.$useWrapMode){var m=this.$wrapData[r];if(m){var g=Math.floor(e-o);s=m[g],g>0&&m.length&&(v=m.indent,i=m[g-1]||m[m.length-1],n=n.substring(i))}}return i+=this.$getStringScreenWidth(n,t-v)[1],this.$useWrapMode&&i>=s&&(i=s-1),p?p.idxToPosition(i):{row:r,column:i}},this.documentToScreenPosition=function(e,t){if(typeof t=="undefined")var n=this.$clipPositionToDocument(e.row,e.column);else n=this.$clipPositionToDocument(e,t);e=n.row,t=n.column;var r=0,i=null,s=null;s=this.getFoldAt(e,t,1),s&&(e=s.start.row,t=s.start.column);var o,u=0,a=this.$docRowCache,f=this.$getRowCacheIndex(a,e),l=a.length;if(l&&f>=0)var u=a[f],r=this.$screenRowCache[f],c=e>a[l-1];else var c=!l;var h=this.getNextFoldLine(u),p=h?h.start.row:Infinity;while(u=p){o=h.end.row+1;if(o>e)break;h=this.getNextFoldLine(o,h),p=h?h.start.row:Infinity}else o=u+1;r+=this.getRowLength(u),u=o,c&&(this.$docRowCache.push(u),this.$screenRowCache.push(r))}var d="";h&&u>=p?(d=this.getFoldDisplayLine(h,e,t),i=h.start.row):(d=this.getLine(e).substring(0,t),i=e);var v=0;if(this.$useWrapMode){var m=this.$wrapData[i];if(m){var g=0;while(d.length>=m[g])r++,g++;d=d.substring(m[g-1]||0,d.length),v=g>0?m.indent:0}}return{row:r,column:v+this.$getStringScreenWidth(d)[0]}},this.documentToScreenColumn=function(e,t){return this.documentToScreenPosition(e,t).column},this.documentToScreenRow=function(e,t){return this.documentToScreenPosition(e,t).row},this.getScreenLength=function(){var e=0,t=null;if(!this.$useWrapMode){e=this.getLength();var n=this.$foldData;for(var r=0;ro&&(s=t.end.row+1,t=this.$foldData[r++],o=t?t.start.row:Infinity)}}return this.lineWidgets&&(e+=this.$getWidgetScreenLength()),e},this.$setFontMetrics=function(e){if(!this.$enableVarChar)return;this.$getStringScreenWidth=function(t,n,r){if(n===0)return[0,0];n||(n=Infinity),r=r||0;var i,s;for(s=0;sn)break}return[r,s]}},this.destroy=function(){this.bgTokenizer&&(this.bgTokenizer.setDocument(null),this.bgTokenizer=null),this.$stopWorker()}}).call(p.prototype),e("./edit_session/folding").Folding.call(p.prototype),e("./edit_session/bracket_match").BracketMatch.call(p.prototype),s.defineOptions(p.prototype,"session",{wrap:{set:function(e){!e||e=="off"?e=!1:e=="free"?e=!0:e=="printMargin"?e=-1:typeof e=="string"&&(e=parseInt(e,10)||!1);if(this.$wrap==e)return;this.$wrap=e;if(!e)this.setUseWrapMode(!1);else{var t=typeof e=="number"?e:null;this.setWrapLimitRange(t,t),this.setUseWrapMode(!0)}},get:function(){return this.getUseWrapMode()?this.$wrap==-1?"printMargin":this.getWrapLimitRange().min?this.$wrap:"free":"off"},handlesSet:!0},wrapMethod:{set:function(e){e=e=="auto"?this.$mode.type!="text":e!="text",e!=this.$wrapAsCode&&(this.$wrapAsCode=e,this.$useWrapMode&&(this.$modified=!0,this.$resetRowCache(0),this.$updateWrapData(0,this.getLength()-1)))},initialValue:"auto"},indentedSoftWrap:{initialValue:!0},firstLineNumber:{set:function(){this._signal("changeBreakpoint")},initialValue:1},useWorker:{set:function(e){this.$useWorker=e,this.$stopWorker(),e&&this.$startWorker()},initialValue:!0},useSoftTabs:{initialValue:!0},tabSize:{set:function(e){if(isNaN(e)||this.$tabSize===e)return;this.$modified=!0,this.$rowLengthCache=[],this.$tabSize=e,this._signal("changeTabSize")},initialValue:4,handlesSet:!0},overwrite:{set:function(e){this._signal("changeOverwrite")},initialValue:!1},newLineMode:{set:function(e){this.doc.setNewLineMode(e)},get:function(){return this.doc.getNewLineMode()},handlesSet:!0},mode:{set:function(e){this.setMode(e)},get:function(){return this.$modeId}}}),t.EditSession=p}),ace.define("ace/search",["require","exports","module","ace/lib/lang","ace/lib/oop","ace/range"],function(e,t,n){"use strict";var r=e("./lib/lang"),i=e("./lib/oop"),s=e("./range").Range,o=function(){this.$options={}};(function(){this.set=function(e){return i.mixin(this.$options,e),this},this.getOptions=function(){return r.copyObject(this.$options)},this.setOptions=function(e){this.$options=e},this.find=function(e){var t=this.$options,n=this.$matchIterator(e,t);if(!n)return!1;var r=null;return n.forEach(function(e,n,i){if(!e.start){var o=e.offset+(i||0);r=new s(n,o,n,o+e.length);if(!e.length&&t.start&&t.start.start&&t.skipCurrent!=0&&r.isEqual(t.start))return r=null,!1}else r=e;return!0}),r},this.findAll=function(e){var t=this.$options;if(!t.needle)return[];this.$assembleRegExp(t);var n=t.range,i=n?e.getLines(n.start.row,n.end.row):e.doc.getAllLines(),o=[],u=t.re;if(t.$isMultiLine){var a=u.length,f=i.length-a,l;e:for(var c=u.offset||0;c<=f;c++){for(var h=0;hv)continue;o.push(l=new s(c,v,c+a-1,m)),a>2&&(c=c+a-2)}}else for(var g=0;gE&&o[h].end.row==n.end.row)h--;o=o.slice(g,h+1);for(g=0,h=o.length;g=0;u--)if(i(o[u],t,s))return!0};else var u=function(e,t,s){var o=r.getMatchOffsets(e,n);for(var u=0;u=o;r--)if(n(e.getLine(r),r))return;if(t.wrap==0)return;for(r=u,o=s.row;r>=o;r--)if(n(e.getLine(r),r))return}:function(n){var r=s.row,i=e.getLine(r).substr(s.column);if(n(i,r,s.column))return;for(r+=1;r<=u;r++)if(n(e.getLine(r),r))return;if(t.wrap==0)return;for(r=o,u=s.row;r<=u;r++)if(n(e.getLine(r),r))return};return{forEach:a}}}).call(o.prototype),t.Search=o}),ace.define("ace/keyboard/hash_handler",["require","exports","module","ace/lib/keys","ace/lib/useragent"],function(e,t,n){"use strict";function o(e,t){this.platform=t||(i.isMac?"mac":"win"),this.commands={},this.commandKeyBinding={},this.addCommands(e),this.$singleCommand=!0}function u(e,t){o.call(this,e,t),this.$singleCommand=!1}var r=e("../lib/keys"),i=e("../lib/useragent"),s=r.KEY_MODS;u.prototype=o.prototype,function(){function e(e){return typeof e=="object"&&e.bindKey&&e.bindKey.position||0}this.addCommand=function(e){this.commands[e.name]&&this.removeCommand(e),this.commands[e.name]=e,e.bindKey&&this._buildKeyHash(e)},this.removeCommand=function(e,t){var n=e&&(typeof e=="string"?e:e.name);e=this.commands[n],t||delete this.commands[n];var r=this.commandKeyBinding;for(var i in r){var s=r[i];if(s==e)delete r[i];else if(Array.isArray(s)){var o=s.indexOf(e);o!=-1&&(s.splice(o,1),s.length==1&&(r[i]=s[0]))}}},this.bindKey=function(e,t,n){typeof e=="object"&&e&&(n==undefined&&(n=e.position),e=e[this.platform]);if(!e)return;if(typeof t=="function")return this.addCommand({exec:t,bindKey:e,name:t.name||e});e.split("|").forEach(function(e){var r="";if(e.indexOf(" ")!=-1){var i=e.split(/\s+/);e=i.pop(),i.forEach(function(e){var t=this.parseKeys(e),n=s[t.hashId]+t.key;r+=(r?" ":"")+n,this._addCommandToBinding(r,"chainKeys")},this),r+=" "}var o=this.parseKeys(e),u=s[o.hashId]+o.key;this._addCommandToBinding(r+u,t,n)},this)},this._addCommandToBinding=function(t,n,r){var i=this.commandKeyBinding,s;if(!n)delete i[t];else if(!i[t]||this.$singleCommand)i[t]=n;else{Array.isArray(i[t])?(s=i[t].indexOf(n))!=-1&&i[t].splice(s,1):i[t]=[i[t]],typeof r!="number"&&(r||n.isDefault?r=-100:r=e(n));var o=i[t];for(s=0;sr)break}o.splice(s,0,n)}},this.addCommands=function(e){e&&Object.keys(e).forEach(function(t){var n=e[t];if(!n)return;if(typeof n=="string")return this.bindKey(n,t);typeof n=="function"&&(n={exec:n});if(typeof n!="object")return;n.name||(n.name=t),this.addCommand(n)},this)},this.removeCommands=function(e){Object.keys(e).forEach(function(t){this.removeCommand(e[t])},this)},this.bindKeys=function(e){Object.keys(e).forEach(function(t){this.bindKey(t,e[t])},this)},this._buildKeyHash=function(e){this.bindKey(e.bindKey,e)},this.parseKeys=function(e){var t=e.toLowerCase().split(/[\-\+]([\-\+])?/).filter(function(e){return e}),n=t.pop(),i=r[n];if(r.FUNCTION_KEYS[i])n=r.FUNCTION_KEYS[i].toLowerCase();else{if(!t.length)return{key:n,hashId:-1};if(t.length==1&&t[0]=="shift")return{key:n.toUpperCase(),hashId:-1}}var s=0;for(var o=t.length;o--;){var u=r.KEY_MODS[t[o]];if(u==null)return typeof console!="undefined"&&console.error("invalid modifier "+t[o]+" in "+e),!1;s|=u}return{key:n,hashId:s}},this.findKeyCommand=function(t,n){var r=s[t]+n;return this.commandKeyBinding[r]},this.handleKeyboard=function(e,t,n,r){if(r<0)return;var i=s[t]+n,o=this.commandKeyBinding[i];e.$keyChain&&(e.$keyChain+=" "+i,o=this.commandKeyBinding[e.$keyChain]||o);if(o)if(o=="chainKeys"||o[o.length-1]=="chainKeys")return e.$keyChain=e.$keyChain||i,{command:"null"};if(e.$keyChain)if(!!t&&t!=4||n.length!=1){if(t==-1||r>0)e.$keyChain=""}else e.$keyChain=e.$keyChain.slice(0,-i.length-1);return{command:o}},this.getStatusText=function(e,t){return t.$keyChain||""}}.call(o.prototype),t.HashHandler=o,t.MultiHashHandler=u}),ace.define("ace/commands/command_manager",["require","exports","module","ace/lib/oop","ace/keyboard/hash_handler","ace/lib/event_emitter"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../keyboard/hash_handler").MultiHashHandler,s=e("../lib/event_emitter").EventEmitter,o=function(e,t){i.call(this,t,e),this.byName=this.commands,this.setDefaultHandler("exec",function(e){return e.command.exec(e.editor,e.args||{})})};r.inherits(o,i),function(){r.implement(this,s),this.exec=function(e,t,n){if(Array.isArray(e)){for(var r=e.length;r--;)if(this.exec(e[r],t,n))return!0;return!1}typeof e=="string"&&(e=this.commands[e]);if(!e)return!1;if(t&&t.$readOnly&&!e.readOnly)return!1;var i={editor:t,command:e,args:n};return i.returnValue=this._emit("exec",i),this._signal("afterExec",i),i.returnValue===!1?!1:!0},this.toggleRecording=function(e){if(this.$inReplay)return;return e&&e._emit("changeStatus"),this.recording?(this.macro.pop(),this.removeEventListener("exec",this.$addCommandToMacro),this.macro.length||(this.macro=this.oldMacro),this.recording=!1):(this.$addCommandToMacro||(this.$addCommandToMacro=function(e){this.macro.push([e.command,e.args])}.bind(this)),this.oldMacro=this.macro,this.macro=[],this.on("exec",this.$addCommandToMacro),this.recording=!0)},this.replay=function(e){if(this.$inReplay||!this.macro)return;if(this.recording)return this.toggleRecording(e);try{this.$inReplay=!0,this.macro.forEach(function(t){typeof t=="string"?this.exec(t,e):this.exec(t[0],e,t[1])},this)}finally{this.$inReplay=!1}},this.trimMacro=function(e){return e.map(function(e){return typeof e[0]!="string"&&(e[0]=e[0].name),e[1]||(e=e[0]),e})}}.call(o.prototype),t.CommandManager=o}),ace.define("ace/commands/default_commands",["require","exports","module","ace/lib/lang","ace/config","ace/range"],function(e,t,n){"use strict";function o(e,t){return{win:e,mac:t}}var r=e("../lib/lang"),i=e("../config"),s=e("../range").Range;t.commands=[{name:"showSettingsMenu",bindKey:o("Ctrl-,","Command-,"),exec:function(e){i.loadModule("ace/ext/settings_menu",function(t){t.init(e),e.showSettingsMenu()})},readOnly:!0},{name:"goToNextError",bindKey:o("Alt-E","Ctrl-E"),exec:function(e){i.loadModule("ace/ext/error_marker",function(t){t.showErrorMarker(e,1)})},scrollIntoView:"animate",readOnly:!0},{name:"goToPreviousError",bindKey:o("Alt-Shift-E","Ctrl-Shift-E"),exec:function(e){i.loadModule("ace/ext/error_marker",function(t){t.showErrorMarker(e,-1)})},scrollIntoView:"animate",readOnly:!0},{name:"selectall",bindKey:o("Ctrl-A","Command-A"),exec:function(e){e.selectAll()},readOnly:!0},{name:"centerselection",bindKey:o(null,"Ctrl-L"),exec:function(e){e.centerSelection()},readOnly:!0},{name:"gotoline",bindKey:o("Ctrl-L","Command-L"),exec:function(e){var t=parseInt(prompt("Enter line number:"),10);isNaN(t)||e.gotoLine(t)},readOnly:!0},{name:"fold",bindKey:o("Alt-L|Ctrl-F1","Command-Alt-L|Command-F1"),exec:function(e){e.session.toggleFold(!1)},multiSelectAction:"forEach",scrollIntoView:"center",readOnly:!0},{name:"unfold",bindKey:o("Alt-Shift-L|Ctrl-Shift-F1","Command-Alt-Shift-L|Command-Shift-F1"),exec:function(e){e.session.toggleFold(!0)},multiSelectAction:"forEach",scrollIntoView:"center",readOnly:!0},{name:"toggleFoldWidget",bindKey:o("F2","F2"),exec:function(e){e.session.toggleFoldWidget()},multiSelectAction:"forEach",scrollIntoView:"center",readOnly:!0},{name:"toggleParentFoldWidget",bindKey:o("Alt-F2","Alt-F2"),exec:function(e){e.session.toggleFoldWidget(!0)},multiSelectAction:"forEach",scrollIntoView:"center",readOnly:!0},{name:"foldall",bindKey:o(null,"Ctrl-Command-Option-0"),exec:function(e){e.session.foldAll()},scrollIntoView:"center",readOnly:!0},{name:"foldOther",bindKey:o("Alt-0","Command-Option-0"),exec:function(e){e.session.foldAll(),e.session.unfold(e.selection.getAllRanges())},scrollIntoView:"center",readOnly:!0},{name:"unfoldall",bindKey:o("Alt-Shift-0","Command-Option-Shift-0"),exec:function(e){e.session.unfold()},scrollIntoView:"center",readOnly:!0},{name:"findnext",bindKey:o("Ctrl-K","Command-G"),exec:function(e){e.findNext()},multiSelectAction:"forEach",scrollIntoView:"center",readOnly:!0},{name:"findprevious",bindKey:o("Ctrl-Shift-K","Command-Shift-G"),exec:function(e){e.findPrevious()},multiSelectAction:"forEach",scrollIntoView:"center",readOnly:!0},{name:"selectOrFindNext",bindKey:o("Alt-K","Ctrl-G"),exec:function(e){e.selection.isEmpty()?e.selection.selectWord():e.findNext()},readOnly:!0},{name:"selectOrFindPrevious",bindKey:o("Alt-Shift-K","Ctrl-Shift-G"),exec:function(e){e.selection.isEmpty()?e.selection.selectWord():e.findPrevious()},readOnly:!0},{name:"find",bindKey:o("Ctrl-F","Command-F"),exec:function(e){i.loadModule("ace/ext/searchbox",function(t){t.Search(e)})},readOnly:!0},{name:"overwrite",bindKey:"Insert",exec:function(e){e.toggleOverwrite()},readOnly:!0},{name:"selecttostart",bindKey:o("Ctrl-Shift-Home","Command-Shift-Up"),exec:function(e){e.getSelection().selectFileStart()},multiSelectAction:"forEach",readOnly:!0,scrollIntoView:"animate",aceCommandGroup:"fileJump"},{name:"gotostart",bindKey:o("Ctrl-Home","Command-Home|Command-Up"),exec:function(e){e.navigateFileStart()},multiSelectAction:"forEach",readOnly:!0,scrollIntoView:"animate",aceCommandGroup:"fileJump"},{name:"selectup",bindKey:o("Shift-Up","Shift-Up"),exec:function(e){e.getSelection().selectUp()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"golineup",bindKey:o("Up","Up|Ctrl-P"),exec:function(e,t){e.navigateUp(t.times)},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selecttoend",bindKey:o("Ctrl-Shift-End","Command-Shift-Down"),exec:function(e){e.getSelection().selectFileEnd()},multiSelectAction:"forEach",readOnly:!0,scrollIntoView:"animate",aceCommandGroup:"fileJump"},{name:"gotoend",bindKey:o("Ctrl-End","Command-End|Command-Down"),exec:function(e){e.navigateFileEnd()},multiSelectAction:"forEach",readOnly:!0,scrollIntoView:"animate",aceCommandGroup:"fileJump"},{name:"selectdown",bindKey:o("Shift-Down","Shift-Down"),exec:function(e){e.getSelection().selectDown()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"golinedown",bindKey:o("Down","Down|Ctrl-N"),exec:function(e,t){e.navigateDown(t.times)},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selectwordleft",bindKey:o("Ctrl-Shift-Left","Option-Shift-Left"),exec:function(e){e.getSelection().selectWordLeft()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"gotowordleft",bindKey:o("Ctrl-Left","Option-Left"),exec:function(e){e.navigateWordLeft()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selecttolinestart",bindKey:o("Alt-Shift-Left","Command-Shift-Left"),exec:function(e){e.getSelection().selectLineStart()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"gotolinestart",bindKey:o("Alt-Left|Home","Command-Left|Home|Ctrl-A"),exec:function(e){e.navigateLineStart()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selectleft",bindKey:o("Shift-Left","Shift-Left"),exec:function(e){e.getSelection().selectLeft()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"gotoleft",bindKey:o("Left","Left|Ctrl-B"),exec:function(e,t){e.navigateLeft(t.times)},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selectwordright",bindKey:o("Ctrl-Shift-Right","Option-Shift-Right"),exec:function(e){e.getSelection().selectWordRight()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"gotowordright",bindKey:o("Ctrl-Right","Option-Right"),exec:function(e){e.navigateWordRight()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selecttolineend",bindKey:o("Alt-Shift-Right","Command-Shift-Right"),exec:function(e){e.getSelection().selectLineEnd()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"gotolineend",bindKey:o("Alt-Right|End","Command-Right|End|Ctrl-E"),exec:function(e){e.navigateLineEnd()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selectright",bindKey:o("Shift-Right","Shift-Right"),exec:function(e){e.getSelection().selectRight()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"gotoright",bindKey:o("Right","Right|Ctrl-F"),exec:function(e,t){e.navigateRight(t.times)},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selectpagedown",bindKey:"Shift-PageDown",exec:function(e){e.selectPageDown()},readOnly:!0},{name:"pagedown",bindKey:o(null,"Option-PageDown"),exec:function(e){e.scrollPageDown()},readOnly:!0},{name:"gotopagedown",bindKey:o("PageDown","PageDown|Ctrl-V"),exec:function(e){e.gotoPageDown()},readOnly:!0},{name:"selectpageup",bindKey:"Shift-PageUp",exec:function(e){e.selectPageUp()},readOnly:!0},{name:"pageup",bindKey:o(null,"Option-PageUp"),exec:function(e){e.scrollPageUp()},readOnly:!0},{name:"gotopageup",bindKey:"PageUp",exec:function(e){e.gotoPageUp()},readOnly:!0},{name:"scrollup",bindKey:o("Ctrl-Up",null),exec:function(e){e.renderer.scrollBy(0,-2*e.renderer.layerConfig.lineHeight)},readOnly:!0},{name:"scrolldown",bindKey:o("Ctrl-Down",null),exec:function(e){e.renderer.scrollBy(0,2*e.renderer.layerConfig.lineHeight)},readOnly:!0},{name:"selectlinestart",bindKey:"Shift-Home",exec:function(e){e.getSelection().selectLineStart()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"selectlineend",bindKey:"Shift-End",exec:function(e){e.getSelection().selectLineEnd()},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"togglerecording",bindKey:o("Ctrl-Alt-E","Command-Option-E"),exec:function(e){e.commands.toggleRecording(e)},readOnly:!0},{name:"replaymacro",bindKey:o("Ctrl-Shift-E","Command-Shift-E"),exec:function(e){e.commands.replay(e)},readOnly:!0},{name:"jumptomatching",bindKey:o("Ctrl-P","Ctrl-P"),exec:function(e){e.jumpToMatching()},multiSelectAction:"forEach",scrollIntoView:"animate",readOnly:!0},{name:"selecttomatching",bindKey:o("Ctrl-Shift-P","Ctrl-Shift-P"),exec:function(e){e.jumpToMatching(!0)},multiSelectAction:"forEach",scrollIntoView:"animate",readOnly:!0},{name:"expandToMatching",bindKey:o("Ctrl-Shift-M","Ctrl-Shift-M"),exec:function(e){e.jumpToMatching(!0,!0)},multiSelectAction:"forEach",scrollIntoView:"animate",readOnly:!0},{name:"passKeysToBrowser",bindKey:o(null,null),exec:function(){},passEvent:!0,readOnly:!0},{name:"copy",exec:function(e){},readOnly:!0},{name:"cut",exec:function(e){var t=e.getSelectionRange();e._emit("cut",t),e.selection.isEmpty()||(e.session.remove(t),e.clearSelection())},scrollIntoView:"cursor",multiSelectAction:"forEach"},{name:"paste",exec:function(e,t){e.$handlePaste(t)},scrollIntoView:"cursor"},{name:"removeline",bindKey:o("Ctrl-D","Command-D"),exec:function(e){e.removeLines()},scrollIntoView:"cursor",multiSelectAction:"forEachLine"},{name:"duplicateSelection",bindKey:o("Ctrl-Shift-D","Command-Shift-D"),exec:function(e){e.duplicateSelection()},scrollIntoView:"cursor",multiSelectAction:"forEach"},{name:"sortlines",bindKey:o("Ctrl-Alt-S","Command-Alt-S"),exec:function(e){e.sortLines()},scrollIntoView:"selection",multiSelectAction:"forEachLine"},{name:"togglecomment",bindKey:o("Ctrl-/","Command-/"),exec:function(e){e.toggleCommentLines()},multiSelectAction:"forEachLine",scrollIntoView:"selectionPart"},{name:"toggleBlockComment",bindKey:o("Ctrl-Shift-/","Command-Shift-/"),exec:function(e){e.toggleBlockComment()},multiSelectAction:"forEach",scrollIntoView:"selectionPart"},{name:"modifyNumberUp",bindKey:o("Ctrl-Shift-Up","Alt-Shift-Up"),exec:function(e){e.modifyNumber(1)},scrollIntoView:"cursor",multiSelectAction:"forEach"},{name:"modifyNumberDown",bindKey:o("Ctrl-Shift-Down","Alt-Shift-Down"),exec:function(e){e.modifyNumber(-1)},scrollIntoView:"cursor",multiSelectAction:"forEach"},{name:"replace",bindKey:o("Ctrl-H","Command-Option-F"),exec:function(e){i.loadModule("ace/ext/searchbox",function(t){t.Search(e,!0)})}},{name:"undo",bindKey:o("Ctrl-Z","Command-Z"),exec:function(e){e.undo()}},{name:"redo",bindKey:o("Ctrl-Shift-Z|Ctrl-Y","Command-Shift-Z|Command-Y"),exec:function(e){e.redo()}},{name:"copylinesup",bindKey:o("Alt-Shift-Up","Command-Option-Up"),exec:function(e){e.copyLinesUp()},scrollIntoView:"cursor"},{name:"movelinesup",bindKey:o("Alt-Up","Option-Up"),exec:function(e){e.moveLinesUp()},scrollIntoView:"cursor"},{name:"copylinesdown",bindKey:o("Alt-Shift-Down","Command-Option-Down"),exec:function(e){e.copyLinesDown()},scrollIntoView:"cursor"},{name:"movelinesdown",bindKey:o("Alt-Down","Option-Down"),exec:function(e){e.moveLinesDown()},scrollIntoView:"cursor"},{name:"del",bindKey:o("Delete","Delete|Ctrl-D|Shift-Delete"),exec:function(e){e.remove("right")},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"backspace",bindKey:o("Shift-Backspace|Backspace","Ctrl-Backspace|Shift-Backspace|Backspace|Ctrl-H"),exec:function(e){e.remove("left")},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"cut_or_delete",bindKey:o("Shift-Delete",null),exec:function(e){if(!e.selection.isEmpty())return!1;e.remove("left")},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"removetolinestart",bindKey:o("Alt-Backspace","Command-Backspace"),exec:function(e){e.removeToLineStart()},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"removetolineend",bindKey:o("Alt-Delete","Ctrl-K"),exec:function(e){e.removeToLineEnd()},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"removewordleft",bindKey:o("Ctrl-Backspace","Alt-Backspace|Ctrl-Alt-Backspace"),exec:function(e){e.removeWordLeft()},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"removewordright",bindKey:o("Ctrl-Delete","Alt-Delete"),exec:function(e){e.removeWordRight()},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"outdent",bindKey:o("Shift-Tab","Shift-Tab"),exec:function(e){e.blockOutdent()},multiSelectAction:"forEach",scrollIntoView:"selectionPart"},{name:"indent",bindKey:o("Tab","Tab"),exec:function(e){e.indent()},multiSelectAction:"forEach",scrollIntoView:"selectionPart"},{name:"blockoutdent",bindKey:o("Ctrl-[","Ctrl-["),exec:function(e){e.blockOutdent()},multiSelectAction:"forEachLine",scrollIntoView:"selectionPart"},{name:"blockindent",bindKey:o("Ctrl-]","Ctrl-]"),exec:function(e){e.blockIndent()},multiSelectAction:"forEachLine",scrollIntoView:"selectionPart"},{name:"insertstring",exec:function(e,t){e.insert(t)},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"inserttext",exec:function(e,t){e.insert(r.stringRepeat(t.text||"",t.times||1))},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"splitline",bindKey:o(null,"Ctrl-O"),exec:function(e){e.splitLine()},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"transposeletters",bindKey:o("Ctrl-T","Ctrl-T"),exec:function(e){e.transposeLetters()},multiSelectAction:function(e){e.transposeSelections(1)},scrollIntoView:"cursor"},{name:"touppercase",bindKey:o("Ctrl-U","Ctrl-U"),exec:function(e){e.toUpperCase()},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"tolowercase",bindKey:o("Ctrl-Shift-U","Ctrl-Shift-U"),exec:function(e){e.toLowerCase()},multiSelectAction:"forEach",scrollIntoView:"cursor"},{name:"expandtoline",bindKey:o("Ctrl-Shift-L","Command-Shift-L"),exec:function(e){var t=e.selection.getRange();t.start.column=t.end.column=0,t.end.row++,e.selection.setRange(t,!1)},multiSelectAction:"forEach",scrollIntoView:"cursor",readOnly:!0},{name:"joinlines",bindKey:o(null,null),exec:function(e){var t=e.selection.isBackwards(),n=t?e.selection.getSelectionLead():e.selection.getSelectionAnchor(),i=t?e.selection.getSelectionAnchor():e.selection.getSelectionLead(),o=e.session.doc.getLine(n.row).length,u=e.session.doc.getTextRange(e.selection.getRange()),a=u.replace(/\n\s*/," ").length,f=e.session.doc.getLine(n.row);for(var l=n.row+1;l<=i.row+1;l++){var c=r.stringTrimLeft(r.stringTrimRight(e.session.doc.getLine(l)));c.length!==0&&(c=" "+c),f+=c}i.row+10?(e.selection.moveCursorTo(n.row,n.column),e.selection.selectTo(n.row,n.column+a)):(o=e.session.doc.getLine(n.row).length>o?o+1:o,e.selection.moveCursorTo(n.row,o))},multiSelectAction:"forEach",readOnly:!0},{name:"invertSelection",bindKey:o(null,null),exec:function(e){var t=e.session.doc.getLength()-1,n=e.session.doc.getLine(t).length,r=e.selection.rangeList.ranges,i=[];r.length<1&&(r=[e.selection.getRange()]);for(var o=0;o0&&this.$blockScrolling--;var n=t&&t.scrollIntoView;if(n){switch(n){case"center-animate":n="animate";case"center":this.renderer.scrollCursorIntoView(null,.5);break;case"animate":case"cursor":this.renderer.scrollCursorIntoView();break;case"selectionPart":var r=this.selection.getRange(),i=this.renderer.layerConfig;(r.start.row>=i.lastRow||r.end.row<=i.firstRow)&&this.renderer.scrollSelectionIntoView(this.selection.anchor,this.selection.lead);break;default:}n=="animate"&&this.renderer.animateScrolling(this.curOp.scrollTop)}this.prevOp=this.curOp,this.curOp=null}},this.$mergeableCommands=["backspace","del","insertstring"],this.$historyTracker=function(e){if(!this.$mergeUndoDeltas)return;var t=this.prevOp,n=this.$mergeableCommands,r=t.command&&e.command.name==t.command.name;if(e.command.name=="insertstring"){var i=e.args;this.mergeNextCommand===undefined&&(this.mergeNextCommand=!0),r=r&&this.mergeNextCommand&&(!/\s/.test(i)||/\s/.test(t.args)),this.mergeNextCommand=!0}else r=r&&n.indexOf(e.command.name)!==-1;this.$mergeUndoDeltas!="always"&&Date.now()-this.sequenceStartTime>2e3&&(r=!1),r?this.session.mergeUndoDeltas=!0:n.indexOf(e.command.name)!==-1&&(this.sequenceStartTime=Date.now())},this.setKeyboardHandler=function(e,t){if(e&&typeof e=="string"){this.$keybindingId=e;var n=this;g.loadModule(["keybinding",e],function(r){n.$keybindingId==e&&n.keyBinding.setKeyboardHandler(r&&r.handler),t&&t()})}else this.$keybindingId=null,this.keyBinding.setKeyboardHandler(e),t&&t()},this.getKeyboardHandler=function(){return this.keyBinding.getKeyboardHandler()},this.setSession=function(e){if(this.session==e)return;this.curOp&&this.endOperation(),this.curOp={};var t=this.session;if(t){this.session.off("change",this.$onDocumentChange),this.session.off("changeMode",this.$onChangeMode),this.session.off("tokenizerUpdate",this.$onTokenizerUpdate),this.session.off("changeTabSize",this.$onChangeTabSize),this.session.off("changeWrapLimit",this.$onChangeWrapLimit),this.session.off("changeWrapMode",this.$onChangeWrapMode),this.session.off("changeFold",this.$onChangeFold),this.session.off("changeFrontMarker",this.$onChangeFrontMarker),this.session.off("changeBackMarker",this.$onChangeBackMarker),this.session.off("changeBreakpoint",this.$onChangeBreakpoint),this.session.off("changeAnnotation",this.$onChangeAnnotation),this.session.off("changeOverwrite",this.$onCursorChange),this.session.off("changeScrollTop",this.$onScrollTopChange),this.session.off("changeScrollLeft",this.$onScrollLeftChange);var n=this.session.getSelection();n.off("changeCursor",this.$onCursorChange),n.off("changeSelection",this.$onSelectionChange)}this.session=e,e?(this.$onDocumentChange=this.onDocumentChange.bind(this),e.on("change",this.$onDocumentChange),this.renderer.setSession(e),this.$onChangeMode=this.onChangeMode.bind(this),e.on("changeMode",this.$onChangeMode),this.$onTokenizerUpdate=this.onTokenizerUpdate.bind(this),e.on("tokenizerUpdate",this.$onTokenizerUpdate),this.$onChangeTabSize=this.renderer.onChangeTabSize.bind(this.renderer),e.on("changeTabSize",this.$onChangeTabSize),this.$onChangeWrapLimit=this.onChangeWrapLimit.bind(this),e.on("changeWrapLimit",this.$onChangeWrapLimit),this.$onChangeWrapMode=this.onChangeWrapMode.bind(this),e.on("changeWrapMode",this.$onChangeWrapMode),this.$onChangeFold=this.onChangeFold.bind(this),e.on("changeFold",this.$onChangeFold),this.$onChangeFrontMarker=this.onChangeFrontMarker.bind(this),this.session.on("changeFrontMarker",this.$onChangeFrontMarker),this.$onChangeBackMarker=this.onChangeBackMarker.bind(this),this.session.on("changeBackMarker",this.$onChangeBackMarker),this.$onChangeBreakpoint=this.onChangeBreakpoint.bind(this),this.session.on("changeBreakpoint",this.$onChangeBreakpoint),this.$onChangeAnnotation=this.onChangeAnnotation.bind(this),this.session.on("changeAnnotation",this.$onChangeAnnotation),this.$onCursorChange=this.onCursorChange.bind(this),this.session.on("changeOverwrite",this.$onCursorChange),this.$onScrollTopChange=this.onScrollTopChange.bind(this),this.session.on("changeScrollTop",this.$onScrollTopChange),this.$onScrollLeftChange=this.onScrollLeftChange.bind(this),this.session.on("changeScrollLeft",this.$onScrollLeftChange),this.selection=e.getSelection(),this.selection.on("changeCursor",this.$onCursorChange),this.$onSelectionChange=this.onSelectionChange.bind(this),this.selection.on("changeSelection",this.$onSelectionChange),this.onChangeMode(),this.$blockScrolling+=1,this.onCursorChange(),this.$blockScrolling-=1,this.onScrollTopChange(),this.onScrollLeftChange(),this.onSelectionChange(),this.onChangeFrontMarker(),this.onChangeBackMarker(),this.onChangeBreakpoint(),this.onChangeAnnotation(),this.session.getUseWrapMode()&&this.renderer.adjustWrapLimit(),this.renderer.updateFull()):(this.selection=null,this.renderer.setSession(e)),this._signal("changeSession",{session:e,oldSession:t}),this.curOp=null,t&&t._signal("changeEditor",{oldEditor:this}),e&&e._signal("changeEditor",{editor:this})},this.getSession=function(){return this.session},this.setValue=function(e,t){return this.session.doc.setValue(e),t?t==1?this.navigateFileEnd():t==-1&&this.navigateFileStart():this.selectAll(),e},this.getValue=function(){return this.session.getValue()},this.getSelection=function(){return this.selection},this.resize=function(e){this.renderer.onResize(e)},this.setTheme=function(e,t){this.renderer.setTheme(e,t)},this.getTheme=function(){return this.renderer.getTheme()},this.setStyle=function(e){this.renderer.setStyle(e)},this.unsetStyle=function(e){this.renderer.unsetStyle(e)},this.getFontSize=function(){return this.getOption("fontSize")||i.computedStyle(this.container,"fontSize")},this.setFontSize=function(e){this.setOption("fontSize",e)},this.$highlightBrackets=function(){this.session.$bracketHighlight&&(this.session.removeMarker(this.session.$bracketHighlight),this.session.$bracketHighlight=null);if(this.$highlightPending)return;var e=this;this.$highlightPending=!0,setTimeout(function(){e.$highlightPending=!1;var t=e.session;if(!t||!t.bgTokenizer)return;var n=t.findMatchingBracket(e.getCursorPosition());if(n)var r=new p(n.row,n.column,n.row,n.column+1);else if(t.$mode.getMatching)var r=t.$mode.getMatching(e.session);r&&(t.$bracketHighlight=t.addMarker(r,"ace_bracket","text"))},50)},this.$highlightTags=function(){if(this.$highlightTagPending)return;var e=this;this.$highlightTagPending=!0,setTimeout(function(){e.$highlightTagPending=!1;var t=e.session;if(!t||!t.bgTokenizer)return;var n=e.getCursorPosition(),r=new y(e.session,n.row,n.column),i=r.getCurrentToken();if(!i||!/\b(?:tag-open|tag-name)/.test(i.type)){t.removeMarker(t.$tagHighlight),t.$tagHighlight=null;return}if(i.type.indexOf("tag-open")!=-1){i=r.stepForward();if(!i)return}var s=i.value,o=0,u=r.stepBackward();if(u.value=="<"){do u=i,i=r.stepForward(),i&&i.value===s&&i.type.indexOf("tag-name")!==-1&&(u.value==="<"?o++:u.value==="=0)}else{do i=u,u=r.stepBackward(),i&&i.value===s&&i.type.indexOf("tag-name")!==-1&&(u.value==="<"?o++:u.value==="1)&&(t=!1)}if(e.$highlightLineMarker&&!t)e.removeMarker(e.$highlightLineMarker.id),e.$highlightLineMarker=null;else if(!e.$highlightLineMarker&&t){var n=new p(t.row,t.column,t.row,Infinity);n.id=e.addMarker(n,"ace_active-line","screenLine"),e.$highlightLineMarker=n}else t&&(e.$highlightLineMarker.start.row=t.row,e.$highlightLineMarker.end.row=t.row,e.$highlightLineMarker.start.column=t.column,e._signal("changeBackMarker"))},this.onSelectionChange=function(e){var t=this.session;t.$selectionMarker&&t.removeMarker(t.$selectionMarker),t.$selectionMarker=null;if(!this.selection.isEmpty()){var n=this.selection.getRange(),r=this.getSelectionStyle();t.$selectionMarker=t.addMarker(n,"ace_selection",r)}else this.$updateHighlightActiveLine();var i=this.$highlightSelectedWord&&this.$getSelectionHighLightRegexp();this.session.highlight(i),this._signal("changeSelection")},this.$getSelectionHighLightRegexp=function(){var e=this.session,t=this.getSelectionRange();if(t.isEmpty()||t.isMultiLine())return;var n=t.start.column-1,r=t.end.column+1,i=e.getLine(t.start.row),s=i.length,o=i.substring(Math.max(n,0),Math.min(r,s));if(n>=0&&/^[\w\d]/.test(o)||r<=s&&/[\w\d]$/.test(o))return;o=i.substring(t.start.column,t.end.column);if(!/^[\w\d]+$/.test(o))return;var u=this.$search.$assembleRegExp({wholeWord:!0,caseSensitive:!0,needle:o});return u},this.onChangeFrontMarker=function(){this.renderer.updateFrontMarkers()},this.onChangeBackMarker=function(){this.renderer.updateBackMarkers()},this.onChangeBreakpoint=function(){this.renderer.updateBreakpoints()},this.onChangeAnnotation=function(){this.renderer.setAnnotations(this.session.getAnnotations())},this.onChangeMode=function(e){this.renderer.updateText(),this._emit("changeMode",e)},this.onChangeWrapLimit=function(){this.renderer.updateFull()},this.onChangeWrapMode=function(){this.renderer.onResize(!0)},this.onChangeFold=function(){this.$updateHighlightActiveLine(),this.renderer.updateFull()},this.getSelectedText=function(){return this.session.getTextRange(this.getSelectionRange())},this.getCopyText=function(){var e=this.getSelectedText();return this._signal("copy",e),e},this.onCopy=function(){this.commands.exec("copy",this)},this.onCut=function(){this.commands.exec("cut",this)},this.onPaste=function(e,t){var n={text:e,event:t};this.commands.exec("paste",this,n)},this.$handlePaste=function(e){typeof e=="string"&&(e={text:e}),this._signal("paste",e);var t=e.text;if(!this.inMultiSelectMode||this.inVirtualSelectionMode)this.insert(t);else{var n=t.split(/\r\n|\r|\n/),r=this.selection.rangeList.ranges;if(n.length>r.length||n.length<2||!n[1])return this.commands.exec("insertstring",this,t);for(var i=r.length;i--;){var s=r[i];s.isEmpty()||this.session.remove(s),this.session.insert(s.start,n[i])}}},this.execCommand=function(e,t){return this.commands.exec(e,this,t)},this.insert=function(e,t){var n=this.session,r=n.getMode(),i=this.getCursorPosition();if(this.getBehavioursEnabled()&&!t){var s=r.transformAction(n.getState(i.row),"insertion",this,n,e);s&&(e!==s.text&&(this.session.mergeUndoDeltas=!1,this.$mergeNextCommand=!1),e=s.text)}e==" "&&(e=this.session.getTabString());if(!this.selection.isEmpty()){var o=this.getSelectionRange();i=this.session.remove(o),this.clearSelection()}else if(this.session.getOverwrite()){var o=new p.fromPoints(i,i);o.end.column+=e.length,this.session.remove(o)}if(e=="\n"||e=="\r\n"){var u=n.getLine(i.row);if(i.column>u.search(/\S|$/)){var a=u.substr(i.column).search(/\S|$/);n.doc.removeInLine(i.row,i.column,i.column+a)}}this.clearSelection();var f=i.column,l=n.getState(i.row),u=n.getLine(i.row),c=r.checkOutdent(l,u,e),h=n.insert(i,e);s&&s.selection&&(s.selection.length==2?this.selection.setSelectionRange(new p(i.row,f+s.selection[0],i.row,f+s.selection[1])):this.selection.setSelectionRange(new p(i.row+s.selection[0],s.selection[1],i.row+s.selection[2],s.selection[3])));if(n.getDocument().isNewLine(e)){var d=r.getNextLineIndent(l,u.slice(0,i.column),n.getTabString());n.insert({row:i.row+1,column:0},d)}c&&r.autoOutdent(l,n,i.row)},this.onTextInput=function(e){this.keyBinding.onTextInput(e)},this.onCommandKey=function(e,t,n){this.keyBinding.onCommandKey(e,t,n)},this.setOverwrite=function(e){this.session.setOverwrite(e)},this.getOverwrite=function(){return this.session.getOverwrite()},this.toggleOverwrite=function(){this.session.toggleOverwrite()},this.setScrollSpeed=function(e){this.setOption("scrollSpeed",e)},this.getScrollSpeed=function(){return this.getOption("scrollSpeed")},this.setDragDelay=function(e){this.setOption("dragDelay",e)},this.getDragDelay=function(){return this.getOption("dragDelay")},this.setSelectionStyle=function(e){this.setOption("selectionStyle",e)},this.getSelectionStyle=function(){return this.getOption("selectionStyle")},this.setHighlightActiveLine=function(e){this.setOption("highlightActiveLine",e)},this.getHighlightActiveLine=function(){return this.getOption("highlightActiveLine")},this.setHighlightGutterLine=function(e){this.setOption("highlightGutterLine",e)},this.getHighlightGutterLine=function(){return this.getOption("highlightGutterLine")},this.setHighlightSelectedWord=function(e){this.setOption("highlightSelectedWord",e)},this.getHighlightSelectedWord=function(){return this.$highlightSelectedWord},this.setAnimatedScroll=function(e){this.renderer.setAnimatedScroll(e)},this.getAnimatedScroll=function(){return this.renderer.getAnimatedScroll()},this.setShowInvisibles=function(e){this.renderer.setShowInvisibles(e)},this.getShowInvisibles=function(){return this.renderer.getShowInvisibles()},this.setDisplayIndentGuides=function(e){this.renderer.setDisplayIndentGuides(e)},this.getDisplayIndentGuides=function(){return this.renderer.getDisplayIndentGuides()},this.setShowPrintMargin=function(e){this.renderer.setShowPrintMargin(e)},this.getShowPrintMargin=function(){return this.renderer.getShowPrintMargin()},this.setPrintMarginColumn=function(e){this.renderer.setPrintMarginColumn(e)},this.getPrintMarginColumn=function(){return this.renderer.getPrintMarginColumn()},this.setReadOnly=function(e){this.setOption("readOnly",e)},this.getReadOnly=function(){return this.getOption("readOnly")},this.setBehavioursEnabled=function(e){this.setOption("behavioursEnabled",e)},this.getBehavioursEnabled=function(){return this.getOption("behavioursEnabled")},this.setWrapBehavioursEnabled=function(e){this.setOption("wrapBehavioursEnabled",e)},this.getWrapBehavioursEnabled=function(){return this.getOption("wrapBehavioursEnabled")},this.setShowFoldWidgets=function(e){this.setOption("showFoldWidgets",e)},this.getShowFoldWidgets=function(){return this.getOption("showFoldWidgets")},this.setFadeFoldWidgets=function(e){this.setOption("fadeFoldWidgets",e)},this.getFadeFoldWidgets=function(){return this.getOption("fadeFoldWidgets")},this.remove=function(e){this.selection.isEmpty()&&(e=="left"?this.selection.selectLeft():this.selection.selectRight());var t=this.getSelectionRange();if(this.getBehavioursEnabled()){var n=this.session,r=n.getState(t.start.row),i=n.getMode().transformAction(r,"deletion",this,n,t);if(t.end.column===0){var s=n.getTextRange(t);if(s[s.length-1]=="\n"){var o=n.getLine(t.end.row);/^\s+$/.test(o)&&(t.end.column=o.length)}}i&&(t=i)}this.session.remove(t),this.clearSelection()},this.removeWordRight=function(){this.selection.isEmpty()&&this.selection.selectWordRight(),this.session.remove(this.getSelectionRange()),this.clearSelection()},this.removeWordLeft=function(){this.selection.isEmpty()&&this.selection.selectWordLeft(),this.session.remove(this.getSelectionRange()),this.clearSelection()},this.removeToLineStart=function(){this.selection.isEmpty()&&this.selection.selectLineStart(),this.session.remove(this.getSelectionRange()),this.clearSelection()},this.removeToLineEnd=function(){this.selection.isEmpty()&&this.selection.selectLineEnd();var e=this.getSelectionRange();e.start.column==e.end.column&&e.start.row==e.end.row&&(e.end.column=0,e.end.row++),this.session.remove(e),this.clearSelection()},this.splitLine=function(){this.selection.isEmpty()||(this.session.remove(this.getSelectionRange()),this.clearSelection());var e=this.getCursorPosition();this.insert("\n"),this.moveCursorToPosition(e)},this.transposeLetters=function(){if(!this.selection.isEmpty())return;var e=this.getCursorPosition(),t=e.column;if(t===0)return;var n=this.session.getLine(e.row),r,i;tt.toLowerCase()?1:0});var r=new p(0,0,0,0);for(var i=e.first;i<=e.last;i++){var s=t.getLine(i);r.start.row=i,r.end.row=i,r.end.column=s.length,t.replace(r,n[i-e.first])}},this.toggleCommentLines=function(){var e=this.session.getState(this.getCursorPosition().row),t=this.$getSelectedRows();this.session.getMode().toggleCommentLines(e,this.session,t.first,t.last)},this.toggleBlockComment=function(){var e=this.getCursorPosition(),t=this.session.getState(e.row),n=this.getSelectionRange();this.session.getMode().toggleBlockComment(t,this.session,n,e)},this.getNumberAt=function(e,t){var n=/[\-]?[0-9]+(?:\.[0-9]+)?/g;n.lastIndex=0;var r=this.session.getLine(e);while(n.lastIndex=t){var s={value:i[0],start:i.index,end:i.index+i[0].length};return s}}return null},this.modifyNumber=function(e){var t=this.selection.getCursor().row,n=this.selection.getCursor().column,r=new p(t,n-1,t,n),i=this.session.getTextRange(r);if(!isNaN(parseFloat(i))&&isFinite(i)){var s=this.getNumberAt(t,n);if(s){var o=s.value.indexOf(".")>=0?s.start+s.value.indexOf(".")+1:s.end,u=s.start+s.value.length-o,a=parseFloat(s.value);a*=Math.pow(10,u),o!==s.end&&np+1)break;p=d.last}l--,u=this.session.$moveLines(h,p,t?0:e),t&&e==-1&&(c=l+1);while(c<=l)o[c].moveBy(u,0),c++;t||(u=0),a+=u}i.fromOrientedRange(i.ranges[0]),i.rangeList.attach(this.session),this.inVirtualSelectionMode=!1}},this.$getSelectedRows=function(e){return e=(e||this.getSelectionRange()).collapseRows(),{first:this.session.getRowFoldStart(e.start.row),last:this.session.getRowFoldEnd(e.end.row)}},this.onCompositionStart=function(e){this.renderer.showComposition(this.getCursorPosition())},this.onCompositionUpdate=function(e){this.renderer.setCompositionText(e)},this.onCompositionEnd=function(){this.renderer.hideComposition()},this.getFirstVisibleRow=function(){return this.renderer.getFirstVisibleRow()},this.getLastVisibleRow=function(){return this.renderer.getLastVisibleRow()},this.isRowVisible=function(e){return e>=this.getFirstVisibleRow()&&e<=this.getLastVisibleRow()},this.isRowFullyVisible=function(e){return e>=this.renderer.getFirstFullyVisibleRow()&&e<=this.renderer.getLastFullyVisibleRow()},this.$getVisibleRowCount=function(){return this.renderer.getScrollBottomRow()-this.renderer.getScrollTopRow()+1},this.$moveByPage=function(e,t){var n=this.renderer,r=this.renderer.layerConfig,i=e*Math.floor(r.height/r.lineHeight);this.$blockScrolling++,t===!0?this.selection.$moveSelection(function(){this.moveCursorBy(i,0)}):t===!1&&(this.selection.moveCursorBy(i,0),this.selection.clearSelection()),this.$blockScrolling--;var s=n.scrollTop;n.scrollBy(0,i*r.lineHeight),t!=null&&n.scrollCursorIntoView(null,.5),n.animateScrolling(s)},this.selectPageDown=function(){this.$moveByPage(1,!0)},this.selectPageUp=function(){this.$moveByPage(-1,!0)},this.gotoPageDown=function(){this.$moveByPage(1,!1)},this.gotoPageUp=function(){this.$moveByPage(-1,!1)},this.scrollPageDown=function(){this.$moveByPage(1)},this.scrollPageUp=function(){this.$moveByPage(-1)},this.scrollToRow=function(e){this.renderer.scrollToRow(e)},this.scrollToLine=function(e,t,n,r){this.renderer.scrollToLine(e,t,n,r)},this.centerSelection=function(){var e=this.getSelectionRange(),t={row:Math.floor(e.start.row+(e.end.row-e.start.row)/2),column:Math.floor(e.start.column+(e.end.column-e.start.column)/2)};this.renderer.alignCursor(t,.5)},this.getCursorPosition=function(){return this.selection.getCursor()},this.getCursorPositionScreen=function(){return this.session.documentToScreenPosition(this.getCursorPosition())},this.getSelectionRange=function(){return this.selection.getRange()},this.selectAll=function(){this.$blockScrolling+=1,this.selection.selectAll(),this.$blockScrolling-=1},this.clearSelection=function(){this.selection.clearSelection()},this.moveCursorTo=function(e,t){this.selection.moveCursorTo(e,t)},this.moveCursorToPosition=function(e){this.selection.moveCursorToPosition(e)},this.jumpToMatching=function(e,t){var n=this.getCursorPosition(),r=new y(this.session,n.row,n.column),i=r.getCurrentToken(),s=i||r.stepForward();if(!s)return;var o,u=!1,a={},f=n.column-s.start,l,c={")":"(","(":"(","]":"[","[":"[","{":"{","}":"{"};do{if(s.value.match(/[{}()\[\]]/g))for(;f=0;--s)this.$tryReplace(n[s],e)&&r++;return this.selection.setSelectionRange(i),this.$blockScrolling-=1,r},this.$tryReplace=function(e,t){var n=this.session.getTextRange(e);return t=this.$search.replace(n,t),t!==null?(e.end=this.session.replace(e,t),e):null},this.getLastSearchOptions=function(){return this.$search.getOptions()},this.find=function(e,t,n){t||(t={}),typeof e=="string"||e instanceof RegExp?t.needle=e:typeof e=="object"&&r.mixin(t,e);var i=this.selection.getRange();t.needle==null&&(e=this.session.getTextRange(i)||this.$search.$options.needle,e||(i=this.session.getWordRange(i.start.row,i.start.column),e=this.session.getTextRange(i)),this.$search.set({needle:e})),this.$search.set(t),t.start||this.$search.set({start:i});var s=this.$search.find(this.session);if(t.preventScroll)return s;if(s)return this.revealRange(s,n),s;t.backwards?i.start=i.end:i.end=i.start,this.selection.setRange(i)},this.findNext=function(e,t){this.find({skipCurrent:!0,backwards:!1},e,t)},this.findPrevious=function(e,t){this.find(e,{skipCurrent:!0,backwards:!0},t)},this.revealRange=function(e,t){this.$blockScrolling+=1,this.session.unfold(e),this.selection.setSelectionRange(e),this.$blockScrolling-=1;var n=this.renderer.scrollTop;this.renderer.scrollSelectionIntoView(e.start,e.end,.5),t!==!1&&this.renderer.animateScrolling(n)},this.undo=function(){this.$blockScrolling++,this.session.getUndoManager().undo(),this.$blockScrolling--,this.renderer.scrollCursorIntoView(null,.5)},this.redo=function(){this.$blockScrolling++,this.session.getUndoManager().redo(),this.$blockScrolling--,this.renderer.scrollCursorIntoView(null,.5)},this.destroy=function(){this.renderer.destroy(),this._signal("destroy",this),this.session&&this.session.destroy()},this.setAutoScrollEditorIntoView=function(e){if(!e)return;var t,n=this,r=!1;this.$scrollAnchor||(this.$scrollAnchor=document.createElement("div"));var i=this.$scrollAnchor;i.style.cssText="position:absolute",this.container.insertBefore(i,this.container.firstChild);var s=this.on("changeSelection",function(){r=!0}),o=this.renderer.on("beforeRender",function(){r&&(t=n.renderer.container.getBoundingClientRect())}),u=this.renderer.on("afterRender",function(){if(r&&t&&(n.isFocused()||n.searchBox&&n.searchBox.isFocused())){var e=n.renderer,s=e.$cursorLayer.$pixelPos,o=e.layerConfig,u=s.top-o.offset;s.top>=0&&u+t.top<0?r=!0:s.topwindow.innerHeight?r=!1:r=null,r!=null&&(i.style.top=u+"px",i.style.left=s.left+"px",i.style.height=o.lineHeight+"px",i.scrollIntoView(r)),r=t=null}});this.setAutoScrollEditorIntoView=function(e){if(e)return;delete this.setAutoScrollEditorIntoView,this.off("changeSelection",s),this.renderer.off("afterRender",u),this.renderer.off("beforeRender",o)}},this.$resetCursorStyle=function(){var e=this.$cursorStyle||"ace",t=this.renderer.$cursorLayer;if(!t)return;t.setSmoothBlinking(/smooth/.test(e)),t.isBlinking=!this.$readOnly&&e!="wide",i.setCssClass(t.element,"ace_slim-cursors",/slim/.test(e))}}).call(b.prototype),g.defineOptions(b.prototype,"editor",{selectionStyle:{set:function(e){this.onSelectionChange(),this._signal("changeSelectionStyle",{data:e})},initialValue:"line"},highlightActiveLine:{set:function(){this.$updateHighlightActiveLine()},initialValue:!0},highlightSelectedWord:{set:function(e){this.$onSelectionChange()},initialValue:!0},readOnly:{set:function(e){this.$resetCursorStyle()},initialValue:!1},cursorStyle:{set:function(e){this.$resetCursorStyle()},values:["ace","slim","smooth","wide"],initialValue:"ace"},mergeUndoDeltas:{values:[!1,!0,"always"],initialValue:!0},behavioursEnabled:{initialValue:!0},wrapBehavioursEnabled:{initialValue:!0},autoScrollEditorIntoView:{set:function(e){this.setAutoScrollEditorIntoView(e)}},keyboardHandler:{set:function(e){this.setKeyboardHandler(e)},get:function(){return this.keybindingId},handlesSet:!0},hScrollBarAlwaysVisible:"renderer",vScrollBarAlwaysVisible:"renderer",highlightGutterLine:"renderer",animatedScroll:"renderer",showInvisibles:"renderer",showPrintMargin:"renderer",printMarginColumn:"renderer",printMargin:"renderer",fadeFoldWidgets:"renderer",showFoldWidgets:"renderer",showLineNumbers:"renderer",showGutter:"renderer",displayIndentGuides:"renderer",fontSize:"renderer",fontFamily:"renderer",maxLines:"renderer",minLines:"renderer",scrollPastEnd:"renderer",fixedWidthGutter:"renderer",theme:"renderer",scrollSpeed:"$mouseHandler",dragDelay:"$mouseHandler",dragEnabled:"$mouseHandler",focusTimout:"$mouseHandler",tooltipFollowsMouse:"$mouseHandler",firstLineNumber:"session",overwrite:"session",newLineMode:"session",useWorker:"session",useSoftTabs:"session",tabSize:"session",wrap:"session",indentedSoftWrap:"session",foldStyle:"session",mode:"session"}),t.Editor=b}),ace.define("ace/undomanager",["require","exports","module"],function(e,t,n){"use strict";var r=function(){this.reset()};(function(){function e(e){return{action:e.action,start:e.start,end:e.end,lines:e.lines.length==1?null:e.lines,text:e.lines.length==1?e.lines[0]:null}}function t(e){return{action:e.action,start:e.start,end:e.end,lines:e.lines||[e.text]}}function n(e,t){var n=new Array(e.length);for(var r=0;r0},this.hasRedo=function(){return this.$redoStack.length>0},this.markClean=function(){this.dirtyCounter=0},this.isClean=function(){return this.dirtyCounter===0},this.$serializeDeltas=function(t){return n(t,e)},this.$deserializeDeltas=function(e){return n(e,t)}}).call(r.prototype),t.UndoManager=r}),ace.define("ace/layer/gutter",["require","exports","module","ace/lib/dom","ace/lib/oop","ace/lib/lang","ace/lib/event_emitter"],function(e,t,n){"use strict";var r=e("../lib/dom"),i=e("../lib/oop"),s=e("../lib/lang"),o=e("../lib/event_emitter").EventEmitter,u=function(e){this.element=r.createElement("div"),this.element.className="ace_layer ace_gutter-layer",e.appendChild(this.element),this.setShowFoldWidgets(this.$showFoldWidgets),this.gutterWidth=0,this.$annotations=[],this.$updateAnnotations=this.$updateAnnotations.bind(this),this.$cells=[]};(function(){i.implement(this,o),this.setSession=function(e){this.session&&this.session.removeEventListener("change",this.$updateAnnotations),this.session=e,e&&e.on("change",this.$updateAnnotations)},this.addGutterDecoration=function(e,t){window.console&&console.warn&&console.warn("deprecated use session.addGutterDecoration"),this.session.addGutterDecoration(e,t)},this.removeGutterDecoration=function(e,t){window.console&&console.warn&&console.warn("deprecated use session.removeGutterDecoration"),this.session.removeGutterDecoration(e,t)},this.setAnnotations=function(e){this.$annotations=[];for(var t=0;to&&(v=s.end.row+1,s=t.getNextFoldLine(v,s),o=s?s.start.row:Infinity);if(v>i){while(this.$cells.length>d+1)p=this.$cells.pop(),this.element.removeChild(p.element);break}p=this.$cells[++d],p||(p={element:null,textNode:null,foldWidget:null},p.element=r.createElement("div"),p.textNode=document.createTextNode(""),p.element.appendChild(p.textNode),this.element.appendChild(p.element),this.$cells[d]=p);var m="ace_gutter-cell ";a[v]&&(m+=a[v]),f[v]&&(m+=f[v]),this.$annotations[v]&&(m+=this.$annotations[v].className),p.element.className!=m&&(p.element.className=m);var g=t.getRowLength(v)*e.lineHeight+"px";g!=p.element.style.height&&(p.element.style.height=g);if(u){var y=u[v];y==null&&(y=u[v]=t.getFoldWidget(v))}if(y){p.foldWidget||(p.foldWidget=r.createElement("span"),p.element.appendChild(p.foldWidget));var m="ace_fold-widget ace_"+y;y=="start"&&v==o&&vn.right-t.right)return"foldWidgets"}}).call(u.prototype),t.Gutter=u}),ace.define("ace/layer/marker",["require","exports","module","ace/range","ace/lib/dom"],function(e,t,n){"use strict";var r=e("../range").Range,i=e("../lib/dom"),s=function(e){this.element=i.createElement("div"),this.element.className="ace_layer ace_marker-layer",e.appendChild(this.element)};(function(){function e(e,t,n,r){return(e?1:0)|(t?2:0)|(n?4:0)|(r?8:0)}this.$padding=0,this.setPadding=function(e){this.$padding=e},this.setSession=function(e){this.session=e},this.setMarkers=function(e){this.markers=e},this.update=function(e){var e=e||this.config;if(!e)return;this.config=e;var t=[];for(var n in this.markers){var r=this.markers[n];if(!r.range){r.update(t,this,this.session,e);continue}var i=r.range.clipRows(e.firstRow,e.lastRow);if(i.isEmpty())continue;i=i.toScreenRange(this.session);if(r.renderer){var s=this.$getTop(i.start.row,e),o=this.$padding+i.start.column*e.characterWidth;r.renderer(t,i,o,s,e)}else r.type=="fullLine"?this.drawFullLineMarker(t,i,r.clazz,e):r.type=="screenLine"?this.drawScreenLineMarker(t,i,r.clazz,e):i.isMultiLine()?r.type=="text"?this.drawTextMarker(t,i,r.clazz,e):this.drawMultiLineMarker(t,i,r.clazz,e):this.drawSingleLineMarker(t,i,r.clazz+" ace_start"+" ace_br15",e)}this.element.innerHTML=t.join("")},this.$getTop=function(e,t){return(e-t.firstRowScreen)*t.lineHeight},this.drawTextMarker=function(t,n,i,s,o){var u=this.session,a=n.start.row,f=n.end.row,l=a,c=0,h=0,p=u.getScreenLastRowColumn(l),d=new r(l,n.start.column,l,h);for(;l<=f;l++)d.start.row=d.end.row=l,d.start.column=l==a?n.start.column:u.getRowWrapIndent(l),d.end.column=p,c=h,h=p,p=l+1p,l==f),s,l==f?0:1,o)},this.drawMultiLineMarker=function(e,t,n,r,i){var s=this.$padding,o=r.lineHeight,u=this.$getTop(t.start.row,r),a=s+t.start.column*r.characterWidth;i=i||"",e.push("
"),u=this.$getTop(t.end.row,r);var f=t.end.column*r.characterWidth;e.push("
"),o=(t.end.row-t.start.row-1)*r.lineHeight;if(o<=0)return;u=this.$getTop(t.start.row+1,r);var l=(t.start.column?1:0)|(t.end.column?0:8);e.push("
")},this.drawSingleLineMarker=function(e,t,n,r,i,s){var o=r.lineHeight,u=(t.end.column+(i||0)-t.start.column)*r.characterWidth,a=this.$getTop(t.start.row,r),f=this.$padding+t.start.column*r.characterWidth;e.push("
")},this.drawFullLineMarker=function(e,t,n,r,i){var s=this.$getTop(t.start.row,r),o=r.lineHeight;t.start.row!=t.end.row&&(o+=this.$getTop(t.end.row,r)-s),e.push("
")},this.drawScreenLineMarker=function(e,t,n,r,i){var s=this.$getTop(t.start.row,r),o=r.lineHeight;e.push("
")}}).call(s.prototype),t.Marker=s}),ace.define("ace/layer/text",["require","exports","module","ace/lib/oop","ace/lib/dom","ace/lib/lang","ace/lib/useragent","ace/lib/event_emitter"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/dom"),s=e("../lib/lang"),o=e("../lib/useragent"),u=e("../lib/event_emitter").EventEmitter,a=function(e){this.element=i.createElement("div"),this.element.className="ace_layer ace_text-layer",e.appendChild(this.element),this.$updateEolChar=this.$updateEolChar.bind(this)};(function(){r.implement(this,u),this.EOF_CHAR="\u00b6",this.EOL_CHAR_LF="\u00ac",this.EOL_CHAR_CRLF="\u00a4",this.EOL_CHAR=this.EOL_CHAR_LF,this.TAB_CHAR="\u2014",this.SPACE_CHAR="\u00b7",this.$padding=0,this.$updateEolChar=function(){var e=this.session.doc.getNewLineCharacter()=="\n"?this.EOL_CHAR_LF:this.EOL_CHAR_CRLF;if(this.EOL_CHAR!=e)return this.EOL_CHAR=e,!0},this.setPadding=function(e){this.$padding=e,this.element.style.padding="0 "+e+"px"},this.getLineHeight=function(){return this.$fontMetrics.$characterSize.height||0},this.getCharacterWidth=function(){return this.$fontMetrics.$characterSize.width||0},this.$setFontMetrics=function(e){this.$fontMetrics=e,this.$fontMetrics.on("changeCharacterSize",function(e){this._signal("changeCharacterSize",e)}.bind(this)),this.$pollSizeChanges()},this.checkForSizeChanges=function(){this.$fontMetrics.checkForSizeChanges()},this.$pollSizeChanges=function(){return this.$pollSizeChangesTimer=this.$fontMetrics.$pollSizeChanges()},this.setSession=function(e){this.session=e,e&&this.$computeTabString()},this.showInvisibles=!1,this.setShowInvisibles=function(e){return this.showInvisibles==e?!1:(this.showInvisibles=e,this.$computeTabString(),!0)},this.displayIndentGuides=!0,this.setDisplayIndentGuides=function(e){return this.displayIndentGuides==e?!1:(this.displayIndentGuides=e,this.$computeTabString(),!0)},this.$tabStrings=[],this.onChangeTabSize=this.$computeTabString=function(){var e=this.session.getTabSize();this.tabSize=e;var t=this.$tabStrings=[0];for(var n=1;n"+s.stringRepeat(this.TAB_CHAR,n)+""):t.push(s.stringRepeat(" ",n));if(this.displayIndentGuides){this.$indentGuideRe=/\s\S| \t|\t |\s$/;var r="ace_indent-guide",i="",o="";if(this.showInvisibles){r+=" ace_invisible",i=" ace_invisible_space",o=" ace_invisible_tab";var u=s.stringRepeat(this.SPACE_CHAR,this.tabSize),a=s.stringRepeat(this.TAB_CHAR,this.tabSize)}else var u=s.stringRepeat(" ",this.tabSize),a=u;this.$tabStrings[" "]=""+u+"",this.$tabStrings[" "]=""+a+""}},this.updateLines=function(e,t,n){(this.config.lastRow!=e.lastRow||this.config.firstRow!=e.firstRow)&&this.scrollLines(e),this.config=e;var r=Math.max(t,e.firstRow),i=Math.min(n,e.lastRow),s=this.element.childNodes,o=0;for(var u=e.firstRow;uf&&(u=a.end.row+1,a=this.session.getNextFoldLine(u,a),f=a?a.start.row:Infinity);if(u>i)break;var l=s[o++];if(l){var c=[];this.$renderLine(c,u,!this.$useLineGroups(),u==f?a:!1),l.style.height=e.lineHeight*this.session.getRowLength(u)+"px",l.innerHTML=c.join("")}u++}},this.scrollLines=function(e){var t=this.config;this.config=e;if(!t||t.lastRow0;r--)n.removeChild(n.firstChild);if(t.lastRow>e.lastRow)for(var r=this.session.getFoldedRowCount(e.lastRow+1,t.lastRow);r>0;r--)n.removeChild(n.lastChild);if(e.firstRowt.lastRow){var i=this.$renderLinesFragment(e,t.lastRow+1,e.lastRow);n.appendChild(i)}},this.$renderLinesFragment=function(e,t,n){var r=this.element.ownerDocument.createDocumentFragment(),s=t,o=this.session.getNextFoldLine(s),u=o?o.start.row:Infinity;for(;;){s>u&&(s=o.end.row+1,o=this.session.getNextFoldLine(s,o),u=o?o.start.row:Infinity);if(s>n)break;var a=i.createElement("div"),f=[];this.$renderLine(f,s,!1,s==u?o:!1),a.innerHTML=f.join("");if(this.$useLineGroups())a.className="ace_line_group",r.appendChild(a),a.style.height=e.lineHeight*this.session.getRowLength(s)+"px";else while(a.firstChild)r.appendChild(a.firstChild);s++}return r},this.update=function(e){this.config=e;var t=[],n=e.firstRow,r=e.lastRow,i=n,s=this.session.getNextFoldLine(i),o=s?s.start.row:Infinity;for(;;){i>o&&(i=s.end.row+1,s=this.session.getNextFoldLine(i,s),o=s?s.start.row:Infinity);if(i>r)break;this.$useLineGroups()&&t.push("
"),this.$renderLine(t,i,!1,i==o?s:!1),this.$useLineGroups()&&t.push("
"),i++}this.element.innerHTML=t.join("")},this.$textToken={text:!0,rparen:!0,lparen:!0},this.$renderToken=function(e,t,n,r){var i=this,o=/\t|&|<|>|( +)|([\x00-\x1f\x80-\xa0\xad\u1680\u180E\u2000-\u200f\u2028\u2029\u202F\u205F\u3000\uFEFF\uFFF9-\uFFFC])|[\u1100-\u115F\u11A3-\u11A7\u11FA-\u11FF\u2329-\u232A\u2E80-\u2E99\u2E9B-\u2EF3\u2F00-\u2FD5\u2FF0-\u2FFB\u3000-\u303E\u3041-\u3096\u3099-\u30FF\u3105-\u312D\u3131-\u318E\u3190-\u31BA\u31C0-\u31E3\u31F0-\u321E\u3220-\u3247\u3250-\u32FE\u3300-\u4DBF\u4E00-\uA48C\uA490-\uA4C6\uA960-\uA97C\uAC00-\uD7A3\uD7B0-\uD7C6\uD7CB-\uD7FB\uF900-\uFAFF\uFE10-\uFE19\uFE30-\uFE52\uFE54-\uFE66\uFE68-\uFE6B\uFF01-\uFF60\uFFE0-\uFFE6]/g,u=function(e,n,r,o,u){if(n)return i.showInvisibles?""+s.stringRepeat(i.SPACE_CHAR,e.length)+"":e;if(e=="&")return"&";if(e=="<")return"<";if(e==">")return">";if(e==" "){var a=i.session.getScreenTabSize(t+o);return t+=a-1,i.$tabStrings[a]}if(e=="\u3000"){var f=i.showInvisibles?"ace_cjk ace_invisible ace_invisible_space":"ace_cjk",l=i.showInvisibles?i.SPACE_CHAR:"";return t+=1,""+l+""}return r?""+i.SPACE_CHAR+"":(t+=1,""+e+"")},a=r.replace(o,u);if(!this.$textToken[n.type]){var f="ace_"+n.type.replace(/\./g," ace_"),l="";n.type=="fold"&&(l=" style='width:"+n.value.length*this.config.characterWidth+"px;' "),e.push("",a,"")}else e.push(a);return t+r.length},this.renderIndentGuide=function(e,t,n){var r=t.search(this.$indentGuideRe);return r<=0||r>=n?t:t[0]==" "?(r-=r%this.tabSize,e.push(s.stringRepeat(this.$tabStrings[" "],r/this.tabSize)),t.substr(r)):t[0]==" "?(e.push(s.stringRepeat(this.$tabStrings[" "],r)),t.substr(r)):t},this.$renderWrappedLine=function(e,t,n,r){var i=0,o=0,u=n[0],a=0;for(var f=0;f=u)a=this.$renderToken(e,a,l,c.substring(0,u-i)),c=c.substring(u-i),i=u,r||e.push("","
"),e.push(s.stringRepeat("\u00a0",n.indent)),o++,a=0,u=n[o]||Number.MAX_VALUE;c.length!=0&&(i+=c.length,a=this.$renderToken(e,a,l,c))}}},this.$renderSimpleLine=function(e,t){var n=0,r=t[0],i=r.value;this.displayIndentGuides&&(i=this.renderIndentGuide(e,i)),i&&(n=this.$renderToken(e,n,r,i));for(var s=1;s");if(i.length){var s=this.session.getRowSplitData(t);s&&s.length?this.$renderWrappedLine(e,i,s,n):this.$renderSimpleLine(e,i)}this.showInvisibles&&(r&&(t=r.end.row),e.push("",t==this.session.getLength()-1?this.EOF_CHAR:this.EOL_CHAR,"")),n||e.push("
")},this.$getFoldLineTokens=function(e,t){function i(e,t,n){var i=0,s=0;while(s+e[i].value.lengthn-t&&(o=o.substring(0,n-t)),r.push({type:e[i].type,value:o}),s=t+o.length,i+=1}while(sn?r.push({type:e[i].type,value:o.substring(0,n-s)}):r.push(e[i]),s+=o.length,i+=1}}var n=this.session,r=[],s=n.getTokens(e);return t.walk(function(e,t,o,u,a){e!=null?r.push({type:"fold",value:e}):(a&&(s=n.getTokens(t)),s.length&&i(s,u,o))},t.end.row,this.session.getLine(t.end.row).length),r},this.$useLineGroups=function(){return this.session.getUseWrapMode()},this.destroy=function(){clearInterval(this.$pollSizeChangesTimer),this.$measureNode&&this.$measureNode.parentNode.removeChild(this.$measureNode),delete this.$measureNode}}).call(a.prototype),t.Text=a}),ace.define("ace/layer/cursor",["require","exports","module","ace/lib/dom"],function(e,t,n){"use strict";var r=e("../lib/dom"),i,s=function(e){this.element=r.createElement("div"),this.element.className="ace_layer ace_cursor-layer",e.appendChild(this.element),i===undefined&&(i=!("opacity"in this.element.style)),this.isVisible=!1,this.isBlinking=!0,this.blinkInterval=1e3,this.smoothBlinking=!1,this.cursors=[],this.cursor=this.addCursor(),r.addCssClass(this.element,"ace_hidden-cursors"),this.$updateCursors=(i?this.$updateVisibility:this.$updateOpacity).bind(this)};(function(){this.$updateVisibility=function(e){var t=this.cursors;for(var n=t.length;n--;)t[n].style.visibility=e?"":"hidden"},this.$updateOpacity=function(e){var t=this.cursors;for(var n=t.length;n--;)t[n].style.opacity=e?"":"0"},this.$padding=0,this.setPadding=function(e){this.$padding=e},this.setSession=function(e){this.session=e},this.setBlinking=function(e){e!=this.isBlinking&&(this.isBlinking=e,this.restartTimer())},this.setBlinkInterval=function(e){e!=this.blinkInterval&&(this.blinkInterval=e,this.restartTimer())},this.setSmoothBlinking=function(e){e!=this.smoothBlinking&&!i&&(this.smoothBlinking=e,r.setCssClass(this.element,"ace_smooth-blinking",e),this.$updateCursors(!0),this.$updateCursors=this.$updateOpacity.bind(this),this.restartTimer())},this.addCursor=function(){var e=r.createElement("div");return e.className="ace_cursor",this.element.appendChild(e),this.cursors.push(e),e},this.removeCursor=function(){if(this.cursors.length>1){var e=this.cursors.pop();return e.parentNode.removeChild(e),e}},this.hideCursor=function(){this.isVisible=!1,r.addCssClass(this.element,"ace_hidden-cursors"),this.restartTimer()},this.showCursor=function(){this.isVisible=!0,r.removeCssClass(this.element,"ace_hidden-cursors"),this.restartTimer()},this.restartTimer=function(){var e=this.$updateCursors;clearInterval(this.intervalId),clearTimeout(this.timeoutId),this.smoothBlinking&&r.removeCssClass(this.element,"ace_smooth-blinking"),e(!0);if(!this.isBlinking||!this.blinkInterval||!this.isVisible)return;this.smoothBlinking&&setTimeout(function(){r.addCssClass(this.element,"ace_smooth-blinking")}.bind(this));var t=function(){this.timeoutId=setTimeout(function(){e(!1)},.6*this.blinkInterval)}.bind(this);this.intervalId=setInterval(function(){e(!0),t()},this.blinkInterval),t()},this.getPixelPosition=function(e,t){if(!this.config||!this.session)return{left:0,top:0};e||(e=this.session.selection.getCursor());var n=this.session.documentToScreenPosition(e),r=this.$padding+n.column*this.config.characterWidth,i=(n.row-(t?this.config.firstRowScreen:0))*this.config.lineHeight;return{left:r,top:i}},this.update=function(e){this.config=e;var t=this.session.$selectionMarkers,n=0,r=0;if(t===undefined||t.length===0)t=[{cursor:null}];for(var n=0,i=t.length;ne.height+e.offset||s.top<0)&&n>1)continue;var o=(this.cursors[r++]||this.addCursor()).style;this.drawCursor?this.drawCursor(o,s,e,t[n],this.session):(o.left=s.left+"px",o.top=s.top+"px",o.width=e.characterWidth+"px",o.height=e.lineHeight+"px")}while(this.cursors.length>r)this.removeCursor();var u=this.session.getOverwrite();this.$setOverwrite(u),this.$pixelPos=s,this.restartTimer()},this.drawCursor=null,this.$setOverwrite=function(e){e!=this.overwrite&&(this.overwrite=e,e?r.addCssClass(this.element,"ace_overwrite-cursors"):r.removeCssClass(this.element,"ace_overwrite-cursors"))},this.destroy=function(){clearInterval(this.intervalId),clearTimeout(this.timeoutId)}}).call(s.prototype),t.Cursor=s}),ace.define("ace/scrollbar",["require","exports","module","ace/lib/oop","ace/lib/dom","ace/lib/event","ace/lib/event_emitter"],function(e,t,n){"use strict";var r=e("./lib/oop"),i=e("./lib/dom"),s=e("./lib/event"),o=e("./lib/event_emitter").EventEmitter,u=function(e){this.element=i.createElement("div"),this.element.className="ace_scrollbar ace_scrollbar"+this.classSuffix,this.inner=i.createElement("div"),this.inner.className="ace_scrollbar-inner",this.element.appendChild(this.inner),e.appendChild(this.element),this.setVisible(!1),this.skipEvent=!1,s.addListener(this.element,"scroll",this.onScroll.bind(this)),s.addListener(this.element,"mousedown",s.preventDefault)};(function(){r.implement(this,o),this.setVisible=function(e){this.element.style.display=e?"":"none",this.isVisible=e}}).call(u.prototype);var a=function(e,t){u.call(this,e),this.scrollTop=0,t.$scrollbarWidth=this.width=i.scrollbarWidth(e.ownerDocument),this.inner.style.width=this.element.style.width=(this.width||15)+5+"px"};r.inherits(a,u),function(){this.classSuffix="-v",this.onScroll=function(){this.skipEvent||(this.scrollTop=this.element.scrollTop,this._emit("scroll",{data:this.scrollTop})),this.skipEvent=!1},this.getWidth=function(){return this.isVisible?this.width:0},this.setHeight=function(e){this.element.style.height=e+"px"},this.setInnerHeight=function(e){this.inner.style.height=e+"px"},this.setScrollHeight=function(e){this.inner.style.height=e+"px"},this.setScrollTop=function(e){this.scrollTop!=e&&(this.skipEvent=!0,this.scrollTop=this.element.scrollTop=e)}}.call(a.prototype);var f=function(e,t){u.call(this,e),this.scrollLeft=0,this.height=t.$scrollbarWidth,this.inner.style.height=this.element.style.height=(this.height||15)+5+"px"};r.inherits(f,u),function(){this.classSuffix="-h",this.onScroll=function(){this.skipEvent||(this.scrollLeft=this.element.scrollLeft,this._emit("scroll",{data:this.scrollLeft})),this.skipEvent=!1},this.getHeight=function(){return this.isVisible?this.height:0},this.setWidth=function(e){this.element.style.width=e+"px"},this.setInnerWidth=function(e){this.inner.style.width=e+"px"},this.setScrollWidth=function(e){this.inner.style.width=e+"px"},this.setScrollLeft=function(e){this.scrollLeft!=e&&(this.skipEvent=!0,this.scrollLeft=this.element.scrollLeft=e)}}.call(f.prototype),t.ScrollBar=a,t.ScrollBarV=a,t.ScrollBarH=f,t.VScrollBar=a,t.HScrollBar=f}),ace.define("ace/renderloop",["require","exports","module","ace/lib/event"],function(e,t,n){"use strict";var r=e("./lib/event"),i=function(e,t){this.onRender=e,this.pending=!1,this.changes=0,this.window=t||window};(function(){this.schedule=function(e){this.changes=this.changes|e;if(!this.pending&&this.changes){this.pending=!0;var t=this;r.nextFrame(function(){t.pending=!1;var e;while(e=t.changes)t.changes=0,t.onRender(e)},this.window)}}}).call(i.prototype),t.RenderLoop=i}),ace.define("ace/layer/font_metrics",["require","exports","module","ace/lib/oop","ace/lib/dom","ace/lib/lang","ace/lib/useragent","ace/lib/event_emitter"],function(e,t,n){var r=e("../lib/oop"),i=e("../lib/dom"),s=e("../lib/lang"),o=e("../lib/useragent"),u=e("../lib/event_emitter").EventEmitter,a=0,f=t.FontMetrics=function(e){this.el=i.createElement("div"),this.$setMeasureNodeStyles(this.el.style,!0),this.$main=i.createElement("div"),this.$setMeasureNodeStyles(this.$main.style),this.$measureNode=i.createElement("div"),this.$setMeasureNodeStyles(this.$measureNode.style),this.el.appendChild(this.$main),this.el.appendChild(this.$measureNode),e.appendChild(this.el),a||this.$testFractionalRect(),this.$measureNode.innerHTML=s.stringRepeat("X",a),this.$characterSize={width:0,height:0},this.checkForSizeChanges()};(function(){r.implement(this,u),this.$characterSize={width:0,height:0},this.$testFractionalRect=function(){var e=i.createElement("div");this.$setMeasureNodeStyles(e.style),e.style.width="0.2px",document.documentElement.appendChild(e);var t=e.getBoundingClientRect().width;t>0&&t<1?a=50:a=100,e.parentNode.removeChild(e)},this.$setMeasureNodeStyles=function(e,t){e.width=e.height="auto",e.left=e.top="0px",e.visibility="hidden",e.position="absolute",e.whiteSpace="pre",o.isIE<8?e["font-family"]="inherit":e.font="inherit",e.overflow=t?"hidden":"visible"},this.checkForSizeChanges=function(){var e=this.$measureSizes();if(e&&(this.$characterSize.width!==e.width||this.$characterSize.height!==e.height)){this.$measureNode.style.fontWeight="bold";var t=this.$measureSizes();this.$measureNode.style.fontWeight="",this.$characterSize=e,this.charSizes=Object.create(null),this.allowBoldFonts=t&&t.width===e.width&&t.height===e.height,this._emit("changeCharacterSize",{data:e})}},this.$pollSizeChanges=function(){if(this.$pollSizeChangesTimer)return this.$pollSizeChangesTimer;var e=this;return this.$pollSizeChangesTimer=setInterval(function(){e.checkForSizeChanges()},500)},this.setPolling=function(e){e?this.$pollSizeChanges():this.$pollSizeChangesTimer&&(clearInterval(this.$pollSizeChangesTimer),this.$pollSizeChangesTimer=0)},this.$measureSizes=function(){if(a===50){var e=null;try{e=this.$measureNode.getBoundingClientRect()}catch(t){e={width:0,height:0}}var n={height:e.height,width:e.width/a}}else var n={height:this.$measureNode.clientHeight,width:this.$measureNode.clientWidth/a};return n.width===0||n.height===0?null:n},this.$measureCharWidth=function(e){this.$main.innerHTML=s.stringRepeat(e,a);var t=this.$main.getBoundingClientRect();return t.width/a},this.getCharacterWidth=function(e){var t=this.charSizes[e];return t===undefined&&(t=this.charSizes[e]=this.$measureCharWidth(e)/this.$characterSize.width),t},this.destroy=function(){clearInterval(this.$pollSizeChangesTimer),this.el&&this.el.parentNode&&this.el.parentNode.removeChild(this.el)}}).call(f.prototype)}),ace.define("ace/virtual_renderer",["require","exports","module","ace/lib/oop","ace/lib/dom","ace/config","ace/lib/useragent","ace/layer/gutter","ace/layer/marker","ace/layer/text","ace/layer/cursor","ace/scrollbar","ace/scrollbar","ace/renderloop","ace/layer/font_metrics","ace/lib/event_emitter"],function(e,t,n){"use strict";var r=e("./lib/oop"),i=e("./lib/dom"),s=e("./config"),o=e("./lib/useragent"),u=e("./layer/gutter").Gutter,a=e("./layer/marker").Marker,f=e("./layer/text").Text,l=e("./layer/cursor").Cursor,c=e("./scrollbar").HScrollBar,h=e("./scrollbar").VScrollBar,p=e("./renderloop").RenderLoop,d=e("./layer/font_metrics").FontMetrics,v=e("./lib/event_emitter").EventEmitter,m='.ace_editor {position: relative;overflow: hidden;font: 12px/normal \'Monaco\', \'Menlo\', \'Ubuntu Mono\', \'Consolas\', \'source-code-pro\', monospace;direction: ltr;}.ace_scroller {position: absolute;overflow: hidden;top: 0;bottom: 0;background-color: inherit;-ms-user-select: none;-moz-user-select: none;-webkit-user-select: none;user-select: none;cursor: text;}.ace_content {position: absolute;-moz-box-sizing: border-box;-webkit-box-sizing: border-box;box-sizing: border-box;min-width: 100%;}.ace_dragging .ace_scroller:before{position: absolute;top: 0;left: 0;right: 0;bottom: 0;content: \'\';background: rgba(250, 250, 250, 0.01);z-index: 1000;}.ace_dragging.ace_dark .ace_scroller:before{background: rgba(0, 0, 0, 0.01);}.ace_selecting, .ace_selecting * {cursor: text !important;}.ace_gutter {position: absolute;overflow : hidden;width: auto;top: 0;bottom: 0;left: 0;cursor: default;z-index: 4;-ms-user-select: none;-moz-user-select: none;-webkit-user-select: none;user-select: none;}.ace_gutter-active-line {position: absolute;left: 0;right: 0;}.ace_scroller.ace_scroll-left {box-shadow: 17px 0 16px -16px rgba(0, 0, 0, 0.4) inset;}.ace_gutter-cell {padding-left: 19px;padding-right: 6px;background-repeat: no-repeat;}.ace_gutter-cell.ace_error {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABAAAAAQCAMAAAAoLQ9TAAABOFBMVEX/////////QRswFAb/Ui4wFAYwFAYwFAaWGAfDRymzOSH/PxswFAb/SiUwFAYwFAbUPRvjQiDllog5HhHdRybsTi3/Tyv9Tir+Syj/UC3////XurebMBIwFAb/RSHbPx/gUzfdwL3kzMivKBAwFAbbvbnhPx66NhowFAYwFAaZJg8wFAaxKBDZurf/RB6mMxb/SCMwFAYwFAbxQB3+RB4wFAb/Qhy4Oh+4QifbNRcwFAYwFAYwFAb/QRzdNhgwFAYwFAbav7v/Uy7oaE68MBK5LxLewr/r2NXewLswFAaxJw4wFAbkPRy2PyYwFAaxKhLm1tMwFAazPiQwFAaUGAb/QBrfOx3bvrv/VC/maE4wFAbRPBq6MRO8Qynew8Dp2tjfwb0wFAbx6eju5+by6uns4uH9/f36+vr/GkHjAAAAYnRSTlMAGt+64rnWu/bo8eAA4InH3+DwoN7j4eLi4xP99Nfg4+b+/u9B/eDs1MD1mO7+4PHg2MXa347g7vDizMLN4eG+Pv7i5evs/v79yu7S3/DV7/498Yv24eH+4ufQ3Ozu/v7+y13sRqwAAADLSURBVHjaZc/XDsFgGIBhtDrshlitmk2IrbHFqL2pvXf/+78DPokj7+Fz9qpU/9UXJIlhmPaTaQ6QPaz0mm+5gwkgovcV6GZzd5JtCQwgsxoHOvJO15kleRLAnMgHFIESUEPmawB9ngmelTtipwwfASilxOLyiV5UVUyVAfbG0cCPHig+GBkzAENHS0AstVF6bacZIOzgLmxsHbt2OecNgJC83JERmePUYq8ARGkJx6XtFsdddBQgZE2nPR6CICZhawjA4Fb/chv+399kfR+MMMDGOQAAAABJRU5ErkJggg==");background-repeat: no-repeat;background-position: 2px center;}.ace_gutter-cell.ace_warning {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABAAAAAQCAMAAAAoLQ9TAAAAmVBMVEX///8AAAD///8AAAAAAABPSzb/5sAAAAB/blH/73z/ulkAAAAAAAD85pkAAAAAAAACAgP/vGz/rkDerGbGrV7/pkQICAf////e0IsAAAD/oED/qTvhrnUAAAD/yHD/njcAAADuv2r/nz//oTj/p064oGf/zHAAAAA9Nir/tFIAAAD/tlTiuWf/tkIAAACynXEAAAAAAAAtIRW7zBpBAAAAM3RSTlMAABR1m7RXO8Ln31Z36zT+neXe5OzooRDfn+TZ4p3h2hTf4t3k3ucyrN1K5+Xaks52Sfs9CXgrAAAAjklEQVR42o3PbQ+CIBQFYEwboPhSYgoYunIqqLn6/z8uYdH8Vmdnu9vz4WwXgN/xTPRD2+sgOcZjsge/whXZgUaYYvT8QnuJaUrjrHUQreGczuEafQCO/SJTufTbroWsPgsllVhq3wJEk2jUSzX3CUEDJC84707djRc5MTAQxoLgupWRwW6UB5fS++NV8AbOZgnsC7BpEAAAAABJRU5ErkJggg==");background-position: 2px center;}.ace_gutter-cell.ace_info {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABAAAAAQCAAAAAA6mKC9AAAAGXRFWHRTb2Z0d2FyZQBBZG9iZSBJbWFnZVJlYWR5ccllPAAAAAJ0Uk5TAAB2k804AAAAPklEQVQY02NgIB68QuO3tiLznjAwpKTgNyDbMegwisCHZUETUZV0ZqOquBpXj2rtnpSJT1AEnnRmL2OgGgAAIKkRQap2htgAAAAASUVORK5CYII=");background-position: 2px center;}.ace_dark .ace_gutter-cell.ace_info {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABAAAAAQBAMAAADt3eJSAAAAJFBMVEUAAAChoaGAgIAqKiq+vr6tra1ZWVmUlJSbm5s8PDxubm56enrdgzg3AAAAAXRSTlMAQObYZgAAAClJREFUeNpjYMAPdsMYHegyJZFQBlsUlMFVCWUYKkAZMxZAGdxlDMQBAG+TBP4B6RyJAAAAAElFTkSuQmCC");}.ace_scrollbar {position: absolute;right: 0;bottom: 0;z-index: 6;}.ace_scrollbar-inner {position: absolute;cursor: text;left: 0;top: 0;}.ace_scrollbar-v{overflow-x: hidden;overflow-y: scroll;top: 0;}.ace_scrollbar-h {overflow-x: scroll;overflow-y: hidden;left: 0;}.ace_print-margin {position: absolute;height: 100%;}.ace_text-input {position: absolute;z-index: 0;width: 0.5em;height: 1em;opacity: 0;background: transparent;-moz-appearance: none;appearance: none;border: none;resize: none;outline: none;overflow: hidden;font: inherit;padding: 0 1px;margin: 0 -1px;text-indent: -1em;-ms-user-select: text;-moz-user-select: text;-webkit-user-select: text;user-select: text;white-space: pre!important;}.ace_text-input.ace_composition {background: inherit;color: inherit;z-index: 1000;opacity: 1;text-indent: 0;}.ace_layer {z-index: 1;position: absolute;overflow: hidden;word-wrap: normal;white-space: pre;height: 100%;width: 100%;-moz-box-sizing: border-box;-webkit-box-sizing: border-box;box-sizing: border-box;pointer-events: none;}.ace_gutter-layer {position: relative;width: auto;text-align: right;pointer-events: auto;}.ace_text-layer {font: inherit !important;}.ace_cjk {display: inline-block;text-align: center;}.ace_cursor-layer {z-index: 4;}.ace_cursor {z-index: 4;position: absolute;-moz-box-sizing: border-box;-webkit-box-sizing: border-box;box-sizing: border-box;border-left: 2px solid;transform: translatez(0);}.ace_slim-cursors .ace_cursor {border-left-width: 1px;}.ace_overwrite-cursors .ace_cursor {border-left-width: 0;border-bottom: 1px solid;}.ace_hidden-cursors .ace_cursor {opacity: 0.2;}.ace_smooth-blinking .ace_cursor {-webkit-transition: opacity 0.18s;transition: opacity 0.18s;}.ace_editor.ace_multiselect .ace_cursor {border-left-width: 1px;}.ace_marker-layer .ace_step, .ace_marker-layer .ace_stack {position: absolute;z-index: 3;}.ace_marker-layer .ace_selection {position: absolute;z-index: 5;}.ace_marker-layer .ace_bracket {position: absolute;z-index: 6;}.ace_marker-layer .ace_active-line {position: absolute;z-index: 2;}.ace_marker-layer .ace_selected-word {position: absolute;z-index: 4;-moz-box-sizing: border-box;-webkit-box-sizing: border-box;box-sizing: border-box;}.ace_line .ace_fold {-moz-box-sizing: border-box;-webkit-box-sizing: border-box;box-sizing: border-box;display: inline-block;height: 11px;margin-top: -2px;vertical-align: middle;background-image:url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABEAAAAJCAYAAADU6McMAAAAGXRFWHRTb2Z0d2FyZQBBZG9iZSBJbWFnZVJlYWR5ccllPAAAAJpJREFUeNpi/P//PwOlgAXGYGRklAVSokD8GmjwY1wasKljQpYACtpCFeADcHVQfQyMQAwzwAZI3wJKvCLkfKBaMSClBlR7BOQikCFGQEErIH0VqkabiGCAqwUadAzZJRxQr/0gwiXIal8zQQPnNVTgJ1TdawL0T5gBIP1MUJNhBv2HKoQHHjqNrA4WO4zY0glyNKLT2KIfIMAAQsdgGiXvgnYAAAAASUVORK5CYII="),url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAEAAAA3CAYAAADNNiA5AAAAGXRFWHRTb2Z0d2FyZQBBZG9iZSBJbWFnZVJlYWR5ccllPAAAACJJREFUeNpi+P//fxgTAwPDBxDxD078RSX+YeEyDFMCIMAAI3INmXiwf2YAAAAASUVORK5CYII=");background-repeat: no-repeat, repeat-x;background-position: center center, top left;color: transparent;border: 1px solid black;border-radius: 2px;cursor: pointer;pointer-events: auto;}.ace_dark .ace_fold {}.ace_fold:hover{background-image:url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABEAAAAJCAYAAADU6McMAAAAGXRFWHRTb2Z0d2FyZQBBZG9iZSBJbWFnZVJlYWR5ccllPAAAAJpJREFUeNpi/P//PwOlgAXGYGRklAVSokD8GmjwY1wasKljQpYACtpCFeADcHVQfQyMQAwzwAZI3wJKvCLkfKBaMSClBlR7BOQikCFGQEErIH0VqkabiGCAqwUadAzZJRxQr/0gwiXIal8zQQPnNVTgJ1TdawL0T5gBIP1MUJNhBv2HKoQHHjqNrA4WO4zY0glyNKLT2KIfIMAAQsdgGiXvgnYAAAAASUVORK5CYII="),url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAEAAAA3CAYAAADNNiA5AAAAGXRFWHRTb2Z0d2FyZQBBZG9iZSBJbWFnZVJlYWR5ccllPAAAACBJREFUeNpi+P//fz4TAwPDZxDxD5X4i5fLMEwJgAADAEPVDbjNw87ZAAAAAElFTkSuQmCC");}.ace_tooltip {background-color: #FFF;background-image: -webkit-linear-gradient(top, transparent, rgba(0, 0, 0, 0.1));background-image: linear-gradient(to bottom, transparent, rgba(0, 0, 0, 0.1));border: 1px solid gray;border-radius: 1px;box-shadow: 0 1px 2px rgba(0, 0, 0, 0.3);color: black;max-width: 100%;padding: 3px 4px;position: fixed;z-index: 999999;-moz-box-sizing: border-box;-webkit-box-sizing: border-box;box-sizing: border-box;cursor: default;white-space: pre;word-wrap: break-word;line-height: normal;font-style: normal;font-weight: normal;letter-spacing: normal;pointer-events: none;}.ace_folding-enabled > .ace_gutter-cell {padding-right: 13px;}.ace_fold-widget {-moz-box-sizing: border-box;-webkit-box-sizing: border-box;box-sizing: border-box;margin: 0 -12px 0 1px;display: none;width: 11px;vertical-align: top;background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAUAAAAFCAYAAACNbyblAAAANElEQVR42mWKsQ0AMAzC8ixLlrzQjzmBiEjp0A6WwBCSPgKAXoLkqSot7nN3yMwR7pZ32NzpKkVoDBUxKAAAAABJRU5ErkJggg==");background-repeat: no-repeat;background-position: center;border-radius: 3px;border: 1px solid transparent;cursor: pointer;}.ace_folding-enabled .ace_fold-widget {display: inline-block; }.ace_fold-widget.ace_end {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAUAAAAFCAYAAACNbyblAAAANElEQVR42m3HwQkAMAhD0YzsRchFKI7sAikeWkrxwScEB0nh5e7KTPWimZki4tYfVbX+MNl4pyZXejUO1QAAAABJRU5ErkJggg==");}.ace_fold-widget.ace_closed {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAMAAAAGCAYAAAAG5SQMAAAAOUlEQVR42jXKwQkAMAgDwKwqKD4EwQ26sSOkVWjgIIHAzPiCgaqiqnJHZnKICBERHN194O5b9vbLuAVRL+l0YWnZAAAAAElFTkSuQmCCXA==");}.ace_fold-widget:hover {border: 1px solid rgba(0, 0, 0, 0.3);background-color: rgba(255, 255, 255, 0.2);box-shadow: 0 1px 1px rgba(255, 255, 255, 0.7);}.ace_fold-widget:active {border: 1px solid rgba(0, 0, 0, 0.4);background-color: rgba(0, 0, 0, 0.05);box-shadow: 0 1px 1px rgba(255, 255, 255, 0.8);}.ace_dark .ace_fold-widget {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAUAAAAFCAYAAACNbyblAAAAHklEQVQIW2P4//8/AzoGEQ7oGCaLLAhWiSwB146BAQCSTPYocqT0AAAAAElFTkSuQmCC");}.ace_dark .ace_fold-widget.ace_end {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAUAAAAFCAYAAACNbyblAAAAH0lEQVQIW2P4//8/AxQ7wNjIAjDMgC4AxjCVKBirIAAF0kz2rlhxpAAAAABJRU5ErkJggg==");}.ace_dark .ace_fold-widget.ace_closed {background-image: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAMAAAAFCAYAAACAcVaiAAAAHElEQVQIW2P4//+/AxAzgDADlOOAznHAKgPWAwARji8UIDTfQQAAAABJRU5ErkJggg==");}.ace_dark .ace_fold-widget:hover {box-shadow: 0 1px 1px rgba(255, 255, 255, 0.2);background-color: rgba(255, 255, 255, 0.1);}.ace_dark .ace_fold-widget:active {box-shadow: 0 1px 1px rgba(255, 255, 255, 0.2);}.ace_fold-widget.ace_invalid {background-color: #FFB4B4;border-color: #DE5555;}.ace_fade-fold-widgets .ace_fold-widget {-webkit-transition: opacity 0.4s ease 0.05s;transition: opacity 0.4s ease 0.05s;opacity: 0;}.ace_fade-fold-widgets:hover .ace_fold-widget {-webkit-transition: opacity 0.05s ease 0.05s;transition: opacity 0.05s ease 0.05s;opacity:1;}.ace_underline {text-decoration: underline;}.ace_bold {font-weight: bold;}.ace_nobold .ace_bold {font-weight: normal;}.ace_italic {font-style: italic;}.ace_error-marker {background-color: rgba(255, 0, 0,0.2);position: absolute;z-index: 9;}.ace_highlight-marker {background-color: rgba(255, 255, 0,0.2);position: absolute;z-index: 8;}.ace_br1 {border-top-left-radius : 3px;}.ace_br2 {border-top-right-radius : 3px;}.ace_br3 {border-top-left-radius : 3px; border-top-right-radius: 3px;}.ace_br4 {border-bottom-right-radius: 3px;}.ace_br5 {border-top-left-radius : 3px; border-bottom-right-radius: 3px;}.ace_br6 {border-top-right-radius : 3px; border-bottom-right-radius: 3px;}.ace_br7 {border-top-left-radius : 3px; border-top-right-radius: 3px; border-bottom-right-radius: 3px;}.ace_br8 {border-bottom-left-radius : 3px;}.ace_br9 {border-top-left-radius : 3px; border-bottom-left-radius: 3px;}.ace_br10{border-top-right-radius : 3px; border-bottom-left-radius: 3px;}.ace_br11{border-top-left-radius : 3px; border-top-right-radius: 3px; border-bottom-left-radius: 3px;}.ace_br12{border-bottom-right-radius: 3px; border-bottom-left-radius: 3px;}.ace_br13{border-top-left-radius : 3px; border-bottom-right-radius: 3px; border-bottom-left-radius: 3px;}.ace_br14{border-top-right-radius : 3px; border-bottom-right-radius: 3px; border-bottom-left-radius: 3px;}.ace_br15{border-top-left-radius : 3px; border-top-right-radius: 3px; border-bottom-right-radius: 3px; border-bottom-left-radius: 3px;}';i.importCssString(m,"ace_editor.css");var g=function(e,t){var n=this;this.container=e||i.createElement("div"),this.$keepTextAreaAtCursor=!o.isOldIE,i.addCssClass(this.container,"ace_editor"),this.setTheme(t),this.$gutter=i.createElement("div"),this.$gutter.className="ace_gutter",this.container.appendChild(this.$gutter),this.scroller=i.createElement("div"),this.scroller.className="ace_scroller",this.container.appendChild(this.scroller),this.content=i.createElement("div"),this.content.className="ace_content",this.scroller.appendChild(this.content),this.$gutterLayer=new u(this.$gutter),this.$gutterLayer.on("changeGutterWidth",this.onGutterResize.bind(this)),this.$markerBack=new a(this.content);var r=this.$textLayer=new f(this.content);this.canvas=r.element,this.$markerFront=new a(this.content),this.$cursorLayer=new l(this.content),this.$horizScroll=!1,this.$vScroll=!1,this.scrollBar=this.scrollBarV=new h(this.container,this),this.scrollBarH=new c(this.container,this),this.scrollBarV.addEventListener("scroll",function(e){n.$scrollAnimation||n.session.setScrollTop(e.data-n.scrollMargin.top)}),this.scrollBarH.addEventListener("scroll",function(e){n.$scrollAnimation||n.session.setScrollLeft(e.data-n.scrollMargin.left)}),this.scrollTop=0,this.scrollLeft=0,this.cursorPos={row:0,column:0},this.$fontMetrics=new d(this.container),this.$textLayer.$setFontMetrics(this.$fontMetrics),this.$textLayer.addEventListener("changeCharacterSize",function(e){n.updateCharacterSize(),n.onResize(!0,n.gutterWidth,n.$size.width,n.$size.height),n._signal("changeCharacterSize",e)}),this.$size={width:0,height:0,scrollerHeight:0,scrollerWidth:0,$dirty:!0},this.layerConfig={width:1,padding:0,firstRow:0,firstRowScreen:0,lastRow:0,lineHeight:0,characterWidth:0,minHeight:1,maxHeight:1,offset:0,height:1,gutterOffset:1},this.scrollMargin={left:0,right:0,top:0,bottom:0,v:0,h:0},this.$loop=new p(this.$renderChanges.bind(this),this.container.ownerDocument.defaultView),this.$loop.schedule(this.CHANGE_FULL),this.updateCharacterSize(),this.setPadding(4),s.resetOptions(this),s._emit("renderer",this)};(function(){this.CHANGE_CURSOR=1,this.CHANGE_MARKER=2,this.CHANGE_GUTTER=4,this.CHANGE_SCROLL=8,this.CHANGE_LINES=16,this.CHANGE_TEXT=32,this.CHANGE_SIZE=64,this.CHANGE_MARKER_BACK=128,this.CHANGE_MARKER_FRONT=256,this.CHANGE_FULL=512,this.CHANGE_H_SCROLL=1024,r.implement(this,v),this.updateCharacterSize=function(){this.$textLayer.allowBoldFonts!=this.$allowBoldFonts&&(this.$allowBoldFonts=this.$textLayer.allowBoldFonts,this.setStyle("ace_nobold",!this.$allowBoldFonts)),this.layerConfig.characterWidth=this.characterWidth=this.$textLayer.getCharacterWidth(),this.layerConfig.lineHeight=this.lineHeight=this.$textLayer.getLineHeight(),this.$updatePrintMargin()},this.setSession=function(e){this.session&&this.session.doc.off("changeNewLineMode",this.onChangeNewLineMode),this.session=e,e&&this.scrollMargin.top&&e.getScrollTop()<=0&&e.setScrollTop(-this.scrollMargin.top),this.$cursorLayer.setSession(e),this.$markerBack.setSession(e),this.$markerFront.setSession(e),this.$gutterLayer.setSession(e),this.$textLayer.setSession(e);if(!e)return;this.$loop.schedule(this.CHANGE_FULL),this.session.$setFontMetrics(this.$fontMetrics),this.onChangeNewLineMode=this.onChangeNewLineMode.bind(this),this.onChangeNewLineMode(),this.session.doc.on("changeNewLineMode",this.onChangeNewLineMode)},this.updateLines=function(e,t,n){t===undefined&&(t=Infinity),this.$changedLines?(this.$changedLines.firstRow>e&&(this.$changedLines.firstRow=e),this.$changedLines.lastRowthis.layerConfig.lastRow)return;this.$loop.schedule(this.CHANGE_LINES)},this.onChangeNewLineMode=function(){this.$loop.schedule(this.CHANGE_TEXT),this.$textLayer.$updateEolChar()},this.onChangeTabSize=function(){this.$loop.schedule(this.CHANGE_TEXT|this.CHANGE_MARKER),this.$textLayer.onChangeTabSize()},this.updateText=function(){this.$loop.schedule(this.CHANGE_TEXT)},this.updateFull=function(e){e?this.$renderChanges(this.CHANGE_FULL,!0):this.$loop.schedule(this.CHANGE_FULL)},this.updateFontSize=function(){this.$textLayer.checkForSizeChanges()},this.$changes=0,this.$updateSizeAsync=function(){this.$loop.pending?this.$size.$dirty=!0:this.onResize()},this.onResize=function(e,t,n,r){if(this.resizing>2)return;this.resizing>0?this.resizing++:this.resizing=e?1:0;var i=this.container;r||(r=i.clientHeight||i.scrollHeight),n||(n=i.clientWidth||i.scrollWidth);var s=this.$updateCachedSize(e,t,n,r);if(!this.$size.scrollerHeight||!n&&!r)return this.resizing=0;e&&(this.$gutterLayer.$padding=null),e?this.$renderChanges(s|this.$changes,!0):this.$loop.schedule(s|this.$changes),this.resizing&&(this.resizing=0),this.scrollBarV.scrollLeft=this.scrollBarV.scrollTop=null},this.$updateCachedSize=function(e,t,n,r){r-=this.$extraHeight||0;var i=0,s=this.$size,o={width:s.width,height:s.height,scrollerHeight:s.scrollerHeight,scrollerWidth:s.scrollerWidth};r&&(e||s.height!=r)&&(s.height=r,i|=this.CHANGE_SIZE,s.scrollerHeight=s.height,this.$horizScroll&&(s.scrollerHeight-=this.scrollBarH.getHeight()),this.scrollBarV.element.style.bottom=this.scrollBarH.getHeight()+"px",i|=this.CHANGE_SCROLL);if(n&&(e||s.width!=n)){i|=this.CHANGE_SIZE,s.width=n,t==null&&(t=this.$showGutter?this.$gutter.offsetWidth:0),this.gutterWidth=t,this.scrollBarH.element.style.left=this.scroller.style.left=t+"px",s.scrollerWidth=Math.max(0,n-t-this.scrollBarV.getWidth()),this.scrollBarH.element.style.right=this.scroller.style.right=this.scrollBarV.getWidth()+"px",this.scroller.style.bottom=this.scrollBarH.getHeight()+"px";if(this.session&&this.session.getUseWrapMode()&&this.adjustWrapLimit()||e)i|=this.CHANGE_FULL}return s.$dirty=!n||!r,i&&this._signal("resize",o),i},this.onGutterResize=function(){var e=this.$showGutter?this.$gutter.offsetWidth:0;e!=this.gutterWidth&&(this.$changes|=this.$updateCachedSize(!0,e,this.$size.width,this.$size.height)),this.session.getUseWrapMode()&&this.adjustWrapLimit()?this.$loop.schedule(this.CHANGE_FULL):this.$size.$dirty?this.$loop.schedule(this.CHANGE_FULL):(this.$computeLayerConfig(),this.$loop.schedule(this.CHANGE_MARKER))},this.adjustWrapLimit=function(){var e=this.$size.scrollerWidth-this.$padding*2,t=Math.floor(e/this.characterWidth);return this.session.adjustWrapLimit(t,this.$showPrintMargin&&this.$printMarginColumn)},this.setAnimatedScroll=function(e){this.setOption("animatedScroll",e)},this.getAnimatedScroll=function(){return this.$animatedScroll},this.setShowInvisibles=function(e){this.setOption("showInvisibles",e)},this.getShowInvisibles=function(){return this.getOption("showInvisibles")},this.getDisplayIndentGuides=function(){return this.getOption("displayIndentGuides")},this.setDisplayIndentGuides=function(e){this.setOption("displayIndentGuides",e)},this.setShowPrintMargin=function(e){this.setOption("showPrintMargin",e)},this.getShowPrintMargin=function(){return this.getOption("showPrintMargin")},this.setPrintMarginColumn=function(e){this.setOption("printMarginColumn",e)},this.getPrintMarginColumn=function(){return this.getOption("printMarginColumn")},this.getShowGutter=function(){return this.getOption("showGutter")},this.setShowGutter=function(e){return this.setOption("showGutter",e)},this.getFadeFoldWidgets=function(){return this.getOption("fadeFoldWidgets")},this.setFadeFoldWidgets=function(e){this.setOption("fadeFoldWidgets",e)},this.setHighlightGutterLine=function(e){this.setOption("highlightGutterLine",e)},this.getHighlightGutterLine=function(){return this.getOption("highlightGutterLine")},this.$updateGutterLineHighlight=function(){var e=this.$cursorLayer.$pixelPos,t=this.layerConfig.lineHeight;if(this.session.getUseWrapMode()){var n=this.session.selection.getCursor();n.column=0,e=this.$cursorLayer.getPixelPosition(n,!0),t*=this.session.getRowLength(n.row)}this.$gutterLineHighlight.style.top=e.top-this.layerConfig.offset+"px",this.$gutterLineHighlight.style.height=t+"px"},this.$updatePrintMargin=function(){if(!this.$showPrintMargin&&!this.$printMarginEl)return;if(!this.$printMarginEl){var e=i.createElement("div");e.className="ace_layer ace_print-margin-layer",this.$printMarginEl=i.createElement("div"),this.$printMarginEl.className="ace_print-margin",e.appendChild(this.$printMarginEl),this.content.insertBefore(e,this.content.firstChild)}var t=this.$printMarginEl.style;t.left=this.characterWidth*this.$printMarginColumn+this.$padding+"px",t.visibility=this.$showPrintMargin?"visible":"hidden",this.session&&this.session.$wrap==-1&&this.adjustWrapLimit()},this.getContainerElement=function(){return this.container},this.getMouseEventTarget=function(){return this.scroller},this.getTextAreaContainer=function(){return this.container},this.$moveTextAreaToCursor=function(){if(!this.$keepTextAreaAtCursor)return;var e=this.layerConfig,t=this.$cursorLayer.$pixelPos.top,n=this.$cursorLayer.$pixelPos.left;t-=e.offset;var r=this.textarea.style,i=this.lineHeight;if(t<0||t>e.height-i){r.top=r.left="0";return}var s=this.characterWidth;if(this.$composition){var o=this.textarea.value.replace(/^\x01+/,"");s*=this.session.$getStringScreenWidth(o)[0]+2,i+=2}n-=this.scrollLeft,n>this.$size.scrollerWidth-s&&(n=this.$size.scrollerWidth-s),n+=this.gutterWidth,r.height=i+"px",r.width=s+"px",r.left=Math.min(n,this.$size.scrollerWidth-s)+"px",r.top=Math.min(t,this.$size.height-i)+"px"},this.getFirstVisibleRow=function(){return this.layerConfig.firstRow},this.getFirstFullyVisibleRow=function(){return this.layerConfig.firstRow+(this.layerConfig.offset===0?0:1)},this.getLastFullyVisibleRow=function(){var e=this.layerConfig,t=e.lastRow,n=this.session.documentToScreenRow(t,0)*e.lineHeight;return n-this.session.getScrollTop()>e.height-e.lineHeight?t-1:t},this.getLastVisibleRow=function(){return this.layerConfig.lastRow},this.$padding=null,this.setPadding=function(e){this.$padding=e,this.$textLayer.setPadding(e),this.$cursorLayer.setPadding(e),this.$markerFront.setPadding(e),this.$markerBack.setPadding(e),this.$loop.schedule(this.CHANGE_FULL),this.$updatePrintMargin()},this.setScrollMargin=function(e,t,n,r){var i=this.scrollMargin;i.top=e|0,i.bottom=t|0,i.right=r|0,i.left=n|0,i.v=i.top+i.bottom,i.h=i.left+i.right,i.top&&this.scrollTop<=0&&this.session&&this.session.setScrollTop(-i.top),this.updateFull()},this.getHScrollBarAlwaysVisible=function(){return this.$hScrollBarAlwaysVisible},this.setHScrollBarAlwaysVisible=function(e){this.setOption("hScrollBarAlwaysVisible",e)},this.getVScrollBarAlwaysVisible=function(){return this.$vScrollBarAlwaysVisible},this.setVScrollBarAlwaysVisible=function(e){this.setOption("vScrollBarAlwaysVisible",e)},this.$updateScrollBarV=function(){var e=this.layerConfig.maxHeight,t=this.$size.scrollerHeight;!this.$maxLines&&this.$scrollPastEnd&&(e-=(t-this.lineHeight)*this.$scrollPastEnd,this.scrollTop>e-t&&(e=this.scrollTop+t,this.scrollBarV.scrollTop=null)),this.scrollBarV.setScrollHeight(e+this.scrollMargin.v),this.scrollBarV.setScrollTop(this.scrollTop+this.scrollMargin.top)},this.$updateScrollBarH=function(){this.scrollBarH.setScrollWidth(this.layerConfig.width+2*this.$padding+this.scrollMargin.h),this.scrollBarH.setScrollLeft(this.scrollLeft+this.scrollMargin.left)},this.$frozen=!1,this.freeze=function(){this.$frozen=!0},this.unfreeze=function(){this.$frozen=!1},this.$renderChanges=function(e,t){this.$changes&&(e|=this.$changes,this.$changes=0);if(!this.session||!this.container.offsetWidth||this.$frozen||!e&&!t){this.$changes|=e;return}if(this.$size.$dirty)return this.$changes|=e,this.onResize(!0);this.lineHeight||this.$textLayer.checkForSizeChanges(),this._signal("beforeRender");var n=this.layerConfig;if(e&this.CHANGE_FULL||e&this.CHANGE_SIZE||e&this.CHANGE_TEXT||e&this.CHANGE_LINES||e&this.CHANGE_SCROLL||e&this.CHANGE_H_SCROLL){e|=this.$computeLayerConfig();if(n.firstRow!=this.layerConfig.firstRow&&n.firstRowScreen==this.layerConfig.firstRowScreen){var r=this.scrollTop+(n.firstRow-this.layerConfig.firstRow)*this.lineHeight;r>0&&(this.scrollTop=r,e|=this.CHANGE_SCROLL,e|=this.$computeLayerConfig())}n=this.layerConfig,this.$updateScrollBarV(),e&this.CHANGE_H_SCROLL&&this.$updateScrollBarH(),this.$gutterLayer.element.style.marginTop=-n.offset+"px",this.content.style.marginTop=-n.offset+"px",this.content.style.width=n.width+2*this.$padding+"px",this.content.style.height=n.minHeight+"px"}e&this.CHANGE_H_SCROLL&&(this.content.style.marginLeft=-this.scrollLeft+"px",this.scroller.className=this.scrollLeft<=0?"ace_scroller":"ace_scroller ace_scroll-left");if(e&this.CHANGE_FULL){this.$textLayer.update(n),this.$showGutter&&this.$gutterLayer.update(n),this.$markerBack.update(n),this.$markerFront.update(n),this.$cursorLayer.update(n),this.$moveTextAreaToCursor(),this.$highlightGutterLine&&this.$updateGutterLineHighlight(),this._signal("afterRender");return}if(e&this.CHANGE_SCROLL){e&this.CHANGE_TEXT||e&this.CHANGE_LINES?this.$textLayer.update(n):this.$textLayer.scrollLines(n),this.$showGutter&&this.$gutterLayer.update(n),this.$markerBack.update(n),this.$markerFront.update(n),this.$cursorLayer.update(n),this.$highlightGutterLine&&this.$updateGutterLineHighlight(),this.$moveTextAreaToCursor(),this._signal("afterRender");return}e&this.CHANGE_TEXT?(this.$textLayer.update(n),this.$showGutter&&this.$gutterLayer.update(n)):e&this.CHANGE_LINES?(this.$updateLines()||e&this.CHANGE_GUTTER&&this.$showGutter)&&this.$gutterLayer.update(n):(e&this.CHANGE_TEXT||e&this.CHANGE_GUTTER)&&this.$showGutter&&this.$gutterLayer.update(n),e&this.CHANGE_CURSOR&&(this.$cursorLayer.update(n),this.$moveTextAreaToCursor(),this.$highlightGutterLine&&this.$updateGutterLineHighlight()),e&(this.CHANGE_MARKER|this.CHANGE_MARKER_FRONT)&&this.$markerFront.update(n),e&(this.CHANGE_MARKER|this.CHANGE_MARKER_BACK)&&this.$markerBack.update(n),this._signal("afterRender")},this.$autosize=function(){var e=this.session.getScreenLength()*this.lineHeight,t=this.$maxLines*this.lineHeight,n=Math.min(t,Math.max((this.$minLines||1)*this.lineHeight,e))+this.scrollMargin.v+(this.$extraHeight||0);this.$horizScroll&&(n+=this.scrollBarH.getHeight()),this.$maxPixelHeight&&n>this.$maxPixelHeight&&(n=this.$maxPixelHeight);var r=e>t;if(n!=this.desiredHeight||this.$size.height!=this.desiredHeight||r!=this.$vScroll){r!=this.$vScroll&&(this.$vScroll=r,this.scrollBarV.setVisible(r));var i=this.container.clientWidth;this.container.style.height=n+"px",this.$updateCachedSize(!0,this.$gutterWidth,i,n),this.desiredHeight=n,this._signal("autosize")}},this.$computeLayerConfig=function(){var e=this.session,t=this.$size,n=t.height<=2*this.lineHeight,r=this.session.getScreenLength(),i=r*this.lineHeight,s=this.$getLongestLine(),o=!n&&(this.$hScrollBarAlwaysVisible||t.scrollerWidth-s-2*this.$padding<0),u=this.$horizScroll!==o;u&&(this.$horizScroll=o,this.scrollBarH.setVisible(o));var a=this.$vScroll;this.$maxLines&&this.lineHeight>1&&this.$autosize();var f=this.scrollTop%this.lineHeight,l=t.scrollerHeight+this.lineHeight,c=!this.$maxLines&&this.$scrollPastEnd?(t.scrollerHeight-this.lineHeight)*this.$scrollPastEnd:0;i+=c;var h=this.scrollMargin;this.session.setScrollTop(Math.max(-h.top,Math.min(this.scrollTop,i-t.scrollerHeight+h.bottom))),this.session.setScrollLeft(Math.max(-h.left,Math.min(this.scrollLeft,s+2*this.$padding-t.scrollerWidth+h.right)));var p=!n&&(this.$vScrollBarAlwaysVisible||t.scrollerHeight-i+c<0||this.scrollTop>h.top),d=a!==p;d&&(this.$vScroll=p,this.scrollBarV.setVisible(p));var v=Math.ceil(l/this.lineHeight)-1,m=Math.max(0,Math.round((this.scrollTop-f)/this.lineHeight)),g=m+v,y,b,w=this.lineHeight;m=e.screenToDocumentRow(m,0);var E=e.getFoldLine(m);E&&(m=E.start.row),y=e.documentToScreenRow(m,0),b=e.getRowLength(m)*w,g=Math.min(e.screenToDocumentRow(g,0),e.getLength()-1),l=t.scrollerHeight+e.getRowLength(g)*w+b,f=this.scrollTop-y*w;var S=0;this.layerConfig.width!=s&&(S=this.CHANGE_H_SCROLL);if(u||d)S=this.$updateCachedSize(!0,this.gutterWidth,t.width,t.height),this._signal("scrollbarVisibilityChanged"),d&&(s=this.$getLongestLine());return this.layerConfig={width:s,padding:this.$padding,firstRow:m,firstRowScreen:y,lastRow:g,lineHeight:w,characterWidth:this.characterWidth,minHeight:l,maxHeight:i,offset:f,gutterOffset:Math.max(0,Math.ceil((f+t.height-t.scrollerHeight)/w)),height:this.$size.scrollerHeight},S},this.$updateLines=function(){var e=this.$changedLines.firstRow,t=this.$changedLines.lastRow;this.$changedLines=null;var n=this.layerConfig;if(e>n.lastRow+1)return;if(ts?(t&&a+o>s+this.lineHeight&&(s-=t*this.$size.scrollerHeight),s===0&&(s=-this.scrollMargin.top),this.session.setScrollTop(s)):a+this.$size.scrollerHeight-ui?(i=1-this.scrollMargin.top)return!0;if(t>0&&this.session.getScrollTop()+this.$size.scrollerHeight-this.layerConfig.maxHeight<-1+this.scrollMargin.bottom)return!0;if(e<0&&this.session.getScrollLeft()>=1-this.scrollMargin.left)return!0;if(e>0&&this.session.getScrollLeft()+this.$size.scrollerWidth-this.layerConfig.width<-1+this.scrollMargin.right)return!0},this.pixelToScreenCoordinates=function(e,t){var n=this.scroller.getBoundingClientRect(),r=(e+this.scrollLeft-n.left-this.$padding)/this.characterWidth,i=Math.floor((t+this.scrollTop-n.top)/this.lineHeight),s=Math.round(r);return{row:i,column:s,side:r-s>0?1:-1}},this.screenToTextCoordinates=function(e,t){var n=this.scroller.getBoundingClientRect(),r=Math.round((e+this.scrollLeft-n.left-this.$padding)/this.characterWidth),i=(t+this.scrollTop-n.top)/this.lineHeight;return this.session.screenToDocumentPosition(i,Math.max(r,0))},this.textToScreenCoordinates=function(e,t){var n=this.scroller.getBoundingClientRect(),r=this.session.documentToScreenPosition(e,t),i=this.$padding+Math.round(r.column*this.characterWidth),s=r.row*this.lineHeight;return{pageX:n.left+i-this.scrollLeft,pageY:n.top+s-this.scrollTop}},this.visualizeFocus=function(){i.addCssClass(this.container,"ace_focus")},this.visualizeBlur=function(){i.removeCssClass(this.container,"ace_focus")},this.showComposition=function(e){this.$composition||(this.$composition={keepTextAreaAtCursor:this.$keepTextAreaAtCursor,cssText:this.textarea.style.cssText}),this.$keepTextAreaAtCursor=!0,i.addCssClass(this.textarea,"ace_composition"),this.textarea.style.cssText="",this.$moveTextAreaToCursor()},this.setCompositionText=function(e){this.$moveTextAreaToCursor()},this.hideComposition=function(){if(!this.$composition)return;i.removeCssClass(this.textarea,"ace_composition"),this.$keepTextAreaAtCursor=this.$composition.keepTextAreaAtCursor,this.textarea.style.cssText=this.$composition.cssText,this.$composition=null},this.setTheme=function(e,t){function o(r){if(n.$themeId!=e)return t&&t();if(!r.cssClass)return;i.importCssString(r.cssText,r.cssClass,n.container.ownerDocument),n.theme&&i.removeCssClass(n.container,n.theme.cssClass);var s="padding"in r?r.padding:"padding"in(n.theme||{})?4:n.$padding;n.$padding&&s!=n.$padding&&n.setPadding(s),n.$theme=r.cssClass,n.theme=r,i.addCssClass(n.container,r.cssClass),i.setCssClass(n.container,"ace_dark",r.isDark),n.$size&&(n.$size.width=0,n.$updateSizeAsync()),n._dispatchEvent("themeLoaded",{theme:r}),t&&t()}var n=this;this.$themeId=e,n._dispatchEvent("themeChange",{theme:e});if(!e||typeof e=="string"){var r=e||this.$options.theme.initialValue;s.loadModule(["theme",r],o)}else o(e)},this.getTheme=function(){return this.$themeId},this.setStyle=function(e,t){i.setCssClass(this.container,e,t!==!1)},this.unsetStyle=function(e){i.removeCssClass(this.container,e)},this.setCursorStyle=function(e){this.scroller.style.cursor!=e&&(this.scroller.style.cursor=e)},this.setMouseCursor=function(e){this.scroller.style.cursor=e},this.destroy=function(){this.$textLayer.destroy(),this.$cursorLayer.destroy()}}).call(g.prototype),s.defineOptions(g.prototype,"renderer",{animatedScroll:{initialValue:!1},showInvisibles:{set:function(e){this.$textLayer.setShowInvisibles(e)&&this.$loop.schedule(this.CHANGE_TEXT)},initialValue:!1},showPrintMargin:{set:function(){this.$updatePrintMargin()},initialValue:!0},printMarginColumn:{set:function(){this.$updatePrintMargin()},initialValue:80},printMargin:{set:function(e){typeof e=="number"&&(this.$printMarginColumn=e),this.$showPrintMargin=!!e,this.$updatePrintMargin()},get:function(){return this.$showPrintMargin&&this.$printMarginColumn}},showGutter:{set:function(e){this.$gutter.style.display=e?"block":"none",this.$loop.schedule(this.CHANGE_FULL),this.onGutterResize()},initialValue:!0},fadeFoldWidgets:{set:function(e){i.setCssClass(this.$gutter,"ace_fade-fold-widgets",e)},initialValue:!1},showFoldWidgets:{set:function(e){this.$gutterLayer.setShowFoldWidgets(e)},initialValue:!0},showLineNumbers:{set:function(e){this.$gutterLayer.setShowLineNumbers(e),this.$loop.schedule(this.CHANGE_GUTTER)},initialValue:!0},displayIndentGuides:{set:function(e){this.$textLayer.setDisplayIndentGuides(e)&&this.$loop.schedule(this.CHANGE_TEXT)},initialValue:!0},highlightGutterLine:{set:function(e){if(!this.$gutterLineHighlight){this.$gutterLineHighlight=i.createElement("div"),this.$gutterLineHighlight.className="ace_gutter-active-line",this.$gutter.appendChild(this.$gutterLineHighlight);return}this.$gutterLineHighlight.style.display=e?"":"none",this.$cursorLayer.$pixelPos&&this.$updateGutterLineHighlight()},initialValue:!1,value:!0},hScrollBarAlwaysVisible:{set:function(e){(!this.$hScrollBarAlwaysVisible||!this.$horizScroll)&&this.$loop.schedule(this.CHANGE_SCROLL)},initialValue:!1},vScrollBarAlwaysVisible:{set:function(e){(!this.$vScrollBarAlwaysVisible||!this.$vScroll)&&this.$loop.schedule(this.CHANGE_SCROLL)},initialValue:!1},fontSize:{set:function(e){typeof e=="number"&&(e+="px"),this.container.style.fontSize=e,this.updateFontSize()},initialValue:12},fontFamily:{set:function(e){this.container.style.fontFamily=e,this.updateFontSize()}},maxLines:{set:function(e){this.updateFull()}},minLines:{set:function(e){this.updateFull()}},maxPixelHeight:{set:function(e){this.updateFull()},initialValue:0},scrollPastEnd:{set:function(e){e=+e||0;if(this.$scrollPastEnd==e)return;this.$scrollPastEnd=e,this.$loop.schedule(this.CHANGE_SCROLL)},initialValue:0,handlesSet:!0},fixedWidthGutter:{set:function(e){this.$gutterLayer.$fixedWidth=!!e,this.$loop.schedule(this.CHANGE_GUTTER)}},theme:{set:function(e){this.setTheme(e)},get:function(){return this.$themeId||this.theme},initialValue:"./theme/textmate",handlesSet:!0}}),t.VirtualRenderer=g}),ace.define("ace/worker/worker_client",["require","exports","module","ace/lib/oop","ace/lib/net","ace/lib/event_emitter","ace/config"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/net"),s=e("../lib/event_emitter").EventEmitter,o=e("../config"),u=function(t,n,r,i){this.$sendDeltaQueue=this.$sendDeltaQueue.bind(this),this.changeListener=this.changeListener.bind(this),this.onMessage=this.onMessage.bind(this),e.nameToUrl&&!e.toUrl&&(e.toUrl=e.nameToUrl);if(o.get("packaged")||!e.toUrl)i=i||o.moduleUrl(n,"worker");else{var s=this.$normalizePath;i=i||s(e.toUrl("ace/worker/worker.js",null,"_"));var u={};t.forEach(function(t){u[t]=s(e.toUrl(t,null,"_").replace(/(\.js)?(\?.*)?$/,""))})}try{this.$worker=new Worker(i)}catch(a){if(!(a instanceof window.DOMException))throw a;var f=this.$workerBlob(i),l=window.URL||window.webkitURL,c=l.createObjectURL(f);this.$worker=new Worker(c),l.revokeObjectURL(c)}this.$worker.postMessage({init:!0,tlns:u,module:n,classname:r}),this.callbackId=1,this.callbacks={},this.$worker.onmessage=this.onMessage};(function(){r.implement(this,s),this.onMessage=function(e){var t=e.data;switch(t.type){case"event":this._signal(t.name,{data:t.data});break;case"call":var n=this.callbacks[t.id];n&&(n(t.data),delete this.callbacks[t.id]);break;case"error":this.reportError(t.data);break;case"log":window.console&&console.log&&console.log.apply(console,t.data)}},this.reportError=function(e){window.console&&console.error&&console.error(e)},this.$normalizePath=function(e){return i.qualifyURL(e)},this.terminate=function(){this._signal("terminate",{}),this.deltaQueue=null,this.$worker.terminate(),this.$worker=null,this.$doc&&this.$doc.off("change",this.changeListener),this.$doc=null},this.send=function(e,t){this.$worker.postMessage({command:e,args:t})},this.call=function(e,t,n){if(n){var r=this.callbackId++;this.callbacks[r]=n,t.push(r)}this.send(e,t)},this.emit=function(e,t){try{this.$worker.postMessage({event:e,data:{data:t.data}})}catch(n){console.error(n.stack)}},this.attachToDocument=function(e){this.$doc&&this.terminate(),this.$doc=e,this.call("setValue",[e.getValue()]),e.on("change",this.changeListener)},this.changeListener=function(e){this.deltaQueue||(this.deltaQueue=[],setTimeout(this.$sendDeltaQueue,0)),e.action=="insert"?this.deltaQueue.push(e.start,e.lines):this.deltaQueue.push(e.start,e.end)},this.$sendDeltaQueue=function(){var e=this.deltaQueue;if(!e)return;this.deltaQueue=null,e.length>50&&e.length>this.$doc.getLength()>>1?this.call("setValue",[this.$doc.getValue()]):this.emit("change",{data:e})},this.$workerBlob=function(e){var t="importScripts('"+i.qualifyURL(e)+"');";try{return new Blob([t],{type:"application/javascript"})}catch(n){var r=window.BlobBuilder||window.WebKitBlobBuilder||window.MozBlobBuilder,s=new r;return s.append(t),s.getBlob("application/javascript")}}}).call(u.prototype);var a=function(e,t,n){this.$sendDeltaQueue=this.$sendDeltaQueue.bind(this),this.changeListener=this.changeListener.bind(this),this.callbackId=1,this.callbacks={},this.messageBuffer=[];var r=null,i=!1,u=Object.create(s),a=this;this.$worker={},this.$worker.terminate=function(){},this.$worker.postMessage=function(e){a.messageBuffer.push(e),r&&(i?setTimeout(f):f())},this.setEmitSync=function(e){i=e};var f=function(){var e=a.messageBuffer.shift();e.command?r[e.command].apply(r,e.args):e.event&&u._signal(e.event,e.data)};u.postMessage=function(e){a.onMessage({data:e})},u.callback=function(e,t){this.postMessage({type:"call",id:t,data:e})},u.emit=function(e,t){this.postMessage({type:"event",name:e,data:t})},o.loadModule(["worker",t],function(e){r=new e[n](u);while(a.messageBuffer.length)f()})};a.prototype=u.prototype,t.UIWorkerClient=a,t.WorkerClient=u}),ace.define("ace/placeholder",["require","exports","module","ace/range","ace/lib/event_emitter","ace/lib/oop"],function(e,t,n){"use strict";var r=e("./range").Range,i=e("./lib/event_emitter").EventEmitter,s=e("./lib/oop"),o=function(e,t,n,r,i,s){var o=this;this.length=t,this.session=e,this.doc=e.getDocument(),this.mainClass=i,this.othersClass=s,this.$onUpdate=this.onUpdate.bind(this),this.doc.on("change",this.$onUpdate),this.$others=r,this.$onCursorChange=function(){setTimeout(function(){o.onCursorChange()})},this.$pos=n;var u=e.getUndoManager().$undoStack||e.getUndoManager().$undostack||{length:-1};this.$undoStackDepth=u.length,this.setup(),e.selection.on("changeCursor",this.$onCursorChange)};(function(){s.implement(this,i),this.setup=function(){var e=this,t=this.doc,n=this.session;this.selectionBefore=n.selection.toJSON(),n.selection.inMultiSelectMode&&n.selection.toSingleRange(),this.pos=t.createAnchor(this.$pos.row,this.$pos.column);var i=this.pos;i.$insertRight=!0,i.detach(),i.markerId=n.addMarker(new r(i.row,i.column,i.row,i.column+this.length),this.mainClass,null,!1),this.others=[],this.$others.forEach(function(n){var r=t.createAnchor(n.row,n.column);r.$insertRight=!0,r.detach(),e.others.push(r)}),n.setUndoSelect(!1)},this.showOtherMarkers=function(){if(this.othersActive)return;var e=this.session,t=this;this.othersActive=!0,this.others.forEach(function(n){n.markerId=e.addMarker(new r(n.row,n.column,n.row,n.column+t.length),t.othersClass,null,!1)})},this.hideOtherMarkers=function(){if(!this.othersActive)return;this.othersActive=!1;for(var e=0;e=this.pos.column&&t.start.column<=this.pos.column+this.length+1,s=t.start.column-this.pos.column;this.updateAnchors(e),i&&(this.length+=n);if(i&&!this.session.$fromUndo)if(e.action==="insert")for(var o=this.others.length-1;o>=0;o--){var u=this.others[o],a={row:u.row,column:u.column+s};this.doc.insertMergedLines(a,e.lines)}else if(e.action==="remove")for(var o=this.others.length-1;o>=0;o--){var u=this.others[o],a={row:u.row,column:u.column+s};this.doc.remove(new r(a.row,a.column,a.row,a.column-n))}this.$updating=!1,this.updateMarkers()},this.updateAnchors=function(e){this.pos.onChange(e);for(var t=this.others.length;t--;)this.others[t].onChange(e);this.updateMarkers()},this.updateMarkers=function(){if(this.$updating)return;var e=this,t=this.session,n=function(n,i){t.removeMarker(n.markerId),n.markerId=t.addMarker(new r(n.row,n.column,n.row,n.column+e.length),i,null,!1)};n(this.pos,this.mainClass);for(var i=this.others.length;i--;)n(this.others[i],this.othersClass)},this.onCursorChange=function(e){if(this.$updating||!this.session)return;var t=this.session.selection.getCursor();t.row===this.pos.row&&t.column>=this.pos.column&&t.column<=this.pos.column+this.length?(this.showOtherMarkers(),this._emit("cursorEnter",e)):(this.hideOtherMarkers(),this._emit("cursorLeave",e))},this.detach=function(){this.session.removeMarker(this.pos&&this.pos.markerId),this.hideOtherMarkers(),this.doc.removeEventListener("change",this.$onUpdate),this.session.selection.removeEventListener("changeCursor",this.$onCursorChange),this.session.setUndoSelect(!0),this.session=null},this.cancel=function(){if(this.$undoStackDepth===-1)return;var e=this.session.getUndoManager(),t=(e.$undoStack||e.$undostack).length-this.$undoStackDepth;for(var n=0;n1&&!this.inMultiSelectMode&&(this._signal("multiSelect"),this.inMultiSelectMode=!0,this.session.$undoSelect=!1,this.rangeList.attach(this.session)),t||this.fromOrientedRange(e)},this.toSingleRange=function(e){e=e||this.ranges[0];var t=this.rangeList.removeAll();t.length&&this.$onRemoveRange(t),e&&this.fromOrientedRange(e)},this.substractPoint=function(e){var t=this.rangeList.substractPoint(e);if(t)return this.$onRemoveRange(t),t[0]},this.mergeOverlappingRanges=function(){var e=this.rangeList.merge();e.length?this.$onRemoveRange(e):this.ranges[0]&&this.fromOrientedRange(this.ranges[0])},this.$onAddRange=function(e){this.rangeCount=this.rangeList.ranges.length,this.ranges.unshift(e),this._signal("addRange",{range:e})},this.$onRemoveRange=function(e){this.rangeCount=this.rangeList.ranges.length;if(this.rangeCount==1&&this.inMultiSelectMode){var t=this.rangeList.ranges.pop();e.push(t),this.rangeCount=0}for(var n=e.length;n--;){var r=this.ranges.indexOf(e[n]);this.ranges.splice(r,1)}this._signal("removeRange",{ranges:e}),this.rangeCount===0&&this.inMultiSelectMode&&(this.inMultiSelectMode=!1,this._signal("singleSelect"),this.session.$undoSelect=!0,this.rangeList.detach(this.session)),t=t||this.ranges[0],t&&!t.isEqual(this.getRange())&&this.fromOrientedRange(t)},this.$initRangeList=function(){if(this.rangeList)return;this.rangeList=new r,this.ranges=[],this.rangeCount=0},this.getAllRanges=function(){return this.rangeCount?this.rangeList.ranges.concat():[this.getRange()]},this.splitIntoLines=function(){if(this.rangeCount>1){var e=this.rangeList.ranges,t=e[e.length-1],n=i.fromPoints(e[0].start,t.end);this.toSingleRange(),this.setSelectionRange(n,t.cursor==t.start)}else{var n=this.getRange(),r=this.isBackwards(),s=n.start.row,o=n.end.row;if(s==o){if(r)var u=n.end,a=n.start;else var u=n.start,a=n.end;this.addRange(i.fromPoints(a,a)),this.addRange(i.fromPoints(u,u));return}var f=[],l=this.getLineRange(s,!0);l.start.column=n.start.column,f.push(l);for(var c=s+1;c1){var e=this.rangeList.ranges,t=e[e.length-1],n=i.fromPoints(e[0].start,t.end);this.toSingleRange(),this.setSelectionRange(n,t.cursor==t.start)}else{var r=this.session.documentToScreenPosition(this.selectionLead),s=this.session.documentToScreenPosition(this.selectionAnchor),o=this.rectangularRangeBlock(r,s);o.forEach(this.addRange,this)}},this.rectangularRangeBlock=function(e,t,n){var r=[],s=e.column0)d--;if(d>0){var m=0;while(r[m].isEmpty())m++}for(var g=d;g>=m;g--)r[g].isEmpty()&&r.splice(g,1)}return r}}.call(s.prototype);var d=e("./editor").Editor;(function(){this.updateSelectionMarkers=function(){this.renderer.updateCursor(),this.renderer.updateBackMarkers()},this.addSelectionMarker=function(e){e.cursor||(e.cursor=e.end);var t=this.getSelectionStyle();return e.marker=this.session.addMarker(e,"ace_selection",t),this.session.$selectionMarkers.push(e),this.session.selectionMarkerCount=this.session.$selectionMarkers.length,e},this.removeSelectionMarker=function(e){if(!e.marker)return;this.session.removeMarker(e.marker);var t=this.session.$selectionMarkers.indexOf(e);t!=-1&&this.session.$selectionMarkers.splice(t,1),this.session.selectionMarkerCount=this.session.$selectionMarkers.length},this.removeSelectionMarkers=function(e){var t=this.session.$selectionMarkers;for(var n=e.length;n--;){var r=e[n];if(!r.marker)continue;this.session.removeMarker(r.marker);var i=t.indexOf(r);i!=-1&&t.splice(i,1)}this.session.selectionMarkerCount=t.length},this.$onAddRange=function(e){this.addSelectionMarker(e.range),this.renderer.updateCursor(),this.renderer.updateBackMarkers()},this.$onRemoveRange=function(e){this.removeSelectionMarkers(e.ranges),this.renderer.updateCursor(),this.renderer.updateBackMarkers()},this.$onMultiSelect=function(e){if(this.inMultiSelectMode)return;this.inMultiSelectMode=!0,this.setStyle("ace_multiselect"),this.keyBinding.addKeyboardHandler(f.keyboardHandler),this.commands.setDefaultHandler("exec",this.$onMultiSelectExec),this.renderer.updateCursor(),this.renderer.updateBackMarkers()},this.$onSingleSelect=function(e){if(this.session.multiSelect.inVirtualMode)return;this.inMultiSelectMode=!1,this.unsetStyle("ace_multiselect"),this.keyBinding.removeKeyboardHandler(f.keyboardHandler),this.commands.removeDefaultHandler("exec",this.$onMultiSelectExec),this.renderer.updateCursor(),this.renderer.updateBackMarkers(),this._emit("changeSelection")},this.$onMultiSelectExec=function(e){var t=e.command,n=e.editor;if(!n.multiSelect)return;if(!t.multiSelectAction){var r=t.exec(n,e.args||{});n.multiSelect.addRange(n.multiSelect.toOrientedRange()),n.multiSelect.mergeOverlappingRanges()}else t.multiSelectAction=="forEach"?r=n.forEachSelection(t,e.args):t.multiSelectAction=="forEachLine"?r=n.forEachSelection(t,e.args,!0):t.multiSelectAction=="single"?(n.exitMultiSelectMode(),r=t.exec(n,e.args||{})):r=t.multiSelectAction(n,e.args||{});return r},this.forEachSelection=function(e,t,n){if(this.inVirtualSelectionMode)return;var r=n&&n.keepOrder,i=n==1||n&&n.$byLines,o=this.session,u=this.selection,a=u.rangeList,f=(r?u:a).ranges,l;if(!f.length)return e.exec?e.exec(this,t||{}):e(this,t||{});var c=u._eventRegistry;u._eventRegistry={};var h=new s(o);this.inVirtualSelectionMode=!0;for(var p=f.length;p--;){if(i)while(p>0&&f[p].start.row==f[p-1].end.row)p--;h.fromOrientedRange(f[p]),h.index=p,this.selection=o.selection=h;var d=e.exec?e.exec(this,t||{}):e(this,t||{});!l&&d!==undefined&&(l=d),h.toOrientedRange(f[p])}h.detach(),this.selection=o.selection=u,this.inVirtualSelectionMode=!1,u._eventRegistry=c,u.mergeOverlappingRanges();var v=this.renderer.$scrollAnimation;return this.onCursorChange(),this.onSelectionChange(),v&&v.from==v.to&&this.renderer.animateScrolling(v.from),l},this.exitMultiSelectMode=function(){if(!this.inMultiSelectMode||this.inVirtualSelectionMode)return;this.multiSelect.toSingleRange()},this.getSelectedText=function(){var e="";if(this.inMultiSelectMode&&!this.inVirtualSelectionMode){var t=this.multiSelect.rangeList.ranges,n=[];for(var r=0;r0);u<0&&(u=0),f>=c&&(f=c-1)}var p=this.session.removeFullLines(u,f);p=this.$reAlignText(p,l),this.session.insert({row:u,column:0},p.join("\n")+"\n"),l||(o.start.column=0,o.end.column=p[p.length-1].length),this.selection.setRange(o)}else{s.forEach(function(e){t.substractPoint(e.cursor)});var d=0,v=Infinity,m=n.map(function(t){var n=t.cursor,r=e.getLine(n.row),i=r.substr(n.column).search(/\S/g);return i==-1&&(i=0),n.column>d&&(d=n.column),io?e.insert(r,a.stringRepeat(" ",s-o)):e.remove(new i(r.row,r.column,r.row,r.column-s+o)),t.start.column=t.end.column=d,t.start.row=t.end.row=r.row,t.cursor=t.end}),t.fromOrientedRange(n[0]),this.renderer.updateCursor(),this.renderer.updateBackMarkers()}},this.$reAlignText=function(e,t){function u(e){return a.stringRepeat(" ",e)}function f(e){return e[2]?u(i)+e[2]+u(s-e[2].length+o)+e[4].replace(/^([=:])\s+/,"$1 "):e[0]}function l(e){return e[2]?u(i+s-e[2].length)+e[2]+u(o," ")+e[4].replace(/^([=:])\s+/,"$1 "):e[0]}function c(e){return e[2]?u(i)+e[2]+u(o)+e[4].replace(/^([=:])\s+/,"$1 "):e[0]}var n=!0,r=!0,i,s,o;return e.map(function(e){var t=e.match(/(\s*)(.*?)(\s*)([=:].*)/);return t?i==null?(i=t[1].length,s=t[2].length,o=t[3].length,t):(i+s+o!=t[1].length+t[2].length+t[3].length&&(r=!1),i!=t[1].length&&(n=!1),i>t[1].length&&(i=t[1].length),st[3].length&&(o=t[3].length),t):[e]}).map(t?f:n?r?l:f:c)}}).call(d.prototype),t.onSessionChange=function(e){var t=e.session;t&&!t.multiSelect&&(t.$selectionMarkers=[],t.selection.$initRangeList(),t.multiSelect=t.selection),this.multiSelect=t&&t.multiSelect;var n=e.oldSession;n&&(n.multiSelect.off("addRange",this.$onAddRange),n.multiSelect.off("removeRange",this.$onRemoveRange),n.multiSelect.off("multiSelect",this.$onMultiSelect),n.multiSelect.off("singleSelect",this.$onSingleSelect),n.multiSelect.lead.off("change",this.$checkMultiselectChange),n.multiSelect.anchor.off("change",this.$checkMultiselectChange)),t&&(t.multiSelect.on("addRange",this.$onAddRange),t.multiSelect.on("removeRange",this.$onRemoveRange),t.multiSelect.on("multiSelect",this.$onMultiSelect),t.multiSelect.on("singleSelect",this.$onSingleSelect),t.multiSelect.lead.on("change",this.$checkMultiselectChange),t.multiSelect.anchor.on("change",this.$checkMultiselectChange)),t&&this.inMultiSelectMode!=t.selection.inMultiSelectMode&&(t.selection.inMultiSelectMode?this.$onMultiSelect():this.$onSingleSelect())},t.MultiSelect=m,e("./config").defineOptions(d.prototype,"editor",{enableMultiselect:{set:function(e){m(this),e?(this.on("changeSession",this.$multiselectOnSessionChange),this.on("mousedown",o)):(this.off("changeSession",this.$multiselectOnSessionChange),this.off("mousedown",o))},value:!0},enableBlockSelect:{set:function(e){this.$blockSelectEnabled=e},value:!0}})}),ace.define("ace/mode/folding/fold_mode",["require","exports","module","ace/range"],function(e,t,n){"use strict";var r=e("../../range").Range,i=t.FoldMode=function(){};(function(){this.foldingStartMarker=null,this.foldingStopMarker=null,this.getFoldWidget=function(e,t,n){var r=e.getLine(n);return this.foldingStartMarker.test(r)?"start":t=="markbeginend"&&this.foldingStopMarker&&this.foldingStopMarker.test(r)?"end":""},this.getFoldWidgetRange=function(e,t,n){return null},this.indentationBlock=function(e,t,n){var i=/\S/,s=e.getLine(t),o=s.search(i);if(o==-1)return;var u=n||s.length,a=e.getLength(),f=t,l=t;while(++tf){var h=e.getLine(l).length;return new r(f,u,l,h)}},this.openingBracketBlock=function(e,t,n,i,s){var o={row:n,column:i+1},u=e.$findClosingBracket(t,o,s);if(!u)return;var a=e.foldWidgets[u.row];return a==null&&(a=e.getFoldWidget(u.row)),a=="start"&&u.row>o.row&&(u.row--,u.column=e.getLine(u.row).length),r.fromPoints(o,u)},this.closingBracketBlock=function(e,t,n,i,s){var o={row:n,column:i},u=e.$findOpeningBracket(t,o);if(!u)return;return u.column++,o.column--,r.fromPoints(u,o)}}).call(i.prototype)}),ace.define("ace/theme/textmate",["require","exports","module","ace/lib/dom"],function(e,t,n){"use strict";t.isDark=!1,t.cssClass="ace-tm",t.cssText='.ace-tm .ace_gutter {background: #f0f0f0;color: #333;}.ace-tm .ace_print-margin {width: 1px;background: #e8e8e8;}.ace-tm .ace_fold {background-color: #6B72E6;}.ace-tm {background-color: #FFFFFF;color: black;}.ace-tm .ace_cursor {color: black;}.ace-tm .ace_invisible {color: rgb(191, 191, 191);}.ace-tm .ace_storage,.ace-tm .ace_keyword {color: blue;}.ace-tm .ace_constant {color: rgb(197, 6, 11);}.ace-tm .ace_constant.ace_buildin {color: rgb(88, 72, 246);}.ace-tm .ace_constant.ace_language {color: rgb(88, 92, 246);}.ace-tm .ace_constant.ace_library {color: rgb(6, 150, 14);}.ace-tm .ace_invalid {background-color: rgba(255, 0, 0, 0.1);color: red;}.ace-tm .ace_support.ace_function {color: rgb(60, 76, 114);}.ace-tm .ace_support.ace_constant {color: rgb(6, 150, 14);}.ace-tm .ace_support.ace_type,.ace-tm .ace_support.ace_class {color: rgb(109, 121, 222);}.ace-tm .ace_keyword.ace_operator {color: rgb(104, 118, 135);}.ace-tm .ace_string {color: rgb(3, 106, 7);}.ace-tm .ace_comment {color: rgb(76, 136, 107);}.ace-tm .ace_comment.ace_doc {color: rgb(0, 102, 255);}.ace-tm .ace_comment.ace_doc.ace_tag {color: rgb(128, 159, 191);}.ace-tm .ace_constant.ace_numeric {color: rgb(0, 0, 205);}.ace-tm .ace_variable {color: rgb(49, 132, 149);}.ace-tm .ace_xml-pe {color: rgb(104, 104, 91);}.ace-tm .ace_entity.ace_name.ace_function {color: #0000A2;}.ace-tm .ace_heading {color: rgb(12, 7, 255);}.ace-tm .ace_list {color:rgb(185, 6, 144);}.ace-tm .ace_meta.ace_tag {color:rgb(0, 22, 142);}.ace-tm .ace_string.ace_regex {color: rgb(255, 0, 0)}.ace-tm .ace_marker-layer .ace_selection {background: rgb(181, 213, 255);}.ace-tm.ace_multiselect .ace_selection.ace_start {box-shadow: 0 0 3px 0px white;}.ace-tm .ace_marker-layer .ace_step {background: rgb(252, 255, 0);}.ace-tm .ace_marker-layer .ace_stack {background: rgb(164, 229, 101);}.ace-tm .ace_marker-layer .ace_bracket {margin: -1px 0 0 -1px;border: 1px solid rgb(192, 192, 192);}.ace-tm .ace_marker-layer .ace_active-line {background: rgba(0, 0, 0, 0.07);}.ace-tm .ace_gutter-active-line {background-color : #dcdcdc;}.ace-tm .ace_marker-layer .ace_selected-word {background: rgb(250, 250, 255);border: 1px solid rgb(200, 200, 250);}.ace-tm .ace_indent-guide {background: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAEAAAACCAYAAACZgbYnAAAAE0lEQVQImWP4////f4bLly//BwAmVgd1/w11/gAAAABJRU5ErkJggg==") right repeat-y;}';var r=e("../lib/dom");r.importCssString(t.cssText,t.cssClass)}),ace.define("ace/line_widgets",["require","exports","module","ace/lib/oop","ace/lib/dom","ace/range"],function(e,t,n){"use strict";function o(e){this.session=e,this.session.widgetManager=this,this.session.getRowLength=this.getRowLength,this.session.$getWidgetScreenLength=this.$getWidgetScreenLength,this.updateOnChange=this.updateOnChange.bind(this),this.renderWidgets=this.renderWidgets.bind(this),this.measureWidgets=this.measureWidgets.bind(this),this.session._changedWidgets=[],this.$onChangeEditor=this.$onChangeEditor.bind(this),this.session.on("change",this.updateOnChange),this.session.on("changeFold",this.updateOnFold),this.session.on("changeEditor",this.$onChangeEditor)}var r=e("./lib/oop"),i=e("./lib/dom"),s=e("./range").Range;(function(){this.getRowLength=function(e){var t;return this.lineWidgets?t=this.lineWidgets[e]&&this.lineWidgets[e].rowCount||0:t=0,!this.$useWrapMode||!this.$wrapData[e]?1+t:this.$wrapData[e].length+1+t},this.$getWidgetScreenLength=function(){var e=0;return this.lineWidgets.forEach(function(t){t&&t.rowCount&&!t.hidden&&(e+=t.rowCount)}),e},this.$onChangeEditor=function(e){this.attach(e.editor)},this.attach=function(e){e&&e.widgetManager&&e.widgetManager!=this&&e.widgetManager.detach();if(this.editor==e)return;this.detach(),this.editor=e,e&&(e.widgetManager=this,e.renderer.on("beforeRender",this.measureWidgets),e.renderer.on("afterRender",this.renderWidgets))},this.detach=function(e){var t=this.editor;if(!t)return;this.editor=null,t.widgetManager=null,t.renderer.off("beforeRender",this.measureWidgets),t.renderer.off("afterRender",this.renderWidgets);var n=this.session.lineWidgets;n&&n.forEach(function(e){e&&e.el&&e.el.parentNode&&(e._inDocument=!1,e.el.parentNode.removeChild(e.el))})},this.updateOnFold=function(e,t){var n=t.lineWidgets;if(!n||!e.action)return;var r=e.data,i=r.start.row,s=r.end.row,o=e.action=="add";for(var u=i+1;u0&&!r[i])i--;this.firstRow=n.firstRow,this.lastRow=n.lastRow,t.$cursorLayer.config=n;for(var o=i;o<=s;o++){var u=r[o];if(!u||!u.el)continue;if(u.hidden){u.el.style.top=-100-(u.pixelHeight||0)+"px";continue}u._inDocument||(u._inDocument=!0,t.container.appendChild(u.el));var a=t.$cursorLayer.getPixelPosition({row:o,column:0},!0).top;u.coverLine||(a+=n.lineHeight*this.session.getRowLineCount(u.row)),u.el.style.top=a-n.offset+"px";var f=u.coverGutter?0:t.gutterWidth;u.fixedWidth||(f-=t.scrollLeft),u.el.style.left=f+"px",u.fullWidth&&u.screenWidth&&(u.el.style.minWidth=n.width+2*n.padding+"px"),u.fixedWidth?u.el.style.right=t.scrollBar.getWidth()+"px":u.el.style.right=""}}}).call(o.prototype),t.LineWidgets=o}),ace.define("ace/ext/error_marker",["require","exports","module","ace/line_widgets","ace/lib/dom","ace/range"],function(e,t,n){"use strict";function o(e,t,n){var r=0,i=e.length-1;while(r<=i){var s=r+i>>1,o=n(t,e[s]);if(o>0)r=s+1;else{if(!(o<0))return s;i=s-1}}return-(r+1)}function u(e,t,n){var r=e.getAnnotations().sort(s.comparePoints);if(!r.length)return;var i=o(r,{row:t,column:-1},s.comparePoints);i<0&&(i=-i-1),i>=r.length?i=n>0?0:r.length-1:i===0&&n<0&&(i=r.length-1);var u=r[i];if(!u||!n)return;if(u.row===t){do u=r[i+=n];while(u&&u.row===t);if(!u)return r.slice()}var a=[];t=u.row;do a[n<0?"unshift":"push"](u),u=r[i+=n];while(u&&u.row==t);return a.length&&a}var r=e("../line_widgets").LineWidgets,i=e("../lib/dom"),s=e("../range").Range;t.showErrorMarker=function(e,t){var n=e.session;n.widgetManager||(n.widgetManager=new r(n),n.widgetManager.attach(e));var s=e.getCursorPosition(),o=s.row,a=n.widgetManager.getWidgetsAtRow(o).filter(function(e){return e.type=="errorMarker"})[0];a?a.destroy():o-=t;var f=u(n,o,t),l;if(f){var c=f[0];s.column=(c.pos&&typeof c.column!="number"?c.pos.sc:c.column)||0,s.row=c.row,l=e.renderer.$gutterLayer.$annotations[s.row]}else{if(a)return;l={text:["Looks good!"],className:"ace_ok"}}e.session.unfold(s.row),e.selection.moveToPosition(s);var h={row:s.row,fixedWidth:!0,coverGutter:!0,el:i.createElement("div"),type:"errorMarker"},p=h.el.appendChild(i.createElement("div")),d=h.el.appendChild(i.createElement("div"));d.className="error_widget_arrow "+l.className;var v=e.renderer.$cursorLayer.getPixelPosition(s).left;d.style.left=v+e.renderer.gutterWidth-5+"px",h.el.className="error_widget_wrapper",p.className="error_widget "+l.className,p.innerHTML=l.text.join("
"),p.appendChild(i.createElement("div"));var m=function(e,t,n){if(t===0&&(n==="esc"||n==="return"))return h.destroy(),{command:"null"}};h.destroy=function(){if(e.$mouseHandler.isMousePressed)return;e.keyBinding.removeKeyboardHandler(m),n.widgetManager.removeLineWidget(h),e.off("changeSelection",h.destroy),e.off("changeSession",h.destroy),e.off("mouseup",h.destroy),e.off("change",h.destroy)},e.keyBinding.addKeyboardHandler(m),e.on("changeSelection",h.destroy),e.on("changeSession",h.destroy),e.on("mouseup",h.destroy),e.on("change",h.destroy),e.session.widgetManager.addLineWidget(h),h.el.onmousedown=e.focus.bind(e),e.renderer.scrollCursorIntoView(null,.5,{bottom:h.el.offsetHeight})},i.importCssString(" .error_widget_wrapper { background: inherit; color: inherit; border:none } .error_widget { border-top: solid 2px; border-bottom: solid 2px; margin: 5px 0; padding: 10px 40px; white-space: pre-wrap; } .error_widget.ace_error, .error_widget_arrow.ace_error{ border-color: #ff5a5a } .error_widget.ace_warning, .error_widget_arrow.ace_warning{ border-color: #F1D817 } .error_widget.ace_info, .error_widget_arrow.ace_info{ border-color: #5a5a5a } .error_widget.ace_ok, .error_widget_arrow.ace_ok{ border-color: #5aaa5a } .error_widget_arrow { position: absolute; border: solid 5px; border-top-color: transparent!important; border-right-color: transparent!important; border-left-color: transparent!important; top: -5px; }","")}),ace.define("ace/ace",["require","exports","module","ace/lib/fixoldbrowsers","ace/lib/dom","ace/lib/event","ace/editor","ace/edit_session","ace/undomanager","ace/virtual_renderer","ace/worker/worker_client","ace/keyboard/hash_handler","ace/placeholder","ace/multi_select","ace/mode/folding/fold_mode","ace/theme/textmate","ace/ext/error_marker","ace/config"],function(e,t,n){"use strict";e("./lib/fixoldbrowsers");var r=e("./lib/dom"),i=e("./lib/event"),s=e("./editor").Editor,o=e("./edit_session").EditSession,u=e("./undomanager").UndoManager,a=e("./virtual_renderer").VirtualRenderer;e("./worker/worker_client"),e("./keyboard/hash_handler"),e("./placeholder"),e("./multi_select"),e("./mode/folding/fold_mode"),e("./theme/textmate"),e("./ext/error_marker"),t.config=e("./config"),t.require=e,t.edit=function(e){if(typeof e=="string"){var n=e;e=document.getElementById(n);if(!e)throw new Error("ace.edit can't find div #"+n)}if(e&&e.env&&e.env.editor instanceof s)return e.env.editor;var o="";if(e&&/input|textarea/i.test(e.tagName)){var u=e;o=u.value,e=r.createElement("pre"),u.parentNode.replaceChild(e,u)}else e&&(o=r.getInnerText(e),e.innerHTML="");var f=t.createEditSession(o),l=new s(new a(e));l.setSession(f);var c={document:f,editor:l,onResize:l.resize.bind(l,null)};return u&&(c.textarea=u),i.addListener(window,"resize",c.onResize),l.on("destroy",function(){i.removeListener(window,"resize",c.onResize),c.editor.container.env=null}),l.container.env=l.env=c,l},t.createEditSession=function(e,t){var n=new o(e,t);return n.setUndoManager(new u),n},t.EditSession=o,t.UndoManager=u,t.version="1.2.3"}); - (function() { - ace.require(["ace/ace"], function(a) { - a && a.config.init(true); - if (!window.ace) - window.ace = a; - for (var key in a) if (a.hasOwnProperty(key)) - window.ace[key] = a[key]; - }); - })(); - \ No newline at end of file diff --git a/docs/ace-1.2.3/mode-css.js b/docs/ace-1.2.3/mode-css.js deleted file mode 100755 index 84cd16c66..000000000 --- a/docs/ace-1.2.3/mode-css.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/mode/css_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=t.supportType="align-content|align-items|align-self|all|animation|animation-delay|animation-direction|animation-duration|animation-fill-mode|animation-iteration-count|animation-name|animation-play-state|animation-timing-function|backface-visibility|background|background-attachment|background-blend-mode|background-clip|background-color|background-image|background-origin|background-position|background-repeat|background-size|border|border-bottom|border-bottom-color|border-bottom-left-radius|border-bottom-right-radius|border-bottom-style|border-bottom-width|border-collapse|border-color|border-image|border-image-outset|border-image-repeat|border-image-slice|border-image-source|border-image-width|border-left|border-left-color|border-left-style|border-left-width|border-radius|border-right|border-right-color|border-right-style|border-right-width|border-spacing|border-style|border-top|border-top-color|border-top-left-radius|border-top-right-radius|border-top-style|border-top-width|border-width|bottom|box-shadow|box-sizing|caption-side|clear|clip|color|column-count|column-fill|column-gap|column-rule|column-rule-color|column-rule-style|column-rule-width|column-span|column-width|columns|content|counter-increment|counter-reset|cursor|direction|display|empty-cells|filter|flex|flex-basis|flex-direction|flex-flow|flex-grow|flex-shrink|flex-wrap|float|font|font-family|font-size|font-size-adjust|font-stretch|font-style|font-variant|font-weight|hanging-punctuation|height|justify-content|left|letter-spacing|line-height|list-style|list-style-image|list-style-position|list-style-type|margin|margin-bottom|margin-left|margin-right|margin-top|max-height|max-width|min-height|min-width|nav-down|nav-index|nav-left|nav-right|nav-up|opacity|order|outline|outline-color|outline-offset|outline-style|outline-width|overflow|overflow-x|overflow-y|padding|padding-bottom|padding-left|padding-right|padding-top|page-break-after|page-break-before|page-break-inside|perspective|perspective-origin|position|quotes|resize|right|tab-size|table-layout|text-align|text-align-last|text-decoration|text-decoration-color|text-decoration-line|text-decoration-style|text-indent|text-justify|text-overflow|text-shadow|text-transform|top|transform|transform-origin|transform-style|transition|transition-delay|transition-duration|transition-property|transition-timing-function|unicode-bidi|vertical-align|visibility|white-space|width|word-break|word-spacing|word-wrap|z-index",u=t.supportFunction="rgb|rgba|url|attr|counter|counters",a=t.supportConstant="absolute|after-edge|after|all-scroll|all|alphabetic|always|antialiased|armenian|auto|avoid-column|avoid-page|avoid|balance|baseline|before-edge|before|below|bidi-override|block-line-height|block|bold|bolder|border-box|both|bottom|box|break-all|break-word|capitalize|caps-height|caption|center|central|char|circle|cjk-ideographic|clone|close-quote|col-resize|collapse|column|consider-shifts|contain|content-box|cover|crosshair|cubic-bezier|dashed|decimal-leading-zero|decimal|default|disabled|disc|disregard-shifts|distribute-all-lines|distribute-letter|distribute-space|distribute|dotted|double|e-resize|ease-in|ease-in-out|ease-out|ease|ellipsis|end|exclude-ruby|fill|fixed|georgian|glyphs|grid-height|groove|hand|hanging|hebrew|help|hidden|hiragana-iroha|hiragana|horizontal|icon|ideograph-alpha|ideograph-numeric|ideograph-parenthesis|ideograph-space|ideographic|inactive|include-ruby|inherit|initial|inline-block|inline-box|inline-line-height|inline-table|inline|inset|inside|inter-ideograph|inter-word|invert|italic|justify|katakana-iroha|katakana|keep-all|last|left|lighter|line-edge|line-through|line|linear|list-item|local|loose|lower-alpha|lower-greek|lower-latin|lower-roman|lowercase|lr-tb|ltr|mathematical|max-height|max-size|medium|menu|message-box|middle|move|n-resize|ne-resize|newspaper|no-change|no-close-quote|no-drop|no-open-quote|no-repeat|none|normal|not-allowed|nowrap|nw-resize|oblique|open-quote|outset|outside|overline|padding-box|page|pointer|pre-line|pre-wrap|pre|preserve-3d|progress|relative|repeat-x|repeat-y|repeat|replaced|reset-size|ridge|right|round|row-resize|rtl|s-resize|scroll|se-resize|separate|slice|small-caps|small-caption|solid|space|square|start|static|status-bar|step-end|step-start|steps|stretch|strict|sub|super|sw-resize|table-caption|table-cell|table-column-group|table-column|table-footer-group|table-header-group|table-row-group|table-row|table|tb-rl|text-after-edge|text-before-edge|text-bottom|text-size|text-top|text|thick|thin|transparent|underline|upper-alpha|upper-latin|upper-roman|uppercase|use-script|vertical-ideographic|vertical-text|visible|w-resize|wait|whitespace|z-index|zero",f=t.supportConstantColor="aqua|black|blue|fuchsia|gray|green|lime|maroon|navy|olive|orange|purple|red|silver|teal|white|yellow",l=t.supportConstantFonts="arial|century|comic|courier|cursive|fantasy|garamond|georgia|helvetica|impact|lucida|symbol|system|tahoma|times|trebuchet|utopia|verdana|webdings|sans-serif|serif|monospace",c=t.numRe="\\-?(?:(?:[0-9]+)|(?:[0-9]*\\.[0-9]+))",h=t.pseudoElements="(\\:+)\\b(after|before|first-letter|first-line|moz-selection|selection)\\b",p=t.pseudoClasses="(:)\\b(active|checked|disabled|empty|enabled|first-child|first-of-type|focus|hover|indeterminate|invalid|last-child|last-of-type|link|not|nth-child|nth-last-child|nth-last-of-type|nth-of-type|only-child|only-of-type|required|root|target|valid|visited)\\b",d=function(){var e=this.createKeywordMapper({"support.function":u,"support.constant":a,"support.type":o,"support.constant.color":f,"support.constant.fonts":l},"text",!0);this.$rules={start:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"@.*?{",push:"media"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],media:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"\\}",next:"pop"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],comment:[{token:"comment",regex:"\\*\\/",next:"pop"},{defaultToken:"comment"}],ruleset:[{token:"paren.rparen",regex:"\\}",next:"pop"},{token:"comment",regex:"\\/\\*",push:"comment"},{token:"string",regex:'["](?:(?:\\\\.)|(?:[^"\\\\]))*?["]'},{token:"string",regex:"['](?:(?:\\\\.)|(?:[^'\\\\]))*?[']"},{token:["constant.numeric","keyword"],regex:"("+c+")(ch|cm|deg|em|ex|fr|gd|grad|Hz|in|kHz|mm|ms|pc|pt|px|rad|rem|s|turn|vh|vm|vw|%)"},{token:"constant.numeric",regex:c},{token:"constant.numeric",regex:"#[a-f0-9]{6}"},{token:"constant.numeric",regex:"#[a-f0-9]{3}"},{token:["punctuation","entity.other.attribute-name.pseudo-element.css"],regex:h},{token:["punctuation","entity.other.attribute-name.pseudo-class.css"],regex:p},{token:["support.function","string","support.function"],regex:"(url\\()(.*)(\\))"},{token:e,regex:"\\-?[a-zA-Z_][a-zA-Z0-9_\\-]*"},{caseInsensitive:!0}]},this.normalizeRules()};r.inherits(d,s),t.CssHighlightRules=d}),ace.define("ace/mode/matching_brace_outdent",["require","exports","module","ace/range"],function(e,t,n){"use strict";var r=e("../range").Range,i=function(){};(function(){this.checkOutdent=function(e,t){return/^\s+$/.test(e)?/^\s*\}/.test(t):!1},this.autoOutdent=function(e,t){var n=e.getLine(t),i=n.match(/^(\s*\})/);if(!i)return 0;var s=i[1].length,o=e.findMatchingBracket({row:t,column:s});if(!o||o.row==t)return 0;var u=this.$getIndent(e.getLine(o.row));e.replace(new r(t,0,t,s-1),u)},this.$getIndent=function(e){return e.match(/^\s*/)[0]}}).call(i.prototype),t.MatchingBraceOutdent=i}),ace.define("ace/mode/css_completions",["require","exports","module"],function(e,t,n){"use strict";var r={background:{"#$0":1},"background-color":{"#$0":1,transparent:1,fixed:1},"background-image":{"url('/$0')":1},"background-repeat":{repeat:1,"repeat-x":1,"repeat-y":1,"no-repeat":1,inherit:1},"background-position":{bottom:2,center:2,left:2,right:2,top:2,inherit:2},"background-attachment":{scroll:1,fixed:1},"background-size":{cover:1,contain:1},"background-clip":{"border-box":1,"padding-box":1,"content-box":1},"background-origin":{"border-box":1,"padding-box":1,"content-box":1},border:{"solid $0":1,"dashed $0":1,"dotted $0":1,"#$0":1},"border-color":{"#$0":1},"border-style":{solid:2,dashed:2,dotted:2,"double":2,groove:2,hidden:2,inherit:2,inset:2,none:2,outset:2,ridged:2},"border-collapse":{collapse:1,separate:1},bottom:{px:1,em:1,"%":1},clear:{left:1,right:1,both:1,none:1},color:{"#$0":1,"rgb(#$00,0,0)":1},cursor:{"default":1,pointer:1,move:1,text:1,wait:1,help:1,progress:1,"n-resize":1,"ne-resize":1,"e-resize":1,"se-resize":1,"s-resize":1,"sw-resize":1,"w-resize":1,"nw-resize":1},display:{none:1,block:1,inline:1,"inline-block":1,"table-cell":1},"empty-cells":{show:1,hide:1},"float":{left:1,right:1,none:1},"font-family":{Arial:2,"Comic Sans MS":2,Consolas:2,"Courier New":2,Courier:2,Georgia:2,Monospace:2,"Sans-Serif":2,"Segoe UI":2,Tahoma:2,"Times New Roman":2,"Trebuchet MS":2,Verdana:1},"font-size":{px:1,em:1,"%":1},"font-weight":{bold:1,normal:1},"font-style":{italic:1,normal:1},"font-variant":{normal:1,"small-caps":1},height:{px:1,em:1,"%":1},left:{px:1,em:1,"%":1},"letter-spacing":{normal:1},"line-height":{normal:1},"list-style-type":{none:1,disc:1,circle:1,square:1,decimal:1,"decimal-leading-zero":1,"lower-roman":1,"upper-roman":1,"lower-greek":1,"lower-latin":1,"upper-latin":1,georgian:1,"lower-alpha":1,"upper-alpha":1},margin:{px:1,em:1,"%":1},"margin-right":{px:1,em:1,"%":1},"margin-left":{px:1,em:1,"%":1},"margin-top":{px:1,em:1,"%":1},"margin-bottom":{px:1,em:1,"%":1},"max-height":{px:1,em:1,"%":1},"max-width":{px:1,em:1,"%":1},"min-height":{px:1,em:1,"%":1},"min-width":{px:1,em:1,"%":1},overflow:{hidden:1,visible:1,auto:1,scroll:1},"overflow-x":{hidden:1,visible:1,auto:1,scroll:1},"overflow-y":{hidden:1,visible:1,auto:1,scroll:1},padding:{px:1,em:1,"%":1},"padding-top":{px:1,em:1,"%":1},"padding-right":{px:1,em:1,"%":1},"padding-bottom":{px:1,em:1,"%":1},"padding-left":{px:1,em:1,"%":1},"page-break-after":{auto:1,always:1,avoid:1,left:1,right:1},"page-break-before":{auto:1,always:1,avoid:1,left:1,right:1},position:{absolute:1,relative:1,fixed:1,"static":1},right:{px:1,em:1,"%":1},"table-layout":{fixed:1,auto:1},"text-decoration":{none:1,underline:1,"line-through":1,blink:1},"text-align":{left:1,right:1,center:1,justify:1},"text-transform":{capitalize:1,uppercase:1,lowercase:1,none:1},top:{px:1,em:1,"%":1},"vertical-align":{top:1,bottom:1},visibility:{hidden:1,visible:1},"white-space":{nowrap:1,normal:1,pre:1,"pre-line":1,"pre-wrap":1},width:{px:1,em:1,"%":1},"word-spacing":{normal:1},filter:{"alpha(opacity=$0100)":1},"text-shadow":{"$02px 2px 2px #777":1},"text-overflow":{"ellipsis-word":1,clip:1,ellipsis:1},"-moz-border-radius":1,"-moz-border-radius-topright":1,"-moz-border-radius-bottomright":1,"-moz-border-radius-topleft":1,"-moz-border-radius-bottomleft":1,"-webkit-border-radius":1,"-webkit-border-top-right-radius":1,"-webkit-border-top-left-radius":1,"-webkit-border-bottom-right-radius":1,"-webkit-border-bottom-left-radius":1,"-moz-box-shadow":1,"-webkit-box-shadow":1,transform:{"rotate($00deg)":1,"skew($00deg)":1},"-moz-transform":{"rotate($00deg)":1,"skew($00deg)":1},"-webkit-transform":{"rotate($00deg)":1,"skew($00deg)":1}},i=function(){};(function(){this.completionsDefined=!1,this.defineCompletions=function(){if(document){var e=document.createElement("c").style;for(var t in e){if(typeof e[t]!="string")continue;var n=t.replace(/[A-Z]/g,function(e){return"-"+e.toLowerCase()});r.hasOwnProperty(n)||(r[n]=1)}}this.completionsDefined=!0},this.getCompletions=function(e,t,n,r){this.completionsDefined||this.defineCompletions();var i=t.getTokenAt(n.row,n.column);if(!i)return[];if(e==="ruleset"){var s=t.getLine(n.row).substr(0,n.column);return/:[^;]+$/.test(s)?(/([\w\-]+):[^:]*$/.test(s),this.getPropertyValueCompletions(e,t,n,r)):this.getPropertyCompletions(e,t,n,r)}return[]},this.getPropertyCompletions=function(e,t,n,i){var s=Object.keys(r);return s.map(function(e){return{caption:e,snippet:e+": $0",meta:"property",score:Number.MAX_VALUE}})},this.getPropertyValueCompletions=function(e,t,n,i){var s=t.getLine(n.row).substr(0,n.column),o=(/([\w\-]+):[^:]*$/.exec(s)||{})[1];if(!o)return[];var u=[];return o in r&&typeof r[o]=="object"&&(u=Object.keys(r[o])),u.map(function(e){return{caption:e,snippet:e,meta:"property value",score:Number.MAX_VALUE}})}}).call(i.prototype),t.CssCompletions=i}),ace.define("ace/mode/behaviour/cstyle",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),u=["text","paren.rparen","punctuation.operator"],a=["text","paren.rparen","punctuation.operator","comment"],f,l={},c=function(e){var t=-1;e.multiSelect&&(t=e.selection.index,l.rangeCount!=e.multiSelect.rangeCount&&(l={rangeCount:e.multiSelect.rangeCount}));if(l[t])return f=l[t];f=l[t]={autoInsertedBrackets:0,autoInsertedRow:-1,autoInsertedLineEnd:"",maybeInsertedBrackets:0,maybeInsertedRow:-1,maybeInsertedLineStart:"",maybeInsertedLineEnd:""}},h=function(e,t,n,r){var i=e.end.row-e.start.row;return{text:n+t+r,selection:[0,e.start.column+1,i,e.end.column+(i?0:1)]}},p=function(){this.add("braces","insertion",function(e,t,n,r,i){var s=n.getCursorPosition(),u=r.doc.getLine(s.row);if(i=="{"){c(n);var a=n.getSelectionRange(),l=r.doc.getTextRange(a);if(l!==""&&l!=="{"&&n.getWrapBehavioursEnabled())return h(a,l,"{","}");if(p.isSaneInsertion(n,r))return/[\]\}\)]/.test(u[s.column])||n.inMultiSelectMode?(p.recordAutoInsert(n,r,"}"),{text:"{}",selection:[1,1]}):(p.recordMaybeInsert(n,r,"{"),{text:"{",selection:[1,1]})}else if(i=="}"){c(n);var d=u.substring(s.column,s.column+1);if(d=="}"){var v=r.$findOpeningBracket("}",{column:s.column+1,row:s.row});if(v!==null&&p.isAutoInsertedClosing(s,u,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}else{if(i=="\n"||i=="\r\n"){c(n);var m="";p.isMaybeInsertedClosing(s,u)&&(m=o.stringRepeat("}",f.maybeInsertedBrackets),p.clearMaybeInsertedClosing());var d=u.substring(s.column,s.column+1);if(d==="}"){var g=r.findMatchingBracket({row:s.row,column:s.column+1},"}");if(!g)return null;var y=this.$getIndent(r.getLine(g.row))}else{if(!m){p.clearMaybeInsertedClosing();return}var y=this.$getIndent(u)}var b=y+r.getTabString();return{text:"\n"+b+"\n"+y+m,selection:[1,b.length,1,b.length]}}p.clearMaybeInsertedClosing()}}),this.add("braces","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="{"){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.end.column,i.end.column+1);if(u=="}")return i.end.column++,i;f.maybeInsertedBrackets--}}),this.add("parens","insertion",function(e,t,n,r,i){if(i=="("){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"(",")");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,")"),{text:"()",selection:[1,1]}}else if(i==")"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f==")"){var l=r.$findOpeningBracket(")",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("parens","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="("){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==")")return i.end.column++,i}}),this.add("brackets","insertion",function(e,t,n,r,i){if(i=="["){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"[","]");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,"]"),{text:"[]",selection:[1,1]}}else if(i=="]"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f=="]"){var l=r.$findOpeningBracket("]",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("brackets","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="["){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u=="]")return i.end.column++,i}}),this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){c(n);var s=i,o=n.getSelectionRange(),u=r.doc.getTextRange(o);if(u!==""&&u!=="'"&&u!='"'&&n.getWrapBehavioursEnabled())return h(o,u,s,s);if(!u){var a=n.getCursorPosition(),f=r.doc.getLine(a.row),l=f.substring(a.column-1,a.column),p=f.substring(a.column,a.column+1),d=r.getTokenAt(a.row,a.column),v=r.getTokenAt(a.row,a.column+1);if(l=="\\"&&d&&/escape/.test(d.type))return null;var m=d&&/string|escape/.test(d.type),g=!v||/string|escape/.test(v.type),y;if(p==s)y=m!==g;else{if(m&&!g)return null;if(m&&g)return null;var b=r.$mode.tokenRe;b.lastIndex=0;var w=b.test(l);b.lastIndex=0;var E=b.test(l);if(w||E)return null;if(p&&!/[\s;,.})\]\\]/.test(p))return null;y=!0}return{text:y?s+s:"",selection:[1,1]}}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}})};p.isSaneInsertion=function(e,t){var n=e.getCursorPosition(),r=new s(t,n.row,n.column);if(!this.$matchTokenType(r.getCurrentToken()||"text",u)){var i=new s(t,n.row,n.column+1);if(!this.$matchTokenType(i.getCurrentToken()||"text",u))return!1}return r.stepForward(),r.getCurrentTokenRow()!==n.row||this.$matchTokenType(r.getCurrentToken()||"text",a)},p.$matchTokenType=function(e,t){return t.indexOf(e.type||e)>-1},p.recordAutoInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isAutoInsertedClosing(r,i,f.autoInsertedLineEnd[0])||(f.autoInsertedBrackets=0),f.autoInsertedRow=r.row,f.autoInsertedLineEnd=n+i.substr(r.column),f.autoInsertedBrackets++},p.recordMaybeInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isMaybeInsertedClosing(r,i)||(f.maybeInsertedBrackets=0),f.maybeInsertedRow=r.row,f.maybeInsertedLineStart=i.substr(0,r.column)+n,f.maybeInsertedLineEnd=i.substr(r.column),f.maybeInsertedBrackets++},p.isAutoInsertedClosing=function(e,t,n){return f.autoInsertedBrackets>0&&e.row===f.autoInsertedRow&&n===f.autoInsertedLineEnd[0]&&t.substr(e.column)===f.autoInsertedLineEnd},p.isMaybeInsertedClosing=function(e,t){return f.maybeInsertedBrackets>0&&e.row===f.maybeInsertedRow&&t.substr(e.column)===f.maybeInsertedLineEnd&&t.substr(0,e.column)==f.maybeInsertedLineStart},p.popAutoInsertedClosing=function(){f.autoInsertedLineEnd=f.autoInsertedLineEnd.substr(1),f.autoInsertedBrackets--},p.clearMaybeInsertedClosing=function(){f&&(f.maybeInsertedBrackets=0,f.maybeInsertedRow=-1)},r.inherits(p,i),t.CstyleBehaviour=p}),ace.define("ace/mode/behaviour/css",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/mode/behaviour/cstyle","ace/token_iterator"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("./cstyle").CstyleBehaviour,o=e("../../token_iterator").TokenIterator,u=function(){this.inherit(s),this.add("colon","insertion",function(e,t,n,r,i){if(i===":"){var s=n.getCursorPosition(),u=new o(r,s.row,s.column),a=u.getCurrentToken();a&&a.value.match(/\s+/)&&(a=u.stepBackward());if(a&&a.type==="support.type"){var f=r.doc.getLine(s.row),l=f.substring(s.column,s.column+1);if(l===":")return{text:"",selection:[1,1]};if(!f.substring(s.column).match(/^\s*;/))return{text:":;",selection:[1,1]}}}}),this.add("colon","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s===":"){var u=n.getCursorPosition(),a=new o(r,u.row,u.column),f=a.getCurrentToken();f&&f.value.match(/\s+/)&&(f=a.stepBackward());if(f&&f.type==="support.type"){var l=r.doc.getLine(i.start.row),c=l.substring(i.end.column,i.end.column+1);if(c===";")return i.end.column++,i}}}),this.add("semicolon","insertion",function(e,t,n,r,i){if(i===";"){var s=n.getCursorPosition(),o=r.doc.getLine(s.row),u=o.substring(s.column,s.column+1);if(u===";")return{text:"",selection:[1,1]}}})};r.inherits(u,s),t.CssBehaviour=u}),ace.define("ace/mode/folding/cstyle",["require","exports","module","ace/lib/oop","ace/range","ace/mode/folding/fold_mode"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../../range").Range,s=e("./fold_mode").FoldMode,o=t.FoldMode=function(e){e&&(this.foldingStartMarker=new RegExp(this.foldingStartMarker.source.replace(/\|[^|]*?$/,"|"+e.start)),this.foldingStopMarker=new RegExp(this.foldingStopMarker.source.replace(/\|[^|]*?$/,"|"+e.end)))};r.inherits(o,s),function(){this.foldingStartMarker=/(\{|\[)[^\}\]]*$|^\s*(\/\*)/,this.foldingStopMarker=/^[^\[\{]*(\}|\])|^[\s\*]*(\*\/)/,this.singleLineBlockCommentRe=/^\s*(\/\*).*\*\/\s*$/,this.tripleStarBlockCommentRe=/^\s*(\/\*\*\*).*\*\/\s*$/,this.startRegionRe=/^\s*(\/\*|\/\/)#?region\b/,this._getFoldWidgetBase=this.getFoldWidget,this.getFoldWidget=function(e,t,n){var r=e.getLine(n);if(this.singleLineBlockCommentRe.test(r)&&!this.startRegionRe.test(r)&&!this.tripleStarBlockCommentRe.test(r))return"";var i=this._getFoldWidgetBase(e,t,n);return!i&&this.startRegionRe.test(r)?"start":i},this.getFoldWidgetRange=function(e,t,n,r){var i=e.getLine(n);if(this.startRegionRe.test(i))return this.getCommentRegionBlock(e,i,n);var s=i.match(this.foldingStartMarker);if(s){var o=s.index;if(s[1])return this.openingBracketBlock(e,s[1],n,o);var u=e.getCommentFoldRange(n,o+s[0].length,1);return u&&!u.isMultiLine()&&(r?u=this.getSectionRange(e,n):t!="all"&&(u=null)),u}if(t==="markbegin")return;var s=i.match(this.foldingStopMarker);if(s){var o=s.index+s[0].length;return s[1]?this.closingBracketBlock(e,s[1],n,o):e.getCommentFoldRange(n,o,-1)}},this.getSectionRange=function(e,t){var n=e.getLine(t),r=n.search(/\S/),s=t,o=n.length;t+=1;var u=t,a=e.getLength();while(++tf)break;var l=this.getFoldWidgetRange(e,"all",t);if(l){if(l.start.row<=s)break;if(l.isMultiLine())t=l.end.row;else if(r==f)break}u=t}return new i(s,o,u,e.getLine(u).length)},this.getCommentRegionBlock=function(e,t,n){var r=t.search(/\s*$/),s=e.getLength(),o=n,u=/^\s*(?:\/\*|\/\/|--)#?(end)?region\b/,a=1;while(++no)return new i(o,r,l,t.length)}}.call(o.prototype)}),ace.define("ace/mode/css",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/css_highlight_rules","ace/mode/matching_brace_outdent","ace/worker/worker_client","ace/mode/css_completions","ace/mode/behaviour/css","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./css_highlight_rules").CssHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../worker/worker_client").WorkerClient,a=e("./css_completions").CssCompletions,f=e("./behaviour/css").CssBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.$completer=new a,this.foldingRules=new l};r.inherits(c,i),function(){this.foldingRules="cStyle",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e).tokens;if(i.length&&i[i.length-1].type=="comment")return r;var s=t.match(/^.*\{\s*$/);return s&&(r+=n),r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.getCompletions=function(e,t,n,r){return this.$completer.getCompletions(e,t,n,r)},this.createWorker=function(e){var t=new u(["ace"],"ace/mode/css_worker","Worker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/css"}.call(c.prototype),t.Mode=c}) \ No newline at end of file diff --git a/docs/ace-1.2.3/mode-html.js b/docs/ace-1.2.3/mode-html.js deleted file mode 100755 index ec4be71ac..000000000 --- a/docs/ace-1.2.3/mode-html.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/mode/doc_comment_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text_highlight_rules").TextHighlightRules,s=function(){this.$rules={start:[{token:"comment.doc.tag",regex:"@[\\w\\d_]+"},s.getTagRule(),{defaultToken:"comment.doc",caseInsensitive:!0}]}};r.inherits(s,i),s.getTagRule=function(e){return{token:"comment.doc.tag.storage.type",regex:"\\b(?:TODO|FIXME|XXX|HACK)\\b"}},s.getStartRule=function(e){return{token:"comment.doc",regex:"\\/\\*(?=\\*)",next:e}},s.getEndRule=function(e){return{token:"comment.doc",regex:"\\*\\/",next:e}},t.DocCommentHighlightRules=s}),ace.define("ace/mode/javascript_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/doc_comment_highlight_rules","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";function a(){var e=o.replace("\\d","\\d\\-"),t={onMatch:function(e,t,n){var r=e.charAt(1)=="/"?2:1;if(r==1)t!=this.nextState?n.unshift(this.next,this.nextState,0):n.unshift(this.next),n[2]++;else if(r==2&&t==this.nextState){n[1]--;if(!n[1]||n[1]<0)n.shift(),n.shift()}return[{type:"meta.tag.punctuation."+(r==1?"":"end-")+"tag-open.xml",value:e.slice(0,r)},{type:"meta.tag.tag-name.xml",value:e.substr(r)}]},regex:"",onMatch:function(e,t,n){return t==n[0]&&n.shift(),e.length==2&&(n[0]==this.nextState&&n[1]--,(!n[1]||n[1]<0)&&n.splice(0,2)),this.next=n[0]||"start",[{type:this.token,value:e}]},nextState:"jsx"},n,f("jsxAttributes"),{token:"entity.other.attribute-name.xml",regex:e},{token:"keyword.operator.attribute-equals.xml",regex:"="},{token:"text.tag-whitespace.xml",regex:"\\s+"},{token:"string.attribute-value.xml",regex:"'",stateName:"jsx_attr_q",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',stateName:"jsx_attr_qq",push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},t],this.$rules.reference=[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}]}function f(e){return[{token:"comment",regex:/\/\*/,next:[i.getTagRule(),{token:"comment",regex:"\\*\\/",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]},{token:"comment",regex:"\\/\\/",next:[i.getTagRule(),{token:"comment",regex:"$|^",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]}]}var r=e("../lib/oop"),i=e("./doc_comment_highlight_rules").DocCommentHighlightRules,s=e("./text_highlight_rules").TextHighlightRules,o="[a-zA-Z\\$_\u00a1-\uffff][a-zA-Z\\d\\$_\u00a1-\uffff]*",u=function(e){var t=this.createKeywordMapper({"variable.language":"Array|Boolean|Date|Function|Iterator|Number|Object|RegExp|String|Proxy|Namespace|QName|XML|XMLList|ArrayBuffer|Float32Array|Float64Array|Int16Array|Int32Array|Int8Array|Uint16Array|Uint32Array|Uint8Array|Uint8ClampedArray|Error|EvalError|InternalError|RangeError|ReferenceError|StopIteration|SyntaxError|TypeError|URIError|decodeURI|decodeURIComponent|encodeURI|encodeURIComponent|eval|isFinite|isNaN|parseFloat|parseInt|JSON|Math|this|arguments|prototype|window|document",keyword:"const|yield|import|get|set|async|await|break|case|catch|continue|default|delete|do|else|finally|for|function|if|in|instanceof|new|return|switch|throw|try|typeof|let|var|while|with|debugger|__parent__|__count__|escape|unescape|with|__proto__|class|enum|extends|super|export|implements|private|public|interface|package|protected|static","storage.type":"const|let|var|function","constant.language":"null|Infinity|NaN|undefined","support.function":"alert","constant.language.boolean":"true|false"},"identifier"),n="case|do|else|finally|in|instanceof|return|throw|try|typeof|yield|void",r="\\\\(?:x[0-9a-fA-F]{2}|u[0-9a-fA-F]{4}|u{[0-9a-fA-F]{1,6}}|[0-2][0-7]{0,2}|3[0-7][0-7]?|[4-7][0-7]?|.)";this.$rules={no_regex:[i.getStartRule("doc-start"),f("no_regex"),{token:"string",regex:"'(?=.)",next:"qstring"},{token:"string",regex:'"(?=.)',next:"qqstring"},{token:"constant.numeric",regex:/0(?:[xX][0-9a-fA-F]+|[bB][01]+)\b/},{token:"constant.numeric",regex:/[+-]?\d[\d_]*(?:(?:\.\d*)?(?:[eE][+-]?\d+)?)?\b/},{token:["storage.type","punctuation.operator","support.function","punctuation.operator","entity.name.function","text","keyword.operator"],regex:"("+o+")(\\.)(prototype)(\\.)("+o+")(\\s*)(=)",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s+)(\\w+)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","text","entity.name.function","text","paren.lparen"],regex:"(function)(\\s+)("+o+")(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","punctuation.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["text","text","storage.type","text","paren.lparen"],regex:"(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:"keyword",regex:"(?:"+n+")\\b",next:"start"},{token:["support.constant"],regex:/that\b/},{token:["storage.type","punctuation.operator","support.function.firebug"],regex:/(console)(\.)(warn|info|log|error|time|trace|timeEnd|assert)\b/},{token:t,regex:o},{token:"punctuation.operator",regex:/[.](?![.])/,next:"property"},{token:"keyword.operator",regex:/--|\+\+|\.{3}|===|==|=|!=|!==|<+=?|>+=?|!|&&|\|\||\?\:|[!$%&*+\-~\/^]=?/,next:"start"},{token:"punctuation.operator",regex:/[?:,;.]/,next:"start"},{token:"paren.lparen",regex:/[\[({]/,next:"start"},{token:"paren.rparen",regex:/[\])}]/},{token:"comment",regex:/^#!.*$/}],property:[{token:"text",regex:"\\s+"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(?:(\\s+)(\\w+))?(\\s*)(\\()",next:"function_arguments"},{token:"punctuation.operator",regex:/[.](?![.])/},{token:"support.function",regex:/(s(?:h(?:ift|ow(?:Mod(?:elessDialog|alDialog)|Help))|croll(?:X|By(?:Pages|Lines)?|Y|To)?|t(?:op|rike)|i(?:n|zeToContent|debar|gnText)|ort|u(?:p|b(?:str(?:ing)?)?)|pli(?:ce|t)|e(?:nd|t(?:Re(?:sizable|questHeader)|M(?:i(?:nutes|lliseconds)|onth)|Seconds|Ho(?:tKeys|urs)|Year|Cursor|Time(?:out)?|Interval|ZOptions|Date|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Date|FullYear)|FullYear|Active)|arch)|qrt|lice|avePreferences|mall)|h(?:ome|andleEvent)|navigate|c(?:har(?:CodeAt|At)|o(?:s|n(?:cat|textual|firm)|mpile)|eil|lear(?:Timeout|Interval)?|a(?:ptureEvents|ll)|reate(?:StyleSheet|Popup|EventObject))|t(?:o(?:GMTString|S(?:tring|ource)|U(?:TCString|pperCase)|Lo(?:caleString|werCase))|est|a(?:n|int(?:Enabled)?))|i(?:s(?:NaN|Finite)|ndexOf|talics)|d(?:isableExternalCapture|ump|etachEvent)|u(?:n(?:shift|taint|escape|watch)|pdateCommands)|j(?:oin|avaEnabled)|p(?:o(?:p|w)|ush|lugins.refresh|a(?:ddings|rse(?:Int|Float)?)|r(?:int|ompt|eference))|e(?:scape|nableExternalCapture|val|lementFromPoint|x(?:p|ec(?:Script|Command)?))|valueOf|UTC|queryCommand(?:State|Indeterm|Enabled|Value)|f(?:i(?:nd|le(?:ModifiedDate|Size|CreatedDate|UpdatedDate)|xed)|o(?:nt(?:size|color)|rward)|loor|romCharCode)|watch|l(?:ink|o(?:ad|g)|astIndexOf)|a(?:sin|nchor|cos|t(?:tachEvent|ob|an(?:2)?)|pply|lert|b(?:s|ort))|r(?:ou(?:nd|teEvents)|e(?:size(?:By|To)|calc|turnValue|place|verse|l(?:oad|ease(?:Capture|Events)))|andom)|g(?:o|et(?:ResponseHeader|M(?:i(?:nutes|lliseconds)|onth)|Se(?:conds|lection)|Hours|Year|Time(?:zoneOffset)?|Da(?:y|te)|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Da(?:y|te)|FullYear)|FullYear|A(?:ttention|llResponseHeaders)))|m(?:in|ove(?:B(?:y|elow)|To(?:Absolute)?|Above)|ergeAttributes|a(?:tch|rgins|x))|b(?:toa|ig|o(?:ld|rderWidths)|link|ack))\b(?=\()/},{token:"support.function.dom",regex:/(s(?:ub(?:stringData|mit)|plitText|e(?:t(?:NamedItem|Attribute(?:Node)?)|lect))|has(?:ChildNodes|Feature)|namedItem|c(?:l(?:ick|o(?:se|neNode))|reate(?:C(?:omment|DATASection|aption)|T(?:Head|extNode|Foot)|DocumentFragment|ProcessingInstruction|E(?:ntityReference|lement)|Attribute))|tabIndex|i(?:nsert(?:Row|Before|Cell|Data)|tem)|open|delete(?:Row|C(?:ell|aption)|T(?:Head|Foot)|Data)|focus|write(?:ln)?|a(?:dd|ppend(?:Child|Data))|re(?:set|place(?:Child|Data)|move(?:NamedItem|Child|Attribute(?:Node)?)?)|get(?:NamedItem|Element(?:sBy(?:Name|TagName|ClassName)|ById)|Attribute(?:Node)?)|blur)\b(?=\()/},{token:"support.constant",regex:/(s(?:ystemLanguage|cr(?:ipts|ollbars|een(?:X|Y|Top|Left))|t(?:yle(?:Sheets)?|atus(?:Text|bar)?)|ibling(?:Below|Above)|ource|uffixes|e(?:curity(?:Policy)?|l(?:ection|f)))|h(?:istory|ost(?:name)?|as(?:h|Focus))|y|X(?:MLDocument|SLDocument)|n(?:ext|ame(?:space(?:s|URI)|Prop))|M(?:IN_VALUE|AX_VALUE)|c(?:haracterSet|o(?:n(?:structor|trollers)|okieEnabled|lorDepth|mp(?:onents|lete))|urrent|puClass|l(?:i(?:p(?:boardData)?|entInformation)|osed|asses)|alle(?:e|r)|rypto)|t(?:o(?:olbar|p)|ext(?:Transform|Indent|Decoration|Align)|ags)|SQRT(?:1_2|2)|i(?:n(?:ner(?:Height|Width)|put)|ds|gnoreCase)|zIndex|o(?:scpu|n(?:readystatechange|Line)|uter(?:Height|Width)|p(?:sProfile|ener)|ffscreenBuffering)|NEGATIVE_INFINITY|d(?:i(?:splay|alog(?:Height|Top|Width|Left|Arguments)|rectories)|e(?:scription|fault(?:Status|Ch(?:ecked|arset)|View)))|u(?:ser(?:Profile|Language|Agent)|n(?:iqueID|defined)|pdateInterval)|_content|p(?:ixelDepth|ort|ersonalbar|kcs11|l(?:ugins|atform)|a(?:thname|dding(?:Right|Bottom|Top|Left)|rent(?:Window|Layer)?|ge(?:X(?:Offset)?|Y(?:Offset)?))|r(?:o(?:to(?:col|type)|duct(?:Sub)?|mpter)|e(?:vious|fix)))|e(?:n(?:coding|abledPlugin)|x(?:ternal|pando)|mbeds)|v(?:isibility|endor(?:Sub)?|Linkcolor)|URLUnencoded|P(?:I|OSITIVE_INFINITY)|f(?:ilename|o(?:nt(?:Size|Family|Weight)|rmName)|rame(?:s|Element)|gColor)|E|whiteSpace|l(?:i(?:stStyleType|n(?:eHeight|kColor))|o(?:ca(?:tion(?:bar)?|lName)|wsrc)|e(?:ngth|ft(?:Context)?)|a(?:st(?:M(?:odified|atch)|Index|Paren)|yer(?:s|X)|nguage))|a(?:pp(?:MinorVersion|Name|Co(?:deName|re)|Version)|vail(?:Height|Top|Width|Left)|ll|r(?:ity|guments)|Linkcolor|bove)|r(?:ight(?:Context)?|e(?:sponse(?:XML|Text)|adyState))|global|x|m(?:imeTypes|ultiline|enubar|argin(?:Right|Bottom|Top|Left))|L(?:N(?:10|2)|OG(?:10E|2E))|b(?:o(?:ttom|rder(?:Width|RightWidth|BottomWidth|Style|Color|TopWidth|LeftWidth))|ufferDepth|elow|ackground(?:Color|Image)))\b/},{token:"identifier",regex:o},{regex:"",token:"empty",next:"no_regex"}],start:[i.getStartRule("doc-start"),f("start"),{token:"string.regexp",regex:"\\/",next:"regex"},{token:"text",regex:"\\s+|^$",next:"start"},{token:"empty",regex:"",next:"no_regex"}],regex:[{token:"regexp.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"string.regexp",regex:"/[sxngimy]*",next:"no_regex"},{token:"invalid",regex:/\{\d+\b,?\d*\}[+*]|[+*$^?][+*]|[$^][?]|\?{3,}/},{token:"constant.language.escape",regex:/\(\?[:=!]|\)|\{\d+\b,?\d*\}|[+*]\?|[()$^+*?.]/},{token:"constant.language.delimiter",regex:/\|/},{token:"constant.language.escape",regex:/\[\^?/,next:"regex_character_class"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp"}],regex_character_class:[{token:"regexp.charclass.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"constant.language.escape",regex:"]",next:"regex"},{token:"constant.language.escape",regex:"-"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp.charachterclass"}],function_arguments:[{token:"variable.parameter",regex:o},{token:"punctuation.operator",regex:"[, ]+"},{token:"punctuation.operator",regex:"$"},{token:"empty",regex:"",next:"no_regex"}],qqstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qqstring"},{token:"string",regex:'"|$',next:"no_regex"},{defaultToken:"string"}],qstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qstring"},{token:"string",regex:"'|$",next:"no_regex"},{defaultToken:"string"}]};if(!e||!e.noES6)this.$rules.no_regex.unshift({regex:"[{}]",onMatch:function(e,t,n){this.next=e=="{"?this.nextState:"";if(e=="{"&&n.length)n.unshift("start",t);else if(e=="}"&&n.length){n.shift(),this.next=n.shift();if(this.next.indexOf("string")!=-1||this.next.indexOf("jsx")!=-1)return"paren.quasi.end"}return e=="{"?"paren.lparen":"paren.rparen"},nextState:"start"},{token:"string.quasi.start",regex:/`/,push:[{token:"constant.language.escape",regex:r},{token:"paren.quasi.start",regex:/\${/,push:"start"},{token:"string.quasi.end",regex:/`/,next:"pop"},{defaultToken:"string.quasi"}]}),(!e||!e.noJSX)&&a.call(this);this.embedRules(i,"doc-",[i.getEndRule("no_regex")]),this.normalizeRules()};r.inherits(u,s),t.JavaScriptHighlightRules=u}),ace.define("ace/mode/matching_brace_outdent",["require","exports","module","ace/range"],function(e,t,n){"use strict";var r=e("../range").Range,i=function(){};(function(){this.checkOutdent=function(e,t){return/^\s+$/.test(e)?/^\s*\}/.test(t):!1},this.autoOutdent=function(e,t){var n=e.getLine(t),i=n.match(/^(\s*\})/);if(!i)return 0;var s=i[1].length,o=e.findMatchingBracket({row:t,column:s});if(!o||o.row==t)return 0;var u=this.$getIndent(e.getLine(o.row));e.replace(new r(t,0,t,s-1),u)},this.$getIndent=function(e){return e.match(/^\s*/)[0]}}).call(i.prototype),t.MatchingBraceOutdent=i}),ace.define("ace/mode/behaviour/cstyle",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),u=["text","paren.rparen","punctuation.operator"],a=["text","paren.rparen","punctuation.operator","comment"],f,l={},c=function(e){var t=-1;e.multiSelect&&(t=e.selection.index,l.rangeCount!=e.multiSelect.rangeCount&&(l={rangeCount:e.multiSelect.rangeCount}));if(l[t])return f=l[t];f=l[t]={autoInsertedBrackets:0,autoInsertedRow:-1,autoInsertedLineEnd:"",maybeInsertedBrackets:0,maybeInsertedRow:-1,maybeInsertedLineStart:"",maybeInsertedLineEnd:""}},h=function(e,t,n,r){var i=e.end.row-e.start.row;return{text:n+t+r,selection:[0,e.start.column+1,i,e.end.column+(i?0:1)]}},p=function(){this.add("braces","insertion",function(e,t,n,r,i){var s=n.getCursorPosition(),u=r.doc.getLine(s.row);if(i=="{"){c(n);var a=n.getSelectionRange(),l=r.doc.getTextRange(a);if(l!==""&&l!=="{"&&n.getWrapBehavioursEnabled())return h(a,l,"{","}");if(p.isSaneInsertion(n,r))return/[\]\}\)]/.test(u[s.column])||n.inMultiSelectMode?(p.recordAutoInsert(n,r,"}"),{text:"{}",selection:[1,1]}):(p.recordMaybeInsert(n,r,"{"),{text:"{",selection:[1,1]})}else if(i=="}"){c(n);var d=u.substring(s.column,s.column+1);if(d=="}"){var v=r.$findOpeningBracket("}",{column:s.column+1,row:s.row});if(v!==null&&p.isAutoInsertedClosing(s,u,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}else{if(i=="\n"||i=="\r\n"){c(n);var m="";p.isMaybeInsertedClosing(s,u)&&(m=o.stringRepeat("}",f.maybeInsertedBrackets),p.clearMaybeInsertedClosing());var d=u.substring(s.column,s.column+1);if(d==="}"){var g=r.findMatchingBracket({row:s.row,column:s.column+1},"}");if(!g)return null;var y=this.$getIndent(r.getLine(g.row))}else{if(!m){p.clearMaybeInsertedClosing();return}var y=this.$getIndent(u)}var b=y+r.getTabString();return{text:"\n"+b+"\n"+y+m,selection:[1,b.length,1,b.length]}}p.clearMaybeInsertedClosing()}}),this.add("braces","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="{"){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.end.column,i.end.column+1);if(u=="}")return i.end.column++,i;f.maybeInsertedBrackets--}}),this.add("parens","insertion",function(e,t,n,r,i){if(i=="("){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"(",")");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,")"),{text:"()",selection:[1,1]}}else if(i==")"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f==")"){var l=r.$findOpeningBracket(")",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("parens","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="("){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==")")return i.end.column++,i}}),this.add("brackets","insertion",function(e,t,n,r,i){if(i=="["){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"[","]");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,"]"),{text:"[]",selection:[1,1]}}else if(i=="]"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f=="]"){var l=r.$findOpeningBracket("]",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("brackets","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="["){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u=="]")return i.end.column++,i}}),this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){c(n);var s=i,o=n.getSelectionRange(),u=r.doc.getTextRange(o);if(u!==""&&u!=="'"&&u!='"'&&n.getWrapBehavioursEnabled())return h(o,u,s,s);if(!u){var a=n.getCursorPosition(),f=r.doc.getLine(a.row),l=f.substring(a.column-1,a.column),p=f.substring(a.column,a.column+1),d=r.getTokenAt(a.row,a.column),v=r.getTokenAt(a.row,a.column+1);if(l=="\\"&&d&&/escape/.test(d.type))return null;var m=d&&/string|escape/.test(d.type),g=!v||/string|escape/.test(v.type),y;if(p==s)y=m!==g;else{if(m&&!g)return null;if(m&&g)return null;var b=r.$mode.tokenRe;b.lastIndex=0;var w=b.test(l);b.lastIndex=0;var E=b.test(l);if(w||E)return null;if(p&&!/[\s;,.})\]\\]/.test(p))return null;y=!0}return{text:y?s+s:"",selection:[1,1]}}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}})};p.isSaneInsertion=function(e,t){var n=e.getCursorPosition(),r=new s(t,n.row,n.column);if(!this.$matchTokenType(r.getCurrentToken()||"text",u)){var i=new s(t,n.row,n.column+1);if(!this.$matchTokenType(i.getCurrentToken()||"text",u))return!1}return r.stepForward(),r.getCurrentTokenRow()!==n.row||this.$matchTokenType(r.getCurrentToken()||"text",a)},p.$matchTokenType=function(e,t){return t.indexOf(e.type||e)>-1},p.recordAutoInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isAutoInsertedClosing(r,i,f.autoInsertedLineEnd[0])||(f.autoInsertedBrackets=0),f.autoInsertedRow=r.row,f.autoInsertedLineEnd=n+i.substr(r.column),f.autoInsertedBrackets++},p.recordMaybeInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isMaybeInsertedClosing(r,i)||(f.maybeInsertedBrackets=0),f.maybeInsertedRow=r.row,f.maybeInsertedLineStart=i.substr(0,r.column)+n,f.maybeInsertedLineEnd=i.substr(r.column),f.maybeInsertedBrackets++},p.isAutoInsertedClosing=function(e,t,n){return f.autoInsertedBrackets>0&&e.row===f.autoInsertedRow&&n===f.autoInsertedLineEnd[0]&&t.substr(e.column)===f.autoInsertedLineEnd},p.isMaybeInsertedClosing=function(e,t){return f.maybeInsertedBrackets>0&&e.row===f.maybeInsertedRow&&t.substr(e.column)===f.maybeInsertedLineEnd&&t.substr(0,e.column)==f.maybeInsertedLineStart},p.popAutoInsertedClosing=function(){f.autoInsertedLineEnd=f.autoInsertedLineEnd.substr(1),f.autoInsertedBrackets--},p.clearMaybeInsertedClosing=function(){f&&(f.maybeInsertedBrackets=0,f.maybeInsertedRow=-1)},r.inherits(p,i),t.CstyleBehaviour=p}),ace.define("ace/mode/folding/cstyle",["require","exports","module","ace/lib/oop","ace/range","ace/mode/folding/fold_mode"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../../range").Range,s=e("./fold_mode").FoldMode,o=t.FoldMode=function(e){e&&(this.foldingStartMarker=new RegExp(this.foldingStartMarker.source.replace(/\|[^|]*?$/,"|"+e.start)),this.foldingStopMarker=new RegExp(this.foldingStopMarker.source.replace(/\|[^|]*?$/,"|"+e.end)))};r.inherits(o,s),function(){this.foldingStartMarker=/(\{|\[)[^\}\]]*$|^\s*(\/\*)/,this.foldingStopMarker=/^[^\[\{]*(\}|\])|^[\s\*]*(\*\/)/,this.singleLineBlockCommentRe=/^\s*(\/\*).*\*\/\s*$/,this.tripleStarBlockCommentRe=/^\s*(\/\*\*\*).*\*\/\s*$/,this.startRegionRe=/^\s*(\/\*|\/\/)#?region\b/,this._getFoldWidgetBase=this.getFoldWidget,this.getFoldWidget=function(e,t,n){var r=e.getLine(n);if(this.singleLineBlockCommentRe.test(r)&&!this.startRegionRe.test(r)&&!this.tripleStarBlockCommentRe.test(r))return"";var i=this._getFoldWidgetBase(e,t,n);return!i&&this.startRegionRe.test(r)?"start":i},this.getFoldWidgetRange=function(e,t,n,r){var i=e.getLine(n);if(this.startRegionRe.test(i))return this.getCommentRegionBlock(e,i,n);var s=i.match(this.foldingStartMarker);if(s){var o=s.index;if(s[1])return this.openingBracketBlock(e,s[1],n,o);var u=e.getCommentFoldRange(n,o+s[0].length,1);return u&&!u.isMultiLine()&&(r?u=this.getSectionRange(e,n):t!="all"&&(u=null)),u}if(t==="markbegin")return;var s=i.match(this.foldingStopMarker);if(s){var o=s.index+s[0].length;return s[1]?this.closingBracketBlock(e,s[1],n,o):e.getCommentFoldRange(n,o,-1)}},this.getSectionRange=function(e,t){var n=e.getLine(t),r=n.search(/\S/),s=t,o=n.length;t+=1;var u=t,a=e.getLength();while(++tf)break;var l=this.getFoldWidgetRange(e,"all",t);if(l){if(l.start.row<=s)break;if(l.isMultiLine())t=l.end.row;else if(r==f)break}u=t}return new i(s,o,u,e.getLine(u).length)},this.getCommentRegionBlock=function(e,t,n){var r=t.search(/\s*$/),s=e.getLength(),o=n,u=/^\s*(?:\/\*|\/\/|--)#?(end)?region\b/,a=1;while(++no)return new i(o,r,l,t.length)}}.call(o.prototype)}),ace.define("ace/mode/javascript",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/javascript_highlight_rules","ace/mode/matching_brace_outdent","ace/range","ace/worker/worker_client","ace/mode/behaviour/cstyle","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./javascript_highlight_rules").JavaScriptHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../range").Range,a=e("../worker/worker_client").WorkerClient,f=e("./behaviour/cstyle").CstyleBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.foldingRules=new l};r.inherits(c,i),function(){this.lineCommentStart="//",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e),s=i.tokens,o=i.state;if(s.length&&s[s.length-1].type=="comment")return r;if(e=="start"||e=="no_regex"){var u=t.match(/^.*(?:\bcase\b.*\:|[\{\(\[])\s*$/);u&&(r+=n)}else if(e=="doc-start"){if(o=="start"||o=="no_regex")return"";var u=t.match(/^\s*(\/?)\*/);u&&(u[1]&&(r+=" "),r+="* ")}return r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.createWorker=function(e){var t=new a(["ace"],"ace/mode/javascript_worker","JavaScriptWorker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/javascript"}.call(c.prototype),t.Mode=c}),ace.define("ace/mode/css_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=t.supportType="align-content|align-items|align-self|all|animation|animation-delay|animation-direction|animation-duration|animation-fill-mode|animation-iteration-count|animation-name|animation-play-state|animation-timing-function|backface-visibility|background|background-attachment|background-blend-mode|background-clip|background-color|background-image|background-origin|background-position|background-repeat|background-size|border|border-bottom|border-bottom-color|border-bottom-left-radius|border-bottom-right-radius|border-bottom-style|border-bottom-width|border-collapse|border-color|border-image|border-image-outset|border-image-repeat|border-image-slice|border-image-source|border-image-width|border-left|border-left-color|border-left-style|border-left-width|border-radius|border-right|border-right-color|border-right-style|border-right-width|border-spacing|border-style|border-top|border-top-color|border-top-left-radius|border-top-right-radius|border-top-style|border-top-width|border-width|bottom|box-shadow|box-sizing|caption-side|clear|clip|color|column-count|column-fill|column-gap|column-rule|column-rule-color|column-rule-style|column-rule-width|column-span|column-width|columns|content|counter-increment|counter-reset|cursor|direction|display|empty-cells|filter|flex|flex-basis|flex-direction|flex-flow|flex-grow|flex-shrink|flex-wrap|float|font|font-family|font-size|font-size-adjust|font-stretch|font-style|font-variant|font-weight|hanging-punctuation|height|justify-content|left|letter-spacing|line-height|list-style|list-style-image|list-style-position|list-style-type|margin|margin-bottom|margin-left|margin-right|margin-top|max-height|max-width|min-height|min-width|nav-down|nav-index|nav-left|nav-right|nav-up|opacity|order|outline|outline-color|outline-offset|outline-style|outline-width|overflow|overflow-x|overflow-y|padding|padding-bottom|padding-left|padding-right|padding-top|page-break-after|page-break-before|page-break-inside|perspective|perspective-origin|position|quotes|resize|right|tab-size|table-layout|text-align|text-align-last|text-decoration|text-decoration-color|text-decoration-line|text-decoration-style|text-indent|text-justify|text-overflow|text-shadow|text-transform|top|transform|transform-origin|transform-style|transition|transition-delay|transition-duration|transition-property|transition-timing-function|unicode-bidi|vertical-align|visibility|white-space|width|word-break|word-spacing|word-wrap|z-index",u=t.supportFunction="rgb|rgba|url|attr|counter|counters",a=t.supportConstant="absolute|after-edge|after|all-scroll|all|alphabetic|always|antialiased|armenian|auto|avoid-column|avoid-page|avoid|balance|baseline|before-edge|before|below|bidi-override|block-line-height|block|bold|bolder|border-box|both|bottom|box|break-all|break-word|capitalize|caps-height|caption|center|central|char|circle|cjk-ideographic|clone|close-quote|col-resize|collapse|column|consider-shifts|contain|content-box|cover|crosshair|cubic-bezier|dashed|decimal-leading-zero|decimal|default|disabled|disc|disregard-shifts|distribute-all-lines|distribute-letter|distribute-space|distribute|dotted|double|e-resize|ease-in|ease-in-out|ease-out|ease|ellipsis|end|exclude-ruby|fill|fixed|georgian|glyphs|grid-height|groove|hand|hanging|hebrew|help|hidden|hiragana-iroha|hiragana|horizontal|icon|ideograph-alpha|ideograph-numeric|ideograph-parenthesis|ideograph-space|ideographic|inactive|include-ruby|inherit|initial|inline-block|inline-box|inline-line-height|inline-table|inline|inset|inside|inter-ideograph|inter-word|invert|italic|justify|katakana-iroha|katakana|keep-all|last|left|lighter|line-edge|line-through|line|linear|list-item|local|loose|lower-alpha|lower-greek|lower-latin|lower-roman|lowercase|lr-tb|ltr|mathematical|max-height|max-size|medium|menu|message-box|middle|move|n-resize|ne-resize|newspaper|no-change|no-close-quote|no-drop|no-open-quote|no-repeat|none|normal|not-allowed|nowrap|nw-resize|oblique|open-quote|outset|outside|overline|padding-box|page|pointer|pre-line|pre-wrap|pre|preserve-3d|progress|relative|repeat-x|repeat-y|repeat|replaced|reset-size|ridge|right|round|row-resize|rtl|s-resize|scroll|se-resize|separate|slice|small-caps|small-caption|solid|space|square|start|static|status-bar|step-end|step-start|steps|stretch|strict|sub|super|sw-resize|table-caption|table-cell|table-column-group|table-column|table-footer-group|table-header-group|table-row-group|table-row|table|tb-rl|text-after-edge|text-before-edge|text-bottom|text-size|text-top|text|thick|thin|transparent|underline|upper-alpha|upper-latin|upper-roman|uppercase|use-script|vertical-ideographic|vertical-text|visible|w-resize|wait|whitespace|z-index|zero",f=t.supportConstantColor="aqua|black|blue|fuchsia|gray|green|lime|maroon|navy|olive|orange|purple|red|silver|teal|white|yellow",l=t.supportConstantFonts="arial|century|comic|courier|cursive|fantasy|garamond|georgia|helvetica|impact|lucida|symbol|system|tahoma|times|trebuchet|utopia|verdana|webdings|sans-serif|serif|monospace",c=t.numRe="\\-?(?:(?:[0-9]+)|(?:[0-9]*\\.[0-9]+))",h=t.pseudoElements="(\\:+)\\b(after|before|first-letter|first-line|moz-selection|selection)\\b",p=t.pseudoClasses="(:)\\b(active|checked|disabled|empty|enabled|first-child|first-of-type|focus|hover|indeterminate|invalid|last-child|last-of-type|link|not|nth-child|nth-last-child|nth-last-of-type|nth-of-type|only-child|only-of-type|required|root|target|valid|visited)\\b",d=function(){var e=this.createKeywordMapper({"support.function":u,"support.constant":a,"support.type":o,"support.constant.color":f,"support.constant.fonts":l},"text",!0);this.$rules={start:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"@.*?{",push:"media"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],media:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"\\}",next:"pop"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],comment:[{token:"comment",regex:"\\*\\/",next:"pop"},{defaultToken:"comment"}],ruleset:[{token:"paren.rparen",regex:"\\}",next:"pop"},{token:"comment",regex:"\\/\\*",push:"comment"},{token:"string",regex:'["](?:(?:\\\\.)|(?:[^"\\\\]))*?["]'},{token:"string",regex:"['](?:(?:\\\\.)|(?:[^'\\\\]))*?[']"},{token:["constant.numeric","keyword"],regex:"("+c+")(ch|cm|deg|em|ex|fr|gd|grad|Hz|in|kHz|mm|ms|pc|pt|px|rad|rem|s|turn|vh|vm|vw|%)"},{token:"constant.numeric",regex:c},{token:"constant.numeric",regex:"#[a-f0-9]{6}"},{token:"constant.numeric",regex:"#[a-f0-9]{3}"},{token:["punctuation","entity.other.attribute-name.pseudo-element.css"],regex:h},{token:["punctuation","entity.other.attribute-name.pseudo-class.css"],regex:p},{token:["support.function","string","support.function"],regex:"(url\\()(.*)(\\))"},{token:e,regex:"\\-?[a-zA-Z_][a-zA-Z0-9_\\-]*"},{caseInsensitive:!0}]},this.normalizeRules()};r.inherits(d,s),t.CssHighlightRules=d}),ace.define("ace/mode/css_completions",["require","exports","module"],function(e,t,n){"use strict";var r={background:{"#$0":1},"background-color":{"#$0":1,transparent:1,fixed:1},"background-image":{"url('/$0')":1},"background-repeat":{repeat:1,"repeat-x":1,"repeat-y":1,"no-repeat":1,inherit:1},"background-position":{bottom:2,center:2,left:2,right:2,top:2,inherit:2},"background-attachment":{scroll:1,fixed:1},"background-size":{cover:1,contain:1},"background-clip":{"border-box":1,"padding-box":1,"content-box":1},"background-origin":{"border-box":1,"padding-box":1,"content-box":1},border:{"solid $0":1,"dashed $0":1,"dotted $0":1,"#$0":1},"border-color":{"#$0":1},"border-style":{solid:2,dashed:2,dotted:2,"double":2,groove:2,hidden:2,inherit:2,inset:2,none:2,outset:2,ridged:2},"border-collapse":{collapse:1,separate:1},bottom:{px:1,em:1,"%":1},clear:{left:1,right:1,both:1,none:1},color:{"#$0":1,"rgb(#$00,0,0)":1},cursor:{"default":1,pointer:1,move:1,text:1,wait:1,help:1,progress:1,"n-resize":1,"ne-resize":1,"e-resize":1,"se-resize":1,"s-resize":1,"sw-resize":1,"w-resize":1,"nw-resize":1},display:{none:1,block:1,inline:1,"inline-block":1,"table-cell":1},"empty-cells":{show:1,hide:1},"float":{left:1,right:1,none:1},"font-family":{Arial:2,"Comic Sans MS":2,Consolas:2,"Courier New":2,Courier:2,Georgia:2,Monospace:2,"Sans-Serif":2,"Segoe UI":2,Tahoma:2,"Times New Roman":2,"Trebuchet MS":2,Verdana:1},"font-size":{px:1,em:1,"%":1},"font-weight":{bold:1,normal:1},"font-style":{italic:1,normal:1},"font-variant":{normal:1,"small-caps":1},height:{px:1,em:1,"%":1},left:{px:1,em:1,"%":1},"letter-spacing":{normal:1},"line-height":{normal:1},"list-style-type":{none:1,disc:1,circle:1,square:1,decimal:1,"decimal-leading-zero":1,"lower-roman":1,"upper-roman":1,"lower-greek":1,"lower-latin":1,"upper-latin":1,georgian:1,"lower-alpha":1,"upper-alpha":1},margin:{px:1,em:1,"%":1},"margin-right":{px:1,em:1,"%":1},"margin-left":{px:1,em:1,"%":1},"margin-top":{px:1,em:1,"%":1},"margin-bottom":{px:1,em:1,"%":1},"max-height":{px:1,em:1,"%":1},"max-width":{px:1,em:1,"%":1},"min-height":{px:1,em:1,"%":1},"min-width":{px:1,em:1,"%":1},overflow:{hidden:1,visible:1,auto:1,scroll:1},"overflow-x":{hidden:1,visible:1,auto:1,scroll:1},"overflow-y":{hidden:1,visible:1,auto:1,scroll:1},padding:{px:1,em:1,"%":1},"padding-top":{px:1,em:1,"%":1},"padding-right":{px:1,em:1,"%":1},"padding-bottom":{px:1,em:1,"%":1},"padding-left":{px:1,em:1,"%":1},"page-break-after":{auto:1,always:1,avoid:1,left:1,right:1},"page-break-before":{auto:1,always:1,avoid:1,left:1,right:1},position:{absolute:1,relative:1,fixed:1,"static":1},right:{px:1,em:1,"%":1},"table-layout":{fixed:1,auto:1},"text-decoration":{none:1,underline:1,"line-through":1,blink:1},"text-align":{left:1,right:1,center:1,justify:1},"text-transform":{capitalize:1,uppercase:1,lowercase:1,none:1},top:{px:1,em:1,"%":1},"vertical-align":{top:1,bottom:1},visibility:{hidden:1,visible:1},"white-space":{nowrap:1,normal:1,pre:1,"pre-line":1,"pre-wrap":1},width:{px:1,em:1,"%":1},"word-spacing":{normal:1},filter:{"alpha(opacity=$0100)":1},"text-shadow":{"$02px 2px 2px #777":1},"text-overflow":{"ellipsis-word":1,clip:1,ellipsis:1},"-moz-border-radius":1,"-moz-border-radius-topright":1,"-moz-border-radius-bottomright":1,"-moz-border-radius-topleft":1,"-moz-border-radius-bottomleft":1,"-webkit-border-radius":1,"-webkit-border-top-right-radius":1,"-webkit-border-top-left-radius":1,"-webkit-border-bottom-right-radius":1,"-webkit-border-bottom-left-radius":1,"-moz-box-shadow":1,"-webkit-box-shadow":1,transform:{"rotate($00deg)":1,"skew($00deg)":1},"-moz-transform":{"rotate($00deg)":1,"skew($00deg)":1},"-webkit-transform":{"rotate($00deg)":1,"skew($00deg)":1}},i=function(){};(function(){this.completionsDefined=!1,this.defineCompletions=function(){if(document){var e=document.createElement("c").style;for(var t in e){if(typeof e[t]!="string")continue;var n=t.replace(/[A-Z]/g,function(e){return"-"+e.toLowerCase()});r.hasOwnProperty(n)||(r[n]=1)}}this.completionsDefined=!0},this.getCompletions=function(e,t,n,r){this.completionsDefined||this.defineCompletions();var i=t.getTokenAt(n.row,n.column);if(!i)return[];if(e==="ruleset"){var s=t.getLine(n.row).substr(0,n.column);return/:[^;]+$/.test(s)?(/([\w\-]+):[^:]*$/.test(s),this.getPropertyValueCompletions(e,t,n,r)):this.getPropertyCompletions(e,t,n,r)}return[]},this.getPropertyCompletions=function(e,t,n,i){var s=Object.keys(r);return s.map(function(e){return{caption:e,snippet:e+": $0",meta:"property",score:Number.MAX_VALUE}})},this.getPropertyValueCompletions=function(e,t,n,i){var s=t.getLine(n.row).substr(0,n.column),o=(/([\w\-]+):[^:]*$/.exec(s)||{})[1];if(!o)return[];var u=[];return o in r&&typeof r[o]=="object"&&(u=Object.keys(r[o])),u.map(function(e){return{caption:e,snippet:e,meta:"property value",score:Number.MAX_VALUE}})}}).call(i.prototype),t.CssCompletions=i}),ace.define("ace/mode/behaviour/css",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/mode/behaviour/cstyle","ace/token_iterator"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("./cstyle").CstyleBehaviour,o=e("../../token_iterator").TokenIterator,u=function(){this.inherit(s),this.add("colon","insertion",function(e,t,n,r,i){if(i===":"){var s=n.getCursorPosition(),u=new o(r,s.row,s.column),a=u.getCurrentToken();a&&a.value.match(/\s+/)&&(a=u.stepBackward());if(a&&a.type==="support.type"){var f=r.doc.getLine(s.row),l=f.substring(s.column,s.column+1);if(l===":")return{text:"",selection:[1,1]};if(!f.substring(s.column).match(/^\s*;/))return{text:":;",selection:[1,1]}}}}),this.add("colon","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s===":"){var u=n.getCursorPosition(),a=new o(r,u.row,u.column),f=a.getCurrentToken();f&&f.value.match(/\s+/)&&(f=a.stepBackward());if(f&&f.type==="support.type"){var l=r.doc.getLine(i.start.row),c=l.substring(i.end.column,i.end.column+1);if(c===";")return i.end.column++,i}}}),this.add("semicolon","insertion",function(e,t,n,r,i){if(i===";"){var s=n.getCursorPosition(),o=r.doc.getLine(s.row),u=o.substring(s.column,s.column+1);if(u===";")return{text:"",selection:[1,1]}}})};r.inherits(u,s),t.CssBehaviour=u}),ace.define("ace/mode/css",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/css_highlight_rules","ace/mode/matching_brace_outdent","ace/worker/worker_client","ace/mode/css_completions","ace/mode/behaviour/css","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./css_highlight_rules").CssHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../worker/worker_client").WorkerClient,a=e("./css_completions").CssCompletions,f=e("./behaviour/css").CssBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.$completer=new a,this.foldingRules=new l};r.inherits(c,i),function(){this.foldingRules="cStyle",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e).tokens;if(i.length&&i[i.length-1].type=="comment")return r;var s=t.match(/^.*\{\s*$/);return s&&(r+=n),r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.getCompletions=function(e,t,n,r){return this.$completer.getCompletions(e,t,n,r)},this.createWorker=function(e){var t=new u(["ace"],"ace/mode/css_worker","Worker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/css"}.call(c.prototype),t.Mode=c}),ace.define("ace/mode/xml_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text_highlight_rules").TextHighlightRules,s=function(e){var t="[_:a-zA-Z\u00c0-\uffff][-_:.a-zA-Z0-9\u00c0-\uffff]*";this.$rules={start:[{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\[",next:"cdata"},{token:["punctuation.xml-decl.xml","keyword.xml-decl.xml"],regex:"(<\\?)(xml)(?=[\\s])",next:"xml_decl",caseInsensitive:!0},{token:["punctuation.instruction.xml","keyword.instruction.xml"],regex:"(<\\?)("+t+")",next:"processing_instruction"},{token:"comment.xml",regex:"<\\!--",next:"comment"},{token:["xml-pe.doctype.xml","xml-pe.doctype.xml"],regex:"(<\\!)(DOCTYPE)(?=[\\s])",next:"doctype",caseInsensitive:!0},{include:"tag"},{token:"text.end-tag-open.xml",regex:"",next:"start"}],processing_instruction:[{token:"punctuation.instruction.xml",regex:"\\?>",next:"start"},{defaultToken:"instruction.xml"}],doctype:[{include:"whitespace"},{include:"string"},{token:"xml-pe.doctype.xml",regex:">",next:"start"},{token:"xml-pe.xml",regex:"[-_a-zA-Z0-9:]+"},{token:"punctuation.int-subset",regex:"\\[",push:"int_subset"}],int_subset:[{token:"text.xml",regex:"\\s+"},{token:"punctuation.int-subset.xml",regex:"]",next:"pop"},{token:["punctuation.markup-decl.xml","keyword.markup-decl.xml"],regex:"(<\\!)("+t+")",push:[{token:"text",regex:"\\s+"},{token:"punctuation.markup-decl.xml",regex:">",next:"pop"},{include:"string"}]}],cdata:[{token:"string.cdata.xml",regex:"\\]\\]>",next:"start"},{token:"text.xml",regex:"\\s+"},{token:"text.xml",regex:"(?:[^\\]]|\\](?!\\]>))+"}],comment:[{token:"comment.xml",regex:"-->",next:"start"},{defaultToken:"comment.xml"}],reference:[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],attr_reference:[{token:"constant.language.escape.reference.attribute-value.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],tag:[{token:["meta.tag.punctuation.tag-open.xml","meta.tag.punctuation.end-tag-open.xml","meta.tag.tag-name.xml"],regex:"(?:(<)|(",next:"start"}]}],tag_whitespace:[{token:"text.tag-whitespace.xml",regex:"\\s+"}],whitespace:[{token:"text.whitespace.xml",regex:"\\s+"}],string:[{token:"string.xml",regex:"'",push:[{token:"string.xml",regex:"'",next:"pop"},{defaultToken:"string.xml"}]},{token:"string.xml",regex:'"',push:[{token:"string.xml",regex:'"',next:"pop"},{defaultToken:"string.xml"}]}],attributes:[{token:"entity.other.attribute-name.xml",regex:"(?:"+t+":)?"+t+""},{token:"keyword.operator.attribute-equals.xml",regex:"="},{include:"tag_whitespace"},{include:"attribute_value"}],attribute_value:[{token:"string.attribute-value.xml",regex:"'",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]}]},this.constructor===s&&this.normalizeRules()};(function(){this.embedTagRules=function(e,t,n){this.$rules.tag.unshift({token:["meta.tag.punctuation.tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(<)("+n+"(?=\\s|>|$))",next:[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:t+"start"}]}),this.$rules[n+"-end"]=[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:"start",onMatch:function(e,t,n){return n.splice(0),this.token}}],this.embedRules(e,t,[{token:["meta.tag.punctuation.end-tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(|$))",next:n+"-end"},{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\["},{token:"string.cdata.xml",regex:"\\]\\]>"}])}}).call(i.prototype),r.inherits(s,i),t.XmlHighlightRules=s}),ace.define("ace/mode/html_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/css_highlight_rules","ace/mode/javascript_highlight_rules","ace/mode/xml_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./css_highlight_rules").CssHighlightRules,o=e("./javascript_highlight_rules").JavaScriptHighlightRules,u=e("./xml_highlight_rules").XmlHighlightRules,a=i.createMap({a:"anchor",button:"form",form:"form",img:"image",input:"form",label:"form",option:"form",script:"script",select:"form",textarea:"form",style:"style",table:"table",tbody:"table",td:"table",tfoot:"table",th:"table",tr:"table"}),f=function(){u.call(this),this.addRules({attributes:[{include:"tag_whitespace"},{token:"entity.other.attribute-name.xml",regex:"[-_a-zA-Z0-9:.]+"},{token:"keyword.operator.attribute-equals.xml",regex:"=",push:[{include:"tag_whitespace"},{token:"string.unquoted.attribute-value.html",regex:"[^<>='\"`\\s]+",next:"pop"},{token:"empty",regex:"",next:"pop"}]},{include:"attribute_value"}],tag:[{token:function(e,t){var n=a[t];return["meta.tag.punctuation."+(e=="<"?"":"end-")+"tag-open.xml","meta.tag"+(n?"."+n:"")+".tag-name.xml"]},regex:"(",next:"start"}]}),this.embedTagRules(s,"css-","style"),this.embedTagRules((new o({noJSX:!0})).getRules(),"js-","script"),this.constructor===f&&this.normalizeRules()};r.inherits(f,u),t.HtmlHighlightRules=f}),ace.define("ace/mode/behaviour/xml",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";function u(e,t){return e.type.lastIndexOf(t+".xml")>-1}var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),a=function(){this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){var o=i,a=r.doc.getTextRange(n.getSelectionRange());if(a!==""&&a!=="'"&&a!='"'&&n.getWrapBehavioursEnabled())return{text:o+a+o,selection:!1};var f=n.getCursorPosition(),l=r.doc.getLine(f.row),c=l.substring(f.column,f.column+1),h=new s(r,f.row,f.column),p=h.getCurrentToken();if(c==o&&(u(p,"attribute-value")||u(p,"string")))return{text:"",selection:[1,1]};p||(p=h.stepBackward());if(!p)return;while(u(p,"tag-whitespace")||u(p,"whitespace"))p=h.stepBackward();var d=!c||c.match(/\s/);if(u(p,"attribute-equals")&&(d||c==">")||u(p,"decl-attribute-equals")&&(d||c=="?"))return{text:o+o,selection:[1,1]}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}}),this.add("autoclosing","insertion",function(e,t,n,r,i){if(i==">"){var o=n.getCursorPosition(),a=new s(r,o.row,o.column),f=a.getCurrentToken()||a.stepBackward();if(!f||!(u(f,"tag-name")||u(f,"tag-whitespace")||u(f,"attribute-name")||u(f,"attribute-equals")||u(f,"attribute-value")))return;if(u(f,"reference.attribute-value"))return;if(u(f,"attribute-value")){var l=f.value.charAt(0);if(l=='"'||l=="'"){var c=f.value.charAt(f.value.length-1),h=a.getCurrentTokenColumn()+f.value.length;if(h>o.column||h==o.column&&l!=c)return}}while(!u(f,"tag-name"))f=a.stepBackward();var p=a.getCurrentTokenRow(),d=a.getCurrentTokenColumn();if(u(a.stepBackward(),"end-tag-open"))return;var v=f.value;p==o.row&&(v=v.substring(0,o.column-d));if(this.voidElements.hasOwnProperty(v.toLowerCase()))return;return{text:">",selection:[1,1]}}}),this.add("autoindent","insertion",function(e,t,n,r,i){if(i=="\n"){var o=n.getCursorPosition(),u=r.getLine(o.row),a=new s(r,o.row,o.column),f=a.getCurrentToken();if(f&&f.type.indexOf("tag-close")!==-1){if(f.value=="/>")return;while(f&&f.type.indexOf("tag-name")===-1)f=a.stepBackward();if(!f)return;var l=f.value,c=a.getCurrentTokenRow();f=a.stepBackward();if(!f||f.type.indexOf("end-tag")!==-1)return;if(this.voidElements&&!this.voidElements[l]){var h=r.getTokenAt(o.row,o.column+1),u=r.getLine(c),p=this.$getIndent(u),d=p+r.getTabString();return h&&h.value==="-1}var r=e("../../lib/oop"),i=e("../../lib/lang"),s=e("../../range").Range,o=e("./fold_mode").FoldMode,u=e("../../token_iterator").TokenIterator,a=t.FoldMode=function(e,t){o.call(this),this.voidElements=e||{},this.optionalEndTags=r.mixin({},this.voidElements),t&&r.mixin(this.optionalEndTags,t)};r.inherits(a,o);var f=function(){this.tagName="",this.closing=!1,this.selfClosing=!1,this.start={row:0,column:0},this.end={row:0,column:0}};(function(){this.getFoldWidget=function(e,t,n){var r=this._getFirstTagInLine(e,n);return r?r.closing||!r.tagName&&r.selfClosing?t=="markbeginend"?"end":"":!r.tagName||r.selfClosing||this.voidElements.hasOwnProperty(r.tagName.toLowerCase())?"":this._findEndTagInLine(e,n,r.tagName,r.end.column)?"":"start":""},this._getFirstTagInLine=function(e,t){var n=e.getTokens(t),r=new f;for(var i=0;i";break}}return r}if(l(s,"tag-close"))return r.selfClosing=s.value=="/>",r;r.start.column+=s.value.length}return null},this._findEndTagInLine=function(e,t,n,r){var i=e.getTokens(t),s=0;for(var o=0;o",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length,e.stepForward(),n;while(t=e.stepForward());return null},this._readTagBackward=function(e){var t=e.getCurrentToken();if(!t)return null;var n=new f;do{if(l(t,"tag-open"))return n.closing=l(t,"end-tag-open"),n.start.row=e.getCurrentTokenRow(),n.start.column=e.getCurrentTokenColumn(),e.stepBackward(),n;l(t,"tag-name")?n.tagName=t.value:l(t,"tag-close")&&(n.selfClosing=t.value=="/>",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length)}while(t=e.stepBackward());return null},this._pop=function(e,t){while(e.length){var n=e[e.length-1];if(!t||n.tagName==t.tagName)return e.pop();if(this.optionalEndTags.hasOwnProperty(n.tagName)){e.pop();continue}return null}},this.getFoldWidgetRange=function(e,t,n){var r=this._getFirstTagInLine(e,n);if(!r)return null;var i=r.closing||r.selfClosing,o=[],a;if(!i){var f=new u(e,n,r.start.column),l={row:n,column:r.start.column+r.tagName.length+2};r.start.row==r.end.row&&(l.column=r.end.column);while(a=this._readTagForward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(a.closing){this._pop(o,a);if(o.length==0)return s.fromPoints(l,a.start)}else o.push(a)}}else{var f=new u(e,n,r.end.column),c={row:n,column:r.start.column};while(a=this._readTagBackward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(!a.closing){this._pop(o,a);if(o.length==0)return a.start.column+=a.tagName.length+2,a.start.row==a.end.row&&a.start.column-1}function l(e,t){var n=new r(e,t.row,t.column),i=n.getCurrentToken();while(i&&!f(i,"tag-name"))i=n.stepBackward();if(i)return i.value}function c(e,t){var n=new r(e,t.row,t.column),i=n.getCurrentToken();while(i&&!f(i,"attribute-name"))i=n.stepBackward();if(i)return i.value}var r=e("../token_iterator").TokenIterator,i=["accesskey","class","contenteditable","contextmenu","dir","draggable","dropzone","hidden","id","inert","itemid","itemprop","itemref","itemscope","itemtype","lang","spellcheck","style","tabindex","title","translate"],s=["onabort","onblur","oncancel","oncanplay","oncanplaythrough","onchange","onclick","onclose","oncontextmenu","oncuechange","ondblclick","ondrag","ondragend","ondragenter","ondragleave","ondragover","ondragstart","ondrop","ondurationchange","onemptied","onended","onerror","onfocus","oninput","oninvalid","onkeydown","onkeypress","onkeyup","onload","onloadeddata","onloadedmetadata","onloadstart","onmousedown","onmousemove","onmouseout","onmouseover","onmouseup","onmousewheel","onpause","onplay","onplaying","onprogress","onratechange","onreset","onscroll","onseeked","onseeking","onselect","onshow","onstalled","onsubmit","onsuspend","ontimeupdate","onvolumechange","onwaiting"],o=i.concat(s),u={html:{manifest:1},head:{},title:{},base:{href:1,target:1},link:{href:1,hreflang:1,rel:{stylesheet:1,icon:1},media:{all:1,screen:1,print:1},type:{"text/css":1,"image/png":1,"image/jpeg":1,"image/gif":1},sizes:1},meta:{"http-equiv":{"content-type":1},name:{description:1,keywords:1},content:{"text/html; charset=UTF-8":1},charset:1},style:{type:1,media:{all:1,screen:1,print:1},scoped:1},script:{charset:1,type:{"text/javascript":1},src:1,defer:1,async:1},noscript:{href:1},body:{onafterprint:1,onbeforeprint:1,onbeforeunload:1,onhashchange:1,onmessage:1,onoffline:1,onpopstate:1,onredo:1,onresize:1,onstorage:1,onundo:1,onunload:1},section:{},nav:{},article:{pubdate:1},aside:{},h1:{},h2:{},h3:{},h4:{},h5:{},h6:{},header:{},footer:{},address:{},main:{},p:{},hr:{},pre:{},blockquote:{cite:1},ol:{start:1,reversed:1},ul:{},li:{value:1},dl:{},dt:{},dd:{},figure:{},figcaption:{},div:{},a:{href:1,target:{_blank:1,top:1},ping:1,rel:{nofollow:1,alternate:1,author:1,bookmark:1,help:1,license:1,next:1,noreferrer:1,prefetch:1,prev:1,search:1,tag:1},media:1,hreflang:1,type:1},em:{},strong:{},small:{},s:{},cite:{},q:{cite:1},dfn:{},abbr:{},data:{},time:{datetime:1},code:{},"var":{},samp:{},kbd:{},sub:{},sup:{},i:{},b:{},u:{},mark:{},ruby:{},rt:{},rp:{},bdi:{},bdo:{},span:{},br:{},wbr:{},ins:{cite:1,datetime:1},del:{cite:1,datetime:1},img:{alt:1,src:1,height:1,width:1,usemap:1,ismap:1},iframe:{name:1,src:1,height:1,width:1,sandbox:{"allow-same-origin":1,"allow-top-navigation":1,"allow-forms":1,"allow-scripts":1},seamless:{seamless:1}},embed:{src:1,height:1,width:1,type:1},object:{param:1,data:1,type:1,height:1,width:1,usemap:1,name:1,form:1,classid:1},param:{name:1,value:1},video:{src:1,autobuffer:1,autoplay:{autoplay:1},loop:{loop:1},controls:{controls:1},width:1,height:1,poster:1,muted:{muted:1},preload:{auto:1,metadata:1,none:1}},audio:{src:1,autobuffer:1,autoplay:{autoplay:1},loop:{loop:1},controls:{controls:1},muted:{muted:1},preload:{auto:1,metadata:1,none:1}},source:{src:1,type:1,media:1},track:{kind:1,src:1,srclang:1,label:1,"default":1},canvas:{width:1,height:1},map:{name:1},area:{shape:1,coords:1,href:1,hreflang:1,alt:1,target:1,media:1,rel:1,ping:1,type:1},svg:{},math:{},table:{summary:1},caption:{},colgroup:{span:1},col:{span:1},tbody:{},thead:{},tfoot:{},tr:{},td:{headers:1,rowspan:1,colspan:1},th:{headers:1,rowspan:1,colspan:1,scope:1},form:{"accept-charset":1,action:1,autocomplete:1,enctype:{"multipart/form-data":1,"application/x-www-form-urlencoded":1},method:{get:1,post:1},name:1,novalidate:1,target:{_blank:1,top:1}},fieldset:{disabled:1,form:1,name:1},legend:{},label:{form:1,"for":1},input:{type:{text:1,password:1,hidden:1,checkbox:1,submit:1,radio:1,file:1,button:1,reset:1,image:31,color:1,date:1,datetime:1,"datetime-local":1,email:1,month:1,number:1,range:1,search:1,tel:1,time:1,url:1,week:1},accept:1,alt:1,autocomplete:{on:1,off:1},autofocus:{autofocus:1},checked:{checked:1},disabled:{disabled:1},form:1,formaction:1,formenctype:{"application/x-www-form-urlencoded":1,"multipart/form-data":1,"text/plain":1},formmethod:{get:1,post:1},formnovalidate:{formnovalidate:1},formtarget:{_blank:1,_self:1,_parent:1,_top:1},height:1,list:1,max:1,maxlength:1,min:1,multiple:{multiple:1},name:1,pattern:1,placeholder:1,readonly:{readonly:1},required:{required:1},size:1,src:1,step:1,width:1,files:1,value:1},button:{autofocus:1,disabled:{disabled:1},form:1,formaction:1,formenctype:1,formmethod:1,formnovalidate:1,formtarget:1,name:1,value:1,type:{button:1,submit:1}},select:{autofocus:1,disabled:1,form:1,multiple:{multiple:1},name:1,size:1,readonly:{readonly:1}},datalist:{},optgroup:{disabled:1,label:1},option:{disabled:1,selected:1,label:1,value:1},textarea:{autofocus:{autofocus:1},disabled:{disabled:1},form:1,maxlength:1,name:1,placeholder:1,readonly:{readonly:1},required:{required:1},rows:1,cols:1,wrap:{on:1,off:1,hard:1,soft:1}},keygen:{autofocus:1,challenge:{challenge:1},disabled:{disabled:1},form:1,keytype:{rsa:1,dsa:1,ec:1},name:1},output:{"for":1,form:1,name:1},progress:{value:1,max:1},meter:{value:1,min:1,max:1,low:1,high:1,optimum:1},details:{open:1},summary:{},command:{type:1,label:1,icon:1,disabled:1,checked:1,radiogroup:1,command:1},menu:{type:1,label:1},dialog:{open:1}},a=Object.keys(u),h=function(){};(function(){this.getCompletions=function(e,t,n,r){var i=t.getTokenAt(n.row,n.column);if(!i)return[];if(f(i,"tag-name")||f(i,"tag-open")||f(i,"end-tag-open"))return this.getTagCompletions(e,t,n,r);if(f(i,"tag-whitespace")||f(i,"attribute-name"))return this.getAttributeCompletions(e,t,n,r);if(f(i,"attribute-value"))return this.getAttributeValueCompletions(e,t,n,r);var s=t.getLine(n.row).substr(0,n.column);return/&[A-z]*$/i.test(s)?this.getHTMLEntityCompletions(e,t,n,r):[]},this.getTagCompletions=function(e,t,n,r){return a.map(function(e){return{value:e,meta:"tag",score:Number.MAX_VALUE}})},this.getAttributeCompletions=function(e,t,n,r){var i=l(t,n);if(!i)return[];var s=o;return i in u&&(s=s.concat(Object.keys(u[i]))),s.map(function(e){return{caption:e,snippet:e+'="$0"',meta:"attribute",score:Number.MAX_VALUE}})},this.getAttributeValueCompletions=function(e,t,n,r){var i=l(t,n),s=c(t,n);if(!i)return[];var o=[];return i in u&&s in u[i]&&typeof u[i][s]=="object"&&(o=Object.keys(u[i][s])),o.map(function(e){return{caption:e,snippet:e,meta:"attribute value",score:Number.MAX_VALUE}})},this.getHTMLEntityCompletions=function(e,t,n,r){var i=["Aacute;","aacute;","Acirc;","acirc;","acute;","AElig;","aelig;","Agrave;","agrave;","alefsym;","Alpha;","alpha;","amp;","and;","ang;","Aring;","aring;","asymp;","Atilde;","atilde;","Auml;","auml;","bdquo;","Beta;","beta;","brvbar;","bull;","cap;","Ccedil;","ccedil;","cedil;","cent;","Chi;","chi;","circ;","clubs;","cong;","copy;","crarr;","cup;","curren;","Dagger;","dagger;","dArr;","darr;","deg;","Delta;","delta;","diams;","divide;","Eacute;","eacute;","Ecirc;","ecirc;","Egrave;","egrave;","empty;","emsp;","ensp;","Epsilon;","epsilon;","equiv;","Eta;","eta;","ETH;","eth;","Euml;","euml;","euro;","exist;","fnof;","forall;","frac12;","frac14;","frac34;","frasl;","Gamma;","gamma;","ge;","gt;","hArr;","harr;","hearts;","hellip;","Iacute;","iacute;","Icirc;","icirc;","iexcl;","Igrave;","igrave;","image;","infin;","int;","Iota;","iota;","iquest;","isin;","Iuml;","iuml;","Kappa;","kappa;","Lambda;","lambda;","lang;","laquo;","lArr;","larr;","lceil;","ldquo;","le;","lfloor;","lowast;","loz;","lrm;","lsaquo;","lsquo;","lt;","macr;","mdash;","micro;","middot;","minus;","Mu;","mu;","nabla;","nbsp;","ndash;","ne;","ni;","not;","notin;","nsub;","Ntilde;","ntilde;","Nu;","nu;","Oacute;","oacute;","Ocirc;","ocirc;","OElig;","oelig;","Ograve;","ograve;","oline;","Omega;","omega;","Omicron;","omicron;","oplus;","or;","ordf;","ordm;","Oslash;","oslash;","Otilde;","otilde;","otimes;","Ouml;","ouml;","para;","part;","permil;","perp;","Phi;","phi;","Pi;","pi;","piv;","plusmn;","pound;","Prime;","prime;","prod;","prop;","Psi;","psi;","quot;","radic;","rang;","raquo;","rArr;","rarr;","rceil;","rdquo;","real;","reg;","rfloor;","Rho;","rho;","rlm;","rsaquo;","rsquo;","sbquo;","Scaron;","scaron;","sdot;","sect;","shy;","Sigma;","sigma;","sigmaf;","sim;","spades;","sub;","sube;","sum;","sup;","sup1;","sup2;","sup3;","supe;","szlig;","Tau;","tau;","there4;","Theta;","theta;","thetasym;","thinsp;","THORN;","thorn;","tilde;","times;","trade;","Uacute;","uacute;","uArr;","uarr;","Ucirc;","ucirc;","Ugrave;","ugrave;","uml;","upsih;","Upsilon;","upsilon;","Uuml;","uuml;","weierp;","Xi;","xi;","Yacute;","yacute;","yen;","Yuml;","yuml;","Zeta;","zeta;","zwj;","zwnj;"];return i.map(function(e){return{caption:e,snippet:e,meta:"html entity",score:Number.MAX_VALUE}})}}).call(h.prototype),t.HtmlCompletions=h}),ace.define("ace/mode/html",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text","ace/mode/javascript","ace/mode/css","ace/mode/html_highlight_rules","ace/mode/behaviour/xml","ace/mode/folding/html","ace/mode/html_completions","ace/worker/worker_client"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text").Mode,o=e("./javascript").Mode,u=e("./css").Mode,a=e("./html_highlight_rules").HtmlHighlightRules,f=e("./behaviour/xml").XmlBehaviour,l=e("./folding/html").FoldMode,c=e("./html_completions").HtmlCompletions,h=e("../worker/worker_client").WorkerClient,p=["area","base","br","col","embed","hr","img","input","keygen","link","meta","menuitem","param","source","track","wbr"],d=["li","dt","dd","p","rt","rp","optgroup","option","colgroup","td","th"],v=function(e){this.fragmentContext=e&&e.fragmentContext,this.HighlightRules=a,this.$behaviour=new f,this.$completer=new c,this.createModeDelegates({"js-":o,"css-":u}),this.foldingRules=new l(this.voidElements,i.arrayToMap(d))};r.inherits(v,s),function(){this.blockComment={start:""},this.voidElements=i.arrayToMap(p),this.getNextLineIndent=function(e,t,n){return this.$getIndent(t)},this.checkOutdent=function(e,t,n){return!1},this.getCompletions=function(e,t,n,r){return this.$completer.getCompletions(e,t,n,r)},this.createWorker=function(e){if(this.constructor!=v)return;var t=new h(["ace"],"ace/mode/html_worker","Worker");return t.attachToDocument(e.getDocument()),this.fragmentContext&&t.call("setOptions",[{context:this.fragmentContext}]),t.on("error",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/html"}.call(v.prototype),t.Mode=v}) \ No newline at end of file diff --git a/docs/ace-1.2.3/mode-javascript.js b/docs/ace-1.2.3/mode-javascript.js deleted file mode 100755 index bf5fc926c..000000000 --- a/docs/ace-1.2.3/mode-javascript.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/mode/doc_comment_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text_highlight_rules").TextHighlightRules,s=function(){this.$rules={start:[{token:"comment.doc.tag",regex:"@[\\w\\d_]+"},s.getTagRule(),{defaultToken:"comment.doc",caseInsensitive:!0}]}};r.inherits(s,i),s.getTagRule=function(e){return{token:"comment.doc.tag.storage.type",regex:"\\b(?:TODO|FIXME|XXX|HACK)\\b"}},s.getStartRule=function(e){return{token:"comment.doc",regex:"\\/\\*(?=\\*)",next:e}},s.getEndRule=function(e){return{token:"comment.doc",regex:"\\*\\/",next:e}},t.DocCommentHighlightRules=s}),ace.define("ace/mode/javascript_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/doc_comment_highlight_rules","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";function a(){var e=o.replace("\\d","\\d\\-"),t={onMatch:function(e,t,n){var r=e.charAt(1)=="/"?2:1;if(r==1)t!=this.nextState?n.unshift(this.next,this.nextState,0):n.unshift(this.next),n[2]++;else if(r==2&&t==this.nextState){n[1]--;if(!n[1]||n[1]<0)n.shift(),n.shift()}return[{type:"meta.tag.punctuation."+(r==1?"":"end-")+"tag-open.xml",value:e.slice(0,r)},{type:"meta.tag.tag-name.xml",value:e.substr(r)}]},regex:"",onMatch:function(e,t,n){return t==n[0]&&n.shift(),e.length==2&&(n[0]==this.nextState&&n[1]--,(!n[1]||n[1]<0)&&n.splice(0,2)),this.next=n[0]||"start",[{type:this.token,value:e}]},nextState:"jsx"},n,f("jsxAttributes"),{token:"entity.other.attribute-name.xml",regex:e},{token:"keyword.operator.attribute-equals.xml",regex:"="},{token:"text.tag-whitespace.xml",regex:"\\s+"},{token:"string.attribute-value.xml",regex:"'",stateName:"jsx_attr_q",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',stateName:"jsx_attr_qq",push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},t],this.$rules.reference=[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}]}function f(e){return[{token:"comment",regex:/\/\*/,next:[i.getTagRule(),{token:"comment",regex:"\\*\\/",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]},{token:"comment",regex:"\\/\\/",next:[i.getTagRule(),{token:"comment",regex:"$|^",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]}]}var r=e("../lib/oop"),i=e("./doc_comment_highlight_rules").DocCommentHighlightRules,s=e("./text_highlight_rules").TextHighlightRules,o="[a-zA-Z\\$_\u00a1-\uffff][a-zA-Z\\d\\$_\u00a1-\uffff]*",u=function(e){var t=this.createKeywordMapper({"variable.language":"Array|Boolean|Date|Function|Iterator|Number|Object|RegExp|String|Proxy|Namespace|QName|XML|XMLList|ArrayBuffer|Float32Array|Float64Array|Int16Array|Int32Array|Int8Array|Uint16Array|Uint32Array|Uint8Array|Uint8ClampedArray|Error|EvalError|InternalError|RangeError|ReferenceError|StopIteration|SyntaxError|TypeError|URIError|decodeURI|decodeURIComponent|encodeURI|encodeURIComponent|eval|isFinite|isNaN|parseFloat|parseInt|JSON|Math|this|arguments|prototype|window|document",keyword:"const|yield|import|get|set|async|await|break|case|catch|continue|default|delete|do|else|finally|for|function|if|in|instanceof|new|return|switch|throw|try|typeof|let|var|while|with|debugger|__parent__|__count__|escape|unescape|with|__proto__|class|enum|extends|super|export|implements|private|public|interface|package|protected|static","storage.type":"const|let|var|function","constant.language":"null|Infinity|NaN|undefined","support.function":"alert","constant.language.boolean":"true|false"},"identifier"),n="case|do|else|finally|in|instanceof|return|throw|try|typeof|yield|void",r="\\\\(?:x[0-9a-fA-F]{2}|u[0-9a-fA-F]{4}|u{[0-9a-fA-F]{1,6}}|[0-2][0-7]{0,2}|3[0-7][0-7]?|[4-7][0-7]?|.)";this.$rules={no_regex:[i.getStartRule("doc-start"),f("no_regex"),{token:"string",regex:"'(?=.)",next:"qstring"},{token:"string",regex:'"(?=.)',next:"qqstring"},{token:"constant.numeric",regex:/0(?:[xX][0-9a-fA-F]+|[bB][01]+)\b/},{token:"constant.numeric",regex:/[+-]?\d[\d_]*(?:(?:\.\d*)?(?:[eE][+-]?\d+)?)?\b/},{token:["storage.type","punctuation.operator","support.function","punctuation.operator","entity.name.function","text","keyword.operator"],regex:"("+o+")(\\.)(prototype)(\\.)("+o+")(\\s*)(=)",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s+)(\\w+)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","text","entity.name.function","text","paren.lparen"],regex:"(function)(\\s+)("+o+")(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","punctuation.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["text","text","storage.type","text","paren.lparen"],regex:"(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:"keyword",regex:"(?:"+n+")\\b",next:"start"},{token:["support.constant"],regex:/that\b/},{token:["storage.type","punctuation.operator","support.function.firebug"],regex:/(console)(\.)(warn|info|log|error|time|trace|timeEnd|assert)\b/},{token:t,regex:o},{token:"punctuation.operator",regex:/[.](?![.])/,next:"property"},{token:"keyword.operator",regex:/--|\+\+|\.{3}|===|==|=|!=|!==|<+=?|>+=?|!|&&|\|\||\?\:|[!$%&*+\-~\/^]=?/,next:"start"},{token:"punctuation.operator",regex:/[?:,;.]/,next:"start"},{token:"paren.lparen",regex:/[\[({]/,next:"start"},{token:"paren.rparen",regex:/[\])}]/},{token:"comment",regex:/^#!.*$/}],property:[{token:"text",regex:"\\s+"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(?:(\\s+)(\\w+))?(\\s*)(\\()",next:"function_arguments"},{token:"punctuation.operator",regex:/[.](?![.])/},{token:"support.function",regex:/(s(?:h(?:ift|ow(?:Mod(?:elessDialog|alDialog)|Help))|croll(?:X|By(?:Pages|Lines)?|Y|To)?|t(?:op|rike)|i(?:n|zeToContent|debar|gnText)|ort|u(?:p|b(?:str(?:ing)?)?)|pli(?:ce|t)|e(?:nd|t(?:Re(?:sizable|questHeader)|M(?:i(?:nutes|lliseconds)|onth)|Seconds|Ho(?:tKeys|urs)|Year|Cursor|Time(?:out)?|Interval|ZOptions|Date|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Date|FullYear)|FullYear|Active)|arch)|qrt|lice|avePreferences|mall)|h(?:ome|andleEvent)|navigate|c(?:har(?:CodeAt|At)|o(?:s|n(?:cat|textual|firm)|mpile)|eil|lear(?:Timeout|Interval)?|a(?:ptureEvents|ll)|reate(?:StyleSheet|Popup|EventObject))|t(?:o(?:GMTString|S(?:tring|ource)|U(?:TCString|pperCase)|Lo(?:caleString|werCase))|est|a(?:n|int(?:Enabled)?))|i(?:s(?:NaN|Finite)|ndexOf|talics)|d(?:isableExternalCapture|ump|etachEvent)|u(?:n(?:shift|taint|escape|watch)|pdateCommands)|j(?:oin|avaEnabled)|p(?:o(?:p|w)|ush|lugins.refresh|a(?:ddings|rse(?:Int|Float)?)|r(?:int|ompt|eference))|e(?:scape|nableExternalCapture|val|lementFromPoint|x(?:p|ec(?:Script|Command)?))|valueOf|UTC|queryCommand(?:State|Indeterm|Enabled|Value)|f(?:i(?:nd|le(?:ModifiedDate|Size|CreatedDate|UpdatedDate)|xed)|o(?:nt(?:size|color)|rward)|loor|romCharCode)|watch|l(?:ink|o(?:ad|g)|astIndexOf)|a(?:sin|nchor|cos|t(?:tachEvent|ob|an(?:2)?)|pply|lert|b(?:s|ort))|r(?:ou(?:nd|teEvents)|e(?:size(?:By|To)|calc|turnValue|place|verse|l(?:oad|ease(?:Capture|Events)))|andom)|g(?:o|et(?:ResponseHeader|M(?:i(?:nutes|lliseconds)|onth)|Se(?:conds|lection)|Hours|Year|Time(?:zoneOffset)?|Da(?:y|te)|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Da(?:y|te)|FullYear)|FullYear|A(?:ttention|llResponseHeaders)))|m(?:in|ove(?:B(?:y|elow)|To(?:Absolute)?|Above)|ergeAttributes|a(?:tch|rgins|x))|b(?:toa|ig|o(?:ld|rderWidths)|link|ack))\b(?=\()/},{token:"support.function.dom",regex:/(s(?:ub(?:stringData|mit)|plitText|e(?:t(?:NamedItem|Attribute(?:Node)?)|lect))|has(?:ChildNodes|Feature)|namedItem|c(?:l(?:ick|o(?:se|neNode))|reate(?:C(?:omment|DATASection|aption)|T(?:Head|extNode|Foot)|DocumentFragment|ProcessingInstruction|E(?:ntityReference|lement)|Attribute))|tabIndex|i(?:nsert(?:Row|Before|Cell|Data)|tem)|open|delete(?:Row|C(?:ell|aption)|T(?:Head|Foot)|Data)|focus|write(?:ln)?|a(?:dd|ppend(?:Child|Data))|re(?:set|place(?:Child|Data)|move(?:NamedItem|Child|Attribute(?:Node)?)?)|get(?:NamedItem|Element(?:sBy(?:Name|TagName|ClassName)|ById)|Attribute(?:Node)?)|blur)\b(?=\()/},{token:"support.constant",regex:/(s(?:ystemLanguage|cr(?:ipts|ollbars|een(?:X|Y|Top|Left))|t(?:yle(?:Sheets)?|atus(?:Text|bar)?)|ibling(?:Below|Above)|ource|uffixes|e(?:curity(?:Policy)?|l(?:ection|f)))|h(?:istory|ost(?:name)?|as(?:h|Focus))|y|X(?:MLDocument|SLDocument)|n(?:ext|ame(?:space(?:s|URI)|Prop))|M(?:IN_VALUE|AX_VALUE)|c(?:haracterSet|o(?:n(?:structor|trollers)|okieEnabled|lorDepth|mp(?:onents|lete))|urrent|puClass|l(?:i(?:p(?:boardData)?|entInformation)|osed|asses)|alle(?:e|r)|rypto)|t(?:o(?:olbar|p)|ext(?:Transform|Indent|Decoration|Align)|ags)|SQRT(?:1_2|2)|i(?:n(?:ner(?:Height|Width)|put)|ds|gnoreCase)|zIndex|o(?:scpu|n(?:readystatechange|Line)|uter(?:Height|Width)|p(?:sProfile|ener)|ffscreenBuffering)|NEGATIVE_INFINITY|d(?:i(?:splay|alog(?:Height|Top|Width|Left|Arguments)|rectories)|e(?:scription|fault(?:Status|Ch(?:ecked|arset)|View)))|u(?:ser(?:Profile|Language|Agent)|n(?:iqueID|defined)|pdateInterval)|_content|p(?:ixelDepth|ort|ersonalbar|kcs11|l(?:ugins|atform)|a(?:thname|dding(?:Right|Bottom|Top|Left)|rent(?:Window|Layer)?|ge(?:X(?:Offset)?|Y(?:Offset)?))|r(?:o(?:to(?:col|type)|duct(?:Sub)?|mpter)|e(?:vious|fix)))|e(?:n(?:coding|abledPlugin)|x(?:ternal|pando)|mbeds)|v(?:isibility|endor(?:Sub)?|Linkcolor)|URLUnencoded|P(?:I|OSITIVE_INFINITY)|f(?:ilename|o(?:nt(?:Size|Family|Weight)|rmName)|rame(?:s|Element)|gColor)|E|whiteSpace|l(?:i(?:stStyleType|n(?:eHeight|kColor))|o(?:ca(?:tion(?:bar)?|lName)|wsrc)|e(?:ngth|ft(?:Context)?)|a(?:st(?:M(?:odified|atch)|Index|Paren)|yer(?:s|X)|nguage))|a(?:pp(?:MinorVersion|Name|Co(?:deName|re)|Version)|vail(?:Height|Top|Width|Left)|ll|r(?:ity|guments)|Linkcolor|bove)|r(?:ight(?:Context)?|e(?:sponse(?:XML|Text)|adyState))|global|x|m(?:imeTypes|ultiline|enubar|argin(?:Right|Bottom|Top|Left))|L(?:N(?:10|2)|OG(?:10E|2E))|b(?:o(?:ttom|rder(?:Width|RightWidth|BottomWidth|Style|Color|TopWidth|LeftWidth))|ufferDepth|elow|ackground(?:Color|Image)))\b/},{token:"identifier",regex:o},{regex:"",token:"empty",next:"no_regex"}],start:[i.getStartRule("doc-start"),f("start"),{token:"string.regexp",regex:"\\/",next:"regex"},{token:"text",regex:"\\s+|^$",next:"start"},{token:"empty",regex:"",next:"no_regex"}],regex:[{token:"regexp.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"string.regexp",regex:"/[sxngimy]*",next:"no_regex"},{token:"invalid",regex:/\{\d+\b,?\d*\}[+*]|[+*$^?][+*]|[$^][?]|\?{3,}/},{token:"constant.language.escape",regex:/\(\?[:=!]|\)|\{\d+\b,?\d*\}|[+*]\?|[()$^+*?.]/},{token:"constant.language.delimiter",regex:/\|/},{token:"constant.language.escape",regex:/\[\^?/,next:"regex_character_class"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp"}],regex_character_class:[{token:"regexp.charclass.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"constant.language.escape",regex:"]",next:"regex"},{token:"constant.language.escape",regex:"-"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp.charachterclass"}],function_arguments:[{token:"variable.parameter",regex:o},{token:"punctuation.operator",regex:"[, ]+"},{token:"punctuation.operator",regex:"$"},{token:"empty",regex:"",next:"no_regex"}],qqstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qqstring"},{token:"string",regex:'"|$',next:"no_regex"},{defaultToken:"string"}],qstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qstring"},{token:"string",regex:"'|$",next:"no_regex"},{defaultToken:"string"}]};if(!e||!e.noES6)this.$rules.no_regex.unshift({regex:"[{}]",onMatch:function(e,t,n){this.next=e=="{"?this.nextState:"";if(e=="{"&&n.length)n.unshift("start",t);else if(e=="}"&&n.length){n.shift(),this.next=n.shift();if(this.next.indexOf("string")!=-1||this.next.indexOf("jsx")!=-1)return"paren.quasi.end"}return e=="{"?"paren.lparen":"paren.rparen"},nextState:"start"},{token:"string.quasi.start",regex:/`/,push:[{token:"constant.language.escape",regex:r},{token:"paren.quasi.start",regex:/\${/,push:"start"},{token:"string.quasi.end",regex:/`/,next:"pop"},{defaultToken:"string.quasi"}]}),(!e||!e.noJSX)&&a.call(this);this.embedRules(i,"doc-",[i.getEndRule("no_regex")]),this.normalizeRules()};r.inherits(u,s),t.JavaScriptHighlightRules=u}),ace.define("ace/mode/matching_brace_outdent",["require","exports","module","ace/range"],function(e,t,n){"use strict";var r=e("../range").Range,i=function(){};(function(){this.checkOutdent=function(e,t){return/^\s+$/.test(e)?/^\s*\}/.test(t):!1},this.autoOutdent=function(e,t){var n=e.getLine(t),i=n.match(/^(\s*\})/);if(!i)return 0;var s=i[1].length,o=e.findMatchingBracket({row:t,column:s});if(!o||o.row==t)return 0;var u=this.$getIndent(e.getLine(o.row));e.replace(new r(t,0,t,s-1),u)},this.$getIndent=function(e){return e.match(/^\s*/)[0]}}).call(i.prototype),t.MatchingBraceOutdent=i}),ace.define("ace/mode/behaviour/cstyle",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),u=["text","paren.rparen","punctuation.operator"],a=["text","paren.rparen","punctuation.operator","comment"],f,l={},c=function(e){var t=-1;e.multiSelect&&(t=e.selection.index,l.rangeCount!=e.multiSelect.rangeCount&&(l={rangeCount:e.multiSelect.rangeCount}));if(l[t])return f=l[t];f=l[t]={autoInsertedBrackets:0,autoInsertedRow:-1,autoInsertedLineEnd:"",maybeInsertedBrackets:0,maybeInsertedRow:-1,maybeInsertedLineStart:"",maybeInsertedLineEnd:""}},h=function(e,t,n,r){var i=e.end.row-e.start.row;return{text:n+t+r,selection:[0,e.start.column+1,i,e.end.column+(i?0:1)]}},p=function(){this.add("braces","insertion",function(e,t,n,r,i){var s=n.getCursorPosition(),u=r.doc.getLine(s.row);if(i=="{"){c(n);var a=n.getSelectionRange(),l=r.doc.getTextRange(a);if(l!==""&&l!=="{"&&n.getWrapBehavioursEnabled())return h(a,l,"{","}");if(p.isSaneInsertion(n,r))return/[\]\}\)]/.test(u[s.column])||n.inMultiSelectMode?(p.recordAutoInsert(n,r,"}"),{text:"{}",selection:[1,1]}):(p.recordMaybeInsert(n,r,"{"),{text:"{",selection:[1,1]})}else if(i=="}"){c(n);var d=u.substring(s.column,s.column+1);if(d=="}"){var v=r.$findOpeningBracket("}",{column:s.column+1,row:s.row});if(v!==null&&p.isAutoInsertedClosing(s,u,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}else{if(i=="\n"||i=="\r\n"){c(n);var m="";p.isMaybeInsertedClosing(s,u)&&(m=o.stringRepeat("}",f.maybeInsertedBrackets),p.clearMaybeInsertedClosing());var d=u.substring(s.column,s.column+1);if(d==="}"){var g=r.findMatchingBracket({row:s.row,column:s.column+1},"}");if(!g)return null;var y=this.$getIndent(r.getLine(g.row))}else{if(!m){p.clearMaybeInsertedClosing();return}var y=this.$getIndent(u)}var b=y+r.getTabString();return{text:"\n"+b+"\n"+y+m,selection:[1,b.length,1,b.length]}}p.clearMaybeInsertedClosing()}}),this.add("braces","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="{"){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.end.column,i.end.column+1);if(u=="}")return i.end.column++,i;f.maybeInsertedBrackets--}}),this.add("parens","insertion",function(e,t,n,r,i){if(i=="("){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"(",")");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,")"),{text:"()",selection:[1,1]}}else if(i==")"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f==")"){var l=r.$findOpeningBracket(")",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("parens","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="("){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==")")return i.end.column++,i}}),this.add("brackets","insertion",function(e,t,n,r,i){if(i=="["){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"[","]");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,"]"),{text:"[]",selection:[1,1]}}else if(i=="]"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f=="]"){var l=r.$findOpeningBracket("]",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("brackets","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="["){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u=="]")return i.end.column++,i}}),this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){c(n);var s=i,o=n.getSelectionRange(),u=r.doc.getTextRange(o);if(u!==""&&u!=="'"&&u!='"'&&n.getWrapBehavioursEnabled())return h(o,u,s,s);if(!u){var a=n.getCursorPosition(),f=r.doc.getLine(a.row),l=f.substring(a.column-1,a.column),p=f.substring(a.column,a.column+1),d=r.getTokenAt(a.row,a.column),v=r.getTokenAt(a.row,a.column+1);if(l=="\\"&&d&&/escape/.test(d.type))return null;var m=d&&/string|escape/.test(d.type),g=!v||/string|escape/.test(v.type),y;if(p==s)y=m!==g;else{if(m&&!g)return null;if(m&&g)return null;var b=r.$mode.tokenRe;b.lastIndex=0;var w=b.test(l);b.lastIndex=0;var E=b.test(l);if(w||E)return null;if(p&&!/[\s;,.})\]\\]/.test(p))return null;y=!0}return{text:y?s+s:"",selection:[1,1]}}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}})};p.isSaneInsertion=function(e,t){var n=e.getCursorPosition(),r=new s(t,n.row,n.column);if(!this.$matchTokenType(r.getCurrentToken()||"text",u)){var i=new s(t,n.row,n.column+1);if(!this.$matchTokenType(i.getCurrentToken()||"text",u))return!1}return r.stepForward(),r.getCurrentTokenRow()!==n.row||this.$matchTokenType(r.getCurrentToken()||"text",a)},p.$matchTokenType=function(e,t){return t.indexOf(e.type||e)>-1},p.recordAutoInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isAutoInsertedClosing(r,i,f.autoInsertedLineEnd[0])||(f.autoInsertedBrackets=0),f.autoInsertedRow=r.row,f.autoInsertedLineEnd=n+i.substr(r.column),f.autoInsertedBrackets++},p.recordMaybeInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isMaybeInsertedClosing(r,i)||(f.maybeInsertedBrackets=0),f.maybeInsertedRow=r.row,f.maybeInsertedLineStart=i.substr(0,r.column)+n,f.maybeInsertedLineEnd=i.substr(r.column),f.maybeInsertedBrackets++},p.isAutoInsertedClosing=function(e,t,n){return f.autoInsertedBrackets>0&&e.row===f.autoInsertedRow&&n===f.autoInsertedLineEnd[0]&&t.substr(e.column)===f.autoInsertedLineEnd},p.isMaybeInsertedClosing=function(e,t){return f.maybeInsertedBrackets>0&&e.row===f.maybeInsertedRow&&t.substr(e.column)===f.maybeInsertedLineEnd&&t.substr(0,e.column)==f.maybeInsertedLineStart},p.popAutoInsertedClosing=function(){f.autoInsertedLineEnd=f.autoInsertedLineEnd.substr(1),f.autoInsertedBrackets--},p.clearMaybeInsertedClosing=function(){f&&(f.maybeInsertedBrackets=0,f.maybeInsertedRow=-1)},r.inherits(p,i),t.CstyleBehaviour=p}),ace.define("ace/mode/folding/cstyle",["require","exports","module","ace/lib/oop","ace/range","ace/mode/folding/fold_mode"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../../range").Range,s=e("./fold_mode").FoldMode,o=t.FoldMode=function(e){e&&(this.foldingStartMarker=new RegExp(this.foldingStartMarker.source.replace(/\|[^|]*?$/,"|"+e.start)),this.foldingStopMarker=new RegExp(this.foldingStopMarker.source.replace(/\|[^|]*?$/,"|"+e.end)))};r.inherits(o,s),function(){this.foldingStartMarker=/(\{|\[)[^\}\]]*$|^\s*(\/\*)/,this.foldingStopMarker=/^[^\[\{]*(\}|\])|^[\s\*]*(\*\/)/,this.singleLineBlockCommentRe=/^\s*(\/\*).*\*\/\s*$/,this.tripleStarBlockCommentRe=/^\s*(\/\*\*\*).*\*\/\s*$/,this.startRegionRe=/^\s*(\/\*|\/\/)#?region\b/,this._getFoldWidgetBase=this.getFoldWidget,this.getFoldWidget=function(e,t,n){var r=e.getLine(n);if(this.singleLineBlockCommentRe.test(r)&&!this.startRegionRe.test(r)&&!this.tripleStarBlockCommentRe.test(r))return"";var i=this._getFoldWidgetBase(e,t,n);return!i&&this.startRegionRe.test(r)?"start":i},this.getFoldWidgetRange=function(e,t,n,r){var i=e.getLine(n);if(this.startRegionRe.test(i))return this.getCommentRegionBlock(e,i,n);var s=i.match(this.foldingStartMarker);if(s){var o=s.index;if(s[1])return this.openingBracketBlock(e,s[1],n,o);var u=e.getCommentFoldRange(n,o+s[0].length,1);return u&&!u.isMultiLine()&&(r?u=this.getSectionRange(e,n):t!="all"&&(u=null)),u}if(t==="markbegin")return;var s=i.match(this.foldingStopMarker);if(s){var o=s.index+s[0].length;return s[1]?this.closingBracketBlock(e,s[1],n,o):e.getCommentFoldRange(n,o,-1)}},this.getSectionRange=function(e,t){var n=e.getLine(t),r=n.search(/\S/),s=t,o=n.length;t+=1;var u=t,a=e.getLength();while(++tf)break;var l=this.getFoldWidgetRange(e,"all",t);if(l){if(l.start.row<=s)break;if(l.isMultiLine())t=l.end.row;else if(r==f)break}u=t}return new i(s,o,u,e.getLine(u).length)},this.getCommentRegionBlock=function(e,t,n){var r=t.search(/\s*$/),s=e.getLength(),o=n,u=/^\s*(?:\/\*|\/\/|--)#?(end)?region\b/,a=1;while(++no)return new i(o,r,l,t.length)}}.call(o.prototype)}),ace.define("ace/mode/javascript",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/javascript_highlight_rules","ace/mode/matching_brace_outdent","ace/range","ace/worker/worker_client","ace/mode/behaviour/cstyle","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./javascript_highlight_rules").JavaScriptHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../range").Range,a=e("../worker/worker_client").WorkerClient,f=e("./behaviour/cstyle").CstyleBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.foldingRules=new l};r.inherits(c,i),function(){this.lineCommentStart="//",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e),s=i.tokens,o=i.state;if(s.length&&s[s.length-1].type=="comment")return r;if(e=="start"||e=="no_regex"){var u=t.match(/^.*(?:\bcase\b.*\:|[\{\(\[])\s*$/);u&&(r+=n)}else if(e=="doc-start"){if(o=="start"||o=="no_regex")return"";var u=t.match(/^\s*(\/?)\*/);u&&(u[1]&&(r+=" "),r+="* ")}return r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.createWorker=function(e){var t=new a(["ace"],"ace/mode/javascript_worker","JavaScriptWorker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/javascript"}.call(c.prototype),t.Mode=c}) \ No newline at end of file diff --git a/docs/ace-1.2.3/mode-markdown.js b/docs/ace-1.2.3/mode-markdown.js deleted file mode 100755 index 6d120cc30..000000000 --- a/docs/ace-1.2.3/mode-markdown.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/mode/doc_comment_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text_highlight_rules").TextHighlightRules,s=function(){this.$rules={start:[{token:"comment.doc.tag",regex:"@[\\w\\d_]+"},s.getTagRule(),{defaultToken:"comment.doc",caseInsensitive:!0}]}};r.inherits(s,i),s.getTagRule=function(e){return{token:"comment.doc.tag.storage.type",regex:"\\b(?:TODO|FIXME|XXX|HACK)\\b"}},s.getStartRule=function(e){return{token:"comment.doc",regex:"\\/\\*(?=\\*)",next:e}},s.getEndRule=function(e){return{token:"comment.doc",regex:"\\*\\/",next:e}},t.DocCommentHighlightRules=s}),ace.define("ace/mode/javascript_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/doc_comment_highlight_rules","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";function a(){var e=o.replace("\\d","\\d\\-"),t={onMatch:function(e,t,n){var r=e.charAt(1)=="/"?2:1;if(r==1)t!=this.nextState?n.unshift(this.next,this.nextState,0):n.unshift(this.next),n[2]++;else if(r==2&&t==this.nextState){n[1]--;if(!n[1]||n[1]<0)n.shift(),n.shift()}return[{type:"meta.tag.punctuation."+(r==1?"":"end-")+"tag-open.xml",value:e.slice(0,r)},{type:"meta.tag.tag-name.xml",value:e.substr(r)}]},regex:"",onMatch:function(e,t,n){return t==n[0]&&n.shift(),e.length==2&&(n[0]==this.nextState&&n[1]--,(!n[1]||n[1]<0)&&n.splice(0,2)),this.next=n[0]||"start",[{type:this.token,value:e}]},nextState:"jsx"},n,f("jsxAttributes"),{token:"entity.other.attribute-name.xml",regex:e},{token:"keyword.operator.attribute-equals.xml",regex:"="},{token:"text.tag-whitespace.xml",regex:"\\s+"},{token:"string.attribute-value.xml",regex:"'",stateName:"jsx_attr_q",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',stateName:"jsx_attr_qq",push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},t],this.$rules.reference=[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}]}function f(e){return[{token:"comment",regex:/\/\*/,next:[i.getTagRule(),{token:"comment",regex:"\\*\\/",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]},{token:"comment",regex:"\\/\\/",next:[i.getTagRule(),{token:"comment",regex:"$|^",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]}]}var r=e("../lib/oop"),i=e("./doc_comment_highlight_rules").DocCommentHighlightRules,s=e("./text_highlight_rules").TextHighlightRules,o="[a-zA-Z\\$_\u00a1-\uffff][a-zA-Z\\d\\$_\u00a1-\uffff]*",u=function(e){var t=this.createKeywordMapper({"variable.language":"Array|Boolean|Date|Function|Iterator|Number|Object|RegExp|String|Proxy|Namespace|QName|XML|XMLList|ArrayBuffer|Float32Array|Float64Array|Int16Array|Int32Array|Int8Array|Uint16Array|Uint32Array|Uint8Array|Uint8ClampedArray|Error|EvalError|InternalError|RangeError|ReferenceError|StopIteration|SyntaxError|TypeError|URIError|decodeURI|decodeURIComponent|encodeURI|encodeURIComponent|eval|isFinite|isNaN|parseFloat|parseInt|JSON|Math|this|arguments|prototype|window|document",keyword:"const|yield|import|get|set|async|await|break|case|catch|continue|default|delete|do|else|finally|for|function|if|in|instanceof|new|return|switch|throw|try|typeof|let|var|while|with|debugger|__parent__|__count__|escape|unescape|with|__proto__|class|enum|extends|super|export|implements|private|public|interface|package|protected|static","storage.type":"const|let|var|function","constant.language":"null|Infinity|NaN|undefined","support.function":"alert","constant.language.boolean":"true|false"},"identifier"),n="case|do|else|finally|in|instanceof|return|throw|try|typeof|yield|void",r="\\\\(?:x[0-9a-fA-F]{2}|u[0-9a-fA-F]{4}|u{[0-9a-fA-F]{1,6}}|[0-2][0-7]{0,2}|3[0-7][0-7]?|[4-7][0-7]?|.)";this.$rules={no_regex:[i.getStartRule("doc-start"),f("no_regex"),{token:"string",regex:"'(?=.)",next:"qstring"},{token:"string",regex:'"(?=.)',next:"qqstring"},{token:"constant.numeric",regex:/0(?:[xX][0-9a-fA-F]+|[bB][01]+)\b/},{token:"constant.numeric",regex:/[+-]?\d[\d_]*(?:(?:\.\d*)?(?:[eE][+-]?\d+)?)?\b/},{token:["storage.type","punctuation.operator","support.function","punctuation.operator","entity.name.function","text","keyword.operator"],regex:"("+o+")(\\.)(prototype)(\\.)("+o+")(\\s*)(=)",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s+)(\\w+)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","text","entity.name.function","text","paren.lparen"],regex:"(function)(\\s+)("+o+")(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","punctuation.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["text","text","storage.type","text","paren.lparen"],regex:"(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:"keyword",regex:"(?:"+n+")\\b",next:"start"},{token:["support.constant"],regex:/that\b/},{token:["storage.type","punctuation.operator","support.function.firebug"],regex:/(console)(\.)(warn|info|log|error|time|trace|timeEnd|assert)\b/},{token:t,regex:o},{token:"punctuation.operator",regex:/[.](?![.])/,next:"property"},{token:"keyword.operator",regex:/--|\+\+|\.{3}|===|==|=|!=|!==|<+=?|>+=?|!|&&|\|\||\?\:|[!$%&*+\-~\/^]=?/,next:"start"},{token:"punctuation.operator",regex:/[?:,;.]/,next:"start"},{token:"paren.lparen",regex:/[\[({]/,next:"start"},{token:"paren.rparen",regex:/[\])}]/},{token:"comment",regex:/^#!.*$/}],property:[{token:"text",regex:"\\s+"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(?:(\\s+)(\\w+))?(\\s*)(\\()",next:"function_arguments"},{token:"punctuation.operator",regex:/[.](?![.])/},{token:"support.function",regex:/(s(?:h(?:ift|ow(?:Mod(?:elessDialog|alDialog)|Help))|croll(?:X|By(?:Pages|Lines)?|Y|To)?|t(?:op|rike)|i(?:n|zeToContent|debar|gnText)|ort|u(?:p|b(?:str(?:ing)?)?)|pli(?:ce|t)|e(?:nd|t(?:Re(?:sizable|questHeader)|M(?:i(?:nutes|lliseconds)|onth)|Seconds|Ho(?:tKeys|urs)|Year|Cursor|Time(?:out)?|Interval|ZOptions|Date|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Date|FullYear)|FullYear|Active)|arch)|qrt|lice|avePreferences|mall)|h(?:ome|andleEvent)|navigate|c(?:har(?:CodeAt|At)|o(?:s|n(?:cat|textual|firm)|mpile)|eil|lear(?:Timeout|Interval)?|a(?:ptureEvents|ll)|reate(?:StyleSheet|Popup|EventObject))|t(?:o(?:GMTString|S(?:tring|ource)|U(?:TCString|pperCase)|Lo(?:caleString|werCase))|est|a(?:n|int(?:Enabled)?))|i(?:s(?:NaN|Finite)|ndexOf|talics)|d(?:isableExternalCapture|ump|etachEvent)|u(?:n(?:shift|taint|escape|watch)|pdateCommands)|j(?:oin|avaEnabled)|p(?:o(?:p|w)|ush|lugins.refresh|a(?:ddings|rse(?:Int|Float)?)|r(?:int|ompt|eference))|e(?:scape|nableExternalCapture|val|lementFromPoint|x(?:p|ec(?:Script|Command)?))|valueOf|UTC|queryCommand(?:State|Indeterm|Enabled|Value)|f(?:i(?:nd|le(?:ModifiedDate|Size|CreatedDate|UpdatedDate)|xed)|o(?:nt(?:size|color)|rward)|loor|romCharCode)|watch|l(?:ink|o(?:ad|g)|astIndexOf)|a(?:sin|nchor|cos|t(?:tachEvent|ob|an(?:2)?)|pply|lert|b(?:s|ort))|r(?:ou(?:nd|teEvents)|e(?:size(?:By|To)|calc|turnValue|place|verse|l(?:oad|ease(?:Capture|Events)))|andom)|g(?:o|et(?:ResponseHeader|M(?:i(?:nutes|lliseconds)|onth)|Se(?:conds|lection)|Hours|Year|Time(?:zoneOffset)?|Da(?:y|te)|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Da(?:y|te)|FullYear)|FullYear|A(?:ttention|llResponseHeaders)))|m(?:in|ove(?:B(?:y|elow)|To(?:Absolute)?|Above)|ergeAttributes|a(?:tch|rgins|x))|b(?:toa|ig|o(?:ld|rderWidths)|link|ack))\b(?=\()/},{token:"support.function.dom",regex:/(s(?:ub(?:stringData|mit)|plitText|e(?:t(?:NamedItem|Attribute(?:Node)?)|lect))|has(?:ChildNodes|Feature)|namedItem|c(?:l(?:ick|o(?:se|neNode))|reate(?:C(?:omment|DATASection|aption)|T(?:Head|extNode|Foot)|DocumentFragment|ProcessingInstruction|E(?:ntityReference|lement)|Attribute))|tabIndex|i(?:nsert(?:Row|Before|Cell|Data)|tem)|open|delete(?:Row|C(?:ell|aption)|T(?:Head|Foot)|Data)|focus|write(?:ln)?|a(?:dd|ppend(?:Child|Data))|re(?:set|place(?:Child|Data)|move(?:NamedItem|Child|Attribute(?:Node)?)?)|get(?:NamedItem|Element(?:sBy(?:Name|TagName|ClassName)|ById)|Attribute(?:Node)?)|blur)\b(?=\()/},{token:"support.constant",regex:/(s(?:ystemLanguage|cr(?:ipts|ollbars|een(?:X|Y|Top|Left))|t(?:yle(?:Sheets)?|atus(?:Text|bar)?)|ibling(?:Below|Above)|ource|uffixes|e(?:curity(?:Policy)?|l(?:ection|f)))|h(?:istory|ost(?:name)?|as(?:h|Focus))|y|X(?:MLDocument|SLDocument)|n(?:ext|ame(?:space(?:s|URI)|Prop))|M(?:IN_VALUE|AX_VALUE)|c(?:haracterSet|o(?:n(?:structor|trollers)|okieEnabled|lorDepth|mp(?:onents|lete))|urrent|puClass|l(?:i(?:p(?:boardData)?|entInformation)|osed|asses)|alle(?:e|r)|rypto)|t(?:o(?:olbar|p)|ext(?:Transform|Indent|Decoration|Align)|ags)|SQRT(?:1_2|2)|i(?:n(?:ner(?:Height|Width)|put)|ds|gnoreCase)|zIndex|o(?:scpu|n(?:readystatechange|Line)|uter(?:Height|Width)|p(?:sProfile|ener)|ffscreenBuffering)|NEGATIVE_INFINITY|d(?:i(?:splay|alog(?:Height|Top|Width|Left|Arguments)|rectories)|e(?:scription|fault(?:Status|Ch(?:ecked|arset)|View)))|u(?:ser(?:Profile|Language|Agent)|n(?:iqueID|defined)|pdateInterval)|_content|p(?:ixelDepth|ort|ersonalbar|kcs11|l(?:ugins|atform)|a(?:thname|dding(?:Right|Bottom|Top|Left)|rent(?:Window|Layer)?|ge(?:X(?:Offset)?|Y(?:Offset)?))|r(?:o(?:to(?:col|type)|duct(?:Sub)?|mpter)|e(?:vious|fix)))|e(?:n(?:coding|abledPlugin)|x(?:ternal|pando)|mbeds)|v(?:isibility|endor(?:Sub)?|Linkcolor)|URLUnencoded|P(?:I|OSITIVE_INFINITY)|f(?:ilename|o(?:nt(?:Size|Family|Weight)|rmName)|rame(?:s|Element)|gColor)|E|whiteSpace|l(?:i(?:stStyleType|n(?:eHeight|kColor))|o(?:ca(?:tion(?:bar)?|lName)|wsrc)|e(?:ngth|ft(?:Context)?)|a(?:st(?:M(?:odified|atch)|Index|Paren)|yer(?:s|X)|nguage))|a(?:pp(?:MinorVersion|Name|Co(?:deName|re)|Version)|vail(?:Height|Top|Width|Left)|ll|r(?:ity|guments)|Linkcolor|bove)|r(?:ight(?:Context)?|e(?:sponse(?:XML|Text)|adyState))|global|x|m(?:imeTypes|ultiline|enubar|argin(?:Right|Bottom|Top|Left))|L(?:N(?:10|2)|OG(?:10E|2E))|b(?:o(?:ttom|rder(?:Width|RightWidth|BottomWidth|Style|Color|TopWidth|LeftWidth))|ufferDepth|elow|ackground(?:Color|Image)))\b/},{token:"identifier",regex:o},{regex:"",token:"empty",next:"no_regex"}],start:[i.getStartRule("doc-start"),f("start"),{token:"string.regexp",regex:"\\/",next:"regex"},{token:"text",regex:"\\s+|^$",next:"start"},{token:"empty",regex:"",next:"no_regex"}],regex:[{token:"regexp.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"string.regexp",regex:"/[sxngimy]*",next:"no_regex"},{token:"invalid",regex:/\{\d+\b,?\d*\}[+*]|[+*$^?][+*]|[$^][?]|\?{3,}/},{token:"constant.language.escape",regex:/\(\?[:=!]|\)|\{\d+\b,?\d*\}|[+*]\?|[()$^+*?.]/},{token:"constant.language.delimiter",regex:/\|/},{token:"constant.language.escape",regex:/\[\^?/,next:"regex_character_class"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp"}],regex_character_class:[{token:"regexp.charclass.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"constant.language.escape",regex:"]",next:"regex"},{token:"constant.language.escape",regex:"-"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp.charachterclass"}],function_arguments:[{token:"variable.parameter",regex:o},{token:"punctuation.operator",regex:"[, ]+"},{token:"punctuation.operator",regex:"$"},{token:"empty",regex:"",next:"no_regex"}],qqstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qqstring"},{token:"string",regex:'"|$',next:"no_regex"},{defaultToken:"string"}],qstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qstring"},{token:"string",regex:"'|$",next:"no_regex"},{defaultToken:"string"}]};if(!e||!e.noES6)this.$rules.no_regex.unshift({regex:"[{}]",onMatch:function(e,t,n){this.next=e=="{"?this.nextState:"";if(e=="{"&&n.length)n.unshift("start",t);else if(e=="}"&&n.length){n.shift(),this.next=n.shift();if(this.next.indexOf("string")!=-1||this.next.indexOf("jsx")!=-1)return"paren.quasi.end"}return e=="{"?"paren.lparen":"paren.rparen"},nextState:"start"},{token:"string.quasi.start",regex:/`/,push:[{token:"constant.language.escape",regex:r},{token:"paren.quasi.start",regex:/\${/,push:"start"},{token:"string.quasi.end",regex:/`/,next:"pop"},{defaultToken:"string.quasi"}]}),(!e||!e.noJSX)&&a.call(this);this.embedRules(i,"doc-",[i.getEndRule("no_regex")]),this.normalizeRules()};r.inherits(u,s),t.JavaScriptHighlightRules=u}),ace.define("ace/mode/matching_brace_outdent",["require","exports","module","ace/range"],function(e,t,n){"use strict";var r=e("../range").Range,i=function(){};(function(){this.checkOutdent=function(e,t){return/^\s+$/.test(e)?/^\s*\}/.test(t):!1},this.autoOutdent=function(e,t){var n=e.getLine(t),i=n.match(/^(\s*\})/);if(!i)return 0;var s=i[1].length,o=e.findMatchingBracket({row:t,column:s});if(!o||o.row==t)return 0;var u=this.$getIndent(e.getLine(o.row));e.replace(new r(t,0,t,s-1),u)},this.$getIndent=function(e){return e.match(/^\s*/)[0]}}).call(i.prototype),t.MatchingBraceOutdent=i}),ace.define("ace/mode/behaviour/cstyle",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),u=["text","paren.rparen","punctuation.operator"],a=["text","paren.rparen","punctuation.operator","comment"],f,l={},c=function(e){var t=-1;e.multiSelect&&(t=e.selection.index,l.rangeCount!=e.multiSelect.rangeCount&&(l={rangeCount:e.multiSelect.rangeCount}));if(l[t])return f=l[t];f=l[t]={autoInsertedBrackets:0,autoInsertedRow:-1,autoInsertedLineEnd:"",maybeInsertedBrackets:0,maybeInsertedRow:-1,maybeInsertedLineStart:"",maybeInsertedLineEnd:""}},h=function(e,t,n,r){var i=e.end.row-e.start.row;return{text:n+t+r,selection:[0,e.start.column+1,i,e.end.column+(i?0:1)]}},p=function(){this.add("braces","insertion",function(e,t,n,r,i){var s=n.getCursorPosition(),u=r.doc.getLine(s.row);if(i=="{"){c(n);var a=n.getSelectionRange(),l=r.doc.getTextRange(a);if(l!==""&&l!=="{"&&n.getWrapBehavioursEnabled())return h(a,l,"{","}");if(p.isSaneInsertion(n,r))return/[\]\}\)]/.test(u[s.column])||n.inMultiSelectMode?(p.recordAutoInsert(n,r,"}"),{text:"{}",selection:[1,1]}):(p.recordMaybeInsert(n,r,"{"),{text:"{",selection:[1,1]})}else if(i=="}"){c(n);var d=u.substring(s.column,s.column+1);if(d=="}"){var v=r.$findOpeningBracket("}",{column:s.column+1,row:s.row});if(v!==null&&p.isAutoInsertedClosing(s,u,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}else{if(i=="\n"||i=="\r\n"){c(n);var m="";p.isMaybeInsertedClosing(s,u)&&(m=o.stringRepeat("}",f.maybeInsertedBrackets),p.clearMaybeInsertedClosing());var d=u.substring(s.column,s.column+1);if(d==="}"){var g=r.findMatchingBracket({row:s.row,column:s.column+1},"}");if(!g)return null;var y=this.$getIndent(r.getLine(g.row))}else{if(!m){p.clearMaybeInsertedClosing();return}var y=this.$getIndent(u)}var b=y+r.getTabString();return{text:"\n"+b+"\n"+y+m,selection:[1,b.length,1,b.length]}}p.clearMaybeInsertedClosing()}}),this.add("braces","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="{"){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.end.column,i.end.column+1);if(u=="}")return i.end.column++,i;f.maybeInsertedBrackets--}}),this.add("parens","insertion",function(e,t,n,r,i){if(i=="("){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"(",")");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,")"),{text:"()",selection:[1,1]}}else if(i==")"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f==")"){var l=r.$findOpeningBracket(")",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("parens","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="("){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==")")return i.end.column++,i}}),this.add("brackets","insertion",function(e,t,n,r,i){if(i=="["){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"[","]");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,"]"),{text:"[]",selection:[1,1]}}else if(i=="]"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f=="]"){var l=r.$findOpeningBracket("]",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("brackets","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="["){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u=="]")return i.end.column++,i}}),this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){c(n);var s=i,o=n.getSelectionRange(),u=r.doc.getTextRange(o);if(u!==""&&u!=="'"&&u!='"'&&n.getWrapBehavioursEnabled())return h(o,u,s,s);if(!u){var a=n.getCursorPosition(),f=r.doc.getLine(a.row),l=f.substring(a.column-1,a.column),p=f.substring(a.column,a.column+1),d=r.getTokenAt(a.row,a.column),v=r.getTokenAt(a.row,a.column+1);if(l=="\\"&&d&&/escape/.test(d.type))return null;var m=d&&/string|escape/.test(d.type),g=!v||/string|escape/.test(v.type),y;if(p==s)y=m!==g;else{if(m&&!g)return null;if(m&&g)return null;var b=r.$mode.tokenRe;b.lastIndex=0;var w=b.test(l);b.lastIndex=0;var E=b.test(l);if(w||E)return null;if(p&&!/[\s;,.})\]\\]/.test(p))return null;y=!0}return{text:y?s+s:"",selection:[1,1]}}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}})};p.isSaneInsertion=function(e,t){var n=e.getCursorPosition(),r=new s(t,n.row,n.column);if(!this.$matchTokenType(r.getCurrentToken()||"text",u)){var i=new s(t,n.row,n.column+1);if(!this.$matchTokenType(i.getCurrentToken()||"text",u))return!1}return r.stepForward(),r.getCurrentTokenRow()!==n.row||this.$matchTokenType(r.getCurrentToken()||"text",a)},p.$matchTokenType=function(e,t){return t.indexOf(e.type||e)>-1},p.recordAutoInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isAutoInsertedClosing(r,i,f.autoInsertedLineEnd[0])||(f.autoInsertedBrackets=0),f.autoInsertedRow=r.row,f.autoInsertedLineEnd=n+i.substr(r.column),f.autoInsertedBrackets++},p.recordMaybeInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isMaybeInsertedClosing(r,i)||(f.maybeInsertedBrackets=0),f.maybeInsertedRow=r.row,f.maybeInsertedLineStart=i.substr(0,r.column)+n,f.maybeInsertedLineEnd=i.substr(r.column),f.maybeInsertedBrackets++},p.isAutoInsertedClosing=function(e,t,n){return f.autoInsertedBrackets>0&&e.row===f.autoInsertedRow&&n===f.autoInsertedLineEnd[0]&&t.substr(e.column)===f.autoInsertedLineEnd},p.isMaybeInsertedClosing=function(e,t){return f.maybeInsertedBrackets>0&&e.row===f.maybeInsertedRow&&t.substr(e.column)===f.maybeInsertedLineEnd&&t.substr(0,e.column)==f.maybeInsertedLineStart},p.popAutoInsertedClosing=function(){f.autoInsertedLineEnd=f.autoInsertedLineEnd.substr(1),f.autoInsertedBrackets--},p.clearMaybeInsertedClosing=function(){f&&(f.maybeInsertedBrackets=0,f.maybeInsertedRow=-1)},r.inherits(p,i),t.CstyleBehaviour=p}),ace.define("ace/mode/folding/cstyle",["require","exports","module","ace/lib/oop","ace/range","ace/mode/folding/fold_mode"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../../range").Range,s=e("./fold_mode").FoldMode,o=t.FoldMode=function(e){e&&(this.foldingStartMarker=new RegExp(this.foldingStartMarker.source.replace(/\|[^|]*?$/,"|"+e.start)),this.foldingStopMarker=new RegExp(this.foldingStopMarker.source.replace(/\|[^|]*?$/,"|"+e.end)))};r.inherits(o,s),function(){this.foldingStartMarker=/(\{|\[)[^\}\]]*$|^\s*(\/\*)/,this.foldingStopMarker=/^[^\[\{]*(\}|\])|^[\s\*]*(\*\/)/,this.singleLineBlockCommentRe=/^\s*(\/\*).*\*\/\s*$/,this.tripleStarBlockCommentRe=/^\s*(\/\*\*\*).*\*\/\s*$/,this.startRegionRe=/^\s*(\/\*|\/\/)#?region\b/,this._getFoldWidgetBase=this.getFoldWidget,this.getFoldWidget=function(e,t,n){var r=e.getLine(n);if(this.singleLineBlockCommentRe.test(r)&&!this.startRegionRe.test(r)&&!this.tripleStarBlockCommentRe.test(r))return"";var i=this._getFoldWidgetBase(e,t,n);return!i&&this.startRegionRe.test(r)?"start":i},this.getFoldWidgetRange=function(e,t,n,r){var i=e.getLine(n);if(this.startRegionRe.test(i))return this.getCommentRegionBlock(e,i,n);var s=i.match(this.foldingStartMarker);if(s){var o=s.index;if(s[1])return this.openingBracketBlock(e,s[1],n,o);var u=e.getCommentFoldRange(n,o+s[0].length,1);return u&&!u.isMultiLine()&&(r?u=this.getSectionRange(e,n):t!="all"&&(u=null)),u}if(t==="markbegin")return;var s=i.match(this.foldingStopMarker);if(s){var o=s.index+s[0].length;return s[1]?this.closingBracketBlock(e,s[1],n,o):e.getCommentFoldRange(n,o,-1)}},this.getSectionRange=function(e,t){var n=e.getLine(t),r=n.search(/\S/),s=t,o=n.length;t+=1;var u=t,a=e.getLength();while(++tf)break;var l=this.getFoldWidgetRange(e,"all",t);if(l){if(l.start.row<=s)break;if(l.isMultiLine())t=l.end.row;else if(r==f)break}u=t}return new i(s,o,u,e.getLine(u).length)},this.getCommentRegionBlock=function(e,t,n){var r=t.search(/\s*$/),s=e.getLength(),o=n,u=/^\s*(?:\/\*|\/\/|--)#?(end)?region\b/,a=1;while(++no)return new i(o,r,l,t.length)}}.call(o.prototype)}),ace.define("ace/mode/javascript",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/javascript_highlight_rules","ace/mode/matching_brace_outdent","ace/range","ace/worker/worker_client","ace/mode/behaviour/cstyle","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./javascript_highlight_rules").JavaScriptHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../range").Range,a=e("../worker/worker_client").WorkerClient,f=e("./behaviour/cstyle").CstyleBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.foldingRules=new l};r.inherits(c,i),function(){this.lineCommentStart="//",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e),s=i.tokens,o=i.state;if(s.length&&s[s.length-1].type=="comment")return r;if(e=="start"||e=="no_regex"){var u=t.match(/^.*(?:\bcase\b.*\:|[\{\(\[])\s*$/);u&&(r+=n)}else if(e=="doc-start"){if(o=="start"||o=="no_regex")return"";var u=t.match(/^\s*(\/?)\*/);u&&(u[1]&&(r+=" "),r+="* ")}return r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.createWorker=function(e){var t=new a(["ace"],"ace/mode/javascript_worker","JavaScriptWorker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/javascript"}.call(c.prototype),t.Mode=c}),ace.define("ace/mode/xml_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text_highlight_rules").TextHighlightRules,s=function(e){var t="[_:a-zA-Z\u00c0-\uffff][-_:.a-zA-Z0-9\u00c0-\uffff]*";this.$rules={start:[{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\[",next:"cdata"},{token:["punctuation.xml-decl.xml","keyword.xml-decl.xml"],regex:"(<\\?)(xml)(?=[\\s])",next:"xml_decl",caseInsensitive:!0},{token:["punctuation.instruction.xml","keyword.instruction.xml"],regex:"(<\\?)("+t+")",next:"processing_instruction"},{token:"comment.xml",regex:"<\\!--",next:"comment"},{token:["xml-pe.doctype.xml","xml-pe.doctype.xml"],regex:"(<\\!)(DOCTYPE)(?=[\\s])",next:"doctype",caseInsensitive:!0},{include:"tag"},{token:"text.end-tag-open.xml",regex:"",next:"start"}],processing_instruction:[{token:"punctuation.instruction.xml",regex:"\\?>",next:"start"},{defaultToken:"instruction.xml"}],doctype:[{include:"whitespace"},{include:"string"},{token:"xml-pe.doctype.xml",regex:">",next:"start"},{token:"xml-pe.xml",regex:"[-_a-zA-Z0-9:]+"},{token:"punctuation.int-subset",regex:"\\[",push:"int_subset"}],int_subset:[{token:"text.xml",regex:"\\s+"},{token:"punctuation.int-subset.xml",regex:"]",next:"pop"},{token:["punctuation.markup-decl.xml","keyword.markup-decl.xml"],regex:"(<\\!)("+t+")",push:[{token:"text",regex:"\\s+"},{token:"punctuation.markup-decl.xml",regex:">",next:"pop"},{include:"string"}]}],cdata:[{token:"string.cdata.xml",regex:"\\]\\]>",next:"start"},{token:"text.xml",regex:"\\s+"},{token:"text.xml",regex:"(?:[^\\]]|\\](?!\\]>))+"}],comment:[{token:"comment.xml",regex:"-->",next:"start"},{defaultToken:"comment.xml"}],reference:[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],attr_reference:[{token:"constant.language.escape.reference.attribute-value.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],tag:[{token:["meta.tag.punctuation.tag-open.xml","meta.tag.punctuation.end-tag-open.xml","meta.tag.tag-name.xml"],regex:"(?:(<)|(",next:"start"}]}],tag_whitespace:[{token:"text.tag-whitespace.xml",regex:"\\s+"}],whitespace:[{token:"text.whitespace.xml",regex:"\\s+"}],string:[{token:"string.xml",regex:"'",push:[{token:"string.xml",regex:"'",next:"pop"},{defaultToken:"string.xml"}]},{token:"string.xml",regex:'"',push:[{token:"string.xml",regex:'"',next:"pop"},{defaultToken:"string.xml"}]}],attributes:[{token:"entity.other.attribute-name.xml",regex:"(?:"+t+":)?"+t+""},{token:"keyword.operator.attribute-equals.xml",regex:"="},{include:"tag_whitespace"},{include:"attribute_value"}],attribute_value:[{token:"string.attribute-value.xml",regex:"'",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]}]},this.constructor===s&&this.normalizeRules()};(function(){this.embedTagRules=function(e,t,n){this.$rules.tag.unshift({token:["meta.tag.punctuation.tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(<)("+n+"(?=\\s|>|$))",next:[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:t+"start"}]}),this.$rules[n+"-end"]=[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:"start",onMatch:function(e,t,n){return n.splice(0),this.token}}],this.embedRules(e,t,[{token:["meta.tag.punctuation.end-tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(|$))",next:n+"-end"},{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\["},{token:"string.cdata.xml",regex:"\\]\\]>"}])}}).call(i.prototype),r.inherits(s,i),t.XmlHighlightRules=s}),ace.define("ace/mode/behaviour/xml",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";function u(e,t){return e.type.lastIndexOf(t+".xml")>-1}var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),a=function(){this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){var o=i,a=r.doc.getTextRange(n.getSelectionRange());if(a!==""&&a!=="'"&&a!='"'&&n.getWrapBehavioursEnabled())return{text:o+a+o,selection:!1};var f=n.getCursorPosition(),l=r.doc.getLine(f.row),c=l.substring(f.column,f.column+1),h=new s(r,f.row,f.column),p=h.getCurrentToken();if(c==o&&(u(p,"attribute-value")||u(p,"string")))return{text:"",selection:[1,1]};p||(p=h.stepBackward());if(!p)return;while(u(p,"tag-whitespace")||u(p,"whitespace"))p=h.stepBackward();var d=!c||c.match(/\s/);if(u(p,"attribute-equals")&&(d||c==">")||u(p,"decl-attribute-equals")&&(d||c=="?"))return{text:o+o,selection:[1,1]}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}}),this.add("autoclosing","insertion",function(e,t,n,r,i){if(i==">"){var o=n.getCursorPosition(),a=new s(r,o.row,o.column),f=a.getCurrentToken()||a.stepBackward();if(!f||!(u(f,"tag-name")||u(f,"tag-whitespace")||u(f,"attribute-name")||u(f,"attribute-equals")||u(f,"attribute-value")))return;if(u(f,"reference.attribute-value"))return;if(u(f,"attribute-value")){var l=f.value.charAt(0);if(l=='"'||l=="'"){var c=f.value.charAt(f.value.length-1),h=a.getCurrentTokenColumn()+f.value.length;if(h>o.column||h==o.column&&l!=c)return}}while(!u(f,"tag-name"))f=a.stepBackward();var p=a.getCurrentTokenRow(),d=a.getCurrentTokenColumn();if(u(a.stepBackward(),"end-tag-open"))return;var v=f.value;p==o.row&&(v=v.substring(0,o.column-d));if(this.voidElements.hasOwnProperty(v.toLowerCase()))return;return{text:">",selection:[1,1]}}}),this.add("autoindent","insertion",function(e,t,n,r,i){if(i=="\n"){var o=n.getCursorPosition(),u=r.getLine(o.row),a=new s(r,o.row,o.column),f=a.getCurrentToken();if(f&&f.type.indexOf("tag-close")!==-1){if(f.value=="/>")return;while(f&&f.type.indexOf("tag-name")===-1)f=a.stepBackward();if(!f)return;var l=f.value,c=a.getCurrentTokenRow();f=a.stepBackward();if(!f||f.type.indexOf("end-tag")!==-1)return;if(this.voidElements&&!this.voidElements[l]){var h=r.getTokenAt(o.row,o.column+1),u=r.getLine(c),p=this.$getIndent(u),d=p+r.getTabString();return h&&h.value==="-1}var r=e("../../lib/oop"),i=e("../../lib/lang"),s=e("../../range").Range,o=e("./fold_mode").FoldMode,u=e("../../token_iterator").TokenIterator,a=t.FoldMode=function(e,t){o.call(this),this.voidElements=e||{},this.optionalEndTags=r.mixin({},this.voidElements),t&&r.mixin(this.optionalEndTags,t)};r.inherits(a,o);var f=function(){this.tagName="",this.closing=!1,this.selfClosing=!1,this.start={row:0,column:0},this.end={row:0,column:0}};(function(){this.getFoldWidget=function(e,t,n){var r=this._getFirstTagInLine(e,n);return r?r.closing||!r.tagName&&r.selfClosing?t=="markbeginend"?"end":"":!r.tagName||r.selfClosing||this.voidElements.hasOwnProperty(r.tagName.toLowerCase())?"":this._findEndTagInLine(e,n,r.tagName,r.end.column)?"":"start":""},this._getFirstTagInLine=function(e,t){var n=e.getTokens(t),r=new f;for(var i=0;i";break}}return r}if(l(s,"tag-close"))return r.selfClosing=s.value=="/>",r;r.start.column+=s.value.length}return null},this._findEndTagInLine=function(e,t,n,r){var i=e.getTokens(t),s=0;for(var o=0;o",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length,e.stepForward(),n;while(t=e.stepForward());return null},this._readTagBackward=function(e){var t=e.getCurrentToken();if(!t)return null;var n=new f;do{if(l(t,"tag-open"))return n.closing=l(t,"end-tag-open"),n.start.row=e.getCurrentTokenRow(),n.start.column=e.getCurrentTokenColumn(),e.stepBackward(),n;l(t,"tag-name")?n.tagName=t.value:l(t,"tag-close")&&(n.selfClosing=t.value=="/>",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length)}while(t=e.stepBackward());return null},this._pop=function(e,t){while(e.length){var n=e[e.length-1];if(!t||n.tagName==t.tagName)return e.pop();if(this.optionalEndTags.hasOwnProperty(n.tagName)){e.pop();continue}return null}},this.getFoldWidgetRange=function(e,t,n){var r=this._getFirstTagInLine(e,n);if(!r)return null;var i=r.closing||r.selfClosing,o=[],a;if(!i){var f=new u(e,n,r.start.column),l={row:n,column:r.start.column+r.tagName.length+2};r.start.row==r.end.row&&(l.column=r.end.column);while(a=this._readTagForward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(a.closing){this._pop(o,a);if(o.length==0)return s.fromPoints(l,a.start)}else o.push(a)}}else{var f=new u(e,n,r.end.column),c={row:n,column:r.start.column};while(a=this._readTagBackward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(!a.closing){this._pop(o,a);if(o.length==0)return a.start.column+=a.tagName.length+2,a.start.row==a.end.row&&a.start.column"},this.createWorker=function(e){var t=new f(["ace"],"ace/mode/xml_worker","Worker");return t.attachToDocument(e.getDocument()),t.on("error",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/xml"}.call(l.prototype),t.Mode=l}),ace.define("ace/mode/css_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=t.supportType="align-content|align-items|align-self|all|animation|animation-delay|animation-direction|animation-duration|animation-fill-mode|animation-iteration-count|animation-name|animation-play-state|animation-timing-function|backface-visibility|background|background-attachment|background-blend-mode|background-clip|background-color|background-image|background-origin|background-position|background-repeat|background-size|border|border-bottom|border-bottom-color|border-bottom-left-radius|border-bottom-right-radius|border-bottom-style|border-bottom-width|border-collapse|border-color|border-image|border-image-outset|border-image-repeat|border-image-slice|border-image-source|border-image-width|border-left|border-left-color|border-left-style|border-left-width|border-radius|border-right|border-right-color|border-right-style|border-right-width|border-spacing|border-style|border-top|border-top-color|border-top-left-radius|border-top-right-radius|border-top-style|border-top-width|border-width|bottom|box-shadow|box-sizing|caption-side|clear|clip|color|column-count|column-fill|column-gap|column-rule|column-rule-color|column-rule-style|column-rule-width|column-span|column-width|columns|content|counter-increment|counter-reset|cursor|direction|display|empty-cells|filter|flex|flex-basis|flex-direction|flex-flow|flex-grow|flex-shrink|flex-wrap|float|font|font-family|font-size|font-size-adjust|font-stretch|font-style|font-variant|font-weight|hanging-punctuation|height|justify-content|left|letter-spacing|line-height|list-style|list-style-image|list-style-position|list-style-type|margin|margin-bottom|margin-left|margin-right|margin-top|max-height|max-width|min-height|min-width|nav-down|nav-index|nav-left|nav-right|nav-up|opacity|order|outline|outline-color|outline-offset|outline-style|outline-width|overflow|overflow-x|overflow-y|padding|padding-bottom|padding-left|padding-right|padding-top|page-break-after|page-break-before|page-break-inside|perspective|perspective-origin|position|quotes|resize|right|tab-size|table-layout|text-align|text-align-last|text-decoration|text-decoration-color|text-decoration-line|text-decoration-style|text-indent|text-justify|text-overflow|text-shadow|text-transform|top|transform|transform-origin|transform-style|transition|transition-delay|transition-duration|transition-property|transition-timing-function|unicode-bidi|vertical-align|visibility|white-space|width|word-break|word-spacing|word-wrap|z-index",u=t.supportFunction="rgb|rgba|url|attr|counter|counters",a=t.supportConstant="absolute|after-edge|after|all-scroll|all|alphabetic|always|antialiased|armenian|auto|avoid-column|avoid-page|avoid|balance|baseline|before-edge|before|below|bidi-override|block-line-height|block|bold|bolder|border-box|both|bottom|box|break-all|break-word|capitalize|caps-height|caption|center|central|char|circle|cjk-ideographic|clone|close-quote|col-resize|collapse|column|consider-shifts|contain|content-box|cover|crosshair|cubic-bezier|dashed|decimal-leading-zero|decimal|default|disabled|disc|disregard-shifts|distribute-all-lines|distribute-letter|distribute-space|distribute|dotted|double|e-resize|ease-in|ease-in-out|ease-out|ease|ellipsis|end|exclude-ruby|fill|fixed|georgian|glyphs|grid-height|groove|hand|hanging|hebrew|help|hidden|hiragana-iroha|hiragana|horizontal|icon|ideograph-alpha|ideograph-numeric|ideograph-parenthesis|ideograph-space|ideographic|inactive|include-ruby|inherit|initial|inline-block|inline-box|inline-line-height|inline-table|inline|inset|inside|inter-ideograph|inter-word|invert|italic|justify|katakana-iroha|katakana|keep-all|last|left|lighter|line-edge|line-through|line|linear|list-item|local|loose|lower-alpha|lower-greek|lower-latin|lower-roman|lowercase|lr-tb|ltr|mathematical|max-height|max-size|medium|menu|message-box|middle|move|n-resize|ne-resize|newspaper|no-change|no-close-quote|no-drop|no-open-quote|no-repeat|none|normal|not-allowed|nowrap|nw-resize|oblique|open-quote|outset|outside|overline|padding-box|page|pointer|pre-line|pre-wrap|pre|preserve-3d|progress|relative|repeat-x|repeat-y|repeat|replaced|reset-size|ridge|right|round|row-resize|rtl|s-resize|scroll|se-resize|separate|slice|small-caps|small-caption|solid|space|square|start|static|status-bar|step-end|step-start|steps|stretch|strict|sub|super|sw-resize|table-caption|table-cell|table-column-group|table-column|table-footer-group|table-header-group|table-row-group|table-row|table|tb-rl|text-after-edge|text-before-edge|text-bottom|text-size|text-top|text|thick|thin|transparent|underline|upper-alpha|upper-latin|upper-roman|uppercase|use-script|vertical-ideographic|vertical-text|visible|w-resize|wait|whitespace|z-index|zero",f=t.supportConstantColor="aqua|black|blue|fuchsia|gray|green|lime|maroon|navy|olive|orange|purple|red|silver|teal|white|yellow",l=t.supportConstantFonts="arial|century|comic|courier|cursive|fantasy|garamond|georgia|helvetica|impact|lucida|symbol|system|tahoma|times|trebuchet|utopia|verdana|webdings|sans-serif|serif|monospace",c=t.numRe="\\-?(?:(?:[0-9]+)|(?:[0-9]*\\.[0-9]+))",h=t.pseudoElements="(\\:+)\\b(after|before|first-letter|first-line|moz-selection|selection)\\b",p=t.pseudoClasses="(:)\\b(active|checked|disabled|empty|enabled|first-child|first-of-type|focus|hover|indeterminate|invalid|last-child|last-of-type|link|not|nth-child|nth-last-child|nth-last-of-type|nth-of-type|only-child|only-of-type|required|root|target|valid|visited)\\b",d=function(){var e=this.createKeywordMapper({"support.function":u,"support.constant":a,"support.type":o,"support.constant.color":f,"support.constant.fonts":l},"text",!0);this.$rules={start:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"@.*?{",push:"media"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],media:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"\\}",next:"pop"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],comment:[{token:"comment",regex:"\\*\\/",next:"pop"},{defaultToken:"comment"}],ruleset:[{token:"paren.rparen",regex:"\\}",next:"pop"},{token:"comment",regex:"\\/\\*",push:"comment"},{token:"string",regex:'["](?:(?:\\\\.)|(?:[^"\\\\]))*?["]'},{token:"string",regex:"['](?:(?:\\\\.)|(?:[^'\\\\]))*?[']"},{token:["constant.numeric","keyword"],regex:"("+c+")(ch|cm|deg|em|ex|fr|gd|grad|Hz|in|kHz|mm|ms|pc|pt|px|rad|rem|s|turn|vh|vm|vw|%)"},{token:"constant.numeric",regex:c},{token:"constant.numeric",regex:"#[a-f0-9]{6}"},{token:"constant.numeric",regex:"#[a-f0-9]{3}"},{token:["punctuation","entity.other.attribute-name.pseudo-element.css"],regex:h},{token:["punctuation","entity.other.attribute-name.pseudo-class.css"],regex:p},{token:["support.function","string","support.function"],regex:"(url\\()(.*)(\\))"},{token:e,regex:"\\-?[a-zA-Z_][a-zA-Z0-9_\\-]*"},{caseInsensitive:!0}]},this.normalizeRules()};r.inherits(d,s),t.CssHighlightRules=d}),ace.define("ace/mode/css_completions",["require","exports","module"],function(e,t,n){"use strict";var r={background:{"#$0":1},"background-color":{"#$0":1,transparent:1,fixed:1},"background-image":{"url('/$0')":1},"background-repeat":{repeat:1,"repeat-x":1,"repeat-y":1,"no-repeat":1,inherit:1},"background-position":{bottom:2,center:2,left:2,right:2,top:2,inherit:2},"background-attachment":{scroll:1,fixed:1},"background-size":{cover:1,contain:1},"background-clip":{"border-box":1,"padding-box":1,"content-box":1},"background-origin":{"border-box":1,"padding-box":1,"content-box":1},border:{"solid $0":1,"dashed $0":1,"dotted $0":1,"#$0":1},"border-color":{"#$0":1},"border-style":{solid:2,dashed:2,dotted:2,"double":2,groove:2,hidden:2,inherit:2,inset:2,none:2,outset:2,ridged:2},"border-collapse":{collapse:1,separate:1},bottom:{px:1,em:1,"%":1},clear:{left:1,right:1,both:1,none:1},color:{"#$0":1,"rgb(#$00,0,0)":1},cursor:{"default":1,pointer:1,move:1,text:1,wait:1,help:1,progress:1,"n-resize":1,"ne-resize":1,"e-resize":1,"se-resize":1,"s-resize":1,"sw-resize":1,"w-resize":1,"nw-resize":1},display:{none:1,block:1,inline:1,"inline-block":1,"table-cell":1},"empty-cells":{show:1,hide:1},"float":{left:1,right:1,none:1},"font-family":{Arial:2,"Comic Sans MS":2,Consolas:2,"Courier New":2,Courier:2,Georgia:2,Monospace:2,"Sans-Serif":2,"Segoe UI":2,Tahoma:2,"Times New Roman":2,"Trebuchet MS":2,Verdana:1},"font-size":{px:1,em:1,"%":1},"font-weight":{bold:1,normal:1},"font-style":{italic:1,normal:1},"font-variant":{normal:1,"small-caps":1},height:{px:1,em:1,"%":1},left:{px:1,em:1,"%":1},"letter-spacing":{normal:1},"line-height":{normal:1},"list-style-type":{none:1,disc:1,circle:1,square:1,decimal:1,"decimal-leading-zero":1,"lower-roman":1,"upper-roman":1,"lower-greek":1,"lower-latin":1,"upper-latin":1,georgian:1,"lower-alpha":1,"upper-alpha":1},margin:{px:1,em:1,"%":1},"margin-right":{px:1,em:1,"%":1},"margin-left":{px:1,em:1,"%":1},"margin-top":{px:1,em:1,"%":1},"margin-bottom":{px:1,em:1,"%":1},"max-height":{px:1,em:1,"%":1},"max-width":{px:1,em:1,"%":1},"min-height":{px:1,em:1,"%":1},"min-width":{px:1,em:1,"%":1},overflow:{hidden:1,visible:1,auto:1,scroll:1},"overflow-x":{hidden:1,visible:1,auto:1,scroll:1},"overflow-y":{hidden:1,visible:1,auto:1,scroll:1},padding:{px:1,em:1,"%":1},"padding-top":{px:1,em:1,"%":1},"padding-right":{px:1,em:1,"%":1},"padding-bottom":{px:1,em:1,"%":1},"padding-left":{px:1,em:1,"%":1},"page-break-after":{auto:1,always:1,avoid:1,left:1,right:1},"page-break-before":{auto:1,always:1,avoid:1,left:1,right:1},position:{absolute:1,relative:1,fixed:1,"static":1},right:{px:1,em:1,"%":1},"table-layout":{fixed:1,auto:1},"text-decoration":{none:1,underline:1,"line-through":1,blink:1},"text-align":{left:1,right:1,center:1,justify:1},"text-transform":{capitalize:1,uppercase:1,lowercase:1,none:1},top:{px:1,em:1,"%":1},"vertical-align":{top:1,bottom:1},visibility:{hidden:1,visible:1},"white-space":{nowrap:1,normal:1,pre:1,"pre-line":1,"pre-wrap":1},width:{px:1,em:1,"%":1},"word-spacing":{normal:1},filter:{"alpha(opacity=$0100)":1},"text-shadow":{"$02px 2px 2px #777":1},"text-overflow":{"ellipsis-word":1,clip:1,ellipsis:1},"-moz-border-radius":1,"-moz-border-radius-topright":1,"-moz-border-radius-bottomright":1,"-moz-border-radius-topleft":1,"-moz-border-radius-bottomleft":1,"-webkit-border-radius":1,"-webkit-border-top-right-radius":1,"-webkit-border-top-left-radius":1,"-webkit-border-bottom-right-radius":1,"-webkit-border-bottom-left-radius":1,"-moz-box-shadow":1,"-webkit-box-shadow":1,transform:{"rotate($00deg)":1,"skew($00deg)":1},"-moz-transform":{"rotate($00deg)":1,"skew($00deg)":1},"-webkit-transform":{"rotate($00deg)":1,"skew($00deg)":1}},i=function(){};(function(){this.completionsDefined=!1,this.defineCompletions=function(){if(document){var e=document.createElement("c").style;for(var t in e){if(typeof e[t]!="string")continue;var n=t.replace(/[A-Z]/g,function(e){return"-"+e.toLowerCase()});r.hasOwnProperty(n)||(r[n]=1)}}this.completionsDefined=!0},this.getCompletions=function(e,t,n,r){this.completionsDefined||this.defineCompletions();var i=t.getTokenAt(n.row,n.column);if(!i)return[];if(e==="ruleset"){var s=t.getLine(n.row).substr(0,n.column);return/:[^;]+$/.test(s)?(/([\w\-]+):[^:]*$/.test(s),this.getPropertyValueCompletions(e,t,n,r)):this.getPropertyCompletions(e,t,n,r)}return[]},this.getPropertyCompletions=function(e,t,n,i){var s=Object.keys(r);return s.map(function(e){return{caption:e,snippet:e+": $0",meta:"property",score:Number.MAX_VALUE}})},this.getPropertyValueCompletions=function(e,t,n,i){var s=t.getLine(n.row).substr(0,n.column),o=(/([\w\-]+):[^:]*$/.exec(s)||{})[1];if(!o)return[];var u=[];return o in r&&typeof r[o]=="object"&&(u=Object.keys(r[o])),u.map(function(e){return{caption:e,snippet:e,meta:"property value",score:Number.MAX_VALUE}})}}).call(i.prototype),t.CssCompletions=i}),ace.define("ace/mode/behaviour/css",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/mode/behaviour/cstyle","ace/token_iterator"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("./cstyle").CstyleBehaviour,o=e("../../token_iterator").TokenIterator,u=function(){this.inherit(s),this.add("colon","insertion",function(e,t,n,r,i){if(i===":"){var s=n.getCursorPosition(),u=new o(r,s.row,s.column),a=u.getCurrentToken();a&&a.value.match(/\s+/)&&(a=u.stepBackward());if(a&&a.type==="support.type"){var f=r.doc.getLine(s.row),l=f.substring(s.column,s.column+1);if(l===":")return{text:"",selection:[1,1]};if(!f.substring(s.column).match(/^\s*;/))return{text:":;",selection:[1,1]}}}}),this.add("colon","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s===":"){var u=n.getCursorPosition(),a=new o(r,u.row,u.column),f=a.getCurrentToken();f&&f.value.match(/\s+/)&&(f=a.stepBackward());if(f&&f.type==="support.type"){var l=r.doc.getLine(i.start.row),c=l.substring(i.end.column,i.end.column+1);if(c===";")return i.end.column++,i}}}),this.add("semicolon","insertion",function(e,t,n,r,i){if(i===";"){var s=n.getCursorPosition(),o=r.doc.getLine(s.row),u=o.substring(s.column,s.column+1);if(u===";")return{text:"",selection:[1,1]}}})};r.inherits(u,s),t.CssBehaviour=u}),ace.define("ace/mode/css",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/css_highlight_rules","ace/mode/matching_brace_outdent","ace/worker/worker_client","ace/mode/css_completions","ace/mode/behaviour/css","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./css_highlight_rules").CssHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../worker/worker_client").WorkerClient,a=e("./css_completions").CssCompletions,f=e("./behaviour/css").CssBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.$completer=new a,this.foldingRules=new l};r.inherits(c,i),function(){this.foldingRules="cStyle",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e).tokens;if(i.length&&i[i.length-1].type=="comment")return r;var s=t.match(/^.*\{\s*$/);return s&&(r+=n),r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.getCompletions=function(e,t,n,r){return this.$completer.getCompletions(e,t,n,r)},this.createWorker=function(e){var t=new u(["ace"],"ace/mode/css_worker","Worker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/css"}.call(c.prototype),t.Mode=c}),ace.define("ace/mode/html_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/css_highlight_rules","ace/mode/javascript_highlight_rules","ace/mode/xml_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./css_highlight_rules").CssHighlightRules,o=e("./javascript_highlight_rules").JavaScriptHighlightRules,u=e("./xml_highlight_rules").XmlHighlightRules,a=i.createMap({a:"anchor",button:"form",form:"form",img:"image",input:"form",label:"form",option:"form",script:"script",select:"form",textarea:"form",style:"style",table:"table",tbody:"table",td:"table",tfoot:"table",th:"table",tr:"table"}),f=function(){u.call(this),this.addRules({attributes:[{include:"tag_whitespace"},{token:"entity.other.attribute-name.xml",regex:"[-_a-zA-Z0-9:.]+"},{token:"keyword.operator.attribute-equals.xml",regex:"=",push:[{include:"tag_whitespace"},{token:"string.unquoted.attribute-value.html",regex:"[^<>='\"`\\s]+",next:"pop"},{token:"empty",regex:"",next:"pop"}]},{include:"attribute_value"}],tag:[{token:function(e,t){var n=a[t];return["meta.tag.punctuation."+(e=="<"?"":"end-")+"tag-open.xml","meta.tag"+(n?"."+n:"")+".tag-name.xml"]},regex:"(",next:"start"}]}),this.embedTagRules(s,"css-","style"),this.embedTagRules((new o({noJSX:!0})).getRules(),"js-","script"),this.constructor===f&&this.normalizeRules()};r.inherits(f,u),t.HtmlHighlightRules=f}),ace.define("ace/mode/folding/mixed",["require","exports","module","ace/lib/oop","ace/mode/folding/fold_mode"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("./fold_mode").FoldMode,s=t.FoldMode=function(e,t){this.defaultMode=e,this.subModes=t};r.inherits(s,i),function(){this.$getMode=function(e){typeof e!="string"&&(e=e[0]);for(var t in this.subModes)if(e.indexOf(t)===0)return this.subModes[t];return null},this.$tryMode=function(e,t,n,r){var i=this.$getMode(e);return i?i.getFoldWidget(t,n,r):""},this.getFoldWidget=function(e,t,n){return this.$tryMode(e.getState(n-1),e,t,n)||this.$tryMode(e.getState(n),e,t,n)||this.defaultMode.getFoldWidget(e,t,n)},this.getFoldWidgetRange=function(e,t,n){var r=this.$getMode(e.getState(n-1));if(!r||!r.getFoldWidget(e,t,n))r=this.$getMode(e.getState(n));if(!r||!r.getFoldWidget(e,t,n))r=this.defaultMode;return r.getFoldWidgetRange(e,t,n)}}.call(s.prototype)}),ace.define("ace/mode/folding/html",["require","exports","module","ace/lib/oop","ace/mode/folding/mixed","ace/mode/folding/xml","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("./mixed").FoldMode,s=e("./xml").FoldMode,o=e("./cstyle").FoldMode,u=t.FoldMode=function(e,t){i.call(this,new s(e,t),{"js-":new o,"css-":new o})};r.inherits(u,i)}),ace.define("ace/mode/html_completions",["require","exports","module","ace/token_iterator"],function(e,t,n){"use strict";function f(e,t){return e.type.lastIndexOf(t+".xml")>-1}function l(e,t){var n=new r(e,t.row,t.column),i=n.getCurrentToken();while(i&&!f(i,"tag-name"))i=n.stepBackward();if(i)return i.value}function c(e,t){var n=new r(e,t.row,t.column),i=n.getCurrentToken();while(i&&!f(i,"attribute-name"))i=n.stepBackward();if(i)return i.value}var r=e("../token_iterator").TokenIterator,i=["accesskey","class","contenteditable","contextmenu","dir","draggable","dropzone","hidden","id","inert","itemid","itemprop","itemref","itemscope","itemtype","lang","spellcheck","style","tabindex","title","translate"],s=["onabort","onblur","oncancel","oncanplay","oncanplaythrough","onchange","onclick","onclose","oncontextmenu","oncuechange","ondblclick","ondrag","ondragend","ondragenter","ondragleave","ondragover","ondragstart","ondrop","ondurationchange","onemptied","onended","onerror","onfocus","oninput","oninvalid","onkeydown","onkeypress","onkeyup","onload","onloadeddata","onloadedmetadata","onloadstart","onmousedown","onmousemove","onmouseout","onmouseover","onmouseup","onmousewheel","onpause","onplay","onplaying","onprogress","onratechange","onreset","onscroll","onseeked","onseeking","onselect","onshow","onstalled","onsubmit","onsuspend","ontimeupdate","onvolumechange","onwaiting"],o=i.concat(s),u={html:{manifest:1},head:{},title:{},base:{href:1,target:1},link:{href:1,hreflang:1,rel:{stylesheet:1,icon:1},media:{all:1,screen:1,print:1},type:{"text/css":1,"image/png":1,"image/jpeg":1,"image/gif":1},sizes:1},meta:{"http-equiv":{"content-type":1},name:{description:1,keywords:1},content:{"text/html; charset=UTF-8":1},charset:1},style:{type:1,media:{all:1,screen:1,print:1},scoped:1},script:{charset:1,type:{"text/javascript":1},src:1,defer:1,async:1},noscript:{href:1},body:{onafterprint:1,onbeforeprint:1,onbeforeunload:1,onhashchange:1,onmessage:1,onoffline:1,onpopstate:1,onredo:1,onresize:1,onstorage:1,onundo:1,onunload:1},section:{},nav:{},article:{pubdate:1},aside:{},h1:{},h2:{},h3:{},h4:{},h5:{},h6:{},header:{},footer:{},address:{},main:{},p:{},hr:{},pre:{},blockquote:{cite:1},ol:{start:1,reversed:1},ul:{},li:{value:1},dl:{},dt:{},dd:{},figure:{},figcaption:{},div:{},a:{href:1,target:{_blank:1,top:1},ping:1,rel:{nofollow:1,alternate:1,author:1,bookmark:1,help:1,license:1,next:1,noreferrer:1,prefetch:1,prev:1,search:1,tag:1},media:1,hreflang:1,type:1},em:{},strong:{},small:{},s:{},cite:{},q:{cite:1},dfn:{},abbr:{},data:{},time:{datetime:1},code:{},"var":{},samp:{},kbd:{},sub:{},sup:{},i:{},b:{},u:{},mark:{},ruby:{},rt:{},rp:{},bdi:{},bdo:{},span:{},br:{},wbr:{},ins:{cite:1,datetime:1},del:{cite:1,datetime:1},img:{alt:1,src:1,height:1,width:1,usemap:1,ismap:1},iframe:{name:1,src:1,height:1,width:1,sandbox:{"allow-same-origin":1,"allow-top-navigation":1,"allow-forms":1,"allow-scripts":1},seamless:{seamless:1}},embed:{src:1,height:1,width:1,type:1},object:{param:1,data:1,type:1,height:1,width:1,usemap:1,name:1,form:1,classid:1},param:{name:1,value:1},video:{src:1,autobuffer:1,autoplay:{autoplay:1},loop:{loop:1},controls:{controls:1},width:1,height:1,poster:1,muted:{muted:1},preload:{auto:1,metadata:1,none:1}},audio:{src:1,autobuffer:1,autoplay:{autoplay:1},loop:{loop:1},controls:{controls:1},muted:{muted:1},preload:{auto:1,metadata:1,none:1}},source:{src:1,type:1,media:1},track:{kind:1,src:1,srclang:1,label:1,"default":1},canvas:{width:1,height:1},map:{name:1},area:{shape:1,coords:1,href:1,hreflang:1,alt:1,target:1,media:1,rel:1,ping:1,type:1},svg:{},math:{},table:{summary:1},caption:{},colgroup:{span:1},col:{span:1},tbody:{},thead:{},tfoot:{},tr:{},td:{headers:1,rowspan:1,colspan:1},th:{headers:1,rowspan:1,colspan:1,scope:1},form:{"accept-charset":1,action:1,autocomplete:1,enctype:{"multipart/form-data":1,"application/x-www-form-urlencoded":1},method:{get:1,post:1},name:1,novalidate:1,target:{_blank:1,top:1}},fieldset:{disabled:1,form:1,name:1},legend:{},label:{form:1,"for":1},input:{type:{text:1,password:1,hidden:1,checkbox:1,submit:1,radio:1,file:1,button:1,reset:1,image:31,color:1,date:1,datetime:1,"datetime-local":1,email:1,month:1,number:1,range:1,search:1,tel:1,time:1,url:1,week:1},accept:1,alt:1,autocomplete:{on:1,off:1},autofocus:{autofocus:1},checked:{checked:1},disabled:{disabled:1},form:1,formaction:1,formenctype:{"application/x-www-form-urlencoded":1,"multipart/form-data":1,"text/plain":1},formmethod:{get:1,post:1},formnovalidate:{formnovalidate:1},formtarget:{_blank:1,_self:1,_parent:1,_top:1},height:1,list:1,max:1,maxlength:1,min:1,multiple:{multiple:1},name:1,pattern:1,placeholder:1,readonly:{readonly:1},required:{required:1},size:1,src:1,step:1,width:1,files:1,value:1},button:{autofocus:1,disabled:{disabled:1},form:1,formaction:1,formenctype:1,formmethod:1,formnovalidate:1,formtarget:1,name:1,value:1,type:{button:1,submit:1}},select:{autofocus:1,disabled:1,form:1,multiple:{multiple:1},name:1,size:1,readonly:{readonly:1}},datalist:{},optgroup:{disabled:1,label:1},option:{disabled:1,selected:1,label:1,value:1},textarea:{autofocus:{autofocus:1},disabled:{disabled:1},form:1,maxlength:1,name:1,placeholder:1,readonly:{readonly:1},required:{required:1},rows:1,cols:1,wrap:{on:1,off:1,hard:1,soft:1}},keygen:{autofocus:1,challenge:{challenge:1},disabled:{disabled:1},form:1,keytype:{rsa:1,dsa:1,ec:1},name:1},output:{"for":1,form:1,name:1},progress:{value:1,max:1},meter:{value:1,min:1,max:1,low:1,high:1,optimum:1},details:{open:1},summary:{},command:{type:1,label:1,icon:1,disabled:1,checked:1,radiogroup:1,command:1},menu:{type:1,label:1},dialog:{open:1}},a=Object.keys(u),h=function(){};(function(){this.getCompletions=function(e,t,n,r){var i=t.getTokenAt(n.row,n.column);if(!i)return[];if(f(i,"tag-name")||f(i,"tag-open")||f(i,"end-tag-open"))return this.getTagCompletions(e,t,n,r);if(f(i,"tag-whitespace")||f(i,"attribute-name"))return this.getAttributeCompletions(e,t,n,r);if(f(i,"attribute-value"))return this.getAttributeValueCompletions(e,t,n,r);var s=t.getLine(n.row).substr(0,n.column);return/&[A-z]*$/i.test(s)?this.getHTMLEntityCompletions(e,t,n,r):[]},this.getTagCompletions=function(e,t,n,r){return a.map(function(e){return{value:e,meta:"tag",score:Number.MAX_VALUE}})},this.getAttributeCompletions=function(e,t,n,r){var i=l(t,n);if(!i)return[];var s=o;return i in u&&(s=s.concat(Object.keys(u[i]))),s.map(function(e){return{caption:e,snippet:e+'="$0"',meta:"attribute",score:Number.MAX_VALUE}})},this.getAttributeValueCompletions=function(e,t,n,r){var i=l(t,n),s=c(t,n);if(!i)return[];var o=[];return i in u&&s in u[i]&&typeof u[i][s]=="object"&&(o=Object.keys(u[i][s])),o.map(function(e){return{caption:e,snippet:e,meta:"attribute value",score:Number.MAX_VALUE}})},this.getHTMLEntityCompletions=function(e,t,n,r){var i=["Aacute;","aacute;","Acirc;","acirc;","acute;","AElig;","aelig;","Agrave;","agrave;","alefsym;","Alpha;","alpha;","amp;","and;","ang;","Aring;","aring;","asymp;","Atilde;","atilde;","Auml;","auml;","bdquo;","Beta;","beta;","brvbar;","bull;","cap;","Ccedil;","ccedil;","cedil;","cent;","Chi;","chi;","circ;","clubs;","cong;","copy;","crarr;","cup;","curren;","Dagger;","dagger;","dArr;","darr;","deg;","Delta;","delta;","diams;","divide;","Eacute;","eacute;","Ecirc;","ecirc;","Egrave;","egrave;","empty;","emsp;","ensp;","Epsilon;","epsilon;","equiv;","Eta;","eta;","ETH;","eth;","Euml;","euml;","euro;","exist;","fnof;","forall;","frac12;","frac14;","frac34;","frasl;","Gamma;","gamma;","ge;","gt;","hArr;","harr;","hearts;","hellip;","Iacute;","iacute;","Icirc;","icirc;","iexcl;","Igrave;","igrave;","image;","infin;","int;","Iota;","iota;","iquest;","isin;","Iuml;","iuml;","Kappa;","kappa;","Lambda;","lambda;","lang;","laquo;","lArr;","larr;","lceil;","ldquo;","le;","lfloor;","lowast;","loz;","lrm;","lsaquo;","lsquo;","lt;","macr;","mdash;","micro;","middot;","minus;","Mu;","mu;","nabla;","nbsp;","ndash;","ne;","ni;","not;","notin;","nsub;","Ntilde;","ntilde;","Nu;","nu;","Oacute;","oacute;","Ocirc;","ocirc;","OElig;","oelig;","Ograve;","ograve;","oline;","Omega;","omega;","Omicron;","omicron;","oplus;","or;","ordf;","ordm;","Oslash;","oslash;","Otilde;","otilde;","otimes;","Ouml;","ouml;","para;","part;","permil;","perp;","Phi;","phi;","Pi;","pi;","piv;","plusmn;","pound;","Prime;","prime;","prod;","prop;","Psi;","psi;","quot;","radic;","rang;","raquo;","rArr;","rarr;","rceil;","rdquo;","real;","reg;","rfloor;","Rho;","rho;","rlm;","rsaquo;","rsquo;","sbquo;","Scaron;","scaron;","sdot;","sect;","shy;","Sigma;","sigma;","sigmaf;","sim;","spades;","sub;","sube;","sum;","sup;","sup1;","sup2;","sup3;","supe;","szlig;","Tau;","tau;","there4;","Theta;","theta;","thetasym;","thinsp;","THORN;","thorn;","tilde;","times;","trade;","Uacute;","uacute;","uArr;","uarr;","Ucirc;","ucirc;","Ugrave;","ugrave;","uml;","upsih;","Upsilon;","upsilon;","Uuml;","uuml;","weierp;","Xi;","xi;","Yacute;","yacute;","yen;","Yuml;","yuml;","Zeta;","zeta;","zwj;","zwnj;"];return i.map(function(e){return{caption:e,snippet:e,meta:"html entity",score:Number.MAX_VALUE}})}}).call(h.prototype),t.HtmlCompletions=h}),ace.define("ace/mode/html",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text","ace/mode/javascript","ace/mode/css","ace/mode/html_highlight_rules","ace/mode/behaviour/xml","ace/mode/folding/html","ace/mode/html_completions","ace/worker/worker_client"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text").Mode,o=e("./javascript").Mode,u=e("./css").Mode,a=e("./html_highlight_rules").HtmlHighlightRules,f=e("./behaviour/xml").XmlBehaviour,l=e("./folding/html").FoldMode,c=e("./html_completions").HtmlCompletions,h=e("../worker/worker_client").WorkerClient,p=["area","base","br","col","embed","hr","img","input","keygen","link","meta","menuitem","param","source","track","wbr"],d=["li","dt","dd","p","rt","rp","optgroup","option","colgroup","td","th"],v=function(e){this.fragmentContext=e&&e.fragmentContext,this.HighlightRules=a,this.$behaviour=new f,this.$completer=new c,this.createModeDelegates({"js-":o,"css-":u}),this.foldingRules=new l(this.voidElements,i.arrayToMap(d))};r.inherits(v,s),function(){this.blockComment={start:""},this.voidElements=i.arrayToMap(p),this.getNextLineIndent=function(e,t,n){return this.$getIndent(t)},this.checkOutdent=function(e,t,n){return!1},this.getCompletions=function(e,t,n,r){return this.$completer.getCompletions(e,t,n,r)},this.createWorker=function(e){if(this.constructor!=v)return;var t=new h(["ace"],"ace/mode/html_worker","Worker");return t.attachToDocument(e.getDocument()),this.fragmentContext&&t.call("setOptions",[{context:this.fragmentContext}]),t.on("error",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/html"}.call(v.prototype),t.Mode=v}),ace.define("ace/mode/markdown_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules","ace/mode/javascript_highlight_rules","ace/mode/xml_highlight_rules","ace/mode/html_highlight_rules","ace/mode/css_highlight_rules"],function(e,t,n){"use strict";function c(e,t){return{token:"support.function",regex:"^\\s*```"+e+"\\s*$",push:t+"start"}}var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=e("./javascript_highlight_rules").JavaScriptHighlightRules,u=e("./xml_highlight_rules").XmlHighlightRules,a=e("./html_highlight_rules").HtmlHighlightRules,f=e("./css_highlight_rules").CssHighlightRules,l=function(e){return"(?:[^"+i.escapeRegExp(e)+"\\\\]|\\\\.)*"},h=function(){a.call(this),this.$rules.start.unshift({token:"empty_line",regex:"^$",next:"allowBlock"},{token:"markup.heading.1",regex:"^=+(?=\\s*$)"},{token:"markup.heading.2",regex:"^\\-+(?=\\s*$)"},{token:function(e){return"markup.heading."+e.length},regex:/^#{1,6}(?=\s*[^ #]|\s+#.)/,next:"header"},c("(?:javascript|js)","jscode-"),c("xml","xmlcode-"),c("html","htmlcode-"),c("css","csscode-"),{token:"support.function",regex:"^\\s*```\\s*\\S*(?:{.*?\\})?\\s*$",next:"githubblock"},{token:"string.blockquote",regex:"^\\s*>\\s*(?:[*+-]|\\d+\\.)?\\s+",next:"blockquote"},{token:"constant",regex:"^ {0,2}(?:(?: ?\\* ?){3,}|(?: ?\\- ?){3,}|(?: ?\\_ ?){3,})\\s*$",next:"allowBlock"},{token:"markup.list",regex:"^\\s{0,3}(?:[*+-]|\\d+\\.)\\s+",next:"listblock-start"},{include:"basic"}),this.addRules({basic:[{token:"constant.language.escape",regex:/\\[\\`*_{}\[\]()#+\-.!]/},{token:"support.function",regex:"(`+)(.*?[^`])(\\1)"},{token:["text","constant","text","url","string","text"],regex:'^([ ]{0,3}\\[)([^\\]]+)(\\]:\\s*)([^ ]+)(\\s*(?:["][^"]+["])?(\\s*))$'},{token:["text","string","text","constant","text"],regex:"(\\[)("+l("]")+")(\\]s*\\[)("+l("]")+")(\\])"},{token:["text","string","text","markup.underline","string","text"],regex:"(\\[)("+l("]")+")(\\]\\()"+'((?:[^\\)\\s\\\\]|\\\\.|\\s(?=[^"]))*)'+'(\\s*"'+l('"')+'"\\s*)?'+"(\\))"},{token:"string.strong",regex:"([*]{2}|[_]{2}(?=\\S))(.*?\\S[*_]*)(\\1)"},{token:"string.emphasis",regex:"([*]|[_](?=\\S))(.*?\\S[*_]*)(\\1)"},{token:["text","url","text"],regex:"(<)((?:https?|ftp|dict):[^'\">\\s]+|(?:mailto:)?[-.\\w]+\\@[-a-z0-9]+(?:\\.[-a-z0-9]+)*\\.[a-z]+)(>)"}],allowBlock:[{token:"support.function",regex:"^ {4}.+",next:"allowBlock"},{token:"empty_line",regex:"^$",next:"allowBlock"},{token:"empty",regex:"",next:"start"}],header:[{regex:"$",next:"start"},{include:"basic"},{defaultToken:"heading"}],"listblock-start":[{token:"support.variable",regex:/(?:\[[ x]\])?/,next:"listblock"}],listblock:[{token:"empty_line",regex:"^$",next:"start"},{token:"markup.list",regex:"^\\s{0,3}(?:[*+-]|\\d+\\.)\\s+",next:"listblock-start"},{include:"basic",noEscape:!0},{token:"support.function",regex:"^\\s*```\\s*[a-zA-Z]*(?:{.*?\\})?\\s*$",next:"githubblock"},{defaultToken:"list"}],blockquote:[{token:"empty_line",regex:"^\\s*$",next:"start"},{token:"string.blockquote",regex:"^\\s*>\\s*(?:[*+-]|\\d+\\.)?\\s+",next:"blockquote"},{include:"basic",noEscape:!0},{defaultToken:"string.blockquote"}],githubblock:[{token:"support.function",regex:"^\\s*```",next:"start"},{token:"support.function",regex:".+"}]}),this.embedRules(o,"jscode-",[{token:"support.function",regex:"^\\s*```",next:"pop"}]),this.embedRules(a,"htmlcode-",[{token:"support.function",regex:"^\\s*```",next:"pop"}]),this.embedRules(f,"csscode-",[{token:"support.function",regex:"^\\s*```",next:"pop"}]),this.embedRules(u,"xmlcode-",[{token:"support.function",regex:"^\\s*```",next:"pop"}]),this.normalizeRules()};r.inherits(h,s),t.MarkdownHighlightRules=h}),ace.define("ace/mode/folding/markdown",["require","exports","module","ace/lib/oop","ace/mode/folding/fold_mode","ace/range"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("./fold_mode").FoldMode,s=e("../../range").Range,o=t.FoldMode=function(){};r.inherits(o,i),function(){this.foldingStartMarker=/^(?:[=-]+\s*$|#{1,6} |`{3})/,this.getFoldWidget=function(e,t,n){var r=e.getLine(n);return this.foldingStartMarker.test(r)?r[0]=="`"?e.bgTokenizer.getState(n)=="start"?"end":"start":"start":""},this.getFoldWidgetRange=function(e,t,n){function l(t){return f=e.getTokens(t)[0],f&&f.type.lastIndexOf(c,0)===0}function h(){var e=f.value[0];return e=="="?6:e=="-"?5:7-f.value.search(/[^#]/)}var r=e.getLine(n),i=r.length,o=e.getLength(),u=n,a=n;if(!r.match(this.foldingStartMarker))return;if(r[0]=="`"){if(e.bgTokenizer.getState(n)!=="start"){while(++n0){r=e.getLine(n);if(r[0]=="`"&r.substring(0,3)=="```")break}return new s(n,r.length,u,0)}var f,c="markup.heading";if(l(n)){var p=h();while(++n=p)break}a=n-(!f||["=","-"].indexOf(f.value[0])==-1?1:2);if(a>u)while(a>u&&/^\s*$/.test(e.getLine(a)))a--;if(a>u){var v=e.getLine(a).length;return new s(u,i,a,v)}}}}.call(o.prototype)}),ace.define("ace/mode/markdown",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/javascript","ace/mode/xml","ace/mode/html","ace/mode/markdown_highlight_rules","ace/mode/folding/markdown"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./javascript").Mode,o=e("./xml").Mode,u=e("./html").Mode,a=e("./markdown_highlight_rules").MarkdownHighlightRules,f=e("./folding/markdown").FoldMode,l=function(){this.HighlightRules=a,this.createModeDelegates({"js-":s,"xml-":o,"html-":u}),this.foldingRules=new f};r.inherits(l,i),function(){this.type="text",this.blockComment={start:""},this.getNextLineIndent=function(e,t,n){if(e=="listblock"){var r=/^(\s*)(?:([-+*])|(\d+)\.)(\s+)/.exec(t);if(!r)return"";var i=r[2];return i||(i=parseInt(r[3],10)+1+"."),r[1]+i+r[4]}return this.$getIndent(t)},this.$id="ace/mode/markdown"}.call(l.prototype),t.Mode=l}) \ No newline at end of file diff --git a/docs/ace-1.2.3/mode-plain_text.js b/docs/ace-1.2.3/mode-plain_text.js deleted file mode 100755 index be72ab998..000000000 --- a/docs/ace-1.2.3/mode-plain_text.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/mode/plain_text",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/text_highlight_rules","ace/mode/behaviour"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./text_highlight_rules").TextHighlightRules,o=e("./behaviour").Behaviour,u=function(){this.HighlightRules=s,this.$behaviour=new o};r.inherits(u,i),function(){this.type="text",this.getNextLineIndent=function(e,t,n){return""},this.$id="ace/mode/plain_text"}.call(u.prototype),t.Mode=u}) \ No newline at end of file diff --git a/docs/ace-1.2.3/mode-r.js b/docs/ace-1.2.3/mode-r.js deleted file mode 100755 index 89e73b306..000000000 --- a/docs/ace-1.2.3/mode-r.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/mode/tex_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=function(e){e||(e="text"),this.$rules={start:[{token:"comment",regex:"%.*$"},{token:e,regex:"\\\\[$&%#\\{\\}]"},{token:"keyword",regex:"\\\\(?:documentclass|usepackage|newcounter|setcounter|addtocounter|value|arabic|stepcounter|newenvironment|renewenvironment|ref|vref|eqref|pageref|label|cite[a-zA-Z]*|tag|begin|end|bibitem)\\b",next:"nospell"},{token:"keyword",regex:"\\\\(?:[a-zA-z0-9]+|[^a-zA-z0-9])"},{token:"paren.keyword.operator",regex:"[[({]"},{token:"paren.keyword.operator",regex:"[\\])}]"},{token:e,regex:"\\s+"}],nospell:[{token:"comment",regex:"%.*$",next:"start"},{token:"nospell."+e,regex:"\\\\[$&%#\\{\\}]"},{token:"keyword",regex:"\\\\(?:documentclass|usepackage|newcounter|setcounter|addtocounter|value|arabic|stepcounter|newenvironment|renewenvironment|ref|vref|eqref|pageref|label|cite[a-zA-Z]*|tag|begin|end|bibitem)\\b"},{token:"keyword",regex:"\\\\(?:[a-zA-z0-9]+|[^a-zA-z0-9])",next:"start"},{token:"paren.keyword.operator",regex:"[[({]"},{token:"paren.keyword.operator",regex:"[\\])]"},{token:"paren.keyword.operator",regex:"}",next:"start"},{token:"nospell."+e,regex:"\\s+"},{token:"nospell."+e,regex:"\\w+"}]}};r.inherits(o,s),t.TexHighlightRules=o}),ace.define("ace/mode/r_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules","ace/mode/tex_highlight_rules"],function(e,t,n){var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=e("./tex_highlight_rules").TexHighlightRules,u=function(){var e=i.arrayToMap("function|if|in|break|next|repeat|else|for|return|switch|while|try|tryCatch|stop|warning|require|library|attach|detach|source|setMethod|setGeneric|setGroupGeneric|setClass".split("|")),t=i.arrayToMap("NULL|NA|TRUE|FALSE|T|F|Inf|NaN|NA_integer_|NA_real_|NA_character_|NA_complex_".split("|"));this.$rules={start:[{token:"comment.sectionhead",regex:"#+(?!').*(?:----|====|####)\\s*$"},{token:"comment",regex:"#+'",next:"rd-start"},{token:"comment",regex:"#.*$"},{token:"string",regex:'["]',next:"qqstring"},{token:"string",regex:"[']",next:"qstring"},{token:"constant.numeric",regex:"0[xX][0-9a-fA-F]+[Li]?\\b"},{token:"constant.numeric",regex:"\\d+L\\b"},{token:"constant.numeric",regex:"\\d+(?:\\.\\d*)?(?:[eE][+\\-]?\\d*)?i?\\b"},{token:"constant.numeric",regex:"\\.\\d+(?:[eE][+\\-]?\\d*)?i?\\b"},{token:"constant.language.boolean",regex:"(?:TRUE|FALSE|T|F)\\b"},{token:"identifier",regex:"`.*?`"},{onMatch:function(n){return e[n]?"keyword":t[n]?"constant.language":n=="..."||n.match(/^\.\.\d+$/)?"variable.language":"identifier"},regex:"[a-zA-Z.][a-zA-Z0-9._]*\\b"},{token:"keyword.operator",regex:"%%|>=|<=|==|!=|\\->|<\\-|\\|\\||&&|=|\\+|\\-|\\*|/|\\^|>|<|!|&|\\||~|\\$|:"},{token:"keyword.operator",regex:"%.*?%"},{token:"paren.keyword.operator",regex:"[[({]"},{token:"paren.keyword.operator",regex:"[\\])}]"},{token:"text",regex:"\\s+"}],qqstring:[{token:"string",regex:'(?:(?:\\\\.)|(?:[^"\\\\]))*?"',next:"start"},{token:"string",regex:".+"}],qstring:[{token:"string",regex:"(?:(?:\\\\.)|(?:[^'\\\\]))*?'",next:"start"},{token:"string",regex:".+"}]};var n=(new o("comment")).getRules();for(var r=0;r",onMatch:function(e,t,n){return t==n[0]&&n.shift(),e.length==2&&(n[0]==this.nextState&&n[1]--,(!n[1]||n[1]<0)&&n.splice(0,2)),this.next=n[0]||"start",[{type:this.token,value:e}]},nextState:"jsx"},n,f("jsxAttributes"),{token:"entity.other.attribute-name.xml",regex:e},{token:"keyword.operator.attribute-equals.xml",regex:"="},{token:"text.tag-whitespace.xml",regex:"\\s+"},{token:"string.attribute-value.xml",regex:"'",stateName:"jsx_attr_q",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',stateName:"jsx_attr_qq",push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"reference"},{defaultToken:"string.attribute-value.xml"}]},t],this.$rules.reference=[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}]}function f(e){return[{token:"comment",regex:/\/\*/,next:[i.getTagRule(),{token:"comment",regex:"\\*\\/",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]},{token:"comment",regex:"\\/\\/",next:[i.getTagRule(),{token:"comment",regex:"$|^",next:e||"pop"},{defaultToken:"comment",caseInsensitive:!0}]}]}var r=e("../lib/oop"),i=e("./doc_comment_highlight_rules").DocCommentHighlightRules,s=e("./text_highlight_rules").TextHighlightRules,o="[a-zA-Z\\$_\u00a1-\uffff][a-zA-Z\\d\\$_\u00a1-\uffff]*",u=function(e){var t=this.createKeywordMapper({"variable.language":"Array|Boolean|Date|Function|Iterator|Number|Object|RegExp|String|Proxy|Namespace|QName|XML|XMLList|ArrayBuffer|Float32Array|Float64Array|Int16Array|Int32Array|Int8Array|Uint16Array|Uint32Array|Uint8Array|Uint8ClampedArray|Error|EvalError|InternalError|RangeError|ReferenceError|StopIteration|SyntaxError|TypeError|URIError|decodeURI|decodeURIComponent|encodeURI|encodeURIComponent|eval|isFinite|isNaN|parseFloat|parseInt|JSON|Math|this|arguments|prototype|window|document",keyword:"const|yield|import|get|set|async|await|break|case|catch|continue|default|delete|do|else|finally|for|function|if|in|instanceof|new|return|switch|throw|try|typeof|let|var|while|with|debugger|__parent__|__count__|escape|unescape|with|__proto__|class|enum|extends|super|export|implements|private|public|interface|package|protected|static","storage.type":"const|let|var|function","constant.language":"null|Infinity|NaN|undefined","support.function":"alert","constant.language.boolean":"true|false"},"identifier"),n="case|do|else|finally|in|instanceof|return|throw|try|typeof|yield|void",r="\\\\(?:x[0-9a-fA-F]{2}|u[0-9a-fA-F]{4}|u{[0-9a-fA-F]{1,6}}|[0-2][0-7]{0,2}|3[0-7][0-7]?|[4-7][0-7]?|.)";this.$rules={no_regex:[i.getStartRule("doc-start"),f("no_regex"),{token:"string",regex:"'(?=.)",next:"qstring"},{token:"string",regex:'"(?=.)',next:"qqstring"},{token:"constant.numeric",regex:/0(?:[xX][0-9a-fA-F]+|[bB][01]+)\b/},{token:"constant.numeric",regex:/[+-]?\d[\d_]*(?:(?:\.\d*)?(?:[eE][+-]?\d+)?)?\b/},{token:["storage.type","punctuation.operator","support.function","punctuation.operator","entity.name.function","text","keyword.operator"],regex:"("+o+")(\\.)(prototype)(\\.)("+o+")(\\s*)(=)",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","keyword.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(=)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(\\s+)(\\w+)(\\s*)(\\()",next:"function_arguments"},{token:["storage.type","text","entity.name.function","text","paren.lparen"],regex:"(function)(\\s+)("+o+")(\\s*)(\\()",next:"function_arguments"},{token:["entity.name.function","text","punctuation.operator","text","storage.type","text","paren.lparen"],regex:"("+o+")(\\s*)(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:["text","text","storage.type","text","paren.lparen"],regex:"(:)(\\s*)(function)(\\s*)(\\()",next:"function_arguments"},{token:"keyword",regex:"(?:"+n+")\\b",next:"start"},{token:["support.constant"],regex:/that\b/},{token:["storage.type","punctuation.operator","support.function.firebug"],regex:/(console)(\.)(warn|info|log|error|time|trace|timeEnd|assert)\b/},{token:t,regex:o},{token:"punctuation.operator",regex:/[.](?![.])/,next:"property"},{token:"keyword.operator",regex:/--|\+\+|\.{3}|===|==|=|!=|!==|<+=?|>+=?|!|&&|\|\||\?\:|[!$%&*+\-~\/^]=?/,next:"start"},{token:"punctuation.operator",regex:/[?:,;.]/,next:"start"},{token:"paren.lparen",regex:/[\[({]/,next:"start"},{token:"paren.rparen",regex:/[\])}]/},{token:"comment",regex:/^#!.*$/}],property:[{token:"text",regex:"\\s+"},{token:["storage.type","punctuation.operator","entity.name.function","text","keyword.operator","text","storage.type","text","entity.name.function","text","paren.lparen"],regex:"("+o+")(\\.)("+o+")(\\s*)(=)(\\s*)(function)(?:(\\s+)(\\w+))?(\\s*)(\\()",next:"function_arguments"},{token:"punctuation.operator",regex:/[.](?![.])/},{token:"support.function",regex:/(s(?:h(?:ift|ow(?:Mod(?:elessDialog|alDialog)|Help))|croll(?:X|By(?:Pages|Lines)?|Y|To)?|t(?:op|rike)|i(?:n|zeToContent|debar|gnText)|ort|u(?:p|b(?:str(?:ing)?)?)|pli(?:ce|t)|e(?:nd|t(?:Re(?:sizable|questHeader)|M(?:i(?:nutes|lliseconds)|onth)|Seconds|Ho(?:tKeys|urs)|Year|Cursor|Time(?:out)?|Interval|ZOptions|Date|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Date|FullYear)|FullYear|Active)|arch)|qrt|lice|avePreferences|mall)|h(?:ome|andleEvent)|navigate|c(?:har(?:CodeAt|At)|o(?:s|n(?:cat|textual|firm)|mpile)|eil|lear(?:Timeout|Interval)?|a(?:ptureEvents|ll)|reate(?:StyleSheet|Popup|EventObject))|t(?:o(?:GMTString|S(?:tring|ource)|U(?:TCString|pperCase)|Lo(?:caleString|werCase))|est|a(?:n|int(?:Enabled)?))|i(?:s(?:NaN|Finite)|ndexOf|talics)|d(?:isableExternalCapture|ump|etachEvent)|u(?:n(?:shift|taint|escape|watch)|pdateCommands)|j(?:oin|avaEnabled)|p(?:o(?:p|w)|ush|lugins.refresh|a(?:ddings|rse(?:Int|Float)?)|r(?:int|ompt|eference))|e(?:scape|nableExternalCapture|val|lementFromPoint|x(?:p|ec(?:Script|Command)?))|valueOf|UTC|queryCommand(?:State|Indeterm|Enabled|Value)|f(?:i(?:nd|le(?:ModifiedDate|Size|CreatedDate|UpdatedDate)|xed)|o(?:nt(?:size|color)|rward)|loor|romCharCode)|watch|l(?:ink|o(?:ad|g)|astIndexOf)|a(?:sin|nchor|cos|t(?:tachEvent|ob|an(?:2)?)|pply|lert|b(?:s|ort))|r(?:ou(?:nd|teEvents)|e(?:size(?:By|To)|calc|turnValue|place|verse|l(?:oad|ease(?:Capture|Events)))|andom)|g(?:o|et(?:ResponseHeader|M(?:i(?:nutes|lliseconds)|onth)|Se(?:conds|lection)|Hours|Year|Time(?:zoneOffset)?|Da(?:y|te)|UTC(?:M(?:i(?:nutes|lliseconds)|onth)|Seconds|Hours|Da(?:y|te)|FullYear)|FullYear|A(?:ttention|llResponseHeaders)))|m(?:in|ove(?:B(?:y|elow)|To(?:Absolute)?|Above)|ergeAttributes|a(?:tch|rgins|x))|b(?:toa|ig|o(?:ld|rderWidths)|link|ack))\b(?=\()/},{token:"support.function.dom",regex:/(s(?:ub(?:stringData|mit)|plitText|e(?:t(?:NamedItem|Attribute(?:Node)?)|lect))|has(?:ChildNodes|Feature)|namedItem|c(?:l(?:ick|o(?:se|neNode))|reate(?:C(?:omment|DATASection|aption)|T(?:Head|extNode|Foot)|DocumentFragment|ProcessingInstruction|E(?:ntityReference|lement)|Attribute))|tabIndex|i(?:nsert(?:Row|Before|Cell|Data)|tem)|open|delete(?:Row|C(?:ell|aption)|T(?:Head|Foot)|Data)|focus|write(?:ln)?|a(?:dd|ppend(?:Child|Data))|re(?:set|place(?:Child|Data)|move(?:NamedItem|Child|Attribute(?:Node)?)?)|get(?:NamedItem|Element(?:sBy(?:Name|TagName|ClassName)|ById)|Attribute(?:Node)?)|blur)\b(?=\()/},{token:"support.constant",regex:/(s(?:ystemLanguage|cr(?:ipts|ollbars|een(?:X|Y|Top|Left))|t(?:yle(?:Sheets)?|atus(?:Text|bar)?)|ibling(?:Below|Above)|ource|uffixes|e(?:curity(?:Policy)?|l(?:ection|f)))|h(?:istory|ost(?:name)?|as(?:h|Focus))|y|X(?:MLDocument|SLDocument)|n(?:ext|ame(?:space(?:s|URI)|Prop))|M(?:IN_VALUE|AX_VALUE)|c(?:haracterSet|o(?:n(?:structor|trollers)|okieEnabled|lorDepth|mp(?:onents|lete))|urrent|puClass|l(?:i(?:p(?:boardData)?|entInformation)|osed|asses)|alle(?:e|r)|rypto)|t(?:o(?:olbar|p)|ext(?:Transform|Indent|Decoration|Align)|ags)|SQRT(?:1_2|2)|i(?:n(?:ner(?:Height|Width)|put)|ds|gnoreCase)|zIndex|o(?:scpu|n(?:readystatechange|Line)|uter(?:Height|Width)|p(?:sProfile|ener)|ffscreenBuffering)|NEGATIVE_INFINITY|d(?:i(?:splay|alog(?:Height|Top|Width|Left|Arguments)|rectories)|e(?:scription|fault(?:Status|Ch(?:ecked|arset)|View)))|u(?:ser(?:Profile|Language|Agent)|n(?:iqueID|defined)|pdateInterval)|_content|p(?:ixelDepth|ort|ersonalbar|kcs11|l(?:ugins|atform)|a(?:thname|dding(?:Right|Bottom|Top|Left)|rent(?:Window|Layer)?|ge(?:X(?:Offset)?|Y(?:Offset)?))|r(?:o(?:to(?:col|type)|duct(?:Sub)?|mpter)|e(?:vious|fix)))|e(?:n(?:coding|abledPlugin)|x(?:ternal|pando)|mbeds)|v(?:isibility|endor(?:Sub)?|Linkcolor)|URLUnencoded|P(?:I|OSITIVE_INFINITY)|f(?:ilename|o(?:nt(?:Size|Family|Weight)|rmName)|rame(?:s|Element)|gColor)|E|whiteSpace|l(?:i(?:stStyleType|n(?:eHeight|kColor))|o(?:ca(?:tion(?:bar)?|lName)|wsrc)|e(?:ngth|ft(?:Context)?)|a(?:st(?:M(?:odified|atch)|Index|Paren)|yer(?:s|X)|nguage))|a(?:pp(?:MinorVersion|Name|Co(?:deName|re)|Version)|vail(?:Height|Top|Width|Left)|ll|r(?:ity|guments)|Linkcolor|bove)|r(?:ight(?:Context)?|e(?:sponse(?:XML|Text)|adyState))|global|x|m(?:imeTypes|ultiline|enubar|argin(?:Right|Bottom|Top|Left))|L(?:N(?:10|2)|OG(?:10E|2E))|b(?:o(?:ttom|rder(?:Width|RightWidth|BottomWidth|Style|Color|TopWidth|LeftWidth))|ufferDepth|elow|ackground(?:Color|Image)))\b/},{token:"identifier",regex:o},{regex:"",token:"empty",next:"no_regex"}],start:[i.getStartRule("doc-start"),f("start"),{token:"string.regexp",regex:"\\/",next:"regex"},{token:"text",regex:"\\s+|^$",next:"start"},{token:"empty",regex:"",next:"no_regex"}],regex:[{token:"regexp.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"string.regexp",regex:"/[sxngimy]*",next:"no_regex"},{token:"invalid",regex:/\{\d+\b,?\d*\}[+*]|[+*$^?][+*]|[$^][?]|\?{3,}/},{token:"constant.language.escape",regex:/\(\?[:=!]|\)|\{\d+\b,?\d*\}|[+*]\?|[()$^+*?.]/},{token:"constant.language.delimiter",regex:/\|/},{token:"constant.language.escape",regex:/\[\^?/,next:"regex_character_class"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp"}],regex_character_class:[{token:"regexp.charclass.keyword.operator",regex:"\\\\(?:u[\\da-fA-F]{4}|x[\\da-fA-F]{2}|.)"},{token:"constant.language.escape",regex:"]",next:"regex"},{token:"constant.language.escape",regex:"-"},{token:"empty",regex:"$",next:"no_regex"},{defaultToken:"string.regexp.charachterclass"}],function_arguments:[{token:"variable.parameter",regex:o},{token:"punctuation.operator",regex:"[, ]+"},{token:"punctuation.operator",regex:"$"},{token:"empty",regex:"",next:"no_regex"}],qqstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qqstring"},{token:"string",regex:'"|$',next:"no_regex"},{defaultToken:"string"}],qstring:[{token:"constant.language.escape",regex:r},{token:"string",regex:"\\\\$",next:"qstring"},{token:"string",regex:"'|$",next:"no_regex"},{defaultToken:"string"}]};if(!e||!e.noES6)this.$rules.no_regex.unshift({regex:"[{}]",onMatch:function(e,t,n){this.next=e=="{"?this.nextState:"";if(e=="{"&&n.length)n.unshift("start",t);else if(e=="}"&&n.length){n.shift(),this.next=n.shift();if(this.next.indexOf("string")!=-1||this.next.indexOf("jsx")!=-1)return"paren.quasi.end"}return e=="{"?"paren.lparen":"paren.rparen"},nextState:"start"},{token:"string.quasi.start",regex:/`/,push:[{token:"constant.language.escape",regex:r},{token:"paren.quasi.start",regex:/\${/,push:"start"},{token:"string.quasi.end",regex:/`/,next:"pop"},{defaultToken:"string.quasi"}]}),(!e||!e.noJSX)&&a.call(this);this.embedRules(i,"doc-",[i.getEndRule("no_regex")]),this.normalizeRules()};r.inherits(u,s),t.JavaScriptHighlightRules=u}),ace.define("ace/mode/matching_brace_outdent",["require","exports","module","ace/range"],function(e,t,n){"use strict";var r=e("../range").Range,i=function(){};(function(){this.checkOutdent=function(e,t){return/^\s+$/.test(e)?/^\s*\}/.test(t):!1},this.autoOutdent=function(e,t){var n=e.getLine(t),i=n.match(/^(\s*\})/);if(!i)return 0;var s=i[1].length,o=e.findMatchingBracket({row:t,column:s});if(!o||o.row==t)return 0;var u=this.$getIndent(e.getLine(o.row));e.replace(new r(t,0,t,s-1),u)},this.$getIndent=function(e){return e.match(/^\s*/)[0]}}).call(i.prototype),t.MatchingBraceOutdent=i}),ace.define("ace/mode/behaviour/cstyle",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),u=["text","paren.rparen","punctuation.operator"],a=["text","paren.rparen","punctuation.operator","comment"],f,l={},c=function(e){var t=-1;e.multiSelect&&(t=e.selection.index,l.rangeCount!=e.multiSelect.rangeCount&&(l={rangeCount:e.multiSelect.rangeCount}));if(l[t])return f=l[t];f=l[t]={autoInsertedBrackets:0,autoInsertedRow:-1,autoInsertedLineEnd:"",maybeInsertedBrackets:0,maybeInsertedRow:-1,maybeInsertedLineStart:"",maybeInsertedLineEnd:""}},h=function(e,t,n,r){var i=e.end.row-e.start.row;return{text:n+t+r,selection:[0,e.start.column+1,i,e.end.column+(i?0:1)]}},p=function(){this.add("braces","insertion",function(e,t,n,r,i){var s=n.getCursorPosition(),u=r.doc.getLine(s.row);if(i=="{"){c(n);var a=n.getSelectionRange(),l=r.doc.getTextRange(a);if(l!==""&&l!=="{"&&n.getWrapBehavioursEnabled())return h(a,l,"{","}");if(p.isSaneInsertion(n,r))return/[\]\}\)]/.test(u[s.column])||n.inMultiSelectMode?(p.recordAutoInsert(n,r,"}"),{text:"{}",selection:[1,1]}):(p.recordMaybeInsert(n,r,"{"),{text:"{",selection:[1,1]})}else if(i=="}"){c(n);var d=u.substring(s.column,s.column+1);if(d=="}"){var v=r.$findOpeningBracket("}",{column:s.column+1,row:s.row});if(v!==null&&p.isAutoInsertedClosing(s,u,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}else{if(i=="\n"||i=="\r\n"){c(n);var m="";p.isMaybeInsertedClosing(s,u)&&(m=o.stringRepeat("}",f.maybeInsertedBrackets),p.clearMaybeInsertedClosing());var d=u.substring(s.column,s.column+1);if(d==="}"){var g=r.findMatchingBracket({row:s.row,column:s.column+1},"}");if(!g)return null;var y=this.$getIndent(r.getLine(g.row))}else{if(!m){p.clearMaybeInsertedClosing();return}var y=this.$getIndent(u)}var b=y+r.getTabString();return{text:"\n"+b+"\n"+y+m,selection:[1,b.length,1,b.length]}}p.clearMaybeInsertedClosing()}}),this.add("braces","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="{"){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.end.column,i.end.column+1);if(u=="}")return i.end.column++,i;f.maybeInsertedBrackets--}}),this.add("parens","insertion",function(e,t,n,r,i){if(i=="("){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"(",")");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,")"),{text:"()",selection:[1,1]}}else if(i==")"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f==")"){var l=r.$findOpeningBracket(")",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("parens","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="("){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==")")return i.end.column++,i}}),this.add("brackets","insertion",function(e,t,n,r,i){if(i=="["){c(n);var s=n.getSelectionRange(),o=r.doc.getTextRange(s);if(o!==""&&n.getWrapBehavioursEnabled())return h(s,o,"[","]");if(p.isSaneInsertion(n,r))return p.recordAutoInsert(n,r,"]"),{text:"[]",selection:[1,1]}}else if(i=="]"){c(n);var u=n.getCursorPosition(),a=r.doc.getLine(u.row),f=a.substring(u.column,u.column+1);if(f=="]"){var l=r.$findOpeningBracket("]",{column:u.column+1,row:u.row});if(l!==null&&p.isAutoInsertedClosing(u,a,i))return p.popAutoInsertedClosing(),{text:"",selection:[1,1]}}}}),this.add("brackets","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s=="["){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u=="]")return i.end.column++,i}}),this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){c(n);var s=i,o=n.getSelectionRange(),u=r.doc.getTextRange(o);if(u!==""&&u!=="'"&&u!='"'&&n.getWrapBehavioursEnabled())return h(o,u,s,s);if(!u){var a=n.getCursorPosition(),f=r.doc.getLine(a.row),l=f.substring(a.column-1,a.column),p=f.substring(a.column,a.column+1),d=r.getTokenAt(a.row,a.column),v=r.getTokenAt(a.row,a.column+1);if(l=="\\"&&d&&/escape/.test(d.type))return null;var m=d&&/string|escape/.test(d.type),g=!v||/string|escape/.test(v.type),y;if(p==s)y=m!==g;else{if(m&&!g)return null;if(m&&g)return null;var b=r.$mode.tokenRe;b.lastIndex=0;var w=b.test(l);b.lastIndex=0;var E=b.test(l);if(w||E)return null;if(p&&!/[\s;,.})\]\\]/.test(p))return null;y=!0}return{text:y?s+s:"",selection:[1,1]}}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){c(n);var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}})};p.isSaneInsertion=function(e,t){var n=e.getCursorPosition(),r=new s(t,n.row,n.column);if(!this.$matchTokenType(r.getCurrentToken()||"text",u)){var i=new s(t,n.row,n.column+1);if(!this.$matchTokenType(i.getCurrentToken()||"text",u))return!1}return r.stepForward(),r.getCurrentTokenRow()!==n.row||this.$matchTokenType(r.getCurrentToken()||"text",a)},p.$matchTokenType=function(e,t){return t.indexOf(e.type||e)>-1},p.recordAutoInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isAutoInsertedClosing(r,i,f.autoInsertedLineEnd[0])||(f.autoInsertedBrackets=0),f.autoInsertedRow=r.row,f.autoInsertedLineEnd=n+i.substr(r.column),f.autoInsertedBrackets++},p.recordMaybeInsert=function(e,t,n){var r=e.getCursorPosition(),i=t.doc.getLine(r.row);this.isMaybeInsertedClosing(r,i)||(f.maybeInsertedBrackets=0),f.maybeInsertedRow=r.row,f.maybeInsertedLineStart=i.substr(0,r.column)+n,f.maybeInsertedLineEnd=i.substr(r.column),f.maybeInsertedBrackets++},p.isAutoInsertedClosing=function(e,t,n){return f.autoInsertedBrackets>0&&e.row===f.autoInsertedRow&&n===f.autoInsertedLineEnd[0]&&t.substr(e.column)===f.autoInsertedLineEnd},p.isMaybeInsertedClosing=function(e,t){return f.maybeInsertedBrackets>0&&e.row===f.maybeInsertedRow&&t.substr(e.column)===f.maybeInsertedLineEnd&&t.substr(0,e.column)==f.maybeInsertedLineStart},p.popAutoInsertedClosing=function(){f.autoInsertedLineEnd=f.autoInsertedLineEnd.substr(1),f.autoInsertedBrackets--},p.clearMaybeInsertedClosing=function(){f&&(f.maybeInsertedBrackets=0,f.maybeInsertedRow=-1)},r.inherits(p,i),t.CstyleBehaviour=p}),ace.define("ace/mode/folding/cstyle",["require","exports","module","ace/lib/oop","ace/range","ace/mode/folding/fold_mode"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../../range").Range,s=e("./fold_mode").FoldMode,o=t.FoldMode=function(e){e&&(this.foldingStartMarker=new RegExp(this.foldingStartMarker.source.replace(/\|[^|]*?$/,"|"+e.start)),this.foldingStopMarker=new RegExp(this.foldingStopMarker.source.replace(/\|[^|]*?$/,"|"+e.end)))};r.inherits(o,s),function(){this.foldingStartMarker=/(\{|\[)[^\}\]]*$|^\s*(\/\*)/,this.foldingStopMarker=/^[^\[\{]*(\}|\])|^[\s\*]*(\*\/)/,this.singleLineBlockCommentRe=/^\s*(\/\*).*\*\/\s*$/,this.tripleStarBlockCommentRe=/^\s*(\/\*\*\*).*\*\/\s*$/,this.startRegionRe=/^\s*(\/\*|\/\/)#?region\b/,this._getFoldWidgetBase=this.getFoldWidget,this.getFoldWidget=function(e,t,n){var r=e.getLine(n);if(this.singleLineBlockCommentRe.test(r)&&!this.startRegionRe.test(r)&&!this.tripleStarBlockCommentRe.test(r))return"";var i=this._getFoldWidgetBase(e,t,n);return!i&&this.startRegionRe.test(r)?"start":i},this.getFoldWidgetRange=function(e,t,n,r){var i=e.getLine(n);if(this.startRegionRe.test(i))return this.getCommentRegionBlock(e,i,n);var s=i.match(this.foldingStartMarker);if(s){var o=s.index;if(s[1])return this.openingBracketBlock(e,s[1],n,o);var u=e.getCommentFoldRange(n,o+s[0].length,1);return u&&!u.isMultiLine()&&(r?u=this.getSectionRange(e,n):t!="all"&&(u=null)),u}if(t==="markbegin")return;var s=i.match(this.foldingStopMarker);if(s){var o=s.index+s[0].length;return s[1]?this.closingBracketBlock(e,s[1],n,o):e.getCommentFoldRange(n,o,-1)}},this.getSectionRange=function(e,t){var n=e.getLine(t),r=n.search(/\S/),s=t,o=n.length;t+=1;var u=t,a=e.getLength();while(++tf)break;var l=this.getFoldWidgetRange(e,"all",t);if(l){if(l.start.row<=s)break;if(l.isMultiLine())t=l.end.row;else if(r==f)break}u=t}return new i(s,o,u,e.getLine(u).length)},this.getCommentRegionBlock=function(e,t,n){var r=t.search(/\s*$/),s=e.getLength(),o=n,u=/^\s*(?:\/\*|\/\/|--)#?(end)?region\b/,a=1;while(++no)return new i(o,r,l,t.length)}}.call(o.prototype)}),ace.define("ace/mode/javascript",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/javascript_highlight_rules","ace/mode/matching_brace_outdent","ace/range","ace/worker/worker_client","ace/mode/behaviour/cstyle","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./javascript_highlight_rules").JavaScriptHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../range").Range,a=e("../worker/worker_client").WorkerClient,f=e("./behaviour/cstyle").CstyleBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.foldingRules=new l};r.inherits(c,i),function(){this.lineCommentStart="//",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e),s=i.tokens,o=i.state;if(s.length&&s[s.length-1].type=="comment")return r;if(e=="start"||e=="no_regex"){var u=t.match(/^.*(?:\bcase\b.*\:|[\{\(\[])\s*$/);u&&(r+=n)}else if(e=="doc-start"){if(o=="start"||o=="no_regex")return"";var u=t.match(/^\s*(\/?)\*/);u&&(u[1]&&(r+=" "),r+="* ")}return r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.createWorker=function(e){var t=new a(["ace"],"ace/mode/javascript_worker","JavaScriptWorker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/javascript"}.call(c.prototype),t.Mode=c}),ace.define("ace/mode/css_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=t.supportType="align-content|align-items|align-self|all|animation|animation-delay|animation-direction|animation-duration|animation-fill-mode|animation-iteration-count|animation-name|animation-play-state|animation-timing-function|backface-visibility|background|background-attachment|background-blend-mode|background-clip|background-color|background-image|background-origin|background-position|background-repeat|background-size|border|border-bottom|border-bottom-color|border-bottom-left-radius|border-bottom-right-radius|border-bottom-style|border-bottom-width|border-collapse|border-color|border-image|border-image-outset|border-image-repeat|border-image-slice|border-image-source|border-image-width|border-left|border-left-color|border-left-style|border-left-width|border-radius|border-right|border-right-color|border-right-style|border-right-width|border-spacing|border-style|border-top|border-top-color|border-top-left-radius|border-top-right-radius|border-top-style|border-top-width|border-width|bottom|box-shadow|box-sizing|caption-side|clear|clip|color|column-count|column-fill|column-gap|column-rule|column-rule-color|column-rule-style|column-rule-width|column-span|column-width|columns|content|counter-increment|counter-reset|cursor|direction|display|empty-cells|filter|flex|flex-basis|flex-direction|flex-flow|flex-grow|flex-shrink|flex-wrap|float|font|font-family|font-size|font-size-adjust|font-stretch|font-style|font-variant|font-weight|hanging-punctuation|height|justify-content|left|letter-spacing|line-height|list-style|list-style-image|list-style-position|list-style-type|margin|margin-bottom|margin-left|margin-right|margin-top|max-height|max-width|min-height|min-width|nav-down|nav-index|nav-left|nav-right|nav-up|opacity|order|outline|outline-color|outline-offset|outline-style|outline-width|overflow|overflow-x|overflow-y|padding|padding-bottom|padding-left|padding-right|padding-top|page-break-after|page-break-before|page-break-inside|perspective|perspective-origin|position|quotes|resize|right|tab-size|table-layout|text-align|text-align-last|text-decoration|text-decoration-color|text-decoration-line|text-decoration-style|text-indent|text-justify|text-overflow|text-shadow|text-transform|top|transform|transform-origin|transform-style|transition|transition-delay|transition-duration|transition-property|transition-timing-function|unicode-bidi|vertical-align|visibility|white-space|width|word-break|word-spacing|word-wrap|z-index",u=t.supportFunction="rgb|rgba|url|attr|counter|counters",a=t.supportConstant="absolute|after-edge|after|all-scroll|all|alphabetic|always|antialiased|armenian|auto|avoid-column|avoid-page|avoid|balance|baseline|before-edge|before|below|bidi-override|block-line-height|block|bold|bolder|border-box|both|bottom|box|break-all|break-word|capitalize|caps-height|caption|center|central|char|circle|cjk-ideographic|clone|close-quote|col-resize|collapse|column|consider-shifts|contain|content-box|cover|crosshair|cubic-bezier|dashed|decimal-leading-zero|decimal|default|disabled|disc|disregard-shifts|distribute-all-lines|distribute-letter|distribute-space|distribute|dotted|double|e-resize|ease-in|ease-in-out|ease-out|ease|ellipsis|end|exclude-ruby|fill|fixed|georgian|glyphs|grid-height|groove|hand|hanging|hebrew|help|hidden|hiragana-iroha|hiragana|horizontal|icon|ideograph-alpha|ideograph-numeric|ideograph-parenthesis|ideograph-space|ideographic|inactive|include-ruby|inherit|initial|inline-block|inline-box|inline-line-height|inline-table|inline|inset|inside|inter-ideograph|inter-word|invert|italic|justify|katakana-iroha|katakana|keep-all|last|left|lighter|line-edge|line-through|line|linear|list-item|local|loose|lower-alpha|lower-greek|lower-latin|lower-roman|lowercase|lr-tb|ltr|mathematical|max-height|max-size|medium|menu|message-box|middle|move|n-resize|ne-resize|newspaper|no-change|no-close-quote|no-drop|no-open-quote|no-repeat|none|normal|not-allowed|nowrap|nw-resize|oblique|open-quote|outset|outside|overline|padding-box|page|pointer|pre-line|pre-wrap|pre|preserve-3d|progress|relative|repeat-x|repeat-y|repeat|replaced|reset-size|ridge|right|round|row-resize|rtl|s-resize|scroll|se-resize|separate|slice|small-caps|small-caption|solid|space|square|start|static|status-bar|step-end|step-start|steps|stretch|strict|sub|super|sw-resize|table-caption|table-cell|table-column-group|table-column|table-footer-group|table-header-group|table-row-group|table-row|table|tb-rl|text-after-edge|text-before-edge|text-bottom|text-size|text-top|text|thick|thin|transparent|underline|upper-alpha|upper-latin|upper-roman|uppercase|use-script|vertical-ideographic|vertical-text|visible|w-resize|wait|whitespace|z-index|zero",f=t.supportConstantColor="aqua|black|blue|fuchsia|gray|green|lime|maroon|navy|olive|orange|purple|red|silver|teal|white|yellow",l=t.supportConstantFonts="arial|century|comic|courier|cursive|fantasy|garamond|georgia|helvetica|impact|lucida|symbol|system|tahoma|times|trebuchet|utopia|verdana|webdings|sans-serif|serif|monospace",c=t.numRe="\\-?(?:(?:[0-9]+)|(?:[0-9]*\\.[0-9]+))",h=t.pseudoElements="(\\:+)\\b(after|before|first-letter|first-line|moz-selection|selection)\\b",p=t.pseudoClasses="(:)\\b(active|checked|disabled|empty|enabled|first-child|first-of-type|focus|hover|indeterminate|invalid|last-child|last-of-type|link|not|nth-child|nth-last-child|nth-last-of-type|nth-of-type|only-child|only-of-type|required|root|target|valid|visited)\\b",d=function(){var e=this.createKeywordMapper({"support.function":u,"support.constant":a,"support.type":o,"support.constant.color":f,"support.constant.fonts":l},"text",!0);this.$rules={start:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"@.*?{",push:"media"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],media:[{token:"comment",regex:"\\/\\*",push:"comment"},{token:"paren.lparen",regex:"\\{",push:"ruleset"},{token:"string",regex:"\\}",next:"pop"},{token:"keyword",regex:"#[a-z0-9-_]+"},{token:"variable",regex:"\\.[a-z0-9-_]+"},{token:"string",regex:":[a-z0-9-_]+"},{token:"constant",regex:"[a-z0-9-_]+"},{caseInsensitive:!0}],comment:[{token:"comment",regex:"\\*\\/",next:"pop"},{defaultToken:"comment"}],ruleset:[{token:"paren.rparen",regex:"\\}",next:"pop"},{token:"comment",regex:"\\/\\*",push:"comment"},{token:"string",regex:'["](?:(?:\\\\.)|(?:[^"\\\\]))*?["]'},{token:"string",regex:"['](?:(?:\\\\.)|(?:[^'\\\\]))*?[']"},{token:["constant.numeric","keyword"],regex:"("+c+")(ch|cm|deg|em|ex|fr|gd|grad|Hz|in|kHz|mm|ms|pc|pt|px|rad|rem|s|turn|vh|vm|vw|%)"},{token:"constant.numeric",regex:c},{token:"constant.numeric",regex:"#[a-f0-9]{6}"},{token:"constant.numeric",regex:"#[a-f0-9]{3}"},{token:["punctuation","entity.other.attribute-name.pseudo-element.css"],regex:h},{token:["punctuation","entity.other.attribute-name.pseudo-class.css"],regex:p},{token:["support.function","string","support.function"],regex:"(url\\()(.*)(\\))"},{token:e,regex:"\\-?[a-zA-Z_][a-zA-Z0-9_\\-]*"},{caseInsensitive:!0}]},this.normalizeRules()};r.inherits(d,s),t.CssHighlightRules=d}),ace.define("ace/mode/css_completions",["require","exports","module"],function(e,t,n){"use strict";var r={background:{"#$0":1},"background-color":{"#$0":1,transparent:1,fixed:1},"background-image":{"url('/$0')":1},"background-repeat":{repeat:1,"repeat-x":1,"repeat-y":1,"no-repeat":1,inherit:1},"background-position":{bottom:2,center:2,left:2,right:2,top:2,inherit:2},"background-attachment":{scroll:1,fixed:1},"background-size":{cover:1,contain:1},"background-clip":{"border-box":1,"padding-box":1,"content-box":1},"background-origin":{"border-box":1,"padding-box":1,"content-box":1},border:{"solid $0":1,"dashed $0":1,"dotted $0":1,"#$0":1},"border-color":{"#$0":1},"border-style":{solid:2,dashed:2,dotted:2,"double":2,groove:2,hidden:2,inherit:2,inset:2,none:2,outset:2,ridged:2},"border-collapse":{collapse:1,separate:1},bottom:{px:1,em:1,"%":1},clear:{left:1,right:1,both:1,none:1},color:{"#$0":1,"rgb(#$00,0,0)":1},cursor:{"default":1,pointer:1,move:1,text:1,wait:1,help:1,progress:1,"n-resize":1,"ne-resize":1,"e-resize":1,"se-resize":1,"s-resize":1,"sw-resize":1,"w-resize":1,"nw-resize":1},display:{none:1,block:1,inline:1,"inline-block":1,"table-cell":1},"empty-cells":{show:1,hide:1},"float":{left:1,right:1,none:1},"font-family":{Arial:2,"Comic Sans MS":2,Consolas:2,"Courier New":2,Courier:2,Georgia:2,Monospace:2,"Sans-Serif":2,"Segoe UI":2,Tahoma:2,"Times New Roman":2,"Trebuchet MS":2,Verdana:1},"font-size":{px:1,em:1,"%":1},"font-weight":{bold:1,normal:1},"font-style":{italic:1,normal:1},"font-variant":{normal:1,"small-caps":1},height:{px:1,em:1,"%":1},left:{px:1,em:1,"%":1},"letter-spacing":{normal:1},"line-height":{normal:1},"list-style-type":{none:1,disc:1,circle:1,square:1,decimal:1,"decimal-leading-zero":1,"lower-roman":1,"upper-roman":1,"lower-greek":1,"lower-latin":1,"upper-latin":1,georgian:1,"lower-alpha":1,"upper-alpha":1},margin:{px:1,em:1,"%":1},"margin-right":{px:1,em:1,"%":1},"margin-left":{px:1,em:1,"%":1},"margin-top":{px:1,em:1,"%":1},"margin-bottom":{px:1,em:1,"%":1},"max-height":{px:1,em:1,"%":1},"max-width":{px:1,em:1,"%":1},"min-height":{px:1,em:1,"%":1},"min-width":{px:1,em:1,"%":1},overflow:{hidden:1,visible:1,auto:1,scroll:1},"overflow-x":{hidden:1,visible:1,auto:1,scroll:1},"overflow-y":{hidden:1,visible:1,auto:1,scroll:1},padding:{px:1,em:1,"%":1},"padding-top":{px:1,em:1,"%":1},"padding-right":{px:1,em:1,"%":1},"padding-bottom":{px:1,em:1,"%":1},"padding-left":{px:1,em:1,"%":1},"page-break-after":{auto:1,always:1,avoid:1,left:1,right:1},"page-break-before":{auto:1,always:1,avoid:1,left:1,right:1},position:{absolute:1,relative:1,fixed:1,"static":1},right:{px:1,em:1,"%":1},"table-layout":{fixed:1,auto:1},"text-decoration":{none:1,underline:1,"line-through":1,blink:1},"text-align":{left:1,right:1,center:1,justify:1},"text-transform":{capitalize:1,uppercase:1,lowercase:1,none:1},top:{px:1,em:1,"%":1},"vertical-align":{top:1,bottom:1},visibility:{hidden:1,visible:1},"white-space":{nowrap:1,normal:1,pre:1,"pre-line":1,"pre-wrap":1},width:{px:1,em:1,"%":1},"word-spacing":{normal:1},filter:{"alpha(opacity=$0100)":1},"text-shadow":{"$02px 2px 2px #777":1},"text-overflow":{"ellipsis-word":1,clip:1,ellipsis:1},"-moz-border-radius":1,"-moz-border-radius-topright":1,"-moz-border-radius-bottomright":1,"-moz-border-radius-topleft":1,"-moz-border-radius-bottomleft":1,"-webkit-border-radius":1,"-webkit-border-top-right-radius":1,"-webkit-border-top-left-radius":1,"-webkit-border-bottom-right-radius":1,"-webkit-border-bottom-left-radius":1,"-moz-box-shadow":1,"-webkit-box-shadow":1,transform:{"rotate($00deg)":1,"skew($00deg)":1},"-moz-transform":{"rotate($00deg)":1,"skew($00deg)":1},"-webkit-transform":{"rotate($00deg)":1,"skew($00deg)":1}},i=function(){};(function(){this.completionsDefined=!1,this.defineCompletions=function(){if(document){var e=document.createElement("c").style;for(var t in e){if(typeof e[t]!="string")continue;var n=t.replace(/[A-Z]/g,function(e){return"-"+e.toLowerCase()});r.hasOwnProperty(n)||(r[n]=1)}}this.completionsDefined=!0},this.getCompletions=function(e,t,n,r){this.completionsDefined||this.defineCompletions();var i=t.getTokenAt(n.row,n.column);if(!i)return[];if(e==="ruleset"){var s=t.getLine(n.row).substr(0,n.column);return/:[^;]+$/.test(s)?(/([\w\-]+):[^:]*$/.test(s),this.getPropertyValueCompletions(e,t,n,r)):this.getPropertyCompletions(e,t,n,r)}return[]},this.getPropertyCompletions=function(e,t,n,i){var s=Object.keys(r);return s.map(function(e){return{caption:e,snippet:e+": $0",meta:"property",score:Number.MAX_VALUE}})},this.getPropertyValueCompletions=function(e,t,n,i){var s=t.getLine(n.row).substr(0,n.column),o=(/([\w\-]+):[^:]*$/.exec(s)||{})[1];if(!o)return[];var u=[];return o in r&&typeof r[o]=="object"&&(u=Object.keys(r[o])),u.map(function(e){return{caption:e,snippet:e,meta:"property value",score:Number.MAX_VALUE}})}}).call(i.prototype),t.CssCompletions=i}),ace.define("ace/mode/behaviour/css",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/mode/behaviour/cstyle","ace/token_iterator"],function(e,t,n){"use strict";var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("./cstyle").CstyleBehaviour,o=e("../../token_iterator").TokenIterator,u=function(){this.inherit(s),this.add("colon","insertion",function(e,t,n,r,i){if(i===":"){var s=n.getCursorPosition(),u=new o(r,s.row,s.column),a=u.getCurrentToken();a&&a.value.match(/\s+/)&&(a=u.stepBackward());if(a&&a.type==="support.type"){var f=r.doc.getLine(s.row),l=f.substring(s.column,s.column+1);if(l===":")return{text:"",selection:[1,1]};if(!f.substring(s.column).match(/^\s*;/))return{text:":;",selection:[1,1]}}}}),this.add("colon","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&s===":"){var u=n.getCursorPosition(),a=new o(r,u.row,u.column),f=a.getCurrentToken();f&&f.value.match(/\s+/)&&(f=a.stepBackward());if(f&&f.type==="support.type"){var l=r.doc.getLine(i.start.row),c=l.substring(i.end.column,i.end.column+1);if(c===";")return i.end.column++,i}}}),this.add("semicolon","insertion",function(e,t,n,r,i){if(i===";"){var s=n.getCursorPosition(),o=r.doc.getLine(s.row),u=o.substring(s.column,s.column+1);if(u===";")return{text:"",selection:[1,1]}}})};r.inherits(u,s),t.CssBehaviour=u}),ace.define("ace/mode/css",["require","exports","module","ace/lib/oop","ace/mode/text","ace/mode/css_highlight_rules","ace/mode/matching_brace_outdent","ace/worker/worker_client","ace/mode/css_completions","ace/mode/behaviour/css","ace/mode/folding/cstyle"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text").Mode,s=e("./css_highlight_rules").CssHighlightRules,o=e("./matching_brace_outdent").MatchingBraceOutdent,u=e("../worker/worker_client").WorkerClient,a=e("./css_completions").CssCompletions,f=e("./behaviour/css").CssBehaviour,l=e("./folding/cstyle").FoldMode,c=function(){this.HighlightRules=s,this.$outdent=new o,this.$behaviour=new f,this.$completer=new a,this.foldingRules=new l};r.inherits(c,i),function(){this.foldingRules="cStyle",this.blockComment={start:"/*",end:"*/"},this.getNextLineIndent=function(e,t,n){var r=this.$getIndent(t),i=this.getTokenizer().getLineTokens(t,e).tokens;if(i.length&&i[i.length-1].type=="comment")return r;var s=t.match(/^.*\{\s*$/);return s&&(r+=n),r},this.checkOutdent=function(e,t,n){return this.$outdent.checkOutdent(t,n)},this.autoOutdent=function(e,t,n){this.$outdent.autoOutdent(t,n)},this.getCompletions=function(e,t,n,r){return this.$completer.getCompletions(e,t,n,r)},this.createWorker=function(e){var t=new u(["ace"],"ace/mode/css_worker","Worker");return t.attachToDocument(e.getDocument()),t.on("annotate",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/css"}.call(c.prototype),t.Mode=c}),ace.define("ace/mode/xml_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text_highlight_rules").TextHighlightRules,s=function(e){var t="[_:a-zA-Z\u00c0-\uffff][-_:.a-zA-Z0-9\u00c0-\uffff]*";this.$rules={start:[{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\[",next:"cdata"},{token:["punctuation.xml-decl.xml","keyword.xml-decl.xml"],regex:"(<\\?)(xml)(?=[\\s])",next:"xml_decl",caseInsensitive:!0},{token:["punctuation.instruction.xml","keyword.instruction.xml"],regex:"(<\\?)("+t+")",next:"processing_instruction"},{token:"comment.xml",regex:"<\\!--",next:"comment"},{token:["xml-pe.doctype.xml","xml-pe.doctype.xml"],regex:"(<\\!)(DOCTYPE)(?=[\\s])",next:"doctype",caseInsensitive:!0},{include:"tag"},{token:"text.end-tag-open.xml",regex:"",next:"start"}],processing_instruction:[{token:"punctuation.instruction.xml",regex:"\\?>",next:"start"},{defaultToken:"instruction.xml"}],doctype:[{include:"whitespace"},{include:"string"},{token:"xml-pe.doctype.xml",regex:">",next:"start"},{token:"xml-pe.xml",regex:"[-_a-zA-Z0-9:]+"},{token:"punctuation.int-subset",regex:"\\[",push:"int_subset"}],int_subset:[{token:"text.xml",regex:"\\s+"},{token:"punctuation.int-subset.xml",regex:"]",next:"pop"},{token:["punctuation.markup-decl.xml","keyword.markup-decl.xml"],regex:"(<\\!)("+t+")",push:[{token:"text",regex:"\\s+"},{token:"punctuation.markup-decl.xml",regex:">",next:"pop"},{include:"string"}]}],cdata:[{token:"string.cdata.xml",regex:"\\]\\]>",next:"start"},{token:"text.xml",regex:"\\s+"},{token:"text.xml",regex:"(?:[^\\]]|\\](?!\\]>))+"}],comment:[{token:"comment.xml",regex:"-->",next:"start"},{defaultToken:"comment.xml"}],reference:[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],attr_reference:[{token:"constant.language.escape.reference.attribute-value.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],tag:[{token:["meta.tag.punctuation.tag-open.xml","meta.tag.punctuation.end-tag-open.xml","meta.tag.tag-name.xml"],regex:"(?:(<)|(",next:"start"}]}],tag_whitespace:[{token:"text.tag-whitespace.xml",regex:"\\s+"}],whitespace:[{token:"text.whitespace.xml",regex:"\\s+"}],string:[{token:"string.xml",regex:"'",push:[{token:"string.xml",regex:"'",next:"pop"},{defaultToken:"string.xml"}]},{token:"string.xml",regex:'"',push:[{token:"string.xml",regex:'"',next:"pop"},{defaultToken:"string.xml"}]}],attributes:[{token:"entity.other.attribute-name.xml",regex:"(?:"+t+":)?"+t+""},{token:"keyword.operator.attribute-equals.xml",regex:"="},{include:"tag_whitespace"},{include:"attribute_value"}],attribute_value:[{token:"string.attribute-value.xml",regex:"'",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]}]},this.constructor===s&&this.normalizeRules()};(function(){this.embedTagRules=function(e,t,n){this.$rules.tag.unshift({token:["meta.tag.punctuation.tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(<)("+n+"(?=\\s|>|$))",next:[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:t+"start"}]}),this.$rules[n+"-end"]=[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:"start",onMatch:function(e,t,n){return n.splice(0),this.token}}],this.embedRules(e,t,[{token:["meta.tag.punctuation.end-tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(|$))",next:n+"-end"},{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\["},{token:"string.cdata.xml",regex:"\\]\\]>"}])}}).call(i.prototype),r.inherits(s,i),t.XmlHighlightRules=s}),ace.define("ace/mode/html_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/css_highlight_rules","ace/mode/javascript_highlight_rules","ace/mode/xml_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./css_highlight_rules").CssHighlightRules,o=e("./javascript_highlight_rules").JavaScriptHighlightRules,u=e("./xml_highlight_rules").XmlHighlightRules,a=i.createMap({a:"anchor",button:"form",form:"form",img:"image",input:"form",label:"form",option:"form",script:"script",select:"form",textarea:"form",style:"style",table:"table",tbody:"table",td:"table",tfoot:"table",th:"table",tr:"table"}),f=function(){u.call(this),this.addRules({attributes:[{include:"tag_whitespace"},{token:"entity.other.attribute-name.xml",regex:"[-_a-zA-Z0-9:.]+"},{token:"keyword.operator.attribute-equals.xml",regex:"=",push:[{include:"tag_whitespace"},{token:"string.unquoted.attribute-value.html",regex:"[^<>='\"`\\s]+",next:"pop"},{token:"empty",regex:"",next:"pop"}]},{include:"attribute_value"}],tag:[{token:function(e,t){var n=a[t];return["meta.tag.punctuation."+(e=="<"?"":"end-")+"tag-open.xml","meta.tag"+(n?"."+n:"")+".tag-name.xml"]},regex:"(",next:"start"}]}),this.embedTagRules(s,"css-","style"),this.embedTagRules((new o({noJSX:!0})).getRules(),"js-","script"),this.constructor===f&&this.normalizeRules()};r.inherits(f,u),t.HtmlHighlightRules=f}),ace.define("ace/mode/behaviour/xml",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";function u(e,t){return e.type.lastIndexOf(t+".xml")>-1}var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),a=function(){this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){var o=i,a=r.doc.getTextRange(n.getSelectionRange());if(a!==""&&a!=="'"&&a!='"'&&n.getWrapBehavioursEnabled())return{text:o+a+o,selection:!1};var f=n.getCursorPosition(),l=r.doc.getLine(f.row),c=l.substring(f.column,f.column+1),h=new s(r,f.row,f.column),p=h.getCurrentToken();if(c==o&&(u(p,"attribute-value")||u(p,"string")))return{text:"",selection:[1,1]};p||(p=h.stepBackward());if(!p)return;while(u(p,"tag-whitespace")||u(p,"whitespace"))p=h.stepBackward();var d=!c||c.match(/\s/);if(u(p,"attribute-equals")&&(d||c==">")||u(p,"decl-attribute-equals")&&(d||c=="?"))return{text:o+o,selection:[1,1]}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}}),this.add("autoclosing","insertion",function(e,t,n,r,i){if(i==">"){var o=n.getCursorPosition(),a=new s(r,o.row,o.column),f=a.getCurrentToken()||a.stepBackward();if(!f||!(u(f,"tag-name")||u(f,"tag-whitespace")||u(f,"attribute-name")||u(f,"attribute-equals")||u(f,"attribute-value")))return;if(u(f,"reference.attribute-value"))return;if(u(f,"attribute-value")){var l=f.value.charAt(0);if(l=='"'||l=="'"){var c=f.value.charAt(f.value.length-1),h=a.getCurrentTokenColumn()+f.value.length;if(h>o.column||h==o.column&&l!=c)return}}while(!u(f,"tag-name"))f=a.stepBackward();var p=a.getCurrentTokenRow(),d=a.getCurrentTokenColumn();if(u(a.stepBackward(),"end-tag-open"))return;var v=f.value;p==o.row&&(v=v.substring(0,o.column-d));if(this.voidElements.hasOwnProperty(v.toLowerCase()))return;return{text:">",selection:[1,1]}}}),this.add("autoindent","insertion",function(e,t,n,r,i){if(i=="\n"){var o=n.getCursorPosition(),u=r.getLine(o.row),a=new s(r,o.row,o.column),f=a.getCurrentToken();if(f&&f.type.indexOf("tag-close")!==-1){if(f.value=="/>")return;while(f&&f.type.indexOf("tag-name")===-1)f=a.stepBackward();if(!f)return;var l=f.value,c=a.getCurrentTokenRow();f=a.stepBackward();if(!f||f.type.indexOf("end-tag")!==-1)return;if(this.voidElements&&!this.voidElements[l]){var h=r.getTokenAt(o.row,o.column+1),u=r.getLine(c),p=this.$getIndent(u),d=p+r.getTabString();return h&&h.value==="-1}var r=e("../../lib/oop"),i=e("../../lib/lang"),s=e("../../range").Range,o=e("./fold_mode").FoldMode,u=e("../../token_iterator").TokenIterator,a=t.FoldMode=function(e,t){o.call(this),this.voidElements=e||{},this.optionalEndTags=r.mixin({},this.voidElements),t&&r.mixin(this.optionalEndTags,t)};r.inherits(a,o);var f=function(){this.tagName="",this.closing=!1,this.selfClosing=!1,this.start={row:0,column:0},this.end={row:0,column:0}};(function(){this.getFoldWidget=function(e,t,n){var r=this._getFirstTagInLine(e,n);return r?r.closing||!r.tagName&&r.selfClosing?t=="markbeginend"?"end":"":!r.tagName||r.selfClosing||this.voidElements.hasOwnProperty(r.tagName.toLowerCase())?"":this._findEndTagInLine(e,n,r.tagName,r.end.column)?"":"start":""},this._getFirstTagInLine=function(e,t){var n=e.getTokens(t),r=new f;for(var i=0;i";break}}return r}if(l(s,"tag-close"))return r.selfClosing=s.value=="/>",r;r.start.column+=s.value.length}return null},this._findEndTagInLine=function(e,t,n,r){var i=e.getTokens(t),s=0;for(var o=0;o",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length,e.stepForward(),n;while(t=e.stepForward());return null},this._readTagBackward=function(e){var t=e.getCurrentToken();if(!t)return null;var n=new f;do{if(l(t,"tag-open"))return n.closing=l(t,"end-tag-open"),n.start.row=e.getCurrentTokenRow(),n.start.column=e.getCurrentTokenColumn(),e.stepBackward(),n;l(t,"tag-name")?n.tagName=t.value:l(t,"tag-close")&&(n.selfClosing=t.value=="/>",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length)}while(t=e.stepBackward());return null},this._pop=function(e,t){while(e.length){var n=e[e.length-1];if(!t||n.tagName==t.tagName)return e.pop();if(this.optionalEndTags.hasOwnProperty(n.tagName)){e.pop();continue}return null}},this.getFoldWidgetRange=function(e,t,n){var r=this._getFirstTagInLine(e,n);if(!r)return null;var i=r.closing||r.selfClosing,o=[],a;if(!i){var f=new u(e,n,r.start.column),l={row:n,column:r.start.column+r.tagName.length+2};r.start.row==r.end.row&&(l.column=r.end.column);while(a=this._readTagForward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(a.closing){this._pop(o,a);if(o.length==0)return s.fromPoints(l,a.start)}else o.push(a)}}else{var f=new u(e,n,r.end.column),c={row:n,column:r.start.column};while(a=this._readTagBackward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(!a.closing){this._pop(o,a);if(o.length==0)return a.start.column+=a.tagName.length+2,a.start.row==a.end.row&&a.start.column-1}function l(e,t){var n=new r(e,t.row,t.column),i=n.getCurrentToken();while(i&&!f(i,"tag-name"))i=n.stepBackward();if(i)return i.value}function c(e,t){var n=new r(e,t.row,t.column),i=n.getCurrentToken();while(i&&!f(i,"attribute-name"))i=n.stepBackward();if(i)return i.value}var r=e("../token_iterator").TokenIterator,i=["accesskey","class","contenteditable","contextmenu","dir","draggable","dropzone","hidden","id","inert","itemid","itemprop","itemref","itemscope","itemtype","lang","spellcheck","style","tabindex","title","translate"],s=["onabort","onblur","oncancel","oncanplay","oncanplaythrough","onchange","onclick","onclose","oncontextmenu","oncuechange","ondblclick","ondrag","ondragend","ondragenter","ondragleave","ondragover","ondragstart","ondrop","ondurationchange","onemptied","onended","onerror","onfocus","oninput","oninvalid","onkeydown","onkeypress","onkeyup","onload","onloadeddata","onloadedmetadata","onloadstart","onmousedown","onmousemove","onmouseout","onmouseover","onmouseup","onmousewheel","onpause","onplay","onplaying","onprogress","onratechange","onreset","onscroll","onseeked","onseeking","onselect","onshow","onstalled","onsubmit","onsuspend","ontimeupdate","onvolumechange","onwaiting"],o=i.concat(s),u={html:{manifest:1},head:{},title:{},base:{href:1,target:1},link:{href:1,hreflang:1,rel:{stylesheet:1,icon:1},media:{all:1,screen:1,print:1},type:{"text/css":1,"image/png":1,"image/jpeg":1,"image/gif":1},sizes:1},meta:{"http-equiv":{"content-type":1},name:{description:1,keywords:1},content:{"text/html; charset=UTF-8":1},charset:1},style:{type:1,media:{all:1,screen:1,print:1},scoped:1},script:{charset:1,type:{"text/javascript":1},src:1,defer:1,async:1},noscript:{href:1},body:{onafterprint:1,onbeforeprint:1,onbeforeunload:1,onhashchange:1,onmessage:1,onoffline:1,onpopstate:1,onredo:1,onresize:1,onstorage:1,onundo:1,onunload:1},section:{},nav:{},article:{pubdate:1},aside:{},h1:{},h2:{},h3:{},h4:{},h5:{},h6:{},header:{},footer:{},address:{},main:{},p:{},hr:{},pre:{},blockquote:{cite:1},ol:{start:1,reversed:1},ul:{},li:{value:1},dl:{},dt:{},dd:{},figure:{},figcaption:{},div:{},a:{href:1,target:{_blank:1,top:1},ping:1,rel:{nofollow:1,alternate:1,author:1,bookmark:1,help:1,license:1,next:1,noreferrer:1,prefetch:1,prev:1,search:1,tag:1},media:1,hreflang:1,type:1},em:{},strong:{},small:{},s:{},cite:{},q:{cite:1},dfn:{},abbr:{},data:{},time:{datetime:1},code:{},"var":{},samp:{},kbd:{},sub:{},sup:{},i:{},b:{},u:{},mark:{},ruby:{},rt:{},rp:{},bdi:{},bdo:{},span:{},br:{},wbr:{},ins:{cite:1,datetime:1},del:{cite:1,datetime:1},img:{alt:1,src:1,height:1,width:1,usemap:1,ismap:1},iframe:{name:1,src:1,height:1,width:1,sandbox:{"allow-same-origin":1,"allow-top-navigation":1,"allow-forms":1,"allow-scripts":1},seamless:{seamless:1}},embed:{src:1,height:1,width:1,type:1},object:{param:1,data:1,type:1,height:1,width:1,usemap:1,name:1,form:1,classid:1},param:{name:1,value:1},video:{src:1,autobuffer:1,autoplay:{autoplay:1},loop:{loop:1},controls:{controls:1},width:1,height:1,poster:1,muted:{muted:1},preload:{auto:1,metadata:1,none:1}},audio:{src:1,autobuffer:1,autoplay:{autoplay:1},loop:{loop:1},controls:{controls:1},muted:{muted:1},preload:{auto:1,metadata:1,none:1}},source:{src:1,type:1,media:1},track:{kind:1,src:1,srclang:1,label:1,"default":1},canvas:{width:1,height:1},map:{name:1},area:{shape:1,coords:1,href:1,hreflang:1,alt:1,target:1,media:1,rel:1,ping:1,type:1},svg:{},math:{},table:{summary:1},caption:{},colgroup:{span:1},col:{span:1},tbody:{},thead:{},tfoot:{},tr:{},td:{headers:1,rowspan:1,colspan:1},th:{headers:1,rowspan:1,colspan:1,scope:1},form:{"accept-charset":1,action:1,autocomplete:1,enctype:{"multipart/form-data":1,"application/x-www-form-urlencoded":1},method:{get:1,post:1},name:1,novalidate:1,target:{_blank:1,top:1}},fieldset:{disabled:1,form:1,name:1},legend:{},label:{form:1,"for":1},input:{type:{text:1,password:1,hidden:1,checkbox:1,submit:1,radio:1,file:1,button:1,reset:1,image:31,color:1,date:1,datetime:1,"datetime-local":1,email:1,month:1,number:1,range:1,search:1,tel:1,time:1,url:1,week:1},accept:1,alt:1,autocomplete:{on:1,off:1},autofocus:{autofocus:1},checked:{checked:1},disabled:{disabled:1},form:1,formaction:1,formenctype:{"application/x-www-form-urlencoded":1,"multipart/form-data":1,"text/plain":1},formmethod:{get:1,post:1},formnovalidate:{formnovalidate:1},formtarget:{_blank:1,_self:1,_parent:1,_top:1},height:1,list:1,max:1,maxlength:1,min:1,multiple:{multiple:1},name:1,pattern:1,placeholder:1,readonly:{readonly:1},required:{required:1},size:1,src:1,step:1,width:1,files:1,value:1},button:{autofocus:1,disabled:{disabled:1},form:1,formaction:1,formenctype:1,formmethod:1,formnovalidate:1,formtarget:1,name:1,value:1,type:{button:1,submit:1}},select:{autofocus:1,disabled:1,form:1,multiple:{multiple:1},name:1,size:1,readonly:{readonly:1}},datalist:{},optgroup:{disabled:1,label:1},option:{disabled:1,selected:1,label:1,value:1},textarea:{autofocus:{autofocus:1},disabled:{disabled:1},form:1,maxlength:1,name:1,placeholder:1,readonly:{readonly:1},required:{required:1},rows:1,cols:1,wrap:{on:1,off:1,hard:1,soft:1}},keygen:{autofocus:1,challenge:{challenge:1},disabled:{disabled:1},form:1,keytype:{rsa:1,dsa:1,ec:1},name:1},output:{"for":1,form:1,name:1},progress:{value:1,max:1},meter:{value:1,min:1,max:1,low:1,high:1,optimum:1},details:{open:1},summary:{},command:{type:1,label:1,icon:1,disabled:1,checked:1,radiogroup:1,command:1},menu:{type:1,label:1},dialog:{open:1}},a=Object.keys(u),h=function(){};(function(){this.getCompletions=function(e,t,n,r){var i=t.getTokenAt(n.row,n.column);if(!i)return[];if(f(i,"tag-name")||f(i,"tag-open")||f(i,"end-tag-open"))return this.getTagCompletions(e,t,n,r);if(f(i,"tag-whitespace")||f(i,"attribute-name"))return this.getAttributeCompletions(e,t,n,r);if(f(i,"attribute-value"))return this.getAttributeValueCompletions(e,t,n,r);var s=t.getLine(n.row).substr(0,n.column);return/&[A-z]*$/i.test(s)?this.getHTMLEntityCompletions(e,t,n,r):[]},this.getTagCompletions=function(e,t,n,r){return a.map(function(e){return{value:e,meta:"tag",score:Number.MAX_VALUE}})},this.getAttributeCompletions=function(e,t,n,r){var i=l(t,n);if(!i)return[];var s=o;return i in u&&(s=s.concat(Object.keys(u[i]))),s.map(function(e){return{caption:e,snippet:e+'="$0"',meta:"attribute",score:Number.MAX_VALUE}})},this.getAttributeValueCompletions=function(e,t,n,r){var i=l(t,n),s=c(t,n);if(!i)return[];var o=[];return i in u&&s in u[i]&&typeof u[i][s]=="object"&&(o=Object.keys(u[i][s])),o.map(function(e){return{caption:e,snippet:e,meta:"attribute value",score:Number.MAX_VALUE}})},this.getHTMLEntityCompletions=function(e,t,n,r){var i=["Aacute;","aacute;","Acirc;","acirc;","acute;","AElig;","aelig;","Agrave;","agrave;","alefsym;","Alpha;","alpha;","amp;","and;","ang;","Aring;","aring;","asymp;","Atilde;","atilde;","Auml;","auml;","bdquo;","Beta;","beta;","brvbar;","bull;","cap;","Ccedil;","ccedil;","cedil;","cent;","Chi;","chi;","circ;","clubs;","cong;","copy;","crarr;","cup;","curren;","Dagger;","dagger;","dArr;","darr;","deg;","Delta;","delta;","diams;","divide;","Eacute;","eacute;","Ecirc;","ecirc;","Egrave;","egrave;","empty;","emsp;","ensp;","Epsilon;","epsilon;","equiv;","Eta;","eta;","ETH;","eth;","Euml;","euml;","euro;","exist;","fnof;","forall;","frac12;","frac14;","frac34;","frasl;","Gamma;","gamma;","ge;","gt;","hArr;","harr;","hearts;","hellip;","Iacute;","iacute;","Icirc;","icirc;","iexcl;","Igrave;","igrave;","image;","infin;","int;","Iota;","iota;","iquest;","isin;","Iuml;","iuml;","Kappa;","kappa;","Lambda;","lambda;","lang;","laquo;","lArr;","larr;","lceil;","ldquo;","le;","lfloor;","lowast;","loz;","lrm;","lsaquo;","lsquo;","lt;","macr;","mdash;","micro;","middot;","minus;","Mu;","mu;","nabla;","nbsp;","ndash;","ne;","ni;","not;","notin;","nsub;","Ntilde;","ntilde;","Nu;","nu;","Oacute;","oacute;","Ocirc;","ocirc;","OElig;","oelig;","Ograve;","ograve;","oline;","Omega;","omega;","Omicron;","omicron;","oplus;","or;","ordf;","ordm;","Oslash;","oslash;","Otilde;","otilde;","otimes;","Ouml;","ouml;","para;","part;","permil;","perp;","Phi;","phi;","Pi;","pi;","piv;","plusmn;","pound;","Prime;","prime;","prod;","prop;","Psi;","psi;","quot;","radic;","rang;","raquo;","rArr;","rarr;","rceil;","rdquo;","real;","reg;","rfloor;","Rho;","rho;","rlm;","rsaquo;","rsquo;","sbquo;","Scaron;","scaron;","sdot;","sect;","shy;","Sigma;","sigma;","sigmaf;","sim;","spades;","sub;","sube;","sum;","sup;","sup1;","sup2;","sup3;","supe;","szlig;","Tau;","tau;","there4;","Theta;","theta;","thetasym;","thinsp;","THORN;","thorn;","tilde;","times;","trade;","Uacute;","uacute;","uArr;","uarr;","Ucirc;","ucirc;","Ugrave;","ugrave;","uml;","upsih;","Upsilon;","upsilon;","Uuml;","uuml;","weierp;","Xi;","xi;","Yacute;","yacute;","yen;","Yuml;","yuml;","Zeta;","zeta;","zwj;","zwnj;"];return i.map(function(e){return{caption:e,snippet:e,meta:"html entity",score:Number.MAX_VALUE}})}}).call(h.prototype),t.HtmlCompletions=h}),ace.define("ace/mode/html",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text","ace/mode/javascript","ace/mode/css","ace/mode/html_highlight_rules","ace/mode/behaviour/xml","ace/mode/folding/html","ace/mode/html_completions","ace/worker/worker_client"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text").Mode,o=e("./javascript").Mode,u=e("./css").Mode,a=e("./html_highlight_rules").HtmlHighlightRules,f=e("./behaviour/xml").XmlBehaviour,l=e("./folding/html").FoldMode,c=e("./html_completions").HtmlCompletions,h=e("../worker/worker_client").WorkerClient,p=["area","base","br","col","embed","hr","img","input","keygen","link","meta","menuitem","param","source","track","wbr"],d=["li","dt","dd","p","rt","rp","optgroup","option","colgroup","td","th"],v=function(e){this.fragmentContext=e&&e.fragmentContext,this.HighlightRules=a,this.$behaviour=new f,this.$completer=new c,this.createModeDelegates({"js-":o,"css-":u}),this.foldingRules=new l(this.voidElements,i.arrayToMap(d))};r.inherits(v,s),function(){this.blockComment={start:""},this.voidElements=i.arrayToMap(p),this.getNextLineIndent=function(e,t,n){return this.$getIndent(t)},this.checkOutdent=function(e,t,n){return!1},this.getCompletions=function(e,t,n,r){return this.$completer.getCompletions(e,t,n,r)},this.createWorker=function(e){if(this.constructor!=v)return;var t=new h(["ace"],"ace/mode/html_worker","Worker");return t.attachToDocument(e.getDocument()),this.fragmentContext&&t.call("setOptions",[{context:this.fragmentContext}]),t.on("error",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/html"}.call(v.prototype),t.Mode=v}),ace.define("ace/mode/tex_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=function(e){e||(e="text"),this.$rules={start:[{token:"comment",regex:"%.*$"},{token:e,regex:"\\\\[$&%#\\{\\}]"},{token:"keyword",regex:"\\\\(?:documentclass|usepackage|newcounter|setcounter|addtocounter|value|arabic|stepcounter|newenvironment|renewenvironment|ref|vref|eqref|pageref|label|cite[a-zA-Z]*|tag|begin|end|bibitem)\\b",next:"nospell"},{token:"keyword",regex:"\\\\(?:[a-zA-z0-9]+|[^a-zA-z0-9])"},{token:"paren.keyword.operator",regex:"[[({]"},{token:"paren.keyword.operator",regex:"[\\])}]"},{token:e,regex:"\\s+"}],nospell:[{token:"comment",regex:"%.*$",next:"start"},{token:"nospell."+e,regex:"\\\\[$&%#\\{\\}]"},{token:"keyword",regex:"\\\\(?:documentclass|usepackage|newcounter|setcounter|addtocounter|value|arabic|stepcounter|newenvironment|renewenvironment|ref|vref|eqref|pageref|label|cite[a-zA-Z]*|tag|begin|end|bibitem)\\b"},{token:"keyword",regex:"\\\\(?:[a-zA-z0-9]+|[^a-zA-z0-9])",next:"start"},{token:"paren.keyword.operator",regex:"[[({]"},{token:"paren.keyword.operator",regex:"[\\])]"},{token:"paren.keyword.operator",regex:"}",next:"start"},{token:"nospell."+e,regex:"\\s+"},{token:"nospell."+e,regex:"\\w+"}]}};r.inherits(o,s),t.TexHighlightRules=o}),ace.define("ace/mode/r_highlight_rules",["require","exports","module","ace/lib/oop","ace/lib/lang","ace/mode/text_highlight_rules","ace/mode/tex_highlight_rules"],function(e,t,n){var r=e("../lib/oop"),i=e("../lib/lang"),s=e("./text_highlight_rules").TextHighlightRules,o=e("./tex_highlight_rules").TexHighlightRules,u=function(){var e=i.arrayToMap("function|if|in|break|next|repeat|else|for|return|switch|while|try|tryCatch|stop|warning|require|library|attach|detach|source|setMethod|setGeneric|setGroupGeneric|setClass".split("|")),t=i.arrayToMap("NULL|NA|TRUE|FALSE|T|F|Inf|NaN|NA_integer_|NA_real_|NA_character_|NA_complex_".split("|"));this.$rules={start:[{token:"comment.sectionhead",regex:"#+(?!').*(?:----|====|####)\\s*$"},{token:"comment",regex:"#+'",next:"rd-start"},{token:"comment",regex:"#.*$"},{token:"string",regex:'["]',next:"qqstring"},{token:"string",regex:"[']",next:"qstring"},{token:"constant.numeric",regex:"0[xX][0-9a-fA-F]+[Li]?\\b"},{token:"constant.numeric",regex:"\\d+L\\b"},{token:"constant.numeric",regex:"\\d+(?:\\.\\d*)?(?:[eE][+\\-]?\\d*)?i?\\b"},{token:"constant.numeric",regex:"\\.\\d+(?:[eE][+\\-]?\\d*)?i?\\b"},{token:"constant.language.boolean",regex:"(?:TRUE|FALSE|T|F)\\b"},{token:"identifier",regex:"`.*?`"},{onMatch:function(n){return e[n]?"keyword":t[n]?"constant.language":n=="..."||n.match(/^\.\.\d+$/)?"variable.language":"identifier"},regex:"[a-zA-Z.][a-zA-Z0-9._]*\\b"},{token:"keyword.operator",regex:"%%|>=|<=|==|!=|\\->|<\\-|\\|\\||&&|=|\\+|\\-|\\*|/|\\^|>|<|!|&|\\||~|\\$|:"},{token:"keyword.operator",regex:"%.*?%"},{token:"paren.keyword.operator",regex:"[[({]"},{token:"paren.keyword.operator",regex:"[\\])}]"},{token:"text",regex:"\\s+"}],qqstring:[{token:"string",regex:'(?:(?:\\\\.)|(?:[^"\\\\]))*?"',next:"start"},{token:"string",regex:".+"}],qstring:[{token:"string",regex:"(?:(?:\\\\.)|(?:[^'\\\\]))*?'",next:"start"},{token:"string",regex:".+"}]};var n=(new o("comment")).getRules();for(var r=0;r",next:"start"}],["start"]),this.normalizeRules()};r.inherits(u,o),t.RHtmlHighlightRules=u}),ace.define("ace/mode/rhtml",["require","exports","module","ace/lib/oop","ace/mode/html","ace/mode/rhtml_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./html").Mode,s=e("./rhtml_highlight_rules").RHtmlHighlightRules,o=function(e,t){i.call(this),this.$session=t,this.HighlightRules=s};r.inherits(o,i),function(){this.insertChunkInfo={value:"\n",position:{row:0,column:15}},this.getLanguageMode=function(e){return this.$session.getState(e.row).match(/^r-/)?"R":"HTML"},this.$id="ace/mode/rhtml"}.call(o.prototype),t.Mode=o}) \ No newline at end of file diff --git a/docs/ace-1.2.3/mode-text.js b/docs/ace-1.2.3/mode-text.js deleted file mode 100755 index e69de29bb..000000000 diff --git a/docs/ace-1.2.3/mode-xml.js b/docs/ace-1.2.3/mode-xml.js deleted file mode 100755 index 3090bd01d..000000000 --- a/docs/ace-1.2.3/mode-xml.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/mode/xml_highlight_rules",["require","exports","module","ace/lib/oop","ace/mode/text_highlight_rules"],function(e,t,n){"use strict";var r=e("../lib/oop"),i=e("./text_highlight_rules").TextHighlightRules,s=function(e){var t="[_:a-zA-Z\u00c0-\uffff][-_:.a-zA-Z0-9\u00c0-\uffff]*";this.$rules={start:[{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\[",next:"cdata"},{token:["punctuation.xml-decl.xml","keyword.xml-decl.xml"],regex:"(<\\?)(xml)(?=[\\s])",next:"xml_decl",caseInsensitive:!0},{token:["punctuation.instruction.xml","keyword.instruction.xml"],regex:"(<\\?)("+t+")",next:"processing_instruction"},{token:"comment.xml",regex:"<\\!--",next:"comment"},{token:["xml-pe.doctype.xml","xml-pe.doctype.xml"],regex:"(<\\!)(DOCTYPE)(?=[\\s])",next:"doctype",caseInsensitive:!0},{include:"tag"},{token:"text.end-tag-open.xml",regex:"",next:"start"}],processing_instruction:[{token:"punctuation.instruction.xml",regex:"\\?>",next:"start"},{defaultToken:"instruction.xml"}],doctype:[{include:"whitespace"},{include:"string"},{token:"xml-pe.doctype.xml",regex:">",next:"start"},{token:"xml-pe.xml",regex:"[-_a-zA-Z0-9:]+"},{token:"punctuation.int-subset",regex:"\\[",push:"int_subset"}],int_subset:[{token:"text.xml",regex:"\\s+"},{token:"punctuation.int-subset.xml",regex:"]",next:"pop"},{token:["punctuation.markup-decl.xml","keyword.markup-decl.xml"],regex:"(<\\!)("+t+")",push:[{token:"text",regex:"\\s+"},{token:"punctuation.markup-decl.xml",regex:">",next:"pop"},{include:"string"}]}],cdata:[{token:"string.cdata.xml",regex:"\\]\\]>",next:"start"},{token:"text.xml",regex:"\\s+"},{token:"text.xml",regex:"(?:[^\\]]|\\](?!\\]>))+"}],comment:[{token:"comment.xml",regex:"-->",next:"start"},{defaultToken:"comment.xml"}],reference:[{token:"constant.language.escape.reference.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],attr_reference:[{token:"constant.language.escape.reference.attribute-value.xml",regex:"(?:&#[0-9]+;)|(?:&#x[0-9a-fA-F]+;)|(?:&[a-zA-Z0-9_:\\.-]+;)"}],tag:[{token:["meta.tag.punctuation.tag-open.xml","meta.tag.punctuation.end-tag-open.xml","meta.tag.tag-name.xml"],regex:"(?:(<)|(",next:"start"}]}],tag_whitespace:[{token:"text.tag-whitespace.xml",regex:"\\s+"}],whitespace:[{token:"text.whitespace.xml",regex:"\\s+"}],string:[{token:"string.xml",regex:"'",push:[{token:"string.xml",regex:"'",next:"pop"},{defaultToken:"string.xml"}]},{token:"string.xml",regex:'"',push:[{token:"string.xml",regex:'"',next:"pop"},{defaultToken:"string.xml"}]}],attributes:[{token:"entity.other.attribute-name.xml",regex:"(?:"+t+":)?"+t+""},{token:"keyword.operator.attribute-equals.xml",regex:"="},{include:"tag_whitespace"},{include:"attribute_value"}],attribute_value:[{token:"string.attribute-value.xml",regex:"'",push:[{token:"string.attribute-value.xml",regex:"'",next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]},{token:"string.attribute-value.xml",regex:'"',push:[{token:"string.attribute-value.xml",regex:'"',next:"pop"},{include:"attr_reference"},{defaultToken:"string.attribute-value.xml"}]}]},this.constructor===s&&this.normalizeRules()};(function(){this.embedTagRules=function(e,t,n){this.$rules.tag.unshift({token:["meta.tag.punctuation.tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(<)("+n+"(?=\\s|>|$))",next:[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:t+"start"}]}),this.$rules[n+"-end"]=[{include:"attributes"},{token:"meta.tag.punctuation.tag-close.xml",regex:"/?>",next:"start",onMatch:function(e,t,n){return n.splice(0),this.token}}],this.embedRules(e,t,[{token:["meta.tag.punctuation.end-tag-open.xml","meta.tag."+n+".tag-name.xml"],regex:"(|$))",next:n+"-end"},{token:"string.cdata.xml",regex:"<\\!\\[CDATA\\["},{token:"string.cdata.xml",regex:"\\]\\]>"}])}}).call(i.prototype),r.inherits(s,i),t.XmlHighlightRules=s}),ace.define("ace/mode/behaviour/xml",["require","exports","module","ace/lib/oop","ace/mode/behaviour","ace/token_iterator","ace/lib/lang"],function(e,t,n){"use strict";function u(e,t){return e.type.lastIndexOf(t+".xml")>-1}var r=e("../../lib/oop"),i=e("../behaviour").Behaviour,s=e("../../token_iterator").TokenIterator,o=e("../../lib/lang"),a=function(){this.add("string_dquotes","insertion",function(e,t,n,r,i){if(i=='"'||i=="'"){var o=i,a=r.doc.getTextRange(n.getSelectionRange());if(a!==""&&a!=="'"&&a!='"'&&n.getWrapBehavioursEnabled())return{text:o+a+o,selection:!1};var f=n.getCursorPosition(),l=r.doc.getLine(f.row),c=l.substring(f.column,f.column+1),h=new s(r,f.row,f.column),p=h.getCurrentToken();if(c==o&&(u(p,"attribute-value")||u(p,"string")))return{text:"",selection:[1,1]};p||(p=h.stepBackward());if(!p)return;while(u(p,"tag-whitespace")||u(p,"whitespace"))p=h.stepBackward();var d=!c||c.match(/\s/);if(u(p,"attribute-equals")&&(d||c==">")||u(p,"decl-attribute-equals")&&(d||c=="?"))return{text:o+o,selection:[1,1]}}}),this.add("string_dquotes","deletion",function(e,t,n,r,i){var s=r.doc.getTextRange(i);if(!i.isMultiLine()&&(s=='"'||s=="'")){var o=r.doc.getLine(i.start.row),u=o.substring(i.start.column+1,i.start.column+2);if(u==s)return i.end.column++,i}}),this.add("autoclosing","insertion",function(e,t,n,r,i){if(i==">"){var o=n.getCursorPosition(),a=new s(r,o.row,o.column),f=a.getCurrentToken()||a.stepBackward();if(!f||!(u(f,"tag-name")||u(f,"tag-whitespace")||u(f,"attribute-name")||u(f,"attribute-equals")||u(f,"attribute-value")))return;if(u(f,"reference.attribute-value"))return;if(u(f,"attribute-value")){var l=f.value.charAt(0);if(l=='"'||l=="'"){var c=f.value.charAt(f.value.length-1),h=a.getCurrentTokenColumn()+f.value.length;if(h>o.column||h==o.column&&l!=c)return}}while(!u(f,"tag-name"))f=a.stepBackward();var p=a.getCurrentTokenRow(),d=a.getCurrentTokenColumn();if(u(a.stepBackward(),"end-tag-open"))return;var v=f.value;p==o.row&&(v=v.substring(0,o.column-d));if(this.voidElements.hasOwnProperty(v.toLowerCase()))return;return{text:">",selection:[1,1]}}}),this.add("autoindent","insertion",function(e,t,n,r,i){if(i=="\n"){var o=n.getCursorPosition(),u=r.getLine(o.row),a=new s(r,o.row,o.column),f=a.getCurrentToken();if(f&&f.type.indexOf("tag-close")!==-1){if(f.value=="/>")return;while(f&&f.type.indexOf("tag-name")===-1)f=a.stepBackward();if(!f)return;var l=f.value,c=a.getCurrentTokenRow();f=a.stepBackward();if(!f||f.type.indexOf("end-tag")!==-1)return;if(this.voidElements&&!this.voidElements[l]){var h=r.getTokenAt(o.row,o.column+1),u=r.getLine(c),p=this.$getIndent(u),d=p+r.getTabString();return h&&h.value==="-1}var r=e("../../lib/oop"),i=e("../../lib/lang"),s=e("../../range").Range,o=e("./fold_mode").FoldMode,u=e("../../token_iterator").TokenIterator,a=t.FoldMode=function(e,t){o.call(this),this.voidElements=e||{},this.optionalEndTags=r.mixin({},this.voidElements),t&&r.mixin(this.optionalEndTags,t)};r.inherits(a,o);var f=function(){this.tagName="",this.closing=!1,this.selfClosing=!1,this.start={row:0,column:0},this.end={row:0,column:0}};(function(){this.getFoldWidget=function(e,t,n){var r=this._getFirstTagInLine(e,n);return r?r.closing||!r.tagName&&r.selfClosing?t=="markbeginend"?"end":"":!r.tagName||r.selfClosing||this.voidElements.hasOwnProperty(r.tagName.toLowerCase())?"":this._findEndTagInLine(e,n,r.tagName,r.end.column)?"":"start":""},this._getFirstTagInLine=function(e,t){var n=e.getTokens(t),r=new f;for(var i=0;i";break}}return r}if(l(s,"tag-close"))return r.selfClosing=s.value=="/>",r;r.start.column+=s.value.length}return null},this._findEndTagInLine=function(e,t,n,r){var i=e.getTokens(t),s=0;for(var o=0;o",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length,e.stepForward(),n;while(t=e.stepForward());return null},this._readTagBackward=function(e){var t=e.getCurrentToken();if(!t)return null;var n=new f;do{if(l(t,"tag-open"))return n.closing=l(t,"end-tag-open"),n.start.row=e.getCurrentTokenRow(),n.start.column=e.getCurrentTokenColumn(),e.stepBackward(),n;l(t,"tag-name")?n.tagName=t.value:l(t,"tag-close")&&(n.selfClosing=t.value=="/>",n.end.row=e.getCurrentTokenRow(),n.end.column=e.getCurrentTokenColumn()+t.value.length)}while(t=e.stepBackward());return null},this._pop=function(e,t){while(e.length){var n=e[e.length-1];if(!t||n.tagName==t.tagName)return e.pop();if(this.optionalEndTags.hasOwnProperty(n.tagName)){e.pop();continue}return null}},this.getFoldWidgetRange=function(e,t,n){var r=this._getFirstTagInLine(e,n);if(!r)return null;var i=r.closing||r.selfClosing,o=[],a;if(!i){var f=new u(e,n,r.start.column),l={row:n,column:r.start.column+r.tagName.length+2};r.start.row==r.end.row&&(l.column=r.end.column);while(a=this._readTagForward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(a.closing){this._pop(o,a);if(o.length==0)return s.fromPoints(l,a.start)}else o.push(a)}}else{var f=new u(e,n,r.end.column),c={row:n,column:r.start.column};while(a=this._readTagBackward(f)){if(a.selfClosing){if(!o.length)return a.start.column+=a.tagName.length+2,a.end.column-=2,s.fromPoints(a.start,a.end);continue}if(!a.closing){this._pop(o,a);if(o.length==0)return a.start.column+=a.tagName.length+2,a.start.row==a.end.row&&a.start.column"},this.createWorker=function(e){var t=new f(["ace"],"ace/mode/xml_worker","Worker");return t.attachToDocument(e.getDocument()),t.on("error",function(t){e.setAnnotations(t.data)}),t.on("terminate",function(){e.clearAnnotations()}),t},this.$id="ace/mode/xml"}.call(l.prototype),t.Mode=l}) \ No newline at end of file diff --git a/docs/ace-1.2.3/theme-textmate.js b/docs/ace-1.2.3/theme-textmate.js deleted file mode 100755 index 5075030da..000000000 --- a/docs/ace-1.2.3/theme-textmate.js +++ /dev/null @@ -1 +0,0 @@ -ace.define("ace/theme/textmate",["require","exports","module","ace/lib/dom"],function(e,t,n){"use strict";t.isDark=!1,t.cssClass="ace-tm",t.cssText='.ace-tm .ace_gutter {background: #f0f0f0;color: #333;}.ace-tm .ace_print-margin {width: 1px;background: #e8e8e8;}.ace-tm .ace_fold {background-color: #6B72E6;}.ace-tm {background-color: #FFFFFF;color: black;}.ace-tm .ace_cursor {color: black;}.ace-tm .ace_invisible {color: rgb(191, 191, 191);}.ace-tm .ace_storage,.ace-tm .ace_keyword {color: blue;}.ace-tm .ace_constant {color: rgb(197, 6, 11);}.ace-tm .ace_constant.ace_buildin {color: rgb(88, 72, 246);}.ace-tm .ace_constant.ace_language {color: rgb(88, 92, 246);}.ace-tm .ace_constant.ace_library {color: rgb(6, 150, 14);}.ace-tm .ace_invalid {background-color: rgba(255, 0, 0, 0.1);color: red;}.ace-tm .ace_support.ace_function {color: rgb(60, 76, 114);}.ace-tm .ace_support.ace_constant {color: rgb(6, 150, 14);}.ace-tm .ace_support.ace_type,.ace-tm .ace_support.ace_class {color: rgb(109, 121, 222);}.ace-tm .ace_keyword.ace_operator {color: rgb(104, 118, 135);}.ace-tm .ace_string {color: rgb(3, 106, 7);}.ace-tm .ace_comment {color: rgb(76, 136, 107);}.ace-tm .ace_comment.ace_doc {color: rgb(0, 102, 255);}.ace-tm .ace_comment.ace_doc.ace_tag {color: rgb(128, 159, 191);}.ace-tm .ace_constant.ace_numeric {color: rgb(0, 0, 205);}.ace-tm .ace_variable {color: rgb(49, 132, 149);}.ace-tm .ace_xml-pe {color: rgb(104, 104, 91);}.ace-tm .ace_entity.ace_name.ace_function {color: #0000A2;}.ace-tm .ace_heading {color: rgb(12, 7, 255);}.ace-tm .ace_list {color:rgb(185, 6, 144);}.ace-tm .ace_meta.ace_tag {color:rgb(0, 22, 142);}.ace-tm .ace_string.ace_regex {color: rgb(255, 0, 0)}.ace-tm .ace_marker-layer .ace_selection {background: rgb(181, 213, 255);}.ace-tm.ace_multiselect .ace_selection.ace_start {box-shadow: 0 0 3px 0px white;}.ace-tm .ace_marker-layer .ace_step {background: rgb(252, 255, 0);}.ace-tm .ace_marker-layer .ace_stack {background: rgb(164, 229, 101);}.ace-tm .ace_marker-layer .ace_bracket {margin: -1px 0 0 -1px;border: 1px solid rgb(192, 192, 192);}.ace-tm .ace_marker-layer .ace_active-line {background: rgba(0, 0, 0, 0.07);}.ace-tm .ace_gutter-active-line {background-color : #dcdcdc;}.ace-tm .ace_marker-layer .ace_selected-word {background: rgb(250, 250, 255);border: 1px solid rgb(200, 200, 250);}.ace-tm .ace_indent-guide {background: url("data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAAEAAAACCAYAAACZgbYnAAAAE0lEQVQImWP4////f4bLly//BwAmVgd1/w11/gAAAABJRU5ErkJggg==") right repeat-y;}';var r=e("../lib/dom");r.importCssString(t.cssText,t.cssClass)}) \ No newline at end of file diff --git a/docs/articles/demo-app/assets/index.11e19947.js b/docs/articles/demo-app/assets/index.11e19947.js deleted file mode 100644 index 9f476a881..000000000 --- a/docs/articles/demo-app/assets/index.11e19947.js +++ /dev/null @@ -1,171 +0,0 @@ -var kE=Object.defineProperty,OE=Object.defineProperties;var PE=Object.getOwnPropertyDescriptors;var ms=Object.getOwnPropertySymbols;var ng=Object.prototype.hasOwnProperty,rg=Object.prototype.propertyIsEnumerable;var ig=Math.pow,tg=(e,t,n)=>t in e?kE(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,U=(e,t)=>{for(var n in t||(t={}))ng.call(t,n)&&tg(e,n,t[n]);if(ms)for(var n of ms(t))rg.call(t,n)&&tg(e,n,t[n]);return e},Q=(e,t)=>OE(e,PE(t));var vn=(e,t)=>{var n={};for(var r in e)ng.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&ms)for(var r of ms(e))t.indexOf(r)<0&&rg.call(e,r)&&(n[r]=e[r]);return n};var og=(e,t,n)=>new Promise((r,i)=>{var o=s=>{try{l(n.next(s))}catch(u){i(u)}},a=s=>{try{l(n.throw(s))}catch(u){i(u)}},l=s=>s.done?r(s.value):Promise.resolve(s.value).then(o,a);l((n=n.apply(e,t)).next())});const IE=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const i of document.querySelectorAll('link[rel="modulepreload"]'))r(i);new MutationObserver(i=>{for(const o of i)if(o.type==="childList")for(const a of o.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(i){const o={};return i.integrity&&(o.integrity=i.integrity),i.referrerpolicy&&(o.referrerPolicy=i.referrerpolicy),i.crossorigin==="use-credentials"?o.credentials="include":i.crossorigin==="anonymous"?o.credentials="omit":o.credentials="same-origin",o}function r(i){if(i.ep)return;i.ep=!0;const o=n(i);fetch(i.href,o)}};IE();var f0=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Qp(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function d0(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var i=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,i.get?i:{enumerable:!0,get:function(){return e[r]}})}),n}var H={exports:{}},we={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var ag=Object.getOwnPropertySymbols,TE=Object.prototype.hasOwnProperty,_E=Object.prototype.propertyIsEnumerable;function NE(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function DE(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(o){return t[o]});if(r.join("")!=="0123456789")return!1;var i={};return"abcdefghijklmnopqrst".split("").forEach(function(o){i[o]=o}),Object.keys(Object.assign({},i)).join("")==="abcdefghijklmnopqrst"}catch(o){return!1}}var p0=DE()?Object.assign:function(e,t){for(var n,r=NE(e),i,o=1;o=y},i=function(){},e.unstable_forceFrameRate=function(x){0>x||125>>1,pe=x[fe];if(pe!==void 0&&0E(be,X))We!==void 0&&0>E(We,be)?(x[fe]=We,x[Ee]=X,fe=Ee):(x[fe]=be,x[he]=X,fe=he);else if(We!==void 0&&0>E(We,X))x[fe]=We,x[Ee]=X,fe=Ee;else break e}}return A}return null}function E(x,A){var X=x.sortIndex-A.sortIndex;return X!==0?X:x.id-A.id}var C=[],P=[],I=1,T=null,N=3,B=!1,K=!1,V=!1;function le(x){for(var A=w(P);A!==null;){if(A.callback===null)O(P);else if(A.startTime<=x)O(P),A.sortIndex=A.expirationTime,_(C,A);else break;A=w(P)}}function te(x){if(V=!1,le(x),!K)if(w(C)!==null)K=!0,t(se);else{var A=w(P);A!==null&&n(te,A.startTime-x)}}function se(x,A){K=!1,V&&(V=!1,r()),B=!0;var X=N;try{for(le(A),T=w(C);T!==null&&(!(T.expirationTime>A)||x&&!e.unstable_shouldYield());){var fe=T.callback;if(typeof fe=="function"){T.callback=null,N=T.priorityLevel;var pe=fe(T.expirationTime<=A);A=e.unstable_now(),typeof pe=="function"?T.callback=pe:T===w(C)&&O(C),le(A)}else O(C);T=w(C)}if(T!==null)var he=!0;else{var be=w(P);be!==null&&n(te,be.startTime-A),he=!1}return he}finally{T=null,N=X,B=!1}}var q=i;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(x){x.callback=null},e.unstable_continueExecution=function(){K||B||(K=!0,t(se))},e.unstable_getCurrentPriorityLevel=function(){return N},e.unstable_getFirstCallbackNode=function(){return w(C)},e.unstable_next=function(x){switch(N){case 1:case 2:case 3:var A=3;break;default:A=N}var X=N;N=A;try{return x()}finally{N=X}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=q,e.unstable_runWithPriority=function(x,A){switch(x){case 1:case 2:case 3:case 4:case 5:break;default:x=3}var X=N;N=x;try{return A()}finally{N=X}},e.unstable_scheduleCallback=function(x,A,X){var fe=e.unstable_now();switch(typeof X=="object"&&X!==null?(X=X.delay,X=typeof X=="number"&&0fe?(x.sortIndex=X,_(P,x),w(C)===null&&x===w(P)&&(V?r():V=!0,n(te,X-fe))):(x.sortIndex=pe,_(C,x),K||B||(K=!0,t(se))),x},e.unstable_wrapCallback=function(x){var A=N;return function(){var X=N;N=A;try{return x.apply(this,arguments)}finally{N=X}}}})(P0);(function(e){e.exports=P0})(O0);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var oc=H.exports,Be=p0,nt=O0.exports;function j(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function xt(e,t,n,r,i,o,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=i,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=o,this.removeEmptyString=a}var ut={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){ut[e]=new xt(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];ut[t]=new xt(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){ut[e]=new xt(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){ut[e]=new xt(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){ut[e]=new xt(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){ut[e]=new xt(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){ut[e]=new xt(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){ut[e]=new xt(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){ut[e]=new xt(e,5,!1,e.toLowerCase(),null,!1,!1)});var th=/[\-:]([a-z])/g;function nh(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(th,nh);ut[t]=new xt(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(th,nh);ut[t]=new xt(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(th,nh);ut[t]=new xt(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){ut[e]=new xt(e,1,!1,e.toLowerCase(),null,!1,!1)});ut.xlinkHref=new xt("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){ut[e]=new xt(e,1,!1,e.toLowerCase(),null,!0,!0)});function rh(e,t,n,r){var i=ut.hasOwnProperty(t)?ut[t]:null,o=i!==null?i.type===0:r?!1:!(!(2l||i[a]!==o[l])return` -`+i[a].replace(" at new "," at ");while(1<=a&&0<=l);break}}}finally{cf=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Aa(e):""}function YE(e){switch(e.tag){case 5:return Aa(e.type);case 16:return Aa("Lazy");case 13:return Aa("Suspense");case 19:return Aa("SuspenseList");case 0:case 2:case 15:return e=vs(e.type,!1),e;case 11:return e=vs(e.type.render,!1),e;case 22:return e=vs(e.type._render,!1),e;case 1:return e=vs(e.type,!0),e;default:return""}}function Qi(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case vr:return"Fragment";case si:return"Portal";case Fa:return"Profiler";case ih:return"StrictMode";case La:return"Suspense";case cu:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case ah:return(e.displayName||"Context")+".Consumer";case oh:return(e._context.displayName||"Context")+".Provider";case ac:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case lc:return Qi(e.type);case sh:return Qi(e._render);case lh:t=e._payload,e=e._init;try{return Qi(e(t))}catch(n){}}return null}function Mr(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function _0(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function HE(e){var t=_0(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var i=n.get,o=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return i.call(this)},set:function(a){r=""+a,o.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function ys(e){e._valueTracker||(e._valueTracker=HE(e))}function N0(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=_0(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function fu(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function wd(e,t){var n=t.checked;return Be({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function pg(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=Mr(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function D0(e,t){t=t.checked,t!=null&&rh(e,"checked",t,!1)}function bd(e,t){D0(e,t);var n=Mr(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Sd(e,t.type,n):t.hasOwnProperty("defaultValue")&&Sd(e,t.type,Mr(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function hg(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Sd(e,t,n){(t!=="number"||fu(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function $E(e){var t="";return oc.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function xd(e,t){return e=Be({children:void 0},t),(t=$E(t.children))&&(e.children=t),e}function Xi(e,t,n,r){if(e=e.options,t){t={};for(var i=0;i=n.length))throw Error(j(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:Mr(n)}}function R0(e,t){var n=Mr(t.value),r=Mr(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function gg(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Cd={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function F0(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Ad(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?F0(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ws,L0=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,i){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,i)})}:e}(function(e,t){if(e.namespaceURI!==Cd.svg||"innerHTML"in e)e.innerHTML=t;else{for(ws=ws||document.createElement("div"),ws.innerHTML=""+t.valueOf().toString()+"",t=ws.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function il(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Ma={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},VE=["Webkit","ms","Moz","O"];Object.keys(Ma).forEach(function(e){VE.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Ma[t]=Ma[e]})});function M0(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Ma.hasOwnProperty(e)&&Ma[e]?(""+t).trim():t+"px"}function B0(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,i=M0(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,i):e[n]=i}}var GE=Be({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function kd(e,t){if(t){if(GE[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(j(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(j(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(j(61))}if(t.style!=null&&typeof t.style!="object")throw Error(j(62))}}function Od(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function fh(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Pd=null,qi=null,Ki=null;function vg(e){if(e=Tl(e)){if(typeof Pd!="function")throw Error(j(280));var t=e.stateNode;t&&(t=pc(t),Pd(e.stateNode,e.type,t))}}function U0(e){qi?Ki?Ki.push(e):Ki=[e]:qi=e}function z0(){if(qi){var e=qi,t=Ki;if(Ki=qi=null,vg(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function uc(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-Br(t),e[t]=n}var Br=Math.clz32?Math.clz32:uC,lC=Math.log,sC=Math.LN2;function uC(e){return e===0?32:31-(lC(e)/sC|0)|0}var cC=nt.unstable_UserBlockingPriority,fC=nt.unstable_runWithPriority,Ws=!0;function dC(e,t,n,r){ui||ph();var i=yh,o=ui;ui=!0;try{j0(i,e,t,n,r)}finally{(ui=o)||hh()}}function pC(e,t,n,r){fC(cC,yh.bind(null,e,t,n,r))}function yh(e,t,n,r){if(Ws){var i;if((i=(t&4)===0)&&0=Ua),Og=String.fromCharCode(32),Pg=!1;function iw(e,t){switch(e){case"keyup":return LC.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function ow(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var Wi=!1;function BC(e,t){switch(e){case"compositionend":return ow(t);case"keypress":return t.which!==32?null:(Pg=!0,Og);case"textInput":return e=t.data,e===Og&&Pg?null:e;default:return null}}function UC(e,t){if(Wi)return e==="compositionend"||!Eh&&iw(e,t)?(e=nw(),Ys=bh=Sr=null,Wi=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Ng(n)}}function uw(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?uw(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Rg(){for(var e=window,t=fu();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=fu(e.document)}return t}function Dd(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var QC=ur&&"documentMode"in document&&11>=document.documentMode,Yi=null,Rd=null,ja=null,Fd=!1;function Fg(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;Fd||Yi==null||Yi!==fu(r)||(r=Yi,"selectionStart"in r&&Dd(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),ja&&cl(ja,r)||(ja=r,r=mu(Rd,"onSelect"),0$i||(e.current=Md[$i],Md[$i]=null,$i--)}function Ve(e,t){$i++,Md[$i]=e.current,e.current=t}var Ur={},vt=Vr(Ur),Dt=Vr(!1),gi=Ur;function mo(e,t){var n=e.type.contextTypes;if(!n)return Ur;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var i={},o;for(o in n)i[o]=t[o];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=i),i}function Rt(e){return e=e.childContextTypes,e!=null}function yu(){De(Dt),De(vt)}function Hg(e,t,n){if(vt.current!==Ur)throw Error(j(168));Ve(vt,t),Ve(Dt,n)}function vw(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var i in r)if(!(i in e))throw Error(j(108,Qi(t)||"Unknown",i));return Be({},n,r)}function $s(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||Ur,gi=vt.current,Ve(vt,e),Ve(Dt,Dt.current),!0}function $g(e,t,n){var r=e.stateNode;if(!r)throw Error(j(169));n?(e=vw(e,t,gi),r.__reactInternalMemoizedMergedChildContext=e,De(Dt),De(vt),Ve(vt,e)):De(Dt),Ve(Dt,n)}var Ah=null,pi=null,KC=nt.unstable_runWithPriority,kh=nt.unstable_scheduleCallback,Bd=nt.unstable_cancelCallback,ZC=nt.unstable_shouldYield,Vg=nt.unstable_requestPaint,Ud=nt.unstable_now,eA=nt.unstable_getCurrentPriorityLevel,hc=nt.unstable_ImmediatePriority,yw=nt.unstable_UserBlockingPriority,ww=nt.unstable_NormalPriority,bw=nt.unstable_LowPriority,Sw=nt.unstable_IdlePriority,Ef={},tA=Vg!==void 0?Vg:function(){},Zn=null,Vs=null,Cf=!1,Gg=Ud(),mt=1e4>Gg?Ud:function(){return Ud()-Gg};function go(){switch(eA()){case hc:return 99;case yw:return 98;case ww:return 97;case bw:return 96;case Sw:return 95;default:throw Error(j(332))}}function xw(e){switch(e){case 99:return hc;case 98:return yw;case 97:return ww;case 96:return bw;case 95:return Sw;default:throw Error(j(332))}}function vi(e,t){return e=xw(e),KC(e,t)}function dl(e,t,n){return e=xw(e),kh(e,t,n)}function Qn(){if(Vs!==null){var e=Vs;Vs=null,Bd(e)}Ew()}function Ew(){if(!Cf&&Zn!==null){Cf=!0;var e=0;try{var t=Zn;vi(99,function(){for(;eO?(E=w,w=null):E=w.sibling;var C=d(v,w,y[O],S);if(C===null){w===null&&(w=E);break}e&&w&&C.alternate===null&&t(v,w),m=o(C,m,O),_===null?k=C:_.sibling=C,_=C,w=E}if(O===y.length)return n(v,w),k;if(w===null){for(;OO?(E=w,w=null):E=w.sibling;var P=d(v,w,C.value,S);if(P===null){w===null&&(w=E);break}e&&w&&P.alternate===null&&t(v,w),m=o(P,m,O),_===null?k=P:_.sibling=P,_=P,w=E}if(C.done)return n(v,w),k;if(w===null){for(;!C.done;O++,C=y.next())C=f(v,C.value,S),C!==null&&(m=o(C,m,O),_===null?k=C:_.sibling=C,_=C);return k}for(w=r(v,w);!C.done;O++,C=y.next())C=p(w,v,O,C.value,S),C!==null&&(e&&C.alternate!==null&&w.delete(C.key===null?O:C.key),m=o(C,m,O),_===null?k=C:_.sibling=C,_=C);return e&&w.forEach(function(I){return t(v,I)}),k}return function(v,m,y,S){var k=typeof y=="object"&&y!==null&&y.type===vr&&y.key===null;k&&(y=y.props.children);var _=typeof y=="object"&&y!==null;if(_)switch(y.$$typeof){case Ca:e:{for(_=y.key,k=m;k!==null;){if(k.key===_){switch(k.tag){case 7:if(y.type===vr){n(v,k.sibling),m=i(k,y.props.children),m.return=v,v=m;break e}break;default:if(k.elementType===y.type){n(v,k.sibling),m=i(k,y.props),m.ref=ra(v,k,y),m.return=v,v=m;break e}}n(v,k);break}else t(v,k);k=k.sibling}y.type===vr?(m=io(y.props.children,v.mode,S,y.key),m.return=v,v=m):(S=Xs(y.type,y.key,y.props,null,v.mode,S),S.ref=ra(v,m,y),S.return=v,v=S)}return a(v);case si:e:{for(k=y.key;m!==null;){if(m.key===k)if(m.tag===4&&m.stateNode.containerInfo===y.containerInfo&&m.stateNode.implementation===y.implementation){n(v,m.sibling),m=i(m,y.children||[]),m.return=v,v=m;break e}else{n(v,m);break}else t(v,m);m=m.sibling}m=Tf(y,v.mode,S),m.return=v,v=m}return a(v)}if(typeof y=="string"||typeof y=="number")return y=""+y,m!==null&&m.tag===6?(n(v,m.sibling),m=i(m,y),m.return=v,v=m):(n(v,m),m=If(y,v.mode,S),m.return=v,v=m),a(v);if(xs(y))return h(v,m,y,S);if(qo(y))return g(v,m,y,S);if(_&&Es(v,y),typeof y=="undefined"&&!k)switch(v.tag){case 1:case 22:case 0:case 11:case 15:throw Error(j(152,Qi(v.type)||"Component"))}return n(v,m)}}var Eu=Pw(!0),Iw=Pw(!1),_l={},Un=Vr(_l),hl=Vr(_l),ml=Vr(_l);function fi(e){if(e===_l)throw Error(j(174));return e}function jd(e,t){switch(Ve(ml,t),Ve(hl,e),Ve(Un,_l),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Ad(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Ad(t,e)}De(Un),Ve(Un,t)}function vo(){De(Un),De(hl),De(ml)}function Kg(e){fi(ml.current);var t=fi(Un.current),n=Ad(t,e.type);t!==n&&(Ve(hl,e),Ve(Un,n))}function Th(e){hl.current===e&&(De(Un),De(hl))}var $e=Vr(0);function Cu(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var nr=null,Er=null,zn=!1;function Tw(e,t){var n=en(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function Zg(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function Wd(e){if(zn){var t=Er;if(t){var n=t;if(!Zg(e,t)){if(t=Zi(n.nextSibling),!t||!Zg(e,t)){e.flags=e.flags&-1025|2,zn=!1,nr=e;return}Tw(nr,n)}nr=e,Er=Zi(t.firstChild)}else e.flags=e.flags&-1025|2,zn=!1,nr=e}}function ev(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;nr=e}function Cs(e){if(e!==nr)return!1;if(!zn)return ev(e),zn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!Ld(t,e.memoizedProps))for(t=Er;t;)Tw(e,t),t=Zi(t.nextSibling);if(ev(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(j(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){Er=Zi(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}Er=null}}else Er=nr?Zi(e.stateNode.nextSibling):null;return!0}function Af(){Er=nr=null,zn=!1}var to=[];function _h(){for(var e=0;eo))throw Error(j(301));o+=1,lt=dt=null,t.updateQueue=null,Wa.current=aA,e=n(r,i)}while(Ya)}if(Wa.current=Iu,t=dt!==null&&dt.next!==null,gl=0,lt=dt=Je=null,Au=!1,t)throw Error(j(300));return e}function di(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return lt===null?Je.memoizedState=lt=e:lt=lt.next=e,lt}function ki(){if(dt===null){var e=Je.alternate;e=e!==null?e.memoizedState:null}else e=dt.next;var t=lt===null?Je.memoizedState:lt.next;if(t!==null)lt=t,dt=e;else{if(e===null)throw Error(j(310));dt=e,e={memoizedState:dt.memoizedState,baseState:dt.baseState,baseQueue:dt.baseQueue,queue:dt.queue,next:null},lt===null?Je.memoizedState=lt=e:lt=lt.next=e}return lt}function Ln(e,t){return typeof t=="function"?t(e):t}function ia(e){var t=ki(),n=t.queue;if(n===null)throw Error(j(311));n.lastRenderedReducer=e;var r=dt,i=r.baseQueue,o=n.pending;if(o!==null){if(i!==null){var a=i.next;i.next=o.next,o.next=a}r.baseQueue=i=o,n.pending=null}if(i!==null){i=i.next,r=r.baseState;var l=a=o=null,s=i;do{var u=s.lane;if((gl&u)===u)l!==null&&(l=l.next={lane:0,action:s.action,eagerReducer:s.eagerReducer,eagerState:s.eagerState,next:null}),r=s.eagerReducer===e?s.eagerState:e(r,s.action);else{var c={lane:u,action:s.action,eagerReducer:s.eagerReducer,eagerState:s.eagerState,next:null};l===null?(a=l=c,o=r):l=l.next=c,Je.lanes|=u,Nl|=u}s=s.next}while(s!==null&&s!==i);l===null?o=r:l.next=a,Zt(r,t.memoizedState)||(An=!0),t.memoizedState=r,t.baseState=o,t.baseQueue=l,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function oa(e){var t=ki(),n=t.queue;if(n===null)throw Error(j(311));n.lastRenderedReducer=e;var r=n.dispatch,i=n.pending,o=t.memoizedState;if(i!==null){n.pending=null;var a=i=i.next;do o=e(o,a.action),a=a.next;while(a!==i);Zt(o,t.memoizedState)||(An=!0),t.memoizedState=o,t.baseQueue===null&&(t.baseState=o),n.lastRenderedState=o}return[o,r]}function tv(e,t,n){var r=t._getVersion;r=r(t._source);var i=t._workInProgressVersionPrimary;if(i!==null?e=i===r:(e=e.mutableReadLanes,(e=(gl&e)===e)&&(t._workInProgressVersionPrimary=r,to.push(t))),e)return n(t._source);throw to.push(t),Error(j(350))}function _w(e,t,n,r){var i=St;if(i===null)throw Error(j(349));var o=t._getVersion,a=o(t._source),l=Wa.current,s=l.useState(function(){return tv(i,t,n)}),u=s[1],c=s[0];s=lt;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,h=f.source;f=f.subscribe;var g=Je;return e.memoizedState={refs:d,source:t,subscribe:r},l.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var v=o(t._source);if(!Zt(a,v)){v=n(t._source),Zt(c,v)||(u(v),v=_r(g),i.mutableReadLanes|=v&i.pendingLanes),v=i.mutableReadLanes,i.entangledLanes|=v;for(var m=i.entanglements,y=v;0n?98:n,function(){e(!0)}),vi(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[xr]=t,e[vu]=r,zw(e,t,!1,!1),t.stateNode=e,a=Od(n,r),n){case"dialog":_e("cancel",e),_e("close",e),i=r;break;case"iframe":case"object":case"embed":_e("load",e),i=r;break;case"video":case"audio":for(i=0;iKd&&(t.flags|=64,o=!0,la(r,!1),t.lanes=33554432)}else{if(!o)if(e=Cu(a),e!==null){if(t.flags|=64,o=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),la(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!zn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*mt()-r.renderingStartTime>Kd&&n!==1073741824&&(t.flags|=64,o=!0,la(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=mt(),n.sibling=null,t=$e.current,Ve($e,o?t&1|2:t&1),n):null;case 23:case 24:return jh(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(j(156,t.tag))}function uA(e){switch(e.tag){case 1:Rt(e.type)&&yu();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(vo(),De(Dt),De(vt),_h(),t=e.flags,(t&64)!==0)throw Error(j(285));return e.flags=t&-4097|64,e;case 5:return Th(e),null;case 13:return De($e),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return De($e),null;case 4:return vo(),null;case 10:return Ph(e),null;case 23:case 24:return jh(),null;default:return null}}function Mh(e,t){try{var n="",r=t;do n+=YE(r),r=r.return;while(r);var i=n}catch(o){i=` -Error generating stack: `+o.message+` -`+o.stack}return{value:e,source:t,stack:i}}function Gd(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var cA=typeof WeakMap=="function"?WeakMap:Map;function Yw(e,t,n){n=Ir(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){_u||(_u=!0,Zd=r),Gd(e,t)},n}function Hw(e,t,n){n=Ir(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var i=t.value;n.payload=function(){return Gd(e,t),r(i)}}var o=e.stateNode;return o!==null&&typeof o.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(Mn===null?Mn=new Set([this]):Mn.add(this),Gd(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var fA=typeof WeakSet=="function"?WeakSet:Set;function hv(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){Dr(e,n)}else t.current=null}function dA(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Sn(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ch(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(j(163))}function pA(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var i=e;r=i.next,i=i.tag,(i&4)!==0&&(i&1)!==0&&(Zw(n,e),SA(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Sn(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&Qg(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}Qg(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&mw(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&J0(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(j(163))}function mv(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var i=n.memoizedProps.style;i=i!=null&&i.hasOwnProperty("display")?i.display:null,r.style.display=M0("display",i)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function gv(e,t){if(pi&&typeof pi.onCommitFiberUnmount=="function")try{pi.onCommitFiberUnmount(Ah,t)}catch(o){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,i=r.destroy;if(r=r.tag,i!==void 0)if((r&4)!==0)Zw(t,n);else{r=t;try{i()}catch(o){Dr(r,o)}}n=n.next}while(n!==e)}break;case 1:if(hv(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(o){Dr(t,o)}break;case 5:hv(t);break;case 4:$w(e,t)}}function vv(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function yv(e){return e.tag===5||e.tag===3||e.tag===4}function wv(e){e:{for(var t=e.return;t!==null;){if(yv(t))break e;t=t.return}throw Error(j(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(j(161))}n.flags&16&&(il(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||yv(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Jd(e,n,t):Qd(e,n,t)}function Jd(e,t,n){var r=e.tag,i=r===5||r===6;if(i)e=i?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=gu));else if(r!==4&&(e=e.child,e!==null))for(Jd(e,t,n),e=e.sibling;e!==null;)Jd(e,t,n),e=e.sibling}function Qd(e,t,n){var r=e.tag,i=r===5||r===6;if(i)e=i?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(Qd(e,t,n),e=e.sibling;e!==null;)Qd(e,t,n),e=e.sibling}function $w(e,t){for(var n=t,r=!1,i,o;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(j(160));switch(i=r.stateNode,r.tag){case 5:o=!1;break e;case 3:i=i.containerInfo,o=!0;break e;case 4:i=i.containerInfo,o=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,l=n,s=l;;)if(gv(a,s),s.child!==null&&s.tag!==4)s.child.return=s,s=s.child;else{if(s===l)break e;for(;s.sibling===null;){if(s.return===null||s.return===l)break e;s=s.return}s.sibling.return=s.return,s=s.sibling}o?(a=i,l=n.stateNode,a.nodeType===8?a.parentNode.removeChild(l):a.removeChild(l)):i.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){i=n.stateNode.containerInfo,o=!0,n.child.return=n,n=n.child;continue}}else if(gv(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function Pf(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var i=e!==null?e.memoizedProps:r;e=t.type;var o=t.updateQueue;if(t.updateQueue=null,o!==null){for(n[vu]=r,e==="input"&&r.type==="radio"&&r.name!=null&&D0(n,r),Od(e,i),t=Od(e,r),i=0;ii&&(i=a),n&=~o}if(n=i,n=mt()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*mA(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}st!==5&&(st=2),s=Mh(s,l),d=a;do{switch(d.tag){case 3:o=s,d.flags|=4096,t&=-t,d.lanes|=t;var _=Yw(d,o,t);Jg(d,_);break e;case 1:o=s;var w=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof w.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(Mn===null||!Mn.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var E=Hw(d,o,t);Jg(d,E);break e}}d=d.return}while(d!==null)}Kw(n)}catch(C){t=C,Ze===n&&n!==null&&(Ze=n=n.return);continue}break}while(1)}function Xw(){var e=Tu.current;return Tu.current=Iu,e===null?Iu:e}function Pa(e,t){var n=ne;ne|=16;var r=Xw();St===e&>===t||ro(e,t);do try{vA();break}catch(i){Qw(e,i)}while(1);if(Oh(),ne=n,Tu.current=r,Ze!==null)throw Error(j(261));return St=null,gt=0,st}function vA(){for(;Ze!==null;)qw(Ze)}function yA(){for(;Ze!==null&&!ZC();)qw(Ze)}function qw(e){var t=eb(e.alternate,e,yi);e.memoizedProps=e.pendingProps,t===null?Kw(e):Ze=t,Bh.current=null}function Kw(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=sA(n,t,yi),n!==null){Ze=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(yi&1073741824)!==0||(n.mode&4)===0){for(var r=0,i=n.child;i!==null;)r|=i.lanes|i.childLanes,i=i.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(l=a,a=_,_=l),l=Dg(y,_),o=Dg(y,a),l&&o&&(k.rangeCount!==1||k.anchorNode!==l.node||k.anchorOffset!==l.offset||k.focusNode!==o.node||k.focusOffset!==o.offset)&&(S=S.createRange(),S.setStart(l.node,l.offset),k.removeAllRanges(),_>a?(k.addRange(S),k.extend(o.node,o.offset)):(S.setEnd(o.node,o.offset),k.addRange(S)))))),S=[],k=y;k=k.parentNode;)k.nodeType===1&&S.push({element:k,left:k.scrollLeft,top:k.scrollTop});for(typeof y.focus=="function"&&y.focus(),y=0;ymt()-zh?ro(e,0):Uh|=n),ln(e,t)}function CA(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=go()===99?1:2:(tr===0&&(tr=Fo),t=Bi(62914560&~tr),t===0&&(t=4194304))),n=Ht(),e=vc(e,t),e!==null&&(uc(e,t,n),ln(e,n))}var eb;eb=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||Dt.current)An=!0;else if((n&r)!==0)An=(e.flags&16384)!==0;else{switch(An=!1,t.tag){case 3:lv(t),Af();break;case 5:Kg(t);break;case 1:Rt(t.type)&&$s(t);break;case 4:jd(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var i=t.type._context;Ve(wu,i._currentValue),i._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?sv(e,t,n):(Ve($e,$e.current&1),t=rr(e,t,n),t!==null?t.sibling:null);Ve($e,$e.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return pv(e,t,n);t.flags|=64}if(i=t.memoizedState,i!==null&&(i.rendering=null,i.tail=null,i.lastEffect=null),Ve($e,$e.current),r)break;return null;case 23:case 24:return t.lanes=0,kf(e,t,n)}return rr(e,t,n)}else An=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=mo(t,vt.current),eo(t,n),i=Dh(null,t,r,e,i,n),t.flags|=1,typeof i=="object"&&i!==null&&typeof i.render=="function"&&i.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,Rt(r)){var o=!0;$s(t)}else o=!1;t.memoizedState=i.state!==null&&i.state!==void 0?i.state:null,Ih(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&xu(t,r,a,e),i.updater=mc,t.stateNode=i,i._reactInternals=t,zd(t,r,e,n),t=$d(null,t,r,!0,o,n)}else t.tag=0,Tt(null,t,i,n),t=t.child;return t;case 16:i=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=i._init,i=o(i._payload),t.type=i,o=t.tag=kA(i),e=Sn(i,e),o){case 0:t=Hd(null,t,i,e,n);break e;case 1:t=av(null,t,i,e,n);break e;case 11:t=iv(null,t,i,e,n);break e;case 14:t=ov(null,t,i,Sn(i.type,e),r,n);break e}throw Error(j(306,i,""))}return t;case 0:return r=t.type,i=t.pendingProps,i=t.elementType===r?i:Sn(r,i),Hd(e,t,r,i,n);case 1:return r=t.type,i=t.pendingProps,i=t.elementType===r?i:Sn(r,i),av(e,t,r,i,n);case 3:if(lv(t),r=t.updateQueue,e===null||r===null)throw Error(j(282));if(r=t.pendingProps,i=t.memoizedState,i=i!==null?i.element:null,Aw(e,t),pl(t,r,null,n),r=t.memoizedState.element,r===i)Af(),t=rr(e,t,n);else{if(i=t.stateNode,(o=i.hydrate)&&(Er=Zi(t.stateNode.containerInfo.firstChild),nr=t,o=zn=!0),o){if(e=i.mutableSourceEagerHydrationData,e!=null)for(i=0;i1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Xh(e)?2:qh(e)?3:0}function oo(e,t){return Bo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function m2(e,t){return Bo(e)===2?e.get(t):e[t]}function yb(e,t,n){var r=Bo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function wb(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Xh(e){return S2&&e instanceof Map}function qh(e){return x2&&e instanceof Set}function ri(e){return e.o||e.t}function Kh(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Sb(e);delete t[Le];for(var n=ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=g2),Object.freeze(e),t&&wi(e,function(n,r){return Zh(r,!0)},!0)),e}function g2(){En(2)}function em(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function ar(e){var t=sp[e];return t||En(18,e),t}function v2(e,t){sp[e]||(sp[e]=t)}function op(){return vl}function Nf(e,t){t&&(ar("Patches"),e.u=[],e.s=[],e.v=t)}function Du(e){ap(e),e.p.forEach(y2),e.p=null}function ap(e){e===vl&&(vl=e.l)}function Av(e){return vl={p:[],l:vl,h:e,m:!0,_:0}}function y2(e){var t=e[Le];t.i===0||t.i===1?t.j():t.O=!0}function Df(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||ar("ES5").S(t,e,r),r?(n[Le].P&&(Du(t),En(4)),Hr(e)&&(e=Ru(t,e),t.l||Fu(t,e)),t.u&&ar("Patches").M(n[Le],e,t.u,t.s)):e=Ru(t,n,[]),Du(t),t.u&&t.v(t.u,t.s),e!==bb?e:void 0}function Ru(e,t,n){if(em(t))return t;var r=t[Le];if(!r)return wi(t,function(o,a){return kv(e,r,t,o,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Fu(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var i=r.i===4||r.i===5?r.o=Kh(r.k):r.o;wi(r.i===3?new Set(i):i,function(o,a){return kv(e,r,i,o,a,n)}),Fu(e,i,!1),n&&e.u&&ar("Patches").R(r,n,e.u,e.s)}return r.o}function kv(e,t,n,r,i,o){if(Yr(i)){var a=Ru(e,i,o&&t&&t.i!==3&&!oo(t.D,r)?o.concat(r):void 0);if(yb(n,r,a),!Yr(a))return;e.m=!1}if(Hr(i)&&!em(i)){if(!e.h.F&&e._<1)return;Ru(e,i),t&&t.A.l||Fu(e,i)}}function Fu(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&Zh(t,n)}function Rf(e,t){var n=e[Le];return(n?ri(n):e)[t]}function Ov(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function yr(e){e.P||(e.P=!0,e.l&&yr(e.l))}function Ff(e){e.o||(e.o=Kh(e.t))}function lp(e,t,n){var r=Xh(t)?ar("MapSet").N(t,n):qh(t)?ar("MapSet").T(t,n):e.g?function(i,o){var a=Array.isArray(i),l={i:a?1:0,A:o?o.A:op(),P:!1,I:!1,D:{},l:o,t:i,k:null,o:null,j:null,C:!1},s=l,u=lo;a&&(s=[l],u=qs);var c=Proxy.revocable(s,u),f=c.revoke,d=c.proxy;return l.k=d,l.j=f,d}(t,n):ar("ES5").J(t,n);return(n?n.A:op()).p.push(r),r}function w2(e){return Yr(e)||En(22,e),function t(n){if(!Hr(n))return n;var r,i=n[Le],o=Bo(n);if(i){if(!i.P&&(i.i<4||!ar("ES5").K(i)))return i.t;i.I=!0,r=Pv(n,o),i.I=!1}else r=Pv(n,o);return wi(r,function(a,l){i&&m2(i.t,a)===l||yb(r,a,t(l))}),o===3?new Set(r):r}(e)}function Pv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Kh(e)}function b2(){function e(o,a){var l=i[o];return l?l.enumerable=a:i[o]=l={configurable:!0,enumerable:a,get:function(){var s=this[Le];return lo.get(s,o)},set:function(s){var u=this[Le];lo.set(u,o,s)}},l}function t(o){for(var a=o.length-1;a>=0;a--){var l=o[a][Le];if(!l.P)switch(l.i){case 5:r(l)&&yr(l);break;case 4:n(l)&&yr(l)}}}function n(o){for(var a=o.t,l=o.k,s=ao(l),u=s.length-1;u>=0;u--){var c=s[u];if(c!==Le){var f=a[c];if(f===void 0&&!oo(a,c))return!0;var d=l[c],p=d&&d[Le];if(p?p.t!==f:!wb(d,f))return!0}}var h=!!a[Le];return s.length!==ao(a).length+(h?0:1)}function r(o){var a=o.k;if(a.length!==o.t.length)return!0;var l=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!l||l.get)}var i={};v2("ES5",{J:function(o,a){var l=Array.isArray(o),s=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?g-1:0),m=1;m1?u-1:0),f=1;f=0;i--){var o=r[i];if(o.path.length===0&&o.op==="replace"){n=o.value;break}}i>-1&&(r=r.slice(i+1));var a=ar("Patches").$;return Yr(n)?a(n,r):this.produce(n,function(l){return a(l,r)})},e}(),$t=new C2,A2=$t.produce;$t.produceWithPatches.bind($t);$t.setAutoFreeze.bind($t);$t.setUseProxies.bind($t);$t.applyPatches.bind($t);$t.createDraft.bind($t);$t.finishDraft.bind($t);const Ks=A2;function k2(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Nv(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Dv(e){for(var t=1;t0&&o[o.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!o||u[1]>o[0]&&u[1]0)for(var S=p.getState(),k=Array.from(n.values()),_=0,w=k;_!1}}),ck=()=>{const e=Jr();return F.useCallback(()=>{e(fk())},[e])},{DISCONNECTED_FROM_SERVER:fk}=Db.actions,dk=Db.reducer;function Vl(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(o)),i=Object.keys(t).filter(o=>!n.includes(o));if(!Vl(r,i))return!1;for(let o of r)if(e[o]!==t[o])return!1;return!0}function Rb(e,t,n){return n===0?!0:Vl(e.slice(0,n),t.slice(0,n))}function hk(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:Rb(e,t,n)}const Fb=nm({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:Lb,RESET_SELECTION:AM,STEP_BACK_SELECTION:mk}=Fb.actions,gk=Fb.reducer;function Cn(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:am(e)?2:lm(e)?3:0}function cp(e,t){return Uo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function vk(e,t){return Uo(e)===2?e.get(t):e[t]}function Mb(e,t,n){var r=Uo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function yk(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function am(e){return xk&&e instanceof Map}function lm(e){return Ek&&e instanceof Set}function ii(e){return e.o||e.t}function sm(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Ak(e);delete t[Vt];for(var n=dm(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=wk),Object.freeze(e),t&&bl(e,function(n,r){return um(r,!0)},!0)),e}function wk(){Cn(2)}function cm(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function jn(e){var t=kk[e];return t||Cn(18,e),t}function zv(){return Sl}function Mf(e,t){t&&(jn("Patches"),e.u=[],e.s=[],e.v=t)}function Uu(e){fp(e),e.p.forEach(bk),e.p=null}function fp(e){e===Sl&&(Sl=e.l)}function jv(e){return Sl={p:[],l:Sl,h:e,m:!0,_:0}}function bk(e){var t=e[Vt];t.i===0||t.i===1?t.j():t.O=!0}function Bf(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||jn("ES5").S(t,e,r),r?(n[Vt].P&&(Uu(t),Cn(4)),bi(e)&&(e=zu(t,e),t.l||ju(t,e)),t.u&&jn("Patches").M(n[Vt].t,e,t.u,t.s)):e=zu(t,n,[]),Uu(t),t.u&&t.v(t.u,t.s),e!==Bb?e:void 0}function zu(e,t,n){if(cm(t))return t;var r=t[Vt];if(!r)return bl(t,function(o,a){return Wv(e,r,t,o,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return ju(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var i=r.i===4||r.i===5?r.o=sm(r.k):r.o;bl(r.i===3?new Set(i):i,function(o,a){return Wv(e,r,i,o,a,n)}),ju(e,i,!1),n&&e.u&&jn("Patches").R(r,n,e.u,e.s)}return r.o}function Wv(e,t,n,r,i,o){if(wo(i)){var a=zu(e,i,o&&t&&t.i!==3&&!cp(t.D,r)?o.concat(r):void 0);if(Mb(n,r,a),!wo(a))return;e.m=!1}if(bi(i)&&!cm(i)){if(!e.h.F&&e._<1)return;zu(e,i),t&&t.A.l||ju(e,i)}}function ju(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&um(t,n)}function Uf(e,t){var n=e[Vt];return(n?ii(n):e)[t]}function Yv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function dp(e){e.P||(e.P=!0,e.l&&dp(e.l))}function zf(e){e.o||(e.o=sm(e.t))}function pp(e,t,n){var r=am(t)?jn("MapSet").N(t,n):lm(t)?jn("MapSet").T(t,n):e.g?function(i,o){var a=Array.isArray(i),l={i:a?1:0,A:o?o.A:zv(),P:!1,I:!1,D:{},l:o,t:i,k:null,o:null,j:null,C:!1},s=l,u=hp;a&&(s=[l],u=Ia);var c=Proxy.revocable(s,u),f=c.revoke,d=c.proxy;return l.k=d,l.j=f,d}(t,n):jn("ES5").J(t,n);return(n?n.A:zv()).p.push(r),r}function Sk(e){return wo(e)||Cn(22,e),function t(n){if(!bi(n))return n;var r,i=n[Vt],o=Uo(n);if(i){if(!i.P&&(i.i<4||!jn("ES5").K(i)))return i.t;i.I=!0,r=Hv(n,o),i.I=!1}else r=Hv(n,o);return bl(r,function(a,l){i&&vk(i.t,a)===l||Mb(r,a,t(l))}),o===3?new Set(r):r}(e)}function Hv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return sm(e)}var $v,Sl,fm=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",xk=typeof Map!="undefined",Ek=typeof Set!="undefined",Vv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",Bb=fm?Symbol.for("immer-nothing"):(($v={})["immer-nothing"]=!0,$v),Gv=fm?Symbol.for("immer-draftable"):"__$immer_draftable",Vt=fm?Symbol.for("immer-state"):"__$immer_state",Ck=""+Object.prototype.constructor,dm=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,Ak=Object.getOwnPropertyDescriptors||function(e){var t={};return dm(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},kk={},hp={get:function(e,t){if(t===Vt)return e;var n=ii(e);if(!cp(n,t))return function(i,o,a){var l,s=Yv(o,a);return s?"value"in s?s.value:(l=s.get)===null||l===void 0?void 0:l.call(i.k):void 0}(e,n,t);var r=n[t];return e.I||!bi(r)?r:r===Uf(e.t,t)?(zf(e),e.o[t]=pp(e.A.h,r,e)):r},has:function(e,t){return t in ii(e)},ownKeys:function(e){return Reflect.ownKeys(ii(e))},set:function(e,t,n){var r=Yv(ii(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var i=Uf(ii(e),t),o=i==null?void 0:i[Vt];if(o&&o.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(yk(n,i)&&(n!==void 0||cp(e.t,t)))return!0;zf(e),dp(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Uf(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,zf(e),dp(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=ii(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){Cn(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){Cn(12)}},Ia={};bl(hp,function(e,t){Ia[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Ia.deleteProperty=function(e,t){return Ia.set.call(this,e,t,void 0)},Ia.set=function(e,t,n){return hp.set.call(this,e[0],t,n,e[0])};var Ok=function(){function e(n){var r=this;this.g=Vv,this.F=!0,this.produce=function(i,o,a){if(typeof i=="function"&&typeof o!="function"){var l=o;o=i;var s=r;return function(g){var v=this;g===void 0&&(g=l);for(var m=arguments.length,y=Array(m>1?m-1:0),S=1;S1?c-1:0),d=1;d=0;i--){var o=r[i];if(o.path.length===0&&o.op==="replace"){n=o.value;break}}i>-1&&(r=r.slice(i+1));var a=jn("Patches").$;return wo(n)?a(n,r):this.produce(n,function(l){return a(l,r)})},e}(),Gt=new Ok,Pk=Gt.produce;Gt.produceWithPatches.bind(Gt);Gt.setAutoFreeze.bind(Gt);Gt.setUseProxies.bind(Gt);Gt.applyPatches.bind(Gt);Gt.createDraft.bind(Gt);Gt.finishDraft.bind(Gt);const zo=Pk,Ik="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function Tk(e){const t=Jr();return H.exports.useCallback(()=>{e!==null&&t(Nx({path:e}))},[t,e])}const _k="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",Nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",Dk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",mp="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",Ub="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",zb="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",Rk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",Fk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",Lk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",Mk="_icon_1467k_1",Bk={icon:Mk},Uk={undo:Lk,redo:Rk,tour:Fk,alignTop:Dk,alignBottom:Nk,alignCenter:_k,alignSpread:mp,alignTextCenter:mp,alignTextLeft:Ub,alignTextRight:zb};function zk({id:e,alt:t=e,size:n}){return b("img",{src:Uk[e],alt:t,className:Bk.icon,style:n?{height:n}:{}})}var jb={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},Jv=H.exports.createContext&&H.exports.createContext(jb),Si=globalThis&&globalThis.__assign||function(){return Si=Object.assign||function(e){for(var t,n=1,r=arguments.length;nb("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:b("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),pm=e=>M("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[b("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),b("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),b("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),$k=e=>b("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:b("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),Vk="_button_1dliw_1",Gk="_regular_1dliw_26",Jk="_icon_1dliw_34",Qk="_transparent_1dliw_42",jf={button:Vk,regular:Gk,delete:"_delete_1dliw_30",icon:Jk,transparent:Qk},Ft=i=>{var o=i,{children:e,variant:t="regular",className:n}=o,r=vn(o,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(l=>jf[l]).join(" "):jf[t]:"";return b("button",Q(U({className:jf.button+" "+a+(n?" "+n:"")},r),{children:e}))},Xk="_deleteButton_1en02_1",qk={deleteButton:Xk};function Yb({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=Tk(e);return M(Ft,{className:qk.deleteButton,onClick:i=>{i.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[b(pm,{}),t?null:"Delete Element"]})}function Hb(){const e=Jr(),t=Hl(r=>r.selectedPath),n=H.exports.useCallback(r=>{e(Lb({path:r}))},[e]);return[t,n]}const hm=F.createContext([null,e=>{}]),Kk=({children:e})=>{const t=F.useState(null);return b(hm.Provider,{value:t,children:e})};function Zk(){return F.useContext(hm)}function $b({ref:e,nodeInfo:t,immovable:n=!1}){const r=F.useRef(!1),[,i]=F.useContext(hm),o=F.useCallback(()=>{r.current===!1||n||(i(null),r.current=!1,document.body.removeEventListener("dragover",Qv),document.body.removeEventListener("drop",o))},[n,i]),a=F.useCallback(l=>{l.stopPropagation(),i(t),r.current=!0,document.body.addEventListener("dragover",Qv),document.body.addEventListener("drop",o)},[o,t,i]);F.useEffect(()=>{var s;if(((s=t.currentPath)==null?void 0:s.length)===0||n)return;const l=e.current;if(!!l)return l.setAttribute("draggable","true"),l.addEventListener("dragstart",a),l.addEventListener("dragend",o),()=>{l.removeEventListener("dragstart",a),l.removeEventListener("dragend",o)}},[o,n,t.currentPath,a,e])}function Qv(e){e.preventDefault()}const eO="_leaf_1yzht_1",tO="_selectedOverlay_1yzht_5",nO="_container_1yzht_15",Xv={leaf:eO,selectedOverlay:tO,container:nO};function rO({ref:e,path:t}){F.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const mm=r=>{var i=r,{path:e=[],canMove:t=!0}=i,n=vn(i,["path","canMove"]);const o=F.useRef(null),{uiName:a,uiArguments:l,uiChildren:s}=n,[u,c]=Hb(),f=u?Vl(e,u):!1,d=kn[a],p=g=>{g.stopPropagation(),c(e)};if($b({ref:o,nodeInfo:{node:n,currentPath:e},immovable:!t}),rO({ref:o,path:e}),d.acceptsChildren===!0){const g=d.UiComponent;return b(g,{uiArguments:l,uiChildren:s!=null?s:[],compRef:o,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?b("div",{className:Xv.selectedOverlay}):null})}const h=d.UiComponent;return b(h,{uiArguments:l,compRef:o,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?b("div",{className:Xv.selectedOverlay}):null})},gm=F.forwardRef((i,r)=>{var o=i,{className:e="",children:t}=o,n=vn(o,["className","children"]);const a=e+" card";return b("div",Q(U({ref:r,className:a},n),{children:t}))}),iO=F.forwardRef((r,n)=>{var i=r,{className:e=""}=i,t=vn(i,["className"]);const o=e+" card-header";return b("div",U({ref:n,className:o},t))}),oO="_container_rm196_1",aO="_withTitle_rm196_13",lO="_panelTitle_rm196_22",sO="_contentHolder_rm196_27",uO="_dropWatcher_rm196_67",cO="_lastDropWatcher_rm196_75",fO="_firstDropWatcher_rm196_78",dO="_middleDropWatcher_rm196_89",pO="_onlyDropWatcher_rm196_93",hO="_hoveringOverSwap_rm196_98",mO="_availableToSwap_rm196_99",gO="_pulse_rm196_1",vO="_emptyGridCard_rm196_143",yO="_emptyMessage_rm196_160",Wt={container:oO,withTitle:aO,panelTitle:lO,contentHolder:sO,dropWatcher:uO,lastDropWatcher:cO,firstDropWatcher:fO,middleDropWatcher:dO,onlyDropWatcher:pO,hoveringOverSwap:hO,availableToSwap:mO,pulse:gO,emptyGridCard:vO,emptyMessage:yO},wO="_canAcceptDrop_1oxcd_1",bO="_pulse_1oxcd_1",SO="_hoveringOver_1oxcd_32",gp={canAcceptDrop:wO,pulse:bO,hoveringOver:SO};function vm({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:i=gp.canAcceptDrop,hoveringOverClass:o=gp.hoveringOver}){const[a,l]=Zk(),{addCanAcceptDropHighlight:s,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=xO({watcherRef:e,canAcceptDropClass:i,hoveringOverClass:o}),d=a?t(a):!1,p=F.useCallback(v=>{v.preventDefault(),v.stopPropagation(),u(),r==null||r()},[u,r]),h=F.useCallback(v=>{v.preventDefault(),c()},[c]),g=F.useCallback(v=>{if(v.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),l(null)},[d,a,n,c,l]);F.useEffect(()=>{const v=e.current;if(!!v)return d&&(s(),v.addEventListener("dragenter",p),v.addEventListener("dragleave",h),v.addEventListener("dragover",p),v.addEventListener("drop",g)),()=>{f(),v.removeEventListener("dragenter",p),v.removeEventListener("dragleave",h),v.removeEventListener("dragover",p),v.removeEventListener("drop",g)}},[s,d,h,p,g,f,e])}function xO({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=F.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),i=F.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),o=F.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=F.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:i,removeHoveredOverHighlight:o,removeAllHighlights:a}}function EO({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Dx(),i=F.useCallback(({node:a,currentPath:l})=>qv(a)!==null&&VR({fromPath:l,toPath:[...n,t]}),[t,n]),o=F.useCallback(({node:a,currentPath:l})=>{const s=qv(a);if(!s)throw new Error("No node to place...");r({node:s,currentPath:l,parentPath:n,positionInChildren:t})},[t,n,r]);vm({watcherRef:e,getCanAcceptDrop:i,onDrop:o})}function qv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function ym(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const i=n-1;return Vl(e.slice(0,i),t.slice(0,i))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function CO(e){return Bt({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function Kv(e){return Bt({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function Zv(e){return Bt({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function Vb(e){return Bt({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}const Wu=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+o*r)};function ey(e){let t=1/0,n=-1/0;for(let o of e)on&&(n=o);const r=n-t,i=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===i-1}}function Gb(e,t){return[...new Array(t)].fill(e)}function AO(e,t){return e.filter(n=>!t.includes(n))}function vp(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function xl(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function kO(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const i=r[t];return r[t]=void 0,r=xl(r,n,i),r.filter(o=>typeof o!="undefined")}function OO(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const i=e[r-1];return[...e].splice(0,r-1).join(t)+n+i}var Fc=Jb;function Jb(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],i={}.toString.call(r).slice(8,-1);i=="Array"||i=="Object"?t[n]=Jb(r):i=="Date"?t[n]=new Date(r.getTime()):i=="RegExp"?t[n]=RegExp(r.source,PO(r)):t[n]=r}return t}function PO(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Gl(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function IO(e,t={}){const n=new Set;for(let r of e)for(let i of r)t.ignore&&t.ignore.includes(i)||n.add(i);return[...n]}function TO(e,{index:t,arr:n,dir:r}){const i=Fc(e);switch(r){case"rows":return xl(i,t,n);case"cols":return i.map((o,a)=>xl(o,t,n[a]))}}function _O(e,{index:t,dir:n}){const r=Fc(e);switch(n){case"rows":return vp(r,t);case"cols":return r.map((i,o)=>vp(i,t))}}const Hn=".";function wm(e){const t=new Map;return NO(e).forEach(({itemRows:n,itemCols:r},i)=>{if(i===Hn)return;const o=ey(n),a=ey(r);t.set(i,{colStart:a.minVal,rowStart:o.minVal,colSpan:a.span+1,rowSpan:o.span+1,isValid:o.isSequence&&a.isSequence})}),t}function NO(e){var i;const t=new Map,{numRows:n,numCols:r}=Gl(e);for(let o=0;o1,c=r>1,f=[];return(ty({colRange:s,rowIndex:e-1,layoutAreas:i})||u)&&f.push("up"),(ty({colRange:s,rowIndex:o+1,layoutAreas:i})||u)&&f.push("down"),(ny({rowRange:l,colIndex:n-1,layoutAreas:i})||c)&&f.push("left"),(ny({rowRange:l,colIndex:a+1,layoutAreas:i})||c)&&f.push("right"),f}function ty({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===Hn)}function ny({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===Hn)}const RO="_marker_rkm38_1",FO="_dragger_rkm38_30",LO="_move_rkm38_50",ry={marker:RO,dragger:FO,move:LO};function El({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function MO(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=El(e)),"colSpan"in t&&(t=El(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function BO({row:e,col:t}){return`row${e}-col${t}`}function UO({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:i,colStart:o,colEnd:a}=El(t),l=n.length,s=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:i,growExtent:1};u=r-1,c=1,f=i;break;case"left":if(o===1)return{shrinkExtent:a,growExtent:1};u=o-1,c=1,f=a;break;case"down":if(i===l)return{shrinkExtent:r,growExtent:l};u=i+1,c=l,f=r;break;case"right":if(a===s)return{shrinkExtent:o,growExtent:s};u=a+1,c=s,f=o;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[h,g]=d?[o,a]:[r,i],v=(S,k)=>{const[_,w]=d?[S,k]:[k,S];return n[_-1][w-1]!==Hn},m=Wu(h,g),y=Wu(u,c);for(let S of y)for(let k of m)if(v(S,k))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function Qb(e,t,n){const r=t=r&&e<=i}function zO({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=yp(t.getPropertyValue("gap")),o=yp(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],l=jO(t,e),s=l.length,u=[];for(let c=0;cQb(o,s,u));if(a===void 0)return;const l=YO[n];return i[l]=a.index,i}const YO={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function HO({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const i=El(t),o=F.useRef(null),a=F.useCallback(u=>{const c=e.current,f=o.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=WO({mousePos:u,dragState:f});d&&oy(c,d)},[e]),l=F.useCallback(()=>{const u=e.current,c=o.current;if(!u||!c)return;const f=c.gridItemExtent;MO(f,i)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),iy("on")},[i,a,r,e]);return F.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),h=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:g,growExtent:v}=UO({dragDirection:u,gridLocation:t,layoutAreas:n});o.current={dragHandle:u,gridItemExtent:El(t),tractExtents:zO({dir:h,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:m})=>Qb(m,g,v))},oy(e.current,o.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",l,{once:!0}),iy("off")},[l,t,n,a,e])}function iy(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function oy(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:i}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(i+1))}function $O({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const i=F.useRef(null),o=HO({overlayRef:i,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=F.useMemo(()=>DO({gridLocation:t,layoutAreas:n}),[t,n]),l=F.useMemo(()=>{let s=[];for(let u of a)s.push(b("div",{className:ry.dragger+" "+u,onMouseDown:c=>{VO(c),o(u)},children:GO[u]},u));return s},[a,o]);return F.useEffect(()=>{var s;(s=i.current)==null||s.style.setProperty("--grid-area",e)},[e]),b("div",{ref:i,className:ry.marker+" grid-area-overlay",children:l})}function VO(e){e.preventDefault(),e.stopPropagation()}const GO={up:b(Zv,{}),down:b(Zv,{}),left:b(Kv,{}),right:b(Kv,{})};function JO({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=F.useRef(null);return vm({watcherRef:r,onDrop:i=>{n(Q(U({},i),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),b("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function QO(e,t){const{numRows:n,numCols:r}=Gl(e),i=[];for(let o=0;o{const o=r==="rows"?"cols":"rows",a=Xb(i);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const l=wm(i.areas);let s=Gb(Hn,a[o].length);l.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=bp(u,r);if(f<=t&&d>t){const h=bp(u,o);for(let g=h.itemStart-1;g1}function ZO(e,{index:t,dir:n}){let r=[];return e.forEach((i,o)=>{const{itemStart:a,itemEnd:l}=bp(i,n);a===t&&a===l&&r.push(o)}),r}const eP="_ResizableGrid_i4cq9_1",tP={ResizableGrid:eP,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function eS(e){var i,o;const t=((i=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:i[0])||"px",n=(o=e.match(/^[\d|\.]*/g))==null?void 0:o[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function wr(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const nP="_container_jk9tt_8",rP="_label_jk9tt_26",iP="_mainInput_jk9tt_59",lr={container:nP,label:rP,mainInput:iP},tS=F.createContext(null);function Oi(e){const t=F.useContext(tS);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const oP=({onChange:e,children:t})=>b(tS.Provider,{value:e,children:t});function aP({name:e,isDisabled:t,defaultValue:n}){const r=Oi(),i=`Click to ${t?"set":"unset"} ${e} property`;return b("input",{"aria-label":i,type:"checkbox",checked:!t,title:i,onChange:o=>{r({name:e,value:o.target.checked?n:void 0})}})}function bm({name:e,label:t,optional:n,isDisabled:r,defaultValue:i,mainInput:o,width_setting:a="full"}){return M("label",{className:lr.container,"data-disabled":r,"data-width-setting":a,children:[M("div",{className:lr.label,children:[n?b(aP,{name:e,isDisabled:r,defaultValue:i}):null,t!=null?t:e,":"]}),b("div",{className:lr.mainInput,children:o})]})}const lP="_numericInput_n1lnu_1",sP={numericInput:lP};function Sm({value:e,ariaLabel:t,onChange:n,min:r,max:i,disabled:o=!1}){var l;const a=F.useCallback((s=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+s*c;r&&(f=Math.max(f,r)),i&&(f=Math.min(f,i)),n(f)},[i,r,n,e]);return b("input",{className:sP.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:o,value:(l=e==null?void 0:e.toString())!=null?l:"",onChange:s=>n(Number(s.target.value)),min:r,onKeyDown:s=>{(s.key==="ArrowUp"||s.key==="ArrowDown")&&(s.preventDefault(),a(s.key==="ArrowUp"?1:-1,s.shiftKey))}})}function Cr({name:e,label:t,value:n,min:r=0,max:i,onChange:o,optional:a=!1,defaultValue:l=1,disabled:s=n===void 0}){const u=Oi(o);return b(bm,{name:e,label:t,optional:a,isDisabled:s,defaultValue:l,width_setting:"fit",mainInput:b(Sm,{ariaLabel:t!=null?t:e,disabled:s,value:n,onChange:c=>u({name:e,value:c}),min:r,max:i})})}var xm=uP;function uP(e,t,n){var r=null,i=null,o=function(){r&&(clearTimeout(r),i=null,r=null)},a=function(){var s=i;o(),s&&s()},l=function(){if(!t)return e.apply(this,arguments);var s=this,u=arguments,c=n&&!r;if(o(),i=function(){e.apply(s,u)},r=setTimeout(function(){if(r=null,!c){var f=i;return i=null,f()}},t),c)return i()};return l.cancel=o,l.flush=a,l}const ly=["http","https","mailto","tel"];function cP(e){const t=(e||"").trim(),n=t.charAt(0);if(n==="#"||n==="/")return t;const r=t.indexOf(":");if(r===-1)return t;let i=-1;for(;++ii||(i=t.indexOf("#"),i!==-1&&r>i)?t:"javascript:void(0)"}/*! - * Determine if an object is a Buffer - * - * @author Feross Aboukhadijeh - * @license MIT - */var Em=function(t){return t!=null&&t.constructor!=null&&typeof t.constructor.isBuffer=="function"&&t.constructor.isBuffer(t)};function co(e){return!e||typeof e!="object"?"":"position"in e||"type"in e?sy(e.position):"start"in e||"end"in e?sy(e):"line"in e||"column"in e?Sp(e):""}function Sp(e){return uy(e&&e.line)+":"+uy(e&&e.column)}function sy(e){return Sp(e&&e.start)+"-"+Sp(e&&e.end)}function uy(e){return e&&typeof e=="number"?e:1}class dn extends Error{constructor(t,n,r){const i=[null,null];let o={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof n=="string"&&(r=n,n=void 0),typeof r=="string"){const a=r.indexOf(":");a===-1?i[1]=r:(i[0]=r.slice(0,a),i[1]=r.slice(a+1))}n&&("type"in n||"position"in n?n.position&&(o=n.position):"start"in n||"end"in n?o=n:("line"in n||"column"in n)&&(o.start=n)),this.name=co(n)||"1:1",this.message=typeof t=="object"?t.message:t,this.stack=typeof t=="object"?t.stack:"",this.reason=this.message,this.fatal,this.line=o.start.line,this.column=o.start.column,this.source=i[0],this.ruleId=i[1],this.position=o,this.actual,this.expected,this.file,this.url,this.note}}dn.prototype.file="";dn.prototype.name="";dn.prototype.reason="";dn.prototype.message="";dn.prototype.stack="";dn.prototype.fatal=null;dn.prototype.column=null;dn.prototype.line=null;dn.prototype.source=null;dn.prototype.ruleId=null;dn.prototype.position=null;const Tn={basename:fP,dirname:dP,extname:pP,join:hP,sep:"/"};function fP(e,t){if(t!==void 0&&typeof t!="string")throw new TypeError('"ext" argument must be a string');Jl(e);let n=0,r=-1,i=e.length,o;if(t===void 0||t.length===0||t.length>e.length){for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else r<0&&(o=!0,r=i+1);return r<0?"":e.slice(n,r)}if(t===e)return"";let a=-1,l=t.length-1;for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else a<0&&(o=!0,a=i+1),l>-1&&(e.charCodeAt(i)===t.charCodeAt(l--)?l<0&&(r=i):(l=-1,r=a));return n===r?r=a:r<0&&(r=e.length),e.slice(n,r)}function dP(e){if(Jl(e),e.length===0)return".";let t=-1,n=e.length,r;for(;--n;)if(e.charCodeAt(n)===47){if(r){t=n;break}}else r||(r=!0);return t<0?e.charCodeAt(0)===47?"/":".":t===1&&e.charCodeAt(0)===47?"//":e.slice(0,t)}function pP(e){Jl(e);let t=e.length,n=-1,r=0,i=-1,o=0,a;for(;t--;){const l=e.charCodeAt(t);if(l===47){if(a){r=t+1;break}continue}n<0&&(a=!0,n=t+1),l===46?i<0?i=t:o!==1&&(o=1):i>-1&&(o=-1)}return i<0||n<0||o===0||o===1&&i===n-1&&i===r+1?"":e.slice(i,n)}function hP(...e){let t=-1,n;for(;++t0&&e.charCodeAt(e.length-1)===47&&(n+="/"),t?"/"+n:n}function gP(e,t){let n="",r=0,i=-1,o=0,a=-1,l,s;for(;++a<=e.length;){if(a2){if(s=n.lastIndexOf("/"),s!==n.length-1){s<0?(n="",r=0):(n=n.slice(0,s),r=n.length-1-n.lastIndexOf("/")),i=a,o=0;continue}}else if(n.length>0){n="",r=0,i=a,o=0;continue}}t&&(n=n.length>0?n+"/..":"..",r=2)}else n.length>0?n+="/"+e.slice(i+1,a):n=e.slice(i+1,a),r=a-i-1;i=a,o=0}else l===46&&o>-1?o++:o=-1}return n}function Jl(e){if(typeof e!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(e))}const vP={cwd:yP};function yP(){return"/"}function xp(e){return e!==null&&typeof e=="object"&&e.href&&e.origin}function wP(e){if(typeof e=="string")e=new URL(e);else if(!xp(e)){const t=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+e+"`");throw t.code="ERR_INVALID_ARG_TYPE",t}if(e.protocol!=="file:"){const t=new TypeError("The URL must be of scheme file");throw t.code="ERR_INVALID_URL_SCHEME",t}return bP(e)}function bP(e){if(e.hostname!==""){const r=new TypeError('File URL host must be "localhost" or empty on darwin');throw r.code="ERR_INVALID_FILE_URL_HOST",r}const t=e.pathname;let n=-1;for(;++na.length;let s;l&&a.push(i);try{s=e.apply(this,a)}catch(u){const c=u;if(l&&n)throw c;return i(c)}l||(s instanceof Promise?s.then(o,i):s instanceof Error?i(s):o(s))}function i(a,...l){n||(n=!0,t(a,...l))}function o(a){i(null,a)}}class pn extends Error{constructor(t,n,r){const i=[null,null];let o={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof n=="string"&&(r=n,n=void 0),typeof r=="string"){const a=r.indexOf(":");a===-1?i[1]=r:(i[0]=r.slice(0,a),i[1]=r.slice(a+1))}n&&("type"in n||"position"in n?n.position&&(o=n.position):"start"in n||"end"in n?o=n:("line"in n||"column"in n)&&(o.start=n)),this.name=co(n)||"1:1",this.message=typeof t=="object"?t.message:t,this.stack=typeof t=="object"?t.stack:"",this.reason=this.message,this.fatal,this.line=o.start.line,this.column=o.start.column,this.source=i[0],this.ruleId=i[1],this.position=o,this.actual,this.expected,this.file,this.url,this.note}}pn.prototype.file="";pn.prototype.name="";pn.prototype.reason="";pn.prototype.message="";pn.prototype.stack="";pn.prototype.fatal=null;pn.prototype.column=null;pn.prototype.line=null;pn.prototype.source=null;pn.prototype.ruleId=null;pn.prototype.position=null;const _n={basename:CP,dirname:AP,extname:kP,join:OP,sep:"/"};function CP(e,t){if(t!==void 0&&typeof t!="string")throw new TypeError('"ext" argument must be a string');Ql(e);let n=0,r=-1,i=e.length,o;if(t===void 0||t.length===0||t.length>e.length){for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else r<0&&(o=!0,r=i+1);return r<0?"":e.slice(n,r)}if(t===e)return"";let a=-1,l=t.length-1;for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else a<0&&(o=!0,a=i+1),l>-1&&(e.charCodeAt(i)===t.charCodeAt(l--)?l<0&&(r=i):(l=-1,r=a));return n===r?r=a:r<0&&(r=e.length),e.slice(n,r)}function AP(e){if(Ql(e),e.length===0)return".";let t=-1,n=e.length,r;for(;--n;)if(e.charCodeAt(n)===47){if(r){t=n;break}}else r||(r=!0);return t<0?e.charCodeAt(0)===47?"/":".":t===1&&e.charCodeAt(0)===47?"//":e.slice(0,t)}function kP(e){Ql(e);let t=e.length,n=-1,r=0,i=-1,o=0,a;for(;t--;){const l=e.charCodeAt(t);if(l===47){if(a){r=t+1;break}continue}n<0&&(a=!0,n=t+1),l===46?i<0?i=t:o!==1&&(o=1):i>-1&&(o=-1)}return i<0||n<0||o===0||o===1&&i===n-1&&i===r+1?"":e.slice(i,n)}function OP(...e){let t=-1,n;for(;++t0&&e.charCodeAt(e.length-1)===47&&(n+="/"),t?"/"+n:n}function IP(e,t){let n="",r=0,i=-1,o=0,a=-1,l,s;for(;++a<=e.length;){if(a2){if(s=n.lastIndexOf("/"),s!==n.length-1){s<0?(n="",r=0):(n=n.slice(0,s),r=n.length-1-n.lastIndexOf("/")),i=a,o=0;continue}}else if(n.length>0){n="",r=0,i=a,o=0;continue}}t&&(n=n.length>0?n+"/..":"..",r=2)}else n.length>0?n+="/"+e.slice(i+1,a):n=e.slice(i+1,a),r=a-i-1;i=a,o=0}else l===46&&o>-1?o++:o=-1}return n}function Ql(e){if(typeof e!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(e))}const TP={cwd:_P};function _P(){return"/"}function Cp(e){return e!==null&&typeof e=="object"&&e.href&&e.origin}function NP(e){if(typeof e=="string")e=new URL(e);else if(!Cp(e)){const t=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+e+"`");throw t.code="ERR_INVALID_ARG_TYPE",t}if(e.protocol!=="file:"){const t=new TypeError("The URL must be of scheme file");throw t.code="ERR_INVALID_URL_SCHEME",t}return DP(e)}function DP(e){if(e.hostname!==""){const r=new TypeError('File URL host must be "localhost" or empty on darwin');throw r.code="ERR_INVALID_FILE_URL_HOST",r}const t=e.pathname;let n=-1;for(;++n{if(w||!O||!E)_(w);else{const C=o.stringify(O,E);C==null||(BP(C)?E.value=C:E.result=C),_(w,E)}});function _(w,O){w||!O?S(w):y?y(O):v(null,O)}}}function h(g){let v;o.freeze(),Jf("processSync",o.Parser),Qf("processSync",o.Compiler);const m=ua(g);return o.process(m,y),xy("processSync","process",v),m;function y(S){v=!0,fy(S)}}}function by(e,t){return typeof e=="function"&&e.prototype&&(LP(e.prototype)||t in e.prototype)}function LP(e){let t;for(t in e)if(rS.call(e,t))return!0;return!1}function Jf(e,t){if(typeof t!="function")throw new TypeError("Cannot `"+e+"` without `Parser`")}function Qf(e,t){if(typeof t!="function")throw new TypeError("Cannot `"+e+"` without `Compiler`")}function Xf(e,t){if(t)throw new Error("Cannot call `"+e+"` on a frozen processor.\nCreate a new processor first, by calling it: use `processor()` instead of `processor`.")}function Sy(e){if(!Ep(e)||typeof e.type!="string")throw new TypeError("Expected node, got `"+e+"`")}function xy(e,t,n){if(!n)throw new Error("`"+e+"` finished async. Use `"+t+"` instead")}function ua(e){return MP(e)?e:new RP(e)}function MP(e){return Boolean(e&&typeof e=="object"&&"message"in e&&"messages"in e)}function BP(e){return typeof e=="string"||Em(e)}function UP(e,t){var{includeImageAlt:n=!0}=t||{};return oS(e,n)}function oS(e,t){return e&&typeof e=="object"&&(e.value||(t?e.alt:"")||"children"in e&&Ey(e.children,t)||Array.isArray(e)&&Ey(e,t))||""}function Ey(e,t){for(var n=[],r=-1;++ri?0:i+t:t=t>i?i:t,n=n>0?n:0,r.length<1e4)a=Array.from(r),a.unshift(t,n),[].splice.apply(e,a);else for(n&&[].splice.apply(e,[t,n]);o0?($n(e,e.length,0,t),e):t}const Cy={}.hasOwnProperty;function zP(e){const t={};let n=-1;for(;++na))return;const O=t.events.length;let E=O,C,P;for(;E--;)if(t.events[E][0]==="exit"&&t.events[E][1].type==="chunkFlow"){if(C){P=t.events[E][1].end;break}C=!0}for(m(r),w=O;wS;){const _=n[k];t.containerState=_[1],_[0].exit.call(t,e)}n.length=S}function y(){i.write([null]),o=void 0,i=void 0,t.containerState._closeFlow=void 0}}function KP(e,t,n){return ke(e,e.attempt(this.parser.constructs.document,t,n),"linePrefix",this.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function Oy(e){if(e===null||rn(e)||VP(e))return 1;if(GP(e))return 2}function Cm(e,t,n){const r=[];let i=-1;for(;++i1&&e[n][1].end.offset-e[n][1].start.offset>1?2:1;const f=Object.assign({},e[r][1].end),d=Object.assign({},e[n][1].start);Py(f,-s),Py(d,s),a={type:s>1?"strongSequence":"emphasisSequence",start:f,end:Object.assign({},e[r][1].end)},l={type:s>1?"strongSequence":"emphasisSequence",start:Object.assign({},e[n][1].start),end:d},o={type:s>1?"strongText":"emphasisText",start:Object.assign({},e[r][1].end),end:Object.assign({},e[n][1].start)},i={type:s>1?"strong":"emphasis",start:Object.assign({},a.start),end:Object.assign({},l.end)},e[r][1].end=Object.assign({},a.start),e[n][1].start=Object.assign({},l.end),u=[],e[r][1].end.offset-e[r][1].start.offset&&(u=Kt(u,[["enter",e[r][1],t],["exit",e[r][1],t]])),u=Kt(u,[["enter",i,t],["enter",a,t],["exit",a,t],["enter",o,t]]),u=Kt(u,Cm(t.parser.constructs.insideSpan.null,e.slice(r+1,n),t)),u=Kt(u,[["exit",o,t],["enter",l,t],["exit",l,t],["exit",i,t]]),e[n][1].end.offset-e[n][1].start.offset?(c=2,u=Kt(u,[["enter",e[n][1],t],["exit",e[n][1],t]])):c=0,$n(e,r-1,n-r+3,u),n=r+u.length-c-2;break}}for(n=-1;++n=4?a(u):n(u)}function a(u){return u===null?s(u):re(u)?e.attempt(c3,a,s)(u):(e.enter("codeFlowValue"),l(u))}function l(u){return u===null||re(u)?(e.exit("codeFlowValue"),a(u)):(e.consume(u),l)}function s(u){return e.exit("codeIndented"),t(u)}}function d3(e,t,n){const r=this;return i;function i(a){return r.parser.lazy[r.now().line]?n(a):re(a)?(e.enter("lineEnding"),e.consume(a),e.exit("lineEnding"),i):ke(e,o,"linePrefix",4+1)(a)}function o(a){const l=r.events[r.events.length-1];return l&&l[1].type==="linePrefix"&&l[2].sliceSerialize(l[1],!0).length>=4?t(a):re(a)?i(a):n(a)}}const p3={name:"codeText",tokenize:g3,resolve:h3,previous:m3};function h3(e){let t=e.length-4,n=3,r,i;if((e[n][1].type==="lineEnding"||e[n][1].type==="space")&&(e[t][1].type==="lineEnding"||e[t][1].type==="space")){for(r=n;++r=4?t(a):e.interrupt(r.parser.constructs.flow,n,t)(a)}}function cS(e,t,n,r,i,o,a,l,s){const u=s||Number.POSITIVE_INFINITY;let c=0;return f;function f(m){return m===60?(e.enter(r),e.enter(i),e.enter(o),e.consume(m),e.exit(o),d):m===null||m===41||kp(m)?n(m):(e.enter(r),e.enter(a),e.enter(l),e.enter("chunkString",{contentType:"string"}),g(m))}function d(m){return m===62?(e.enter(o),e.consume(m),e.exit(o),e.exit(i),e.exit(r),t):(e.enter(l),e.enter("chunkString",{contentType:"string"}),p(m))}function p(m){return m===62?(e.exit("chunkString"),e.exit(l),d(m)):m===null||m===60||re(m)?n(m):(e.consume(m),m===92?h:p)}function h(m){return m===60||m===62||m===92?(e.consume(m),p):p(m)}function g(m){return m===40?++c>u?n(m):(e.consume(m),g):m===41?c--?(e.consume(m),g):(e.exit("chunkString"),e.exit(l),e.exit(a),e.exit(r),t(m)):m===null||rn(m)?c?n(m):(e.exit("chunkString"),e.exit(l),e.exit(a),e.exit(r),t(m)):kp(m)?n(m):(e.consume(m),m===92?v:g)}function v(m){return m===40||m===41||m===92?(e.consume(m),g):g(m)}}function fS(e,t,n,r,i,o){const a=this;let l=0,s;return u;function u(p){return e.enter(r),e.enter(i),e.consume(p),e.exit(i),e.enter(o),c}function c(p){return p===null||p===91||p===93&&!s||p===94&&!l&&"_hiddenFootnoteSupport"in a.parser.constructs||l>999?n(p):p===93?(e.exit(o),e.enter(i),e.consume(p),e.exit(i),e.exit(r),t):re(p)?(e.enter("lineEnding"),e.consume(p),e.exit("lineEnding"),c):(e.enter("chunkString",{contentType:"string"}),f(p))}function f(p){return p===null||p===91||p===93||re(p)||l++>999?(e.exit("chunkString"),c(p)):(e.consume(p),s=s||!qe(p),p===92?d:f)}function d(p){return p===91||p===92||p===93?(e.consume(p),l++,f):f(p)}}function dS(e,t,n,r,i,o){let a;return l;function l(d){return e.enter(r),e.enter(i),e.consume(d),e.exit(i),a=d===40?41:d,s}function s(d){return d===a?(e.enter(i),e.consume(d),e.exit(i),e.exit(r),t):(e.enter(o),u(d))}function u(d){return d===a?(e.exit(o),s(a)):d===null?n(d):re(d)?(e.enter("lineEnding"),e.consume(d),e.exit("lineEnding"),ke(e,u,"linePrefix")):(e.enter("chunkString",{contentType:"string"}),c(d))}function c(d){return d===a||d===null||re(d)?(e.exit("chunkString"),u(d)):(e.consume(d),d===92?f:c)}function f(d){return d===a||d===92?(e.consume(d),c):c(d)}}function Ga(e,t){let n;return r;function r(i){return re(i)?(e.enter("lineEnding"),e.consume(i),e.exit("lineEnding"),n=!0,r):qe(i)?ke(e,r,n?"linePrefix":"lineSuffix")(i):t(i)}}function fo(e){return e.replace(/[\t\n\r ]+/g," ").replace(/^ | $/g,"").toLowerCase().toUpperCase()}const E3={name:"definition",tokenize:A3},C3={tokenize:k3,partial:!0};function A3(e,t,n){const r=this;let i;return o;function o(s){return e.enter("definition"),fS.call(r,e,a,n,"definitionLabel","definitionLabelMarker","definitionLabelString")(s)}function a(s){return i=fo(r.sliceSerialize(r.events[r.events.length-1][1]).slice(1,-1)),s===58?(e.enter("definitionMarker"),e.consume(s),e.exit("definitionMarker"),Ga(e,cS(e,e.attempt(C3,ke(e,l,"whitespace"),ke(e,l,"whitespace")),n,"definitionDestination","definitionDestinationLiteral","definitionDestinationLiteralMarker","definitionDestinationRaw","definitionDestinationString"))):n(s)}function l(s){return s===null||re(s)?(e.exit("definition"),r.parser.defined.includes(i)||r.parser.defined.push(i),t(s)):n(s)}}function k3(e,t,n){return r;function r(a){return rn(a)?Ga(e,i)(a):n(a)}function i(a){return a===34||a===39||a===40?dS(e,ke(e,o,"whitespace"),n,"definitionTitle","definitionTitleMarker","definitionTitleString")(a):n(a)}function o(a){return a===null||re(a)?t(a):n(a)}}const O3={name:"hardBreakEscape",tokenize:P3};function P3(e,t,n){return r;function r(o){return e.enter("hardBreakEscape"),e.enter("escapeMarker"),e.consume(o),i}function i(o){return re(o)?(e.exit("escapeMarker"),e.exit("hardBreakEscape"),t(o)):n(o)}}const I3={name:"headingAtx",tokenize:_3,resolve:T3};function T3(e,t){let n=e.length-2,r=3,i,o;return e[r][1].type==="whitespace"&&(r+=2),n-2>r&&e[n][1].type==="whitespace"&&(n-=2),e[n][1].type==="atxHeadingSequence"&&(r===n-1||n-4>r&&e[n-2][1].type==="whitespace")&&(n-=r+1===n?2:4),n>r&&(i={type:"atxHeadingText",start:e[r][1].start,end:e[n][1].end},o={type:"chunkText",start:e[r][1].start,end:e[n][1].end,contentType:"text"},$n(e,r,n-r+1,[["enter",i,t],["enter",o,t],["exit",o,t],["exit",i,t]])),e}function _3(e,t,n){const r=this;let i=0;return o;function o(c){return e.enter("atxHeading"),e.enter("atxHeadingSequence"),a(c)}function a(c){return c===35&&i++<6?(e.consume(c),a):c===null||rn(c)?(e.exit("atxHeadingSequence"),r.interrupt?t(c):l(c)):n(c)}function l(c){return c===35?(e.enter("atxHeadingSequence"),s(c)):c===null||re(c)?(e.exit("atxHeading"),t(c)):qe(c)?ke(e,l,"whitespace")(c):(e.enter("atxHeadingText"),u(c))}function s(c){return c===35?(e.consume(c),s):(e.exit("atxHeadingSequence"),l(c))}function u(c){return c===null||c===35||rn(c)?(e.exit("atxHeadingText"),l(c)):(e.consume(c),u)}}const N3=["address","article","aside","base","basefont","blockquote","body","caption","center","col","colgroup","dd","details","dialog","dir","div","dl","dt","fieldset","figcaption","figure","footer","form","frame","frameset","h1","h2","h3","h4","h5","h6","head","header","hr","html","iframe","legend","li","link","main","menu","menuitem","nav","noframes","ol","optgroup","option","p","param","section","summary","table","tbody","td","tfoot","th","thead","title","tr","track","ul"],_y=["pre","script","style","textarea"],D3={name:"htmlFlow",tokenize:L3,resolveTo:F3,concrete:!0},R3={tokenize:M3,partial:!0};function F3(e){let t=e.length;for(;t--&&!(e[t][0]==="enter"&&e[t][1].type==="htmlFlow"););return t>1&&e[t-2][1].type==="linePrefix"&&(e[t][1].start=e[t-2][1].start,e[t+1][1].start=e[t-2][1].start,e.splice(t-2,2)),e}function L3(e,t,n){const r=this;let i,o,a,l,s;return u;function u(A){return e.enter("htmlFlow"),e.enter("htmlFlowData"),e.consume(A),c}function c(A){return A===33?(e.consume(A),f):A===47?(e.consume(A),h):A===63?(e.consume(A),i=3,r.interrupt?t:se):Nn(A)?(e.consume(A),a=String.fromCharCode(A),o=!0,g):n(A)}function f(A){return A===45?(e.consume(A),i=2,d):A===91?(e.consume(A),i=5,a="CDATA[",l=0,p):Nn(A)?(e.consume(A),i=4,r.interrupt?t:se):n(A)}function d(A){return A===45?(e.consume(A),r.interrupt?t:se):n(A)}function p(A){return A===a.charCodeAt(l++)?(e.consume(A),l===a.length?r.interrupt?t:I:p):n(A)}function h(A){return Nn(A)?(e.consume(A),a=String.fromCharCode(A),g):n(A)}function g(A){return A===null||A===47||A===62||rn(A)?A!==47&&o&&_y.includes(a.toLowerCase())?(i=1,r.interrupt?t(A):I(A)):N3.includes(a.toLowerCase())?(i=6,A===47?(e.consume(A),v):r.interrupt?t(A):I(A)):(i=7,r.interrupt&&!r.parser.lazy[r.now().line]?n(A):o?y(A):m(A)):A===45||Yt(A)?(e.consume(A),a+=String.fromCharCode(A),g):n(A)}function v(A){return A===62?(e.consume(A),r.interrupt?t:I):n(A)}function m(A){return qe(A)?(e.consume(A),m):C(A)}function y(A){return A===47?(e.consume(A),C):A===58||A===95||Nn(A)?(e.consume(A),S):qe(A)?(e.consume(A),y):C(A)}function S(A){return A===45||A===46||A===58||A===95||Yt(A)?(e.consume(A),S):k(A)}function k(A){return A===61?(e.consume(A),_):qe(A)?(e.consume(A),k):y(A)}function _(A){return A===null||A===60||A===61||A===62||A===96?n(A):A===34||A===39?(e.consume(A),s=A,w):qe(A)?(e.consume(A),_):(s=null,O(A))}function w(A){return A===null||re(A)?n(A):A===s?(e.consume(A),E):(e.consume(A),w)}function O(A){return A===null||A===34||A===39||A===60||A===61||A===62||A===96||rn(A)?k(A):(e.consume(A),O)}function E(A){return A===47||A===62||qe(A)?y(A):n(A)}function C(A){return A===62?(e.consume(A),P):n(A)}function P(A){return qe(A)?(e.consume(A),P):A===null||re(A)?I(A):n(A)}function I(A){return A===45&&i===2?(e.consume(A),K):A===60&&i===1?(e.consume(A),V):A===62&&i===4?(e.consume(A),q):A===63&&i===3?(e.consume(A),se):A===93&&i===5?(e.consume(A),te):re(A)&&(i===6||i===7)?e.check(R3,q,T)(A):A===null||re(A)?T(A):(e.consume(A),I)}function T(A){return e.exit("htmlFlowData"),N(A)}function N(A){return A===null?x(A):re(A)?e.attempt({tokenize:B,partial:!0},N,x)(A):(e.enter("htmlFlowData"),I(A))}function B(A,X,fe){return pe;function pe(be){return A.enter("lineEnding"),A.consume(be),A.exit("lineEnding"),he}function he(be){return r.parser.lazy[r.now().line]?fe(be):X(be)}}function K(A){return A===45?(e.consume(A),se):I(A)}function V(A){return A===47?(e.consume(A),a="",le):I(A)}function le(A){return A===62&&_y.includes(a.toLowerCase())?(e.consume(A),q):Nn(A)&&a.length<8?(e.consume(A),a+=String.fromCharCode(A),le):I(A)}function te(A){return A===93?(e.consume(A),se):I(A)}function se(A){return A===62?(e.consume(A),q):A===45&&i===2?(e.consume(A),se):I(A)}function q(A){return A===null||re(A)?(e.exit("htmlFlowData"),x(A)):(e.consume(A),q)}function x(A){return e.exit("htmlFlow"),t(A)}}function M3(e,t,n){return r;function r(i){return e.exit("htmlFlowData"),e.enter("lineEndingBlank"),e.consume(i),e.exit("lineEndingBlank"),e.attempt(Lc,t,n)}}const B3={name:"htmlText",tokenize:U3};function U3(e,t,n){const r=this;let i,o,a,l;return s;function s(x){return e.enter("htmlText"),e.enter("htmlTextData"),e.consume(x),u}function u(x){return x===33?(e.consume(x),c):x===47?(e.consume(x),O):x===63?(e.consume(x),_):Nn(x)?(e.consume(x),P):n(x)}function c(x){return x===45?(e.consume(x),f):x===91?(e.consume(x),o="CDATA[",a=0,v):Nn(x)?(e.consume(x),k):n(x)}function f(x){return x===45?(e.consume(x),d):n(x)}function d(x){return x===null||x===62?n(x):x===45?(e.consume(x),p):h(x)}function p(x){return x===null||x===62?n(x):h(x)}function h(x){return x===null?n(x):x===45?(e.consume(x),g):re(x)?(l=h,te(x)):(e.consume(x),h)}function g(x){return x===45?(e.consume(x),q):h(x)}function v(x){return x===o.charCodeAt(a++)?(e.consume(x),a===o.length?m:v):n(x)}function m(x){return x===null?n(x):x===93?(e.consume(x),y):re(x)?(l=m,te(x)):(e.consume(x),m)}function y(x){return x===93?(e.consume(x),S):m(x)}function S(x){return x===62?q(x):x===93?(e.consume(x),S):m(x)}function k(x){return x===null||x===62?q(x):re(x)?(l=k,te(x)):(e.consume(x),k)}function _(x){return x===null?n(x):x===63?(e.consume(x),w):re(x)?(l=_,te(x)):(e.consume(x),_)}function w(x){return x===62?q(x):_(x)}function O(x){return Nn(x)?(e.consume(x),E):n(x)}function E(x){return x===45||Yt(x)?(e.consume(x),E):C(x)}function C(x){return re(x)?(l=C,te(x)):qe(x)?(e.consume(x),C):q(x)}function P(x){return x===45||Yt(x)?(e.consume(x),P):x===47||x===62||rn(x)?I(x):n(x)}function I(x){return x===47?(e.consume(x),q):x===58||x===95||Nn(x)?(e.consume(x),T):re(x)?(l=I,te(x)):qe(x)?(e.consume(x),I):q(x)}function T(x){return x===45||x===46||x===58||x===95||Yt(x)?(e.consume(x),T):N(x)}function N(x){return x===61?(e.consume(x),B):re(x)?(l=N,te(x)):qe(x)?(e.consume(x),N):I(x)}function B(x){return x===null||x===60||x===61||x===62||x===96?n(x):x===34||x===39?(e.consume(x),i=x,K):re(x)?(l=B,te(x)):qe(x)?(e.consume(x),B):(e.consume(x),i=void 0,le)}function K(x){return x===i?(e.consume(x),V):x===null?n(x):re(x)?(l=K,te(x)):(e.consume(x),K)}function V(x){return x===62||x===47||rn(x)?I(x):n(x)}function le(x){return x===null||x===34||x===39||x===60||x===61||x===96?n(x):x===62||rn(x)?I(x):(e.consume(x),le)}function te(x){return e.exit("htmlTextData"),e.enter("lineEnding"),e.consume(x),e.exit("lineEnding"),ke(e,se,"linePrefix",r.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function se(x){return e.enter("htmlTextData"),l(x)}function q(x){return x===62?(e.consume(x),e.exit("htmlTextData"),e.exit("htmlText"),t):n(x)}}const km={name:"labelEnd",tokenize:$3,resolveTo:H3,resolveAll:Y3},z3={tokenize:V3},j3={tokenize:G3},W3={tokenize:J3};function Y3(e){let t=-1,n;for(;++t-1&&(a[0]=a[0].slice(r)),o>0&&a.push(e[i].slice(0,o))),a}function y4(e,t){let n=-1;const r=[];let i;for(;++n13&&n<32||n>126&&n<160||n>55295&&n<57344||n>64975&&n<65008||(n&65535)===65535||(n&65535)===65534||n>1114111?"\uFFFD":String.fromCharCode(n)}const N4=/\\([!-/:-@[-`{-~])|&(#(?:\d{1,7}|x[\da-f]{1,6})|[\da-z]{1,31});/gi;function D4(e){return e.replace(N4,R4)}function R4(e,t,n){if(t)return t;if(n.charCodeAt(0)===35){const i=n.charCodeAt(1),o=i===120||i===88;return mS(n.slice(o?2:1),o?16:10)}return Am(n)||e}const Pp={}.hasOwnProperty,F4=function(e,t,n){return typeof t!="string"&&(n=t,t=void 0),L4(n)(_4(I4(n).document().write(T4()(e,t,!0))))};function L4(e={}){const t=gS({transforms:[],canContainEols:["emphasis","fragment","heading","paragraph","strong"],enter:{autolink:s(Kr),autolinkProtocol:T,autolinkEmail:T,atxHeading:s(Vo),blockQuote:s(rf),characterEscape:T,characterReference:T,codeFenced:s($o),codeFencedFenceInfo:u,codeFencedFenceMeta:u,codeIndented:s($o,u),codeText:s(of,u),codeTextData:T,data:T,codeFlowValue:T,definition:s(af),definitionDestinationString:u,definitionLabelString:u,definitionTitleString:u,emphasis:s(ss),hardBreakEscape:s(us),hardBreakTrailing:s(us),htmlFlow:s(cs,u),htmlFlowData:T,htmlText:s(cs,u),htmlTextData:T,image:s(Xn),label:u,link:s(Kr),listItem:s(fs),listItemValue:g,listOrdered:s(Go,h),listUnordered:s(Go),paragraph:s(Jo),reference:he,referenceString:u,resourceDestinationString:u,resourceTitleString:u,setextHeading:s(Vo),strong:s(ds),thematicBreak:s(hs)},exit:{atxHeading:f(),atxHeadingSequence:E,autolink:f(),autolinkEmail:qr,autolinkProtocol:gn,blockQuote:f(),characterEscapeValue:N,characterReferenceMarkerHexadecimal:Ee,characterReferenceMarkerNumeric:Ee,characterReferenceValue:We,codeFenced:f(S),codeFencedFence:y,codeFencedFenceInfo:v,codeFencedFenceMeta:m,codeFlowValue:N,codeIndented:f(k),codeText:f(te),codeTextData:N,data:N,definition:f(),definitionDestinationString:O,definitionLabelString:_,definitionTitleString:w,emphasis:f(),hardBreakEscape:f(K),hardBreakTrailing:f(K),htmlFlow:f(V),htmlFlowData:N,htmlText:f(le),htmlTextData:N,image:f(q),label:A,labelText:x,lineEnding:B,link:f(se),listItem:f(),listOrdered:f(),listUnordered:f(),paragraph:f(),referenceString:be,resourceDestinationString:X,resourceTitleString:fe,resource:pe,setextHeading:f(I),setextHeadingLineSequence:P,setextHeadingText:C,strong:f(),thematicBreak:f()}},e.mdastExtensions||[]),n={};return r;function r(L){let Y={type:"root",children:[]};const oe=[Y],Ce=[],Xt=[],Qo={stack:oe,tokenStack:Ce,config:t,enter:c,exit:d,buffer:u,resume:p,setData:o,getData:a};let Te=-1;for(;++Te0){const it=Ce[Ce.length-1];(it[1]||Ry).call(Qo,void 0,it[0])}for(Y.position={start:l(L.length>0?L[0][1].start:{line:1,column:1,offset:0}),end:l(L.length>0?L[L.length-2][1].end:{line:1,column:1,offset:0})},Te=-1;++Te{const r=this.data("settings");return F4(n,Object.assign({},r,e,{extensions:this.data("micromarkExtensions")||[],mdastExtensions:this.data("fromMarkdownExtensions")||[]}))}})}var et=function(e,t,n){var r={type:String(e)};return n==null&&(typeof t=="string"||Array.isArray(t))?n=t:Object.assign(r,t),Array.isArray(n)?r.children=n:n!=null&&(r.value=String(n)),r};const tu={}.hasOwnProperty;function U4(e,t){const n=t.data||{};return"value"in t&&!(tu.call(n,"hName")||tu.call(n,"hProperties")||tu.call(n,"hChildren"))?e.augment(t,et("text",t.value)):e(t,"div",yt(e,t))}function vS(e,t,n){const r=t&&t.type;let i;if(!r)throw new Error("Expected node, got `"+t+"`");return tu.call(e.handlers,r)?i=e.handlers[r]:e.passThrough&&e.passThrough.includes(r)?i=z4:i=e.unknownHandler,(typeof i=="function"?i:U4)(e,t,n)}function z4(e,t){return"children"in t?Q(U({},t),{children:yt(e,t)}):t}function yt(e,t){const n=[];if("children"in t){const r=t.children;let i=-1;for(;++i":""))+")"})),d;function d(){let p=[],h,g,v;if((!t||i(l,s,u[u.length-1]||null))&&(p=J4(n(l,u)),p[0]===Fy))return p;if(l.children&&p[0]!==V4)for(g=(r?l.children.length:-1)+o,v=u.concat(l);g>-1&&g-1?r.offset:null}}}function Q4(e){return!e||!e.position||!e.position.start||!e.position.start.line||!e.position.start.column||!e.position.end||!e.position.end.line||!e.position.end.column}const Ly={}.hasOwnProperty;function X4(e){const t=Object.create(null);if(!e||!e.type)throw new Error("mdast-util-definitions expected node");return wS(e,"definition",r=>{const i=My(r.identifier);i&&!Ly.call(t,i)&&(t[i]=r)}),n;function n(r){const i=My(r);return i&&Ly.call(t,i)?t[i]:null}}function My(e){return String(e||"").toUpperCase()}const q4={'"':"quot","&":"amp","<":"lt",">":"gt"};function K4(e){return e.replace(/["&<>]/g,t);function t(n){return"&"+q4[n]+";"}}function ES(e,t){const n=K4(Z4(e||""));if(!t)return n;const r=n.indexOf(":"),i=n.indexOf("?"),o=n.indexOf("#"),a=n.indexOf("/");return r<0||a>-1&&r>a||i>-1&&r>i||o>-1&&r>o||t.test(n.slice(0,r))?n:""}function Z4(e){const t=[];let n=-1,r=0,i=0;for(;++n55295&&o<57344){const l=e.charCodeAt(n+1);o<56320&&l>56319&&l<57344?(a=String.fromCharCode(o,l),i=1):a="\uFFFD"}else a=String.fromCharCode(o);a&&(t.push(e.slice(r,n),encodeURIComponent(a)),r=n+i+1,a=""),i&&(n+=i,i=0)}return t.join("")+e.slice(r)}function ir(e,t){const n=[];let r=-1;for(t&&n.push(et("text",` -`));++r0&&n.push(et("text",` -`)),n}function eI(e){let t=-1;const n=[];for(;++t1?"-"+l:""),dataFootnoteBackref:!0,className:["data-footnote-backref"],ariaLabel:e.footnoteBackLabel},children:[{type:"text",value:"\u21A9"}]};l>1&&f.children.push({type:"element",tagName:"sup",children:[{type:"text",value:String(l)}]}),s.length>0&&s.push({type:"text",value:" "}),s.push(f)}const u=i[i.length-1];if(u&&u.type==="element"&&u.tagName==="p"){const f=u.children[u.children.length-1];f&&f.type==="text"?f.value+=" ":u.children.push({type:"text",value:" "}),u.children.push(...s)}else i.push(...s);const c={type:"element",tagName:"li",properties:{id:e.clobberPrefix+"fn-"+a},children:ir(i,!0)};r.position&&(c.position=r.position),n.push(c)}return n.length===0?null:{type:"element",tagName:"section",properties:{dataFootnotes:!0,className:["footnotes"]},children:[{type:"element",tagName:e.footnoteLabelTagName,properties:JSON.parse(JSON.stringify(e.footnoteLabelProperties)),children:[et("text",e.footnoteLabel)]},{type:"text",value:` -`},{type:"element",tagName:"ol",properties:{},children:ir(n,!0)},{type:"text",value:` -`}]}}function tI(e,t){return e(t,"blockquote",ir(yt(e,t),!0))}function nI(e,t){return[e(t,"br"),et("text",` -`)]}function rI(e,t){const n=t.value?t.value+` -`:"",r=t.lang&&t.lang.match(/^[^ \t]+(?=[ \t]|$)/),i={};r&&(i.className=["language-"+r]);const o=e(t,"code",i,[et("text",n)]);return t.meta&&(o.data={meta:t.meta}),e(t.position,"pre",[o])}function iI(e,t){return e(t,"del",yt(e,t))}function oI(e,t){return e(t,"em",yt(e,t))}function CS(e,t){const n=String(t.identifier),r=ES(n.toLowerCase()),i=e.footnoteOrder.indexOf(n);let o;i===-1?(e.footnoteOrder.push(n),e.footnoteCounts[n]=1,o=e.footnoteOrder.length):(e.footnoteCounts[n]++,o=i+1);const a=e.footnoteCounts[n];return e(t,"sup",[e(t.position,"a",{href:"#"+e.clobberPrefix+"fn-"+r,id:e.clobberPrefix+"fnref-"+r+(a>1?"-"+a:""),dataFootnoteRef:!0,ariaDescribedBy:"footnote-label"},[et("text",String(o))])])}function aI(e,t){const n=e.footnoteById;let r=1;for(;r in n;)r++;const i=String(r);return n[i]={type:"footnoteDefinition",identifier:i,children:[{type:"paragraph",children:t.children}],position:t.position},CS(e,{type:"footnoteReference",identifier:i,position:t.position})}function lI(e,t){return e(t,"h"+t.depth,yt(e,t))}function sI(e,t){return e.dangerous?e.augment(t,et("raw",t.value)):null}var By={};function uI(e){var t,n,r=By[e];if(r)return r;for(r=By[e]=[],t=0;t<128;t++)n=String.fromCharCode(t),/^[0-9a-z]$/i.test(n)?r.push(n):r.push("%"+("0"+t.toString(16).toUpperCase()).slice(-2));for(t=0;t=55296&&o<=57343){if(o>=55296&&o<=56319&&r+1=56320&&a<=57343)){s+=encodeURIComponent(e[r]+e[r+1]),r++;continue}s+="%EF%BF%BD";continue}s+=encodeURIComponent(e[r])}return s}Bc.defaultChars=";/?:@&=+$,-_.!~*'()#";Bc.componentChars="-_.!~*'()";var Uc=Bc;function AS(e,t){const n=t.referenceType;let r="]";if(n==="collapsed"?r+="[]":n==="full"&&(r+="["+(t.label||t.identifier)+"]"),t.type==="imageReference")return et("text","!["+t.alt+r);const i=yt(e,t),o=i[0];o&&o.type==="text"?o.value="["+o.value:i.unshift(et("text","["));const a=i[i.length-1];return a&&a.type==="text"?a.value+=r:i.push(et("text",r)),i}function cI(e,t){const n=e.definition(t.identifier);if(!n)return AS(e,t);const r={src:Uc(n.url||""),alt:t.alt};return n.title!==null&&n.title!==void 0&&(r.title=n.title),e(t,"img",r)}function fI(e,t){const n={src:Uc(t.url),alt:t.alt};return t.title!==null&&t.title!==void 0&&(n.title=t.title),e(t,"img",n)}function dI(e,t){return e(t,"code",[et("text",t.value.replace(/\r?\n|\r/g," "))])}function pI(e,t){const n=e.definition(t.identifier);if(!n)return AS(e,t);const r={href:Uc(n.url||"")};return n.title!==null&&n.title!==void 0&&(r.title=n.title),e(t,"a",r,yt(e,t))}function hI(e,t){const n={href:Uc(t.url)};return t.title!==null&&t.title!==void 0&&(n.title=t.title),e(t,"a",n,yt(e,t))}function mI(e,t,n){const r=yt(e,t),i=n?gI(n):kS(t),o={},a=[];if(typeof t.checked=="boolean"){let u;r[0]&&r[0].type==="element"&&r[0].tagName==="p"?u=r[0]:(u=e(null,"p",[]),r.unshift(u)),u.children.length>0&&u.children.unshift(et("text"," ")),u.children.unshift(e(null,"input",{type:"checkbox",checked:t.checked,disabled:!0})),o.className=["task-list-item"]}let l=-1;for(;++l1:t}function vI(e,t){const n={},r=t.ordered?"ol":"ul",i=yt(e,t);let o=-1;for(typeof t.start=="number"&&t.start!==1&&(n.start=t.start);++o0,!0),r[0]),i=r.index+r[0].length,r=n.exec(t);return o.push(jy(t.slice(i),i>0,!1)),o.join("")}function jy(e,t,n){let r=0,i=e.length;if(t){let o=e.codePointAt(r);for(;o===Uy||o===zy;)r++,o=e.codePointAt(r)}if(n){let o=e.codePointAt(i-1);for(;o===Uy||o===zy;)i--,o=e.codePointAt(i-1)}return i>r?e.slice(r,i):""}function EI(e,t){return e.augment(t,et("text",xI(String(t.value))))}function CI(e,t){return e(t,"hr")}const AI={blockquote:tI,break:nI,code:rI,delete:iI,emphasis:oI,footnoteReference:CS,footnote:aI,heading:lI,html:sI,imageReference:cI,image:fI,inlineCode:dI,linkReference:pI,link:hI,listItem:mI,list:vI,paragraph:yI,root:wI,strong:bI,table:SI,text:EI,thematicBreak:CI,toml:Ps,yaml:Ps,definition:Ps,footnoteDefinition:Ps};function Ps(){return null}const kI={}.hasOwnProperty;function OI(e,t){const n=t||{},r=n.allowDangerousHtml||!1,i={};return a.dangerous=r,a.clobberPrefix=n.clobberPrefix===void 0||n.clobberPrefix===null?"user-content-":n.clobberPrefix,a.footnoteLabel=n.footnoteLabel||"Footnotes",a.footnoteLabelTagName=n.footnoteLabelTagName||"h2",a.footnoteLabelProperties=n.footnoteLabelProperties||{id:"footnote-label",className:["sr-only"]},a.footnoteBackLabel=n.footnoteBackLabel||"Back to content",a.definition=X4(e),a.footnoteById=i,a.footnoteOrder=[],a.footnoteCounts={},a.augment=o,a.handlers=U(U({},AI),n.handlers),a.unknownHandler=n.unknownHandler,a.passThrough=n.passThrough,wS(e,"footnoteDefinition",l=>{const s=String(l.identifier).toUpperCase();kI.call(i,s)||(i[s]=l)}),a;function o(l,s){if(l&&"data"in l&&l.data){const u=l.data;u.hName&&(s.type!=="element"&&(s={type:"element",tagName:"",properties:{},children:[]}),s.tagName=u.hName),s.type==="element"&&u.hProperties&&(s.properties=U(U({},s.properties),u.hProperties)),"children"in s&&s.children&&u.hChildren&&(s.children=u.hChildren)}if(l){const u="type"in l?l:{position:l};Q4(u)||(s.position={start:bS(u),end:SS(u)})}return s}function a(l,s,u,c){return Array.isArray(u)&&(c=u,u={}),o(l,{type:"element",tagName:s,properties:u||{},children:c||[]})}}function OS(e,t){const n=OI(e,t),r=vS(n,e,null),i=eI(n);return i&&r.children.push(et("text",` -`),i),Array.isArray(r)?{type:"root",children:r}:r}const PI=function(e,t){return e&&"run"in e?TI(e,t):_I(e||t)},II=PI;function TI(e,t){return(n,r,i)=>{e.run(OS(n,t),r,o=>{i(o)})}}function _I(e){return t=>OS(t,e)}class Xl{constructor(t,n,r){this.property=t,this.normal=n,r&&(this.space=r)}}Xl.prototype.property={};Xl.prototype.normal={};Xl.prototype.space=null;function PS(e,t){const n={},r={};let i=-1;for(;++i4&&n.slice(0,4)==="data"&&LI.test(t)){if(t.charAt(4)==="-"){const o=t.slice(5).replace(Yy,zI);r="data"+o.charAt(0).toUpperCase()+o.slice(1)}else{const o=t.slice(4);if(!Yy.test(o)){let a=o.replace(MI,UI);a.charAt(0)!=="-"&&(a="-"+a),t="data"+a}}i=Om}return new i(r,t)}function UI(e){return"-"+e.toLowerCase()}function zI(e){return e.charAt(1).toUpperCase()}const Hy={classId:"classID",dataType:"datatype",itemId:"itemID",strokeDashArray:"strokeDasharray",strokeDashOffset:"strokeDashoffset",strokeLineCap:"strokeLinecap",strokeLineJoin:"strokeLinejoin",strokeMiterLimit:"strokeMiterlimit",typeOf:"typeof",xLinkActuate:"xlinkActuate",xLinkArcRole:"xlinkArcrole",xLinkHref:"xlinkHref",xLinkRole:"xlinkRole",xLinkShow:"xlinkShow",xLinkTitle:"xlinkTitle",xLinkType:"xlinkType",xmlnsXLink:"xmlnsXlink"},jI=PS([_S,TS,RS,FS,RI],"html"),WI=PS([_S,TS,RS,FS,FI],"svg"),LS=function(e){if(e==null)return VI;if(typeof e=="string")return $I(e);if(typeof e=="object")return Array.isArray(e)?YI(e):HI(e);if(typeof e=="function")return zc(e);throw new Error("Expected function, string, or object as test")};function YI(e){const t=[];let n=-1;for(;++n":""))+")"})),d;function d(){let p=[],h,g,v;if((!t||i(l,s,u[u.length-1]||null))&&(p=XI(n(l,u)),p[0]===$y))return p;if(l.children&&p[0]!==JI)for(g=(r?l.children.length:-1)+o,v=u.concat(l);g>-1&&g{qI(t,"element",(n,r,i)=>{const o=i;let a;if(e.allowedElements?a=!e.allowedElements.includes(n.tagName):e.disallowedElements&&(a=e.disallowedElements.includes(n.tagName)),!a&&e.allowElement&&typeof r=="number"&&(a=!e.allowElement(n,r,o)),a&&typeof r=="number")return e.unwrapDisallowed&&n.children?o.children.splice(r,1,...n.children):o.children.splice(r,1),r})}}var MS={exports:{}},xe={};/** - * @license React - * react-is.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Pm=Symbol.for("react.element"),Im=Symbol.for("react.portal"),jc=Symbol.for("react.fragment"),Wc=Symbol.for("react.strict_mode"),Yc=Symbol.for("react.profiler"),Hc=Symbol.for("react.provider"),$c=Symbol.for("react.context"),ZI=Symbol.for("react.server_context"),Vc=Symbol.for("react.forward_ref"),Gc=Symbol.for("react.suspense"),Jc=Symbol.for("react.suspense_list"),Qc=Symbol.for("react.memo"),Xc=Symbol.for("react.lazy"),eT=Symbol.for("react.offscreen"),BS;BS=Symbol.for("react.module.reference");function mn(e){if(typeof e=="object"&&e!==null){var t=e.$$typeof;switch(t){case Pm:switch(e=e.type,e){case jc:case Yc:case Wc:case Gc:case Jc:return e;default:switch(e=e&&e.$$typeof,e){case ZI:case $c:case Vc:case Xc:case Qc:case Hc:return e;default:return t}}case Im:return t}}}xe.ContextConsumer=$c;xe.ContextProvider=Hc;xe.Element=Pm;xe.ForwardRef=Vc;xe.Fragment=jc;xe.Lazy=Xc;xe.Memo=Qc;xe.Portal=Im;xe.Profiler=Yc;xe.StrictMode=Wc;xe.Suspense=Gc;xe.SuspenseList=Jc;xe.isAsyncMode=function(){return!1};xe.isConcurrentMode=function(){return!1};xe.isContextConsumer=function(e){return mn(e)===$c};xe.isContextProvider=function(e){return mn(e)===Hc};xe.isElement=function(e){return typeof e=="object"&&e!==null&&e.$$typeof===Pm};xe.isForwardRef=function(e){return mn(e)===Vc};xe.isFragment=function(e){return mn(e)===jc};xe.isLazy=function(e){return mn(e)===Xc};xe.isMemo=function(e){return mn(e)===Qc};xe.isPortal=function(e){return mn(e)===Im};xe.isProfiler=function(e){return mn(e)===Yc};xe.isStrictMode=function(e){return mn(e)===Wc};xe.isSuspense=function(e){return mn(e)===Gc};xe.isSuspenseList=function(e){return mn(e)===Jc};xe.isValidElementType=function(e){return typeof e=="string"||typeof e=="function"||e===jc||e===Yc||e===Wc||e===Gc||e===Jc||e===eT||typeof e=="object"&&e!==null&&(e.$$typeof===Xc||e.$$typeof===Qc||e.$$typeof===Hc||e.$$typeof===$c||e.$$typeof===Vc||e.$$typeof===BS||e.getModuleId!==void 0)};xe.typeOf=mn;(function(e){e.exports=xe})(MS);const tT=Qp(MS.exports);function nT(e){var t=e&&typeof e=="object"&&e.type==="text"?e.value||"":e;return typeof t=="string"&&t.replace(/[ \t\n\f\r]/g,"")===""}function rT(e){return e.join(" ").trim()}function iT(e,t){var n=t||{};return e[e.length-1]===""&&(e=e.concat("")),e.join((n.padRight?" ":"")+","+(n.padLeft===!1?"":" ")).trim()}var Vy=/\/\*[^*]*\*+([^/*][^*]*\*+)*\//g,oT=/\n/g,aT=/^\s*/,lT=/^(\*?[-#/*\\\w]+(\[[0-9a-z_-]+\])?)\s*/,sT=/^:\s*/,uT=/^((?:'(?:\\'|.)*?'|"(?:\\"|.)*?"|\([^)]*?\)|[^};])+)/,cT=/^[;\s]*/,fT=/^\s+|\s+$/g,dT=` -`,Gy="/",Jy="*",li="",pT="comment",hT="declaration",mT=function(e,t){if(typeof e!="string")throw new TypeError("First argument must be a string");if(!e)return[];t=t||{};var n=1,r=1;function i(h){var g=h.match(oT);g&&(n+=g.length);var v=h.lastIndexOf(dT);r=~v?h.length-v:r+h.length}function o(){var h={line:n,column:r};return function(g){return g.position=new a(h),u(),g}}function a(h){this.start=h,this.end={line:n,column:r},this.source=t.source}a.prototype.content=e;function l(h){var g=new Error(t.source+":"+n+":"+r+": "+h);if(g.reason=h,g.filename=t.source,g.line=n,g.column=r,g.source=e,!t.silent)throw g}function s(h){var g=h.exec(e);if(!!g){var v=g[0];return i(v),e=e.slice(v.length),g}}function u(){s(aT)}function c(h){var g;for(h=h||[];g=f();)g!==!1&&h.push(g);return h}function f(){var h=o();if(!(Gy!=e.charAt(0)||Jy!=e.charAt(1))){for(var g=2;li!=e.charAt(g)&&(Jy!=e.charAt(g)||Gy!=e.charAt(g+1));)++g;if(g+=2,li===e.charAt(g-1))return l("End of comment missing");var v=e.slice(2,g-2);return r+=2,i(v),e=e.slice(g),r+=2,h({type:pT,comment:v})}}function d(){var h=o(),g=s(lT);if(!!g){if(f(),!s(sT))return l("property missing ':'");var v=s(uT),m=h({type:hT,property:Qy(g[0].replace(Vy,li)),value:v?Qy(v[0].replace(Vy,li)):li});return s(cT),m}}function p(){var h=[];c(h);for(var g;g=d();)g!==!1&&(h.push(g),c(h));return h}return u(),p()};function Qy(e){return e?e.replace(fT,li):li}var gT=mT;function vT(e,t){var n=null;if(!e||typeof e!="string")return n;for(var r,i=gT(e),o=typeof t=="function",a,l,s=0,u=i.length;s0?F.createElement(d,l,c):F.createElement(d,l)}function ST(e){let t=-1;for(;++tString(t)).join("")}const Xy={}.hasOwnProperty,kT="https://github.com/remarkjs/react-markdown/blob/main/changelog.md",Is={plugins:{to:"plugins",id:"change-plugins-to-remarkplugins"},renderers:{to:"components",id:"change-renderers-to-components"},astPlugins:{id:"remove-buggy-html-in-markdown-parser"},allowDangerousHtml:{id:"remove-buggy-html-in-markdown-parser"},escapeHtml:{id:"remove-buggy-html-in-markdown-parser"},source:{to:"children",id:"change-source-to-children"},allowNode:{to:"allowElement",id:"replace-allownode-allowedtypes-and-disallowedtypes"},allowedTypes:{to:"allowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},disallowedTypes:{to:"disallowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},includeNodeIndex:{to:"includeElementIndex",id:"change-includenodeindex-to-includeelementindex"}};function Tm(e){for(const o in Is)if(Xy.call(Is,o)&&Xy.call(e,o)){const a=Is[o];console.warn(`[react-markdown] Warning: please ${a.to?`use \`${a.to}\` instead of`:"remove"} \`${o}\` (see <${kT}#${a.id}> for more info)`),delete Is[o]}const t=FP().use(B4).use(e.remarkPlugins||[]).use(II,Q(U({},e.remarkRehypeOptions),{allowDangerousHtml:!0})).use(e.rehypePlugins||[]).use(KI,e),n=new SP;typeof e.children=="string"?n.value=e.children:e.children!==void 0&&e.children!==null&&console.warn(`[react-markdown] Warning: please pass a string as \`children\` (not: \`${e.children}\`)`);const r=t.runSync(t.parse(n),n);if(r.type!=="root")throw new TypeError("Expected a `root` node");let i=b(Ke,{children:US({options:e,schema:jI,listDepth:0},r)});return e.className&&(i=b("div",{className:e.className,children:i})),i}Tm.defaultProps={transformLinkUri:cP};Tm.propTypes={children:R.exports.string,className:R.exports.string,allowElement:R.exports.func,allowedElements:R.exports.arrayOf(R.exports.string),disallowedElements:R.exports.arrayOf(R.exports.string),unwrapDisallowed:R.exports.bool,remarkPlugins:R.exports.arrayOf(R.exports.oneOfType([R.exports.object,R.exports.func,R.exports.arrayOf(R.exports.oneOfType([R.exports.bool,R.exports.string,R.exports.object,R.exports.func,R.exports.arrayOf(R.exports.any)]))])),rehypePlugins:R.exports.arrayOf(R.exports.oneOfType([R.exports.object,R.exports.func,R.exports.arrayOf(R.exports.oneOfType([R.exports.bool,R.exports.string,R.exports.object,R.exports.func,R.exports.arrayOf(R.exports.any)]))])),sourcePos:R.exports.bool,rawSourcePos:R.exports.bool,skipHtml:R.exports.bool,includeElementIndex:R.exports.bool,transformLinkUri:R.exports.oneOfType([R.exports.func,R.exports.bool]),linkTarget:R.exports.oneOfType([R.exports.func,R.exports.string]),transformImageUri:R.exports.func,components:R.exports.object};var qy=function(t){return t.reduce(function(n,r){var i=r[0],o=r[1];return n[i]=o,n},{})},Ky=typeof window!="undefined"&&window.document&&window.document.createElement?H.exports.useLayoutEffect:H.exports.useEffect,Lt="top",sn="bottom",un="right",Mt="left",_m="auto",ql=[Lt,sn,un,Mt],bo="start",Cl="end",OT="clippingParents",zS="viewport",ca="popper",PT="reference",Zy=ql.reduce(function(e,t){return e.concat([t+"-"+bo,t+"-"+Cl])},[]),jS=[].concat(ql,[_m]).reduce(function(e,t){return e.concat([t,t+"-"+bo,t+"-"+Cl])},[]),IT="beforeRead",TT="read",_T="afterRead",NT="beforeMain",DT="main",RT="afterMain",FT="beforeWrite",LT="write",MT="afterWrite",BT=[IT,TT,_T,NT,DT,RT,FT,LT,MT];function Vn(e){return e?(e.nodeName||"").toLowerCase():null}function Pn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function So(e){var t=Pn(e).Element;return e instanceof t||e instanceof Element}function on(e){var t=Pn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function WS(e){if(typeof ShadowRoot=="undefined")return!1;var t=Pn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function UT(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},i=t.attributes[n]||{},o=t.elements[n];!on(o)||!Vn(o)||(Object.assign(o.style,r),Object.keys(i).forEach(function(a){var l=i[a];l===!1?o.removeAttribute(a):o.setAttribute(a,l===!0?"":l)}))})}function zT(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var i=t.elements[r],o=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),l=a.reduce(function(s,u){return s[u]="",s},{});!on(i)||!Vn(i)||(Object.assign(i.style,l),Object.keys(o).forEach(function(s){i.removeAttribute(s)}))})}}const jT={name:"applyStyles",enabled:!0,phase:"write",fn:UT,effect:zT,requires:["computeStyles"]};function Wn(e){return e.split("-")[0]}var hi=Math.max,Yu=Math.min,xo=Math.round;function Eo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,i=1;if(on(e)&&t){var o=e.offsetHeight,a=e.offsetWidth;a>0&&(r=xo(n.width)/a||1),o>0&&(i=xo(n.height)/o||1)}return{width:n.width/r,height:n.height/i,top:n.top/i,right:n.right/r,bottom:n.bottom/i,left:n.left/r,x:n.left/r,y:n.top/i}}function Nm(e){var t=Eo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function YS(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&WS(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function cr(e){return Pn(e).getComputedStyle(e)}function WT(e){return["table","td","th"].indexOf(Vn(e))>=0}function Xr(e){return((So(e)?e.ownerDocument:e.document)||window.document).documentElement}function qc(e){return Vn(e)==="html"?e:e.assignedSlot||e.parentNode||(WS(e)?e.host:null)||Xr(e)}function e1(e){return!on(e)||cr(e).position==="fixed"?null:e.offsetParent}function YT(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&on(e)){var r=cr(e);if(r.position==="fixed")return null}for(var i=qc(e);on(i)&&["html","body"].indexOf(Vn(i))<0;){var o=cr(i);if(o.transform!=="none"||o.perspective!=="none"||o.contain==="paint"||["transform","perspective"].indexOf(o.willChange)!==-1||t&&o.willChange==="filter"||t&&o.filter&&o.filter!=="none")return i;i=i.parentNode}return null}function Kl(e){for(var t=Pn(e),n=e1(e);n&&WT(n)&&cr(n).position==="static";)n=e1(n);return n&&(Vn(n)==="html"||Vn(n)==="body"&&cr(n).position==="static")?t:n||YT(e)||t}function Dm(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function Ja(e,t,n){return hi(e,Yu(t,n))}function HT(e,t,n){var r=Ja(e,t,n);return r>n?n:r}function HS(){return{top:0,right:0,bottom:0,left:0}}function $S(e){return Object.assign({},HS(),e)}function VS(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var $T=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,$S(typeof t!="number"?t:VS(t,ql))};function VT(e){var t,n=e.state,r=e.name,i=e.options,o=n.elements.arrow,a=n.modifiersData.popperOffsets,l=Wn(n.placement),s=Dm(l),u=[Mt,un].indexOf(l)>=0,c=u?"height":"width";if(!(!o||!a)){var f=$T(i.padding,n),d=Nm(o),p=s==="y"?Lt:Mt,h=s==="y"?sn:un,g=n.rects.reference[c]+n.rects.reference[s]-a[s]-n.rects.popper[c],v=a[s]-n.rects.reference[s],m=Kl(o),y=m?s==="y"?m.clientHeight||0:m.clientWidth||0:0,S=g/2-v/2,k=f[p],_=y-d[c]-f[h],w=y/2-d[c]/2+S,O=Ja(k,w,_),E=s;n.modifiersData[r]=(t={},t[E]=O,t.centerOffset=O-w,t)}}function GT(e){var t=e.state,n=e.options,r=n.element,i=r===void 0?"[data-popper-arrow]":r;i!=null&&(typeof i=="string"&&(i=t.elements.popper.querySelector(i),!i)||!YS(t.elements.popper,i)||(t.elements.arrow=i))}const JT={name:"arrow",enabled:!0,phase:"main",fn:VT,effect:GT,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Co(e){return e.split("-")[1]}var QT={top:"auto",right:"auto",bottom:"auto",left:"auto"};function XT(e){var t=e.x,n=e.y,r=window,i=r.devicePixelRatio||1;return{x:xo(t*i)/i||0,y:xo(n*i)/i||0}}function t1(e){var t,n=e.popper,r=e.popperRect,i=e.placement,o=e.variation,a=e.offsets,l=e.position,s=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,h=a.y,g=h===void 0?0:h,v=typeof c=="function"?c({x:p,y:g}):{x:p,y:g};p=v.x,g=v.y;var m=a.hasOwnProperty("x"),y=a.hasOwnProperty("y"),S=Mt,k=Lt,_=window;if(u){var w=Kl(n),O="clientHeight",E="clientWidth";if(w===Pn(n)&&(w=Xr(n),cr(w).position!=="static"&&l==="absolute"&&(O="scrollHeight",E="scrollWidth")),w=w,i===Lt||(i===Mt||i===un)&&o===Cl){k=sn;var C=f&&_.visualViewport?_.visualViewport.height:w[O];g-=C-r.height,g*=s?1:-1}if(i===Mt||(i===Lt||i===sn)&&o===Cl){S=un;var P=f&&_.visualViewport?_.visualViewport.width:w[E];p-=P-r.width,p*=s?1:-1}}var I=Object.assign({position:l},u&&QT),T=c===!0?XT({x:p,y:g}):{x:p,y:g};if(p=T.x,g=T.y,s){var N;return Object.assign({},I,(N={},N[k]=y?"0":"",N[S]=m?"0":"",N.transform=(_.devicePixelRatio||1)<=1?"translate("+p+"px, "+g+"px)":"translate3d("+p+"px, "+g+"px, 0)",N))}return Object.assign({},I,(t={},t[k]=y?g+"px":"",t[S]=m?p+"px":"",t.transform="",t))}function qT(e){var t=e.state,n=e.options,r=n.gpuAcceleration,i=r===void 0?!0:r,o=n.adaptive,a=o===void 0?!0:o,l=n.roundOffsets,s=l===void 0?!0:l,u={placement:Wn(t.placement),variation:Co(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:i,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,t1(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:s})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,t1(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:s})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const KT={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:qT,data:{}};var Ts={passive:!0};function ZT(e){var t=e.state,n=e.instance,r=e.options,i=r.scroll,o=i===void 0?!0:i,a=r.resize,l=a===void 0?!0:a,s=Pn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return o&&u.forEach(function(c){c.addEventListener("scroll",n.update,Ts)}),l&&s.addEventListener("resize",n.update,Ts),function(){o&&u.forEach(function(c){c.removeEventListener("scroll",n.update,Ts)}),l&&s.removeEventListener("resize",n.update,Ts)}}const e_={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:ZT,data:{}};var t_={left:"right",right:"left",bottom:"top",top:"bottom"};function nu(e){return e.replace(/left|right|bottom|top/g,function(t){return t_[t]})}var n_={start:"end",end:"start"};function n1(e){return e.replace(/start|end/g,function(t){return n_[t]})}function Rm(e){var t=Pn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Fm(e){return Eo(Xr(e)).left+Rm(e).scrollLeft}function r_(e){var t=Pn(e),n=Xr(e),r=t.visualViewport,i=n.clientWidth,o=n.clientHeight,a=0,l=0;return r&&(i=r.width,o=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,l=r.offsetTop)),{width:i,height:o,x:a+Fm(e),y:l}}function i_(e){var t,n=Xr(e),r=Rm(e),i=(t=e.ownerDocument)==null?void 0:t.body,o=hi(n.scrollWidth,n.clientWidth,i?i.scrollWidth:0,i?i.clientWidth:0),a=hi(n.scrollHeight,n.clientHeight,i?i.scrollHeight:0,i?i.clientHeight:0),l=-r.scrollLeft+Fm(e),s=-r.scrollTop;return cr(i||n).direction==="rtl"&&(l+=hi(n.clientWidth,i?i.clientWidth:0)-o),{width:o,height:a,x:l,y:s}}function Lm(e){var t=cr(e),n=t.overflow,r=t.overflowX,i=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+i+r)}function GS(e){return["html","body","#document"].indexOf(Vn(e))>=0?e.ownerDocument.body:on(e)&&Lm(e)?e:GS(qc(e))}function Qa(e,t){var n;t===void 0&&(t=[]);var r=GS(e),i=r===((n=e.ownerDocument)==null?void 0:n.body),o=Pn(r),a=i?[o].concat(o.visualViewport||[],Lm(r)?r:[]):r,l=t.concat(a);return i?l:l.concat(Qa(qc(a)))}function Np(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function o_(e){var t=Eo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function r1(e,t){return t===zS?Np(r_(e)):So(t)?o_(t):Np(i_(Xr(e)))}function a_(e){var t=Qa(qc(e)),n=["absolute","fixed"].indexOf(cr(e).position)>=0,r=n&&on(e)?Kl(e):e;return So(r)?t.filter(function(i){return So(i)&&YS(i,r)&&Vn(i)!=="body"}):[]}function l_(e,t,n){var r=t==="clippingParents"?a_(e):[].concat(t),i=[].concat(r,[n]),o=i[0],a=i.reduce(function(l,s){var u=r1(e,s);return l.top=hi(u.top,l.top),l.right=Yu(u.right,l.right),l.bottom=Yu(u.bottom,l.bottom),l.left=hi(u.left,l.left),l},r1(e,o));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function JS(e){var t=e.reference,n=e.element,r=e.placement,i=r?Wn(r):null,o=r?Co(r):null,a=t.x+t.width/2-n.width/2,l=t.y+t.height/2-n.height/2,s;switch(i){case Lt:s={x:a,y:t.y-n.height};break;case sn:s={x:a,y:t.y+t.height};break;case un:s={x:t.x+t.width,y:l};break;case Mt:s={x:t.x-n.width,y:l};break;default:s={x:t.x,y:t.y}}var u=i?Dm(i):null;if(u!=null){var c=u==="y"?"height":"width";switch(o){case bo:s[u]=s[u]-(t[c]/2-n[c]/2);break;case Cl:s[u]=s[u]+(t[c]/2-n[c]/2);break}}return s}function Al(e,t){t===void 0&&(t={});var n=t,r=n.placement,i=r===void 0?e.placement:r,o=n.boundary,a=o===void 0?OT:o,l=n.rootBoundary,s=l===void 0?zS:l,u=n.elementContext,c=u===void 0?ca:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,h=p===void 0?0:p,g=$S(typeof h!="number"?h:VS(h,ql)),v=c===ca?PT:ca,m=e.rects.popper,y=e.elements[d?v:c],S=l_(So(y)?y:y.contextElement||Xr(e.elements.popper),a,s),k=Eo(e.elements.reference),_=JS({reference:k,element:m,strategy:"absolute",placement:i}),w=Np(Object.assign({},m,_)),O=c===ca?w:k,E={top:S.top-O.top+g.top,bottom:O.bottom-S.bottom+g.bottom,left:S.left-O.left+g.left,right:O.right-S.right+g.right},C=e.modifiersData.offset;if(c===ca&&C){var P=C[i];Object.keys(E).forEach(function(I){var T=[un,sn].indexOf(I)>=0?1:-1,N=[Lt,sn].indexOf(I)>=0?"y":"x";E[I]+=P[N]*T})}return E}function s_(e,t){t===void 0&&(t={});var n=t,r=n.placement,i=n.boundary,o=n.rootBoundary,a=n.padding,l=n.flipVariations,s=n.allowedAutoPlacements,u=s===void 0?jS:s,c=Co(r),f=c?l?Zy:Zy.filter(function(h){return Co(h)===c}):ql,d=f.filter(function(h){return u.indexOf(h)>=0});d.length===0&&(d=f);var p=d.reduce(function(h,g){return h[g]=Al(e,{placement:g,boundary:i,rootBoundary:o,padding:a})[Wn(g)],h},{});return Object.keys(p).sort(function(h,g){return p[h]-p[g]})}function u_(e){if(Wn(e)===_m)return[];var t=nu(e);return[n1(e),t,n1(t)]}function c_(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var i=n.mainAxis,o=i===void 0?!0:i,a=n.altAxis,l=a===void 0?!0:a,s=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,h=p===void 0?!0:p,g=n.allowedAutoPlacements,v=t.options.placement,m=Wn(v),y=m===v,S=s||(y||!h?[nu(v)]:u_(v)),k=[v].concat(S).reduce(function(fe,pe){return fe.concat(Wn(pe)===_m?s_(t,{placement:pe,boundary:c,rootBoundary:f,padding:u,flipVariations:h,allowedAutoPlacements:g}):pe)},[]),_=t.rects.reference,w=t.rects.popper,O=new Map,E=!0,C=k[0],P=0;P=0,K=B?"width":"height",V=Al(t,{placement:I,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),le=B?N?un:Mt:N?sn:Lt;_[K]>w[K]&&(le=nu(le));var te=nu(le),se=[];if(o&&se.push(V[T]<=0),l&&se.push(V[le]<=0,V[te]<=0),se.every(function(fe){return fe})){C=I,E=!1;break}O.set(I,se)}if(E)for(var q=h?3:1,x=function(pe){var he=k.find(function(be){var Ee=O.get(be);if(Ee)return Ee.slice(0,pe).every(function(We){return We})});if(he)return C=he,"break"},A=q;A>0;A--){var X=x(A);if(X==="break")break}t.placement!==C&&(t.modifiersData[r]._skip=!0,t.placement=C,t.reset=!0)}}const f_={name:"flip",enabled:!0,phase:"main",fn:c_,requiresIfExists:["offset"],data:{_skip:!1}};function i1(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function o1(e){return[Lt,un,sn,Mt].some(function(t){return e[t]>=0})}function d_(e){var t=e.state,n=e.name,r=t.rects.reference,i=t.rects.popper,o=t.modifiersData.preventOverflow,a=Al(t,{elementContext:"reference"}),l=Al(t,{altBoundary:!0}),s=i1(a,r),u=i1(l,i,o),c=o1(s),f=o1(u);t.modifiersData[n]={referenceClippingOffsets:s,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const p_={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:d_};function h_(e,t,n){var r=Wn(e),i=[Mt,Lt].indexOf(r)>=0?-1:1,o=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=o[0],l=o[1];return a=a||0,l=(l||0)*i,[Mt,un].indexOf(r)>=0?{x:l,y:a}:{x:a,y:l}}function m_(e){var t=e.state,n=e.options,r=e.name,i=n.offset,o=i===void 0?[0,0]:i,a=jS.reduce(function(c,f){return c[f]=h_(f,t.rects,o),c},{}),l=a[t.placement],s=l.x,u=l.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=s,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const g_={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:m_};function v_(e){var t=e.state,n=e.name;t.modifiersData[n]=JS({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const y_={name:"popperOffsets",enabled:!0,phase:"read",fn:v_,data:{}};function w_(e){return e==="x"?"y":"x"}function b_(e){var t=e.state,n=e.options,r=e.name,i=n.mainAxis,o=i===void 0?!0:i,a=n.altAxis,l=a===void 0?!1:a,s=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,h=n.tetherOffset,g=h===void 0?0:h,v=Al(t,{boundary:s,rootBoundary:u,padding:f,altBoundary:c}),m=Wn(t.placement),y=Co(t.placement),S=!y,k=Dm(m),_=w_(k),w=t.modifiersData.popperOffsets,O=t.rects.reference,E=t.rects.popper,C=typeof g=="function"?g(Object.assign({},t.rects,{placement:t.placement})):g,P=typeof C=="number"?{mainAxis:C,altAxis:C}:Object.assign({mainAxis:0,altAxis:0},C),I=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,T={x:0,y:0};if(!!w){if(o){var N,B=k==="y"?Lt:Mt,K=k==="y"?sn:un,V=k==="y"?"height":"width",le=w[k],te=le+v[B],se=le-v[K],q=p?-E[V]/2:0,x=y===bo?O[V]:E[V],A=y===bo?-E[V]:-O[V],X=t.elements.arrow,fe=p&&X?Nm(X):{width:0,height:0},pe=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:HS(),he=pe[B],be=pe[K],Ee=Ja(0,O[V],fe[V]),We=S?O[V]/2-q-Ee-he-P.mainAxis:x-Ee-he-P.mainAxis,gn=S?-O[V]/2+q+Ee+be+P.mainAxis:A+Ee+be+P.mainAxis,qr=t.elements.arrow&&Kl(t.elements.arrow),rf=qr?k==="y"?qr.clientTop||0:qr.clientLeft||0:0,$o=(N=I==null?void 0:I[k])!=null?N:0,of=le+We-$o-rf,af=le+gn-$o,ss=Ja(p?Yu(te,of):te,le,p?hi(se,af):se);w[k]=ss,T[k]=ss-le}if(l){var Vo,us=k==="x"?Lt:Mt,cs=k==="x"?sn:un,Xn=w[_],Kr=_==="y"?"height":"width",Go=Xn+v[us],fs=Xn-v[cs],Jo=[Lt,Mt].indexOf(m)!==-1,ds=(Vo=I==null?void 0:I[_])!=null?Vo:0,ps=Jo?Go:Xn-O[Kr]-E[Kr]-ds+P.altAxis,hs=Jo?Xn+O[Kr]+E[Kr]-ds-P.altAxis:fs,L=p&&Jo?HT(ps,Xn,hs):Ja(p?ps:Go,Xn,p?hs:fs);w[_]=L,T[_]=L-Xn}t.modifiersData[r]=T}}const S_={name:"preventOverflow",enabled:!0,phase:"main",fn:b_,requiresIfExists:["offset"]};function x_(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function E_(e){return e===Pn(e)||!on(e)?Rm(e):x_(e)}function C_(e){var t=e.getBoundingClientRect(),n=xo(t.width)/e.offsetWidth||1,r=xo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function A_(e,t,n){n===void 0&&(n=!1);var r=on(t),i=on(t)&&C_(t),o=Xr(t),a=Eo(e,i),l={scrollLeft:0,scrollTop:0},s={x:0,y:0};return(r||!r&&!n)&&((Vn(t)!=="body"||Lm(o))&&(l=E_(t)),on(t)?(s=Eo(t,!0),s.x+=t.clientLeft,s.y+=t.clientTop):o&&(s.x=Fm(o))),{x:a.left+l.scrollLeft-s.x,y:a.top+l.scrollTop-s.y,width:a.width,height:a.height}}function k_(e){var t=new Map,n=new Set,r=[];e.forEach(function(o){t.set(o.name,o)});function i(o){n.add(o.name);var a=[].concat(o.requires||[],o.requiresIfExists||[]);a.forEach(function(l){if(!n.has(l)){var s=t.get(l);s&&i(s)}}),r.push(o)}return e.forEach(function(o){n.has(o.name)||i(o)}),r}function O_(e){var t=k_(e);return BT.reduce(function(n,r){return n.concat(t.filter(function(i){return i.phase===r}))},[])}function P_(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function I_(e){var t=e.reduce(function(n,r){var i=n[r.name];return n[r.name]=i?Object.assign({},i,r,{options:Object.assign({},i.options,r.options),data:Object.assign({},i.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var a1={placement:"bottom",modifiers:[],strategy:"absolute"};function l1(){for(var e=arguments.length,t=new Array(e),n=0;n{const[l,s]=F.useState(null),[u,c]=F.useState(null),[f,d]=F.useState(null),{styles:p,attributes:h,update:g}=U_(l,u,{placement:e,modifiers:[{name:"arrow",options:{element:f}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),v=F.useMemo(()=>Q(U({},p.popper),{backgroundColor:i}),[i,p.popper]),m=F.useMemo(()=>{let S;function k(){S=setTimeout(()=>{g==null||g(),u==null||u.setAttribute("data-show","")},o)}function _(){clearTimeout(S),u==null||u.removeAttribute("data-show")}return{[t==="hover"?"onMouseEnter":"onClick"]:()=>k(),onMouseLeave:()=>_(),onPointerDown:()=>_()}},[o,u,t,g]),y=typeof n!="string"?n:r?b(Tm,{className:_s.popoverMarkdown,children:n}):b("div",{className:_s.textContent,children:n});return M(Ke,{children:[F.cloneElement(a,Q(U({},m),{ref:s})),M("div",Q(U({ref:c,className:_s.popover,style:v},h.popper),{children:[y,b("div",{ref:d,className:_s.popperArrow,style:p.arrow})]}))]})},Mm=l=>{var s=l,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:i,openDelayMs:o=0}=s,a=vn(s,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);return b(QS,{placement:t,showOn:n,popoverContent:r,bgColor:i,openDelayMs:o,triggerEl:b("button",Q(U({},a),{children:e}))})},H_="_infoIcon_15ri6_1",$_="_container_15ri6_10",V_="_header_15ri6_15",G_="_info_15ri6_1",J_="_unit_15ri6_27",Q_="_description_15ri6_31",Ui={infoIcon:H_,container:$_,header:V_,info:G_,unit:J_,description:Q_},XS=({units:e})=>b(Mm,{className:Ui.infoIcon,popoverContent:b(X_,{units:e}),openDelayMs:500,placement:"auto",children:b(Yk,{})});function X_({units:e}){return M("div",{className:Ui.container,children:[b("div",{className:Ui.header,children:"CSS size options"}),b("div",{className:Ui.info,children:e.map(t=>M(F.Fragment,{children:[b("div",{className:Ui.unit,children:t}),b("div",{className:Ui.description,children:q_[t]})]},t))})]})}const q_={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},K_="_wrapper_13r28_1",Z_="_unitSelector_13r28_10",Hu={wrapper:K_,unitSelector:Z_};function e6(e){const[t,n]=H.exports.useState(eS(e)),r=H.exports.useCallback(o=>{if(o===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:o})},[t.unit]),i=H.exports.useCallback(o=>{n(a=>{const l=a.unit;return o==="auto"?{unit:o,count:null}:l==="auto"?{unit:o,count:qS[o]}:{unit:o,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:i}}const qS={fr:1,px:10,rem:1,"%":100};function t6({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:i,updateCount:o,updateUnit:a}=e6(e!=null?e:"auto"),l=F.useMemo(()=>xm(u=>{t(u)},500),[t]);if(F.useEffect(()=>{const u=wr(i);if(e!==u)return l(wr(i)),()=>l.cancel()},[i,l,e]),e===void 0&&!r)return null;const s=r||i.count===null;return M("div",{className:Hu.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(wr(i))},children:[b(Sm,{ariaLabel:"value-count",value:s?void 0:i.count,disabled:s,onChange:o,min:0}),b("select",{className:Hu.unitSelector,"aria-label":"value-unit",name:"value-unit",value:i.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>b("option",{value:u,children:u},u))}),b(XS,{units:n})]})}function Gn(l){var s=l,{name:e,label:t,onChange:n,optional:r,value:i,defaultValue:o="10px"}=s,a=vn(s,["name","label","onChange","optional","value","defaultValue"]);const u=Oi(n),c=i===void 0;return b(bm,{name:e,label:t,optional:r,isDisabled:c,defaultValue:o,width_setting:"fit",mainInput:b(t6,Q(U({value:i!=null?i:o},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function n6({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:i}=eS(e),o=F.useCallback(s=>{if(s===void 0){if(i!=="auto")throw new Error("Undefined count with auto units");t(wr({unit:i,count:null}));return}if(i==="auto"){console.error("How did you change the count of an auto unit?");return}t(wr({unit:i,count:s}))},[t,i]),a=F.useCallback(s=>{if(s==="auto"){t(wr({unit:s,count:null}));return}if(i==="auto"){t(wr({unit:s,count:qS[s]}));return}t(wr({unit:s,count:r}))},[r,t,i]),l=r===null;return M("div",{className:Hu.wrapper,"aria-label":"Css Unit Input",children:[b(Sm,{ariaLabel:"value-count",value:l?void 0:r,disabled:l,onChange:o,min:0}),b("select",{className:Hu.unitSelector,"aria-label":"value-unit",name:"value-unit",value:i,onChange:s=>a(s.target.value),children:n.map(s=>b("option",{value:s,children:s},s))}),b(XS,{units:n})]})}const r6="_tractInfoDisplay_9993b_1",i6="_sizeWidget_9993b_61",o6="_hoverListener_9993b_88",a6="_buttons_9993b_108",l6="_tractAddButton_9993b_121",s6="_deleteButton_9993b_122",Gi={tractInfoDisplay:r6,sizeWidget:i6,hoverListener:o6,buttons:a6,tractAddButton:l6,deleteButton:s6},u6=["fr","px"];function c6({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:i}){const o=H.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=H.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),l=H.exports.useCallback(()=>a(t),[a,t]),s=H.exports.useCallback(()=>a(t+1),[a,t]),u=H.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return M("div",{className:Gi.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[b("div",{className:Gi.hoverListener}),M("div",{className:Gi.sizeWidget,onClick:d6,children:[M("div",{className:Gi.buttons,children:[b(s1,{dir:e,onClick:l}),b(f6,{onClick:u,deletionConflicts:i}),b(s1,{dir:e,onClick:s})]}),b(n6,{value:n,units:u6,onChange:o})]})]})}const KS=200;function f6({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return b(Mm,{className:Gi.deleteButton,onClick:ZS(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:KS,children:b(pm,{})})}function s1({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return b(Mm,{className:Gi.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:ZS(t),openDelayMs:KS,children:b(Vb,{})})}function ZS(e){return function(t){t.currentTarget.blur(),e==null||e()}}function u1({dir:e,sizes:t,areas:n,onUpdate:r}){const i=H.exports.useCallback(({dir:o,index:a})=>Zb(n,{dir:o,index:a+1}),[n]);return b(Ke,{children:t.map((o,a)=>b(c6,{index:a,dir:e,size:o,onUpdate:r,deletionConflicts:i({dir:e,index:a})},e+a))})}function d6(e){e.stopPropagation()}const p6="_columnSizer_3i83d_1",h6="_rowSizer_3i83d_2",c1={columnSizer:p6,rowSizer:h6};function f1({dir:e,index:t,onStartDrag:n}){return b("div",{className:e==="rows"?c1.rowSizer:c1.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function m6(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const $u=40,g6=.15,ex=e=>t=>Math.round(t/e)*e,v6=5,Bm=ex(v6),y6=.01,w6=ex(y6),d1=e=>Number(e.toFixed(4));function b6(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const i=w6(e*t),o=n.count+i,a=r.count-i;return(i<0?o/a:a/o)=o.length?null:o[u];if(c==="auto"||f==="auto"){const h=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=h[s],o[s]=c),f==="auto"&&(f=h[u],o[u]=f),r.style[i]=h.join(" ")}const d=C6(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=Q(U({dir:t,mouseStart:nx(e,t),originalSizes:o,currentSizes:[...o],beforeIndex:s,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=A6({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function O6({mousePosition:e,drag:t,container:n}){const i=nx(e,t.dir)-t.mouseStart,o=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=x6(i,t);break;case"after-pixel":a=E6(i,t);break;case"both-pixel":a=S6(i,t);break;case"both-relative":a=b6(i,t);break}a!=="no-change"&&(a.beforeSize&&(o[t.beforeIndex]=a.beforeSize),a.afterSize&&(o[t.afterIndex]=a.afterSize),t.currentSizes=o,t.dir==="cols"?n.style.gridTemplateColumns=o.join(" "):n.style.gridTemplateRows=o.join(" "))}function P6(e){return e.match(/[0-9|.]+px/)!==null}function tx(e){return e.match(/[0-9|.]+fr/)!==null}function Vu(e){if(tx(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(P6(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function nx(e,t){return t==="rows"?e.clientY:e.clientX}function I6(e){return e.some(t=>tx(t))}function T6(e){return e.some(t=>t==="auto")}function p1(e,t){const n=Math.abs(t-e)+1,r=ee+o*r)}function _6({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(i=>`"${i.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function h1(e){return e.split(" ")}function N6(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function D6(e){const t=h1(e.style.gridTemplateRows),n=h1(e.style.gridTemplateColumns),r=N6(e.style.gridTemplateAreas),i=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:i}}function R6({containerRef:e,onDragEnd:t}){return F.useCallback(({e:r,dir:i,index:o})=>{const a=m6(e,"How are you dragging on an element without a container?");r.preventDefault();const l=k6({mousePosition:r,dir:i,index:o,container:a}),{beforeIndex:s,afterIndex:u}=l,c=m1(a,{dir:i,index:s,size:l.currentSizes[s]}),f=m1(a,{dir:i,index:u,size:l.currentSizes[u]});F6(a,l.dir,{move:d=>{O6({mousePosition:d,drag:l,container:a}),c.update(l.currentSizes[s]),f.update(l.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(D6(a))}})},[e,t])}function m1(e,{dir:t,index:n,size:r}){const i=document.createElement("div"),o=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(i.style,o,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,i.appendChild(a),e.appendChild(i),{remove:()=>i.remove(),update:l=>{a.innerHTML=l}}}function F6(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const i=()=>{o(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",i),r.addEventListener("mouseleave",i);function o(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",i),r.removeEventListener("mouseleave",i),r.remove()}}const L6="1fr";function M6(i){var o=i,{className:e,children:t,onNewLayout:n}=o,r=vn(o,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:l}=r,s=H.exports.useRef(null),u=_6(r),c=p1(2,l.length),f=p1(2,a.length),d=R6({containerRef:s,onDragEnd:n}),p=[tP.ResizableGrid];e&&p.push(e);const h=H.exports.useCallback(v=>{switch(v.type){case"ADD":return qb(r,{afterIndex:v.index,dir:v.dir,size:L6});case"RESIZE":return B6(r,v);case"DELETE":return Kb(r,v)}},[r]),g=H.exports.useCallback(v=>n(h(v)),[h,n]);return M("div",{className:p.join(" "),ref:s,style:u,children:[c.map(v=>b(f1,{dir:"cols",index:v,onStartDrag:d},"cols"+v)),f.map(v=>b(f1,{dir:"rows",index:v,onStartDrag:d},"rows"+v)),t,b(u1,{dir:"cols",sizes:l,areas:r.areas,onUpdate:g}),b(u1,{dir:"rows",sizes:a,areas:r.areas,onUpdate:g})]})}function B6(e,{dir:t,index:n,size:r}){return zo(e,i=>{i[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function U6(e,r){var i=r,{name:t}=i,n=vn(i,["name"]);const{rowStart:o,colStart:a}=n,l="rowEnd"in n?n.rowEnd:o+n.rowSpan-1,s="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Fc(e.areas);for(let c=0;c=o-1&&c=a-1&&d{for(let i of n)z6(r,i)})}function j6(e,t){return rx(e,t)}function W6(e,t,n){return zo(e,({areas:r})=>{const{numRows:i,numCols:o}=Gl(r);for(let a=0;a{const o=n==="rows"?"row_sizes":"col_sizes";i[o][t-1]=r})}function H6(e,{item_a:t,item_b:n}){return t===n?e:zo(e,r=>{const{n_rows:i,n_cols:o}=$6(r.areas);let a=!1,l=!1;for(let s=0;s{a.current&&r&&setTimeout(()=>{var l;return(l=a==null?void 0:a.current)==null?void 0:l.focus()},1)},[r]),b("input",{ref:a,className:Q6.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:o,onChange:l=>n(l.target.value),disabled:i})}function Ae({name:e,label:t,value:n,placeholder:r,onChange:i,autoFocus:o=!1,optional:a=!1,defaultValue:l="my-text"}){const s=Oi(i),u=n===void 0,c=F.useRef(null);return F.useEffect(()=>{c.current&&o&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[o]),b(bm,{name:e,label:t,optional:a,isDisabled:u,defaultValue:l,width_setting:"full",mainInput:b(X6,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>s({name:e,value:f}),autoFocus:o,disabled:u})})}const q6="_container_17s66_1",K6="_elementsPanel_17s66_28",Z6="_propertiesPanel_17s66_37",e5="_editorHolder_17s66_52",t5="_titledPanel_17s66_65",n5="_panelTitleHeader_17s66_77",r5="_header_17s66_86",i5="_rightSide_17s66_94",o5="_divider_17s66_115",a5="_title_17s66_65",l5="_shinyLogo_17s66_126",ix={container:q6,elementsPanel:K6,propertiesPanel:Z6,editorHolder:e5,titledPanel:t5,panelTitleHeader:n5,header:r5,rightSide:i5,divider:o5,title:a5,shinyLogo:l5},s5="_portalHolder_18ua3_1",u5="_portalModal_18ua3_11",c5="_title_18ua3_21",f5="_body_18ua3_25",d5="_portalForm_18ua3_30",p5="_portalFormInputs_18ua3_35",h5="_portalFormFooter_18ua3_42",m5="_validationMsg_18ua3_48",g5="_infoText_18ua3_53",Ns={portalHolder:s5,portalModal:u5,title:c5,body:f5,portalForm:d5,portalFormInputs:p5,portalFormFooter:h5,validationMsg:m5,infoText:g5},v5=({children:e,el:t="div"})=>{const[n]=H.exports.useState(document.createElement(t));return H.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Pl.exports.createPortal(e,n)},ox=({children:e,title:t,label:n,onConfirm:r,onCancel:i})=>b(v5,{children:b("div",{className:Ns.portalHolder,onClick:()=>i(),onKeyDown:o=>{o.key==="Escape"&&i()},children:M("div",{className:Ns.portalModal,onClick:o=>o.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?b("div",{className:Ns.title+" "+ix.panelTitleHeader,children:t}):null,b("div",{className:Ns.body,children:e})]})})}),y5="_portalHolder_18ua3_1",w5="_portalModal_18ua3_11",b5="_title_18ua3_21",S5="_body_18ua3_25",x5="_portalForm_18ua3_30",E5="_portalFormInputs_18ua3_35",C5="_portalFormFooter_18ua3_42",A5="_validationMsg_18ua3_48",k5="_infoText_18ua3_53",fa={portalHolder:y5,portalModal:w5,title:b5,body:S5,portalForm:x5,portalFormInputs:E5,portalFormFooter:C5,validationMsg:A5,infoText:k5};function O5({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[i,o]=F.useState(r),[a,l]=F.useState(null),s=F.useCallback(c=>{c&&c.preventDefault();const f=P5({name:i,existingAreaNames:n});if(f){l(f);return}t(i)},[n,i,t]),u=F.useCallback(({value:c})=>{l(null),o(c!=null?c:r)},[r]);return M(ox,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(i),onCancel:e,children:[b("form",{className:fa.portalForm,onSubmit:s,children:M("div",{className:fa.portalFormInputs,children:[b("span",{className:fa.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),b(Ae,{label:"Name of new grid area",name:"New-Item-Name",value:i,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?b("div",{className:fa.validationMsg,children:a}):null]})}),M("div",{className:fa.portalFormFooter,children:[b(Ft,{variant:"delete",onClick:e,children:"Cancel"}),b(Ft,{onClick:()=>s(),children:"Done"})]})]})}function P5({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const I5="_container_1hvsg_1",T5={container:I5},ax=F.createContext(null),_5=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:i,compRef:o})=>{const a=Jr(),l=Dx(),{onClick:s}=r,{uniqueAreas:u}=qO(e),_=e,{areas:c}=_,f=vn(_,["areas"]),d=w=>{a(_x({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:U(U({},f),w)}}))},p=F.useMemo(()=>wm(c),[c]),[h,g]=F.useState(null),v=w=>{const{node:O,currentPath:E,pos:C}=w,P=E!==void 0,I=wp.includes(O.uiName);if(P&&I&&"area"in O.uiArguments&&O.uiArguments.area){const T=O.uiArguments.area;m({type:"MOVE_ITEM",name:T,pos:C});return}g(w)},m=w=>{d(Um(e,w))},y=u.map(w=>b($O,{area:w,areas:c,gridLocation:p.get(w),onNewPos:O=>m({type:"MOVE_ITEM",name:w,pos:O})},w)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},k=(w,{node:O,currentPath:E,pos:C})=>{if(wp.includes(O.uiName)){const P=Q(U({},O.uiArguments),{area:w});O.uiArguments=P}else O={uiName:"gridlayout::grid_card",uiArguments:{area:w},uiChildren:[O]};l({parentPath:[],node:O,currentPath:E}),m({type:"ADD_ITEM",name:w,pos:C}),g(null)};return M(ax.Provider,{value:m,children:[b("div",{ref:o,style:S,className:T5.container,onClick:s,draggable:!1,onDragStart:()=>{},children:M(M6,Q(U({},e),{onNewLayout:d,children:[XO(c).map(({row:w,col:O})=>b(JO,{gridRow:w,gridColumn:O,onDroppedNode:v},BO({row:w,col:O}))),t==null?void 0:t.map((w,O)=>b(mm,U({path:[...i.path,O]},w),i.path.join(".")+O)),n,y]}))}),h?b(O5,{info:h,onCancel:()=>g(null),onDone:w=>k(w,h),existingAreaNames:u}):null]})};function N5(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function D5(){return F.useContext(ax)}function zm({containerRef:e,path:t,area:n}){const r=D5(),i=F.useCallback(({node:a,currentPath:l})=>l===void 0||!wp.includes(a.uiName)?!1:ym(l,t),[t]),o=F.useCallback(a=>{var s;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const l=(s=a.node.uiArguments.area)!=null?s:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:l})},[n,r]);vm({watcherRef:e,getCanAcceptDrop:i,onDrop:o,canAcceptDropClass:Wt.availableToSwap,hoveringOverClass:Wt.hoveringOverSwap})}const R5=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:i},children:o,eventHandlers:a,compRef:l})=>{const s=r.length>0;return zm({containerRef:l,area:e,path:i}),M(gm,{className:Wt.container+" "+(n?Wt.withTitle:""),ref:l,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?b(iO,{className:Wt.panelTitle,children:n}):null,M("div",{className:Wt.contentHolder,"data-alignment":"top",children:[b(g1,{index:0,parentPath:i,numChildren:r.length}),s?r==null?void 0:r.map((u,c)=>M(F.Fragment,{children:[b(mm,U({path:[...i,c]},u)),b(g1,{index:c+1,numChildren:r.length,parentPath:i})]},i.join(".")+c)):b(L5,{path:i})]}),o]})};function g1({index:e,numChildren:t,parentPath:n}){const r=F.useRef(null);EO({watcherRef:r,positionInChildren:e,parentPath:n});const i=F5(e,t);return b("div",{ref:r,className:Wt.dropWatcher+" "+i,"aria-label":"drop watcher"})}function F5(e,t){return e===0&&t===0?Wt.onlyDropWatcher:e===0?Wt.firstDropWatcher:e===t?Wt.lastDropWatcher:Wt.middleDropWatcher}function L5({path:e}){return M("div",{className:Wt.emptyGridCard,children:[b("span",{className:Wt.emptyMessage,children:"Empty grid card"}),b(Yb,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const M5=({settings:e})=>{var t;return M(Ke,{children:[b(Ae,{name:"area",label:"Name of grid area",value:e.area}),b(Ae,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),b(Gn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},B5={area:"default-area",item_gap:"12px"},U5={title:"Grid Card",UiComponent:R5,SettingsComponent:M5,acceptsChildren:!0,defaultSettings:B5,iconSrc:Ik,category:"gridlayout",description:"The standard element for placing elements on the grid in a simple card container."},lx="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function z5(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const sx=({type:e,name:t,className:n})=>M("code",{className:n,children:[M("span",{style:{opacity:.55},children:[e,"$"]}),b("span",{children:t})]}),j5="_container_1rlbk_1",W5="_plotPlaceholder_1rlbk_5",Y5="_label_1rlbk_19",Dp={container:j5,plotPlaceholder:W5,label:Y5};function ux({outputId:e}){const t=H.exports.useRef(null),n=H5(t),r=n===null?100:Math.min(n.width,n.height);return M("div",{ref:t,className:Dp.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[b(sx,{className:Dp.label,type:"output",name:e}),b(z5,{size:`calc(${r}px - 80px)`})]})}function H5(e){const[t,n]=H.exports.useState(null);return H.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(i=>{if(!e.current)return;const{offsetHeight:o,offsetWidth:a}=e.current;n({width:a,height:o})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const $5="_gridCardPlot_1a94v_1",V5={gridCardPlot:$5},G5=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:i,compRef:o})=>(zm({containerRef:o,area:t,path:r}),M(gm,Q(U({ref:o,style:{gridArea:t},className:V5.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},i),{children:[b(ux,{outputId:e!=null?e:t}),n]}))),J5=({settings:{area:e,outputId:t}})=>M(Ke,{children:[b(Ae,{name:"area",label:"Name of grid area",value:e}),b(Ae,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),Q5={title:"Grid Plot Card",UiComponent:G5,SettingsComponent:J5,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:lx,category:"gridlayout",description:"A wrapper for `shiny::plotOutput()` that uses `gridlayout`-friendly sizing defaults. \n For when you want to have a grid area filled entirely with a single plot."},X5="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",q5="_textPanel_525i2_1",K5={textPanel:q5},Z5=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:i},eventHandlers:o,compRef:a})=>(zm({containerRef:a,area:t,path:i}),M(gm,Q(U({ref:a,className:K5.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},o),{children:[b("h1",{children:e}),r]}))),eN="_checkboxInput_12wa8_1",tN="_checkboxLabel_12wa8_10",v1={checkboxInput:eN,checkboxLabel:tN};function cx({name:e,label:t,value:n,onChange:r,disabled:i,noLabel:o}){const a=Oi(r),l=o?void 0:t!=null?t:e,s=`${e}-checkbox-input`,u=M(Ke,{children:[b("input",{className:v1.checkboxInput,id:s,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:i,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),b("label",{className:v1.checkboxLabel,htmlFor:s,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return l!==void 0?M("div",{className:lr.container,children:[M("label",{className:lr.label,children:[l,":"]}),u]}):u}const nN="_radioContainer_1regb_1",rN="_option_1regb_15",iN="_radioInput_1regb_22",oN="_radioLabel_1regb_26",aN="_icon_1regb_41",da={radioContainer:nN,option:rN,radioInput:iN,radioLabel:oN,icon:aN};function lN({name:e,label:t,options:n,currentSelection:r,onChange:i,optionsPerColumn:o}){const a=Object.keys(n),l=Oi(i),s=H.exports.useMemo(()=>({gridTemplateColumns:o?`repeat(${o}, 1fr)`:void 0}),[o]);return M("div",{className:lr.container,"data-full-width":"true",children:[M("label",{htmlFor:e,className:lr.label,children:[t!=null?t:e,":"]}),b("fieldset",{className:da.radioContainer,id:e,style:s,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return M("div",{className:da.option,children:[b("input",{className:da.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>l({name:e,value:u}),checked:u===r}),b("label",{className:da.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?b("img",{src:c,alt:f,className:da.icon}):c})]},u)})})]})}const sN={start:{icon:Ub,label:"left"},center:{icon:mp,label:"center"},end:{icon:zb,label:"right"}},uN=({settings:e})=>{var t;return M(Ke,{children:[b(Ae,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),b(Ae,{name:"content",label:"Panel content",value:e.content}),b(lN,{name:"alignment",label:"Text Alignment",options:sN,currentSelection:e.alignment,optionsPerColumn:3}),b(cx,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},cN={title:"Grid Text Card",UiComponent:Z5,SettingsComponent:uN,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:X5,category:"gridlayout",description:"A grid card that contains just text that is vertically centered within the panel. Useful for app titles or displaying text-based statistics."},fN=({settings:e})=>b(Ke,{children:b(Gn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function jm(e){return e.uiChildren!==void 0}function Fr(e,t){let n=e,r;for(r of t){if(!jm(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function dN(e,{path:t,node:n}){var l;const r=fx({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:i}=r,o=N5(i.uiChildren)[t[0]],a=(l=n.uiArguments.area)!=null?l:Hn;o!==a&&(i.uiArguments=Um(i.uiArguments,{type:"RENAME_ITEM",oldName:o,newName:a}))}function pN(e,{path:t}){const n=fx({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:i}=n,o=i.uiArguments.area;if(!o){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Um(r.uiArguments,{type:"REMOVE_ITEM",name:o})}function fx({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=Fr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const hN={title:"Grid Page",UiComponent:_5,SettingsComponent:fN,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:dN,DELETE_NODE:pN},category:"gridlayout"},mN="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",gN=({settings:e})=>{const{inputId:t,label:n}=e;return M(Ke,{children:[b(Ae,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),b(Ae,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},vN="_container_tyghz_1",yN={container:vN},wN=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:i="My Action Button",width:o}=e;return M("div",Q(U({className:yN.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[b(Ft,{style:o?{width:o}:void 0,children:i}),t]}))},bN={title:"Action Button",UiComponent:wN,SettingsComponent:gN,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:mN,category:"Inputs",description:"Creates an action button whose value is initially zero, and increments by one each time it is pressed."},SN="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",xN="_categoryDivider_8d7ls_1",EN={categoryDivider:xN};function Wo({category:e}){return b("div",{className:EN.categoryDivider,children:b("span",{children:e?`${e}:`:null})})}function CN(e){return Bt({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var dx={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function y1(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Jn(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function ON(e,t){if(e==null)return{};var n=kN(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function PN(e){return IN(e)||TN(e)||_N(e)||NN()}function IN(e){if(Array.isArray(e))return Rp(e)}function TN(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function _N(e,t){if(!!e){if(typeof e=="string")return Rp(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Rp(e,t)}}function Rp(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function RN(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function xn(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Gu(e,t):Gu(e,t))||r&&e===n)return e;if(e===n)break}while(e=RN(e))}return null}var b1=/\s+/g;function ze(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(b1," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(b1," ")}}function J(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function mi(e,t){var n="";if(typeof e=="string")n=e;else do{var r=J(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var i=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return i&&new i(n)}function gx(e,t,n){if(e){var r=e.getElementsByTagName(t),i=0,o=r.length;if(n)for(;i=o:a=i<=o,!a)return r;if(r===Yn())break;r=Ar(r,!1)}return!1}function Ao(e,t,n,r){for(var i=0,o=0,a=e.children;o2&&arguments[2]!==void 0?arguments[2]:{},i=r.evt,o=ON(r,jN);es.pluginEvent.bind(ee)(t,n,Jn({dragEl:W,parentEl:Ye,ghostEl:ae,rootEl:Re,nextEl:oi,lastDownEl:ou,cloneEl:Ue,cloneHidden:br,dragStarted:_a,putSortable:at,activeSortable:ee.active,originalEvent:i,oldIndex:Ji,oldDraggableIndex:Ka,newIndex:jt,newDraggableIndex:gr,hideGhostForTarget:xx,unhideGhostForTarget:Ex,cloneNowHidden:function(){br=!0},cloneNowShown:function(){br=!1},dispatchSortableEvent:function(l){wt({sortable:n,name:l,originalEvent:i})}},o))};function wt(e){Ta(Jn({putSortable:at,cloneEl:Ue,targetEl:W,rootEl:Re,oldIndex:Ji,oldDraggableIndex:Ka,newIndex:jt,newDraggableIndex:gr},e))}var W,Ye,ae,Re,oi,ou,Ue,br,Ji,jt,Ka,gr,Ds,at,zi=!1,Ju=!1,Qu=[],Zr,wn,id,od,C1,A1,_a,Fi,Za,el=!1,Rs=!1,au,ct,ad=[],Fp=!1,Xu=[],Kc=typeof document!="undefined",Fs=px,k1=Zl||dr?"cssFloat":"float",WN=Kc&&!hx&&!px&&"draggable"in document.createElement("div"),wx=function(){if(!!Kc){if(dr)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),bx=function(t,n){var r=J(t),i=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),o=Ao(t,0,n),a=Ao(t,1,n),l=o&&J(o),s=a&&J(a),u=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Me(o).width,c=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Me(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(o&&l.float&&l.float!=="none"){var f=l.float==="left"?"left":"right";return a&&(s.clear==="both"||s.clear===f)?"vertical":"horizontal"}return o&&(l.display==="block"||l.display==="flex"||l.display==="table"||l.display==="grid"||u>=i&&r[k1]==="none"||a&&r[k1]==="none"&&u+c>i)?"vertical":"horizontal"},YN=function(t,n,r){var i=r?t.left:t.top,o=r?t.right:t.bottom,a=r?t.width:t.height,l=r?n.left:n.top,s=r?n.right:n.bottom,u=r?n.width:n.height;return i===l||o===s||i+a/2===l+u/2},HN=function(t,n){var r;return Qu.some(function(i){var o=i[ht].options.emptyInsertThreshold;if(!(!o||Wm(i))){var a=Me(i),l=t>=a.left-o&&t<=a.right+o,s=n>=a.top-o&&n<=a.bottom+o;if(l&&s)return r=i}}),r},Sx=function(t){function n(o,a){return function(l,s,u,c){var f=l.options.group.name&&s.options.group.name&&l.options.group.name===s.options.group.name;if(o==null&&(a||f))return!0;if(o==null||o===!1)return!1;if(a&&o==="clone")return o;if(typeof o=="function")return n(o(l,s,u,c),a)(l,s,u,c);var d=(a?l:s).options.group.name;return o===!0||typeof o=="string"&&o===d||o.join&&o.indexOf(d)>-1}}var r={},i=t.group;(!i||iu(i)!="object")&&(i={name:i}),r.name=i.name,r.checkPull=n(i.pull,!0),r.checkPut=n(i.put),r.revertClone=i.revertClone,t.group=r},xx=function(){!wx&&ae&&J(ae,"display","none")},Ex=function(){!wx&&ae&&J(ae,"display","")};Kc&&!hx&&document.addEventListener("click",function(e){if(Ju)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Ju=!1,!1},!0);var ei=function(t){if(W){t=t.touches?t.touches[0]:t;var n=HN(t.clientX,t.clientY);if(n){var r={};for(var i in t)t.hasOwnProperty(i)&&(r[i]=t[i]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[ht]._onDragOver(r)}}},$N=function(t){W&&W.parentNode[ht]._isOutsideThisEl(t.target)};function ee(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=cn({},t),e[ht]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return bx(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,l){a.setData("Text",l.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:ee.supportPointer!==!1&&"PointerEvent"in window&&!Xa,emptyInsertThreshold:5};es.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);Sx(t);for(var i in this)i.charAt(0)==="_"&&typeof this[i]=="function"&&(this[i]=this[i].bind(this));this.nativeDraggable=t.forceFallback?!1:WN,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ve(e,"pointerdown",this._onTapStart):(ve(e,"mousedown",this._onTapStart),ve(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ve(e,"dragover",this),ve(e,"dragenter",this)),Qu.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),cn(this,BN())}ee.prototype={constructor:ee,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Fi=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,W):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,i=this.options,o=i.preventOnFilter,a=t.type,l=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,s=(l||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||s,c=i.filter;if(ZN(r),!W&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||i.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&Xa&&s&&s.tagName.toUpperCase()==="SELECT")&&(s=xn(s,i.draggable,r,!1),!(s&&s.animated)&&ou!==s)){if(Ji=He(s),Ka=He(s,i.draggable),typeof c=="function"){if(c.call(this,t,s,this)){wt({sortable:n,rootEl:u,name:"filter",targetEl:s,toEl:r,fromEl:r}),Ct("filter",n,{evt:t}),o&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=xn(u,f.trim(),r,!1),f)return wt({sortable:n,rootEl:f,name:"filter",targetEl:s,fromEl:r,toEl:r}),Ct("filter",n,{evt:t}),!0}),c)){o&&t.cancelable&&t.preventDefault();return}i.handle&&!xn(u,i.handle,r,!1)||this._prepareDragStart(t,l,s)}}},_prepareDragStart:function(t,n,r){var i=this,o=i.el,a=i.options,l=o.ownerDocument,s;if(r&&!W&&r.parentNode===o){var u=Me(r);if(Re=o,W=r,Ye=W.parentNode,oi=W.nextSibling,ou=r,Ds=a.group,ee.dragged=W,Zr={target:W,clientX:(n||t).clientX,clientY:(n||t).clientY},C1=Zr.clientX-u.left,A1=Zr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,W.style["will-change"]="all",s=function(){if(Ct("delayEnded",i,{evt:t}),ee.eventCanceled){i._onDrop();return}i._disableDelayedDragEvents(),!w1&&i.nativeDraggable&&(W.draggable=!0),i._triggerDragStart(t,n),wt({sortable:i,name:"choose",originalEvent:t}),ze(W,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){gx(W,c.trim(),ld)}),ve(l,"dragover",ei),ve(l,"mousemove",ei),ve(l,"touchmove",ei),ve(l,"mouseup",i._onDrop),ve(l,"touchend",i._onDrop),ve(l,"touchcancel",i._onDrop),w1&&this.nativeDraggable&&(this.options.touchStartThreshold=4,W.draggable=!0),Ct("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(Zl||dr))){if(ee.eventCanceled){this._onDrop();return}ve(l,"mouseup",i._disableDelayedDrag),ve(l,"touchend",i._disableDelayedDrag),ve(l,"touchcancel",i._disableDelayedDrag),ve(l,"mousemove",i._delayedDragTouchMoveHandler),ve(l,"touchmove",i._delayedDragTouchMoveHandler),a.supportPointer&&ve(l,"pointermove",i._delayedDragTouchMoveHandler),i._dragStartTimer=setTimeout(s,a.delay)}else s()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){W&&ld(W),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;de(t,"mouseup",this._disableDelayedDrag),de(t,"touchend",this._disableDelayedDrag),de(t,"touchcancel",this._disableDelayedDrag),de(t,"mousemove",this._delayedDragTouchMoveHandler),de(t,"touchmove",this._delayedDragTouchMoveHandler),de(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ve(document,"pointermove",this._onTouchMove):n?ve(document,"touchmove",this._onTouchMove):ve(document,"mousemove",this._onTouchMove):(ve(W,"dragend",this),ve(Re,"dragstart",this._onDragStart));try{document.selection?lu(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(zi=!1,Re&&W){Ct("dragStarted",this,{evt:n}),this.nativeDraggable&&ve(document,"dragover",$N);var r=this.options;!t&&ze(W,r.dragClass,!1),ze(W,r.ghostClass,!0),ee.active=this,t&&this._appendGhost(),wt({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(wn){this._lastX=wn.clientX,this._lastY=wn.clientY,xx();for(var t=document.elementFromPoint(wn.clientX,wn.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(wn.clientX,wn.clientY),t!==n);)n=t;if(W.parentNode[ht]._isOutsideThisEl(t),n)do{if(n[ht]){var r=void 0;if(r=n[ht]._onDragOver({clientX:wn.clientX,clientY:wn.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);Ex()}},_onTouchMove:function(t){if(Zr){var n=this.options,r=n.fallbackTolerance,i=n.fallbackOffset,o=t.touches?t.touches[0]:t,a=ae&&mi(ae,!0),l=ae&&a&&a.a,s=ae&&a&&a.d,u=Fs&&ct&&x1(ct),c=(o.clientX-Zr.clientX+i.x)/(l||1)+(u?u[0]-ad[0]:0)/(l||1),f=(o.clientY-Zr.clientY+i.y)/(s||1)+(u?u[1]-ad[1]:0)/(s||1);if(!ee.active&&!zi){if(r&&Math.max(Math.abs(o.clientX-this._lastX),Math.abs(o.clientY-this._lastY))=0&&(wt({rootEl:Ye,name:"add",toEl:Ye,fromEl:Re,originalEvent:t}),wt({sortable:this,name:"remove",toEl:Ye,originalEvent:t}),wt({rootEl:Ye,name:"sort",toEl:Ye,fromEl:Re,originalEvent:t}),wt({sortable:this,name:"sort",toEl:Ye,originalEvent:t})),at&&at.save()):jt!==Ji&&jt>=0&&(wt({sortable:this,name:"update",toEl:Ye,originalEvent:t}),wt({sortable:this,name:"sort",toEl:Ye,originalEvent:t})),ee.active&&((jt==null||jt===-1)&&(jt=Ji,gr=Ka),wt({sortable:this,name:"end",toEl:Ye,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){Ct("nulling",this),Re=W=Ye=ae=oi=Ue=ou=br=Zr=wn=_a=jt=gr=Ji=Ka=Fi=Za=at=Ds=ee.dragged=ee.ghost=ee.clone=ee.active=null,Xu.forEach(function(t){t.checked=!0}),Xu.length=id=od=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":W&&(this._onDragOver(t),VN(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,i=0,o=r.length,a=this.options;ir.right+i||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+i}function XN(e,t,n,r,i,o,a,l){var s=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(l&&auc+u*o/2:sf-au)return-Za}else if(s>c+u*(1-i)/2&&sf-u*o/2)?s>c+u/2?1:-1:0}function qN(e){return He(W)1&&(ie.forEach(function(l){o.addAnimationState({target:l,rect:At?Me(l):a}),nd(l),l.fromRect=a,r.removeAnimationState(l)}),At=!1,iD(!this.options.removeCloneOnHide,i))},dragOverCompleted:function(n){var r=n.sortable,i=n.isOwner,o=n.insertion,a=n.activeSortable,l=n.parentEl,s=n.putSortable,u=this.options;if(o){if(i&&a._hideClone(),ha=!1,u.animation&&ie.length>1&&(At||!i&&!a.options.sort&&!s)){var c=Me(Pe,!1,!0,!0);ie.forEach(function(d){d!==Pe&&(E1(d,c),l.appendChild(d))}),At=!0}if(!i)if(At||Bs(),ie.length>1){var f=Ms;a._showClone(r),a.options.animation&&!Ms&&f&&zt.forEach(function(d){a.addAnimationState({target:d,rect:ma}),d.fromRect=ma,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,i=n.isOwner,o=n.activeSortable;if(ie.forEach(function(l){l.thisAnimationDuration=null}),o.options.animation&&!i&&o.multiDrag.isMultiDrag){ma=cn({},r);var a=mi(Pe,!0);ma.top-=a.f,ma.left-=a.e}},dragOverAnimationComplete:function(){At&&(At=!1,Bs())},drop:function(n){var r=n.originalEvent,i=n.rootEl,o=n.parentEl,a=n.sortable,l=n.dispatchSortableEvent,s=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=o.children;if(!Li)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),ze(Pe,f.selectedClass,!~ie.indexOf(Pe)),~ie.indexOf(Pe))ie.splice(ie.indexOf(Pe),1),pa=null,Ta({sortable:a,rootEl:i,name:"deselect",targetEl:Pe,originalEvent:r});else{if(ie.push(Pe),Ta({sortable:a,rootEl:i,name:"select",targetEl:Pe,originalEvent:r}),r.shiftKey&&pa&&a.el.contains(pa)){var p=He(pa),h=He(Pe);if(~p&&~h&&p!==h){var g,v;for(h>p?(v=p,g=h):(v=h,g=p+1);v1){var m=Me(Pe),y=He(Pe,":not(."+this.options.selectedClass+")");if(!ha&&f.animation&&(Pe.thisAnimationDuration=null),c.captureAnimationState(),!ha&&(f.animation&&(Pe.fromRect=m,ie.forEach(function(k){if(k.thisAnimationDuration=null,k!==Pe){var _=At?Me(k):m;k.fromRect=_,c.addAnimationState({target:k,rect:_})}})),Bs(),ie.forEach(function(k){d[y]?o.insertBefore(k,d[y]):o.appendChild(k),y++}),s===He(Pe))){var S=!1;ie.forEach(function(k){if(k.sortableIndex!==He(k)){S=!0;return}}),S&&l("update")}ie.forEach(function(k){nd(k)}),c.animateAll()}bn=c}(i===o||u&&u.lastPutMode!=="clone")&&zt.forEach(function(k){k.parentNode&&k.parentNode.removeChild(k)})}},nullingGlobal:function(){this.isMultiDrag=Li=!1,zt.length=0},destroyGlobal:function(){this._deselectMultiDrag(),de(document,"pointerup",this._deselectMultiDrag),de(document,"mouseup",this._deselectMultiDrag),de(document,"touchend",this._deselectMultiDrag),de(document,"keydown",this._checkKeyDown),de(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof Li!="undefined"&&Li)&&bn===this.sortable&&!(n&&xn(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;ie.length;){var r=ie[0];ze(r,this.options.selectedClass,!1),ie.shift(),Ta({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},cn(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[ht];!r||!r.options.multiDrag||~ie.indexOf(n)||(bn&&bn!==r&&(bn.multiDrag._deselectMultiDrag(),bn=r),ze(n,r.options.selectedClass,!0),ie.push(n))},deselect:function(n){var r=n.parentNode[ht],i=ie.indexOf(n);!r||!r.options.multiDrag||!~i||(ze(n,r.options.selectedClass,!1),ie.splice(i,1))}},eventProperties:function(){var n=this,r=[],i=[];return ie.forEach(function(o){r.push({multiDragElement:o,index:o.sortableIndex});var a;At&&o!==Pe?a=-1:At?a=He(o,":not(."+n.options.selectedClass+")"):a=He(o),i.push({multiDragElement:o,index:a})}),{items:PN(ie),clones:[].concat(zt),oldIndicies:r,newIndicies:i}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function iD(e,t){ie.forEach(function(n,r){var i=t.children[n.sortableIndex+(e?Number(r):0)];i?t.insertBefore(n,i):t.appendChild(n)})}function P1(e,t){zt.forEach(function(n,r){var i=t.children[n.sortableIndex+(e?Number(r):0)];i?t.insertBefore(n,i):t.appendChild(n)})}function Bs(){ie.forEach(function(e){e!==Pe&&e.parentNode&&e.parentNode.removeChild(e)})}ee.mount(new eD);ee.mount($m,Hm);const oD=Object.freeze(Object.defineProperty({__proto__:null,default:ee,MultiDrag:rD,Sortable:ee,Swap:tD},Symbol.toStringTag,{value:"Module"})),aD=d0(oD);var Ax={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],i=0;i$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>k);function s(w){w.parentElement!==null&&w.parentElement.removeChild(w)}function u(w,O,E){const C=w.children[E]||null;w.insertBefore(O,C)}function c(w){w.forEach(O=>s(O.element))}function f(w){w.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(w,O){const E=v(w),C={parentElement:w.from};let P=[];switch(E){case"normal":P=[{element:w.item,newIndex:w.newIndex,oldIndex:w.oldIndex,parentElement:w.from}];break;case"swap":const N=U({element:w.item,oldIndex:w.oldIndex,newIndex:w.newIndex},C),B=U({element:w.swapItem,oldIndex:w.newIndex,newIndex:w.oldIndex},C);P=[N,B];break;case"multidrag":P=w.oldIndicies.map((K,V)=>U({element:K.multiDragElement,oldIndex:K.index,newIndex:w.newIndicies[V].index},C));break}return m(P,O)}function p(w,O){const E=h(w,O);return g(w,E)}function h(w,O){const E=[...O];return w.concat().reverse().forEach(C=>E.splice(C.oldIndex,1)),E}function g(w,O,E,C){const P=[...O];return w.forEach(I=>{const T=C&&E&&C(I.item,E);P.splice(I.newIndex,0,T||I.item)}),P}function v(w){return w.oldIndicies&&w.oldIndicies.length>0?"multidrag":w.swapItem?"swap":"normal"}function m(w,O){return w.map(C=>Q(U({},C),{item:O[C.oldIndex]})).sort((C,P)=>C.oldIndex-P.oldIndex)}function y(w){const gn=w,{list:O,setList:E,children:C,tag:P,style:I,className:T,clone:N,onAdd:B,onChange:K,onChoose:V,onClone:le,onEnd:te,onFilter:se,onRemove:q,onSort:x,onStart:A,onUnchoose:X,onUpdate:fe,onMove:pe,onSpill:he,onSelect:be,onDeselect:Ee}=gn;return vn(gn,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class k extends r.Component{constructor(O){super(O),this.ref=r.createRef();const E=[...O.list].map(C=>Object.assign(C,{chosen:!1,selected:!1}));O.setList(E,this.sortable,S),o(i)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();o(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:E,className:C,id:P}=this.props,I={style:E,className:C,id:P},T=!O||O===null?"div":O;return r.createElement(T,U({ref:this.ref},I),this.getChildren())}getChildren(){const{children:O,dataIdAttr:E,selectedClass:C="sortable-selected",chosenClass:P="sortable-chosen",dragClass:I="sortable-drag",fallbackClass:T="sortable-falback",ghostClass:N="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:K="sortable-filter",list:V}=this.props;if(!O||O==null)return null;const le=E||"data-id";return r.Children.map(O,(te,se)=>{if(te===void 0)return;const q=V[se]||{},{className:x}=te.props,A=typeof K=="string"&&{[K.replace(".","")]:!!q.filtered},X=o(n)(x,U({[C]:q.selected,[P]:q.chosen},A));return r.cloneElement(te,{[le]:te.key,className:X})})}get sortable(){const O=this.ref.current;if(O===null)return null;const E=Object.keys(O).find(C=>C.includes("Sortable"));return E?O[E]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],E=["onChange","onClone","onFilter","onSort"],C=y(this.props);O.forEach(I=>C[I]=this.prepareOnHandlerPropAndDOM(I)),E.forEach(I=>C[I]=this.prepareOnHandlerProp(I));const P=(I,T)=>{const{onMove:N}=this.props,B=I.willInsertAfter||-1;if(!N)return B;const K=N(I,T,this.sortable,S);return typeof K=="undefined"?!1:K};return Q(U({},C),{onMove:P})}prepareOnHandlerPropAndDOM(O){return E=>{this.callOnHandlerProp(E,O),this[O](E)}}prepareOnHandlerProp(O){return E=>{this.callOnHandlerProp(E,O)}}callOnHandlerProp(O,E){const C=this.props[E];C&&C(O,this.sortable,S)}onAdd(O){const{list:E,setList:C,clone:P}=this.props,I=[...S.dragging.props.list],T=d(O,I);c(T);const N=g(T,E,O,P).map(B=>Object.assign(B,{selected:!1}));C(N,this.sortable,S)}onRemove(O){const{list:E,setList:C}=this.props,P=v(O),I=d(O,E);f(I);let T=[...E];if(O.pullMode!=="clone")T=h(I,T);else{let N=I;switch(P){case"multidrag":N=I.map((B,K)=>Q(U({},B),{element:O.clones[K]}));break;case"normal":N=I.map(B=>Q(U({},B),{element:O.clone}));break;case"swap":default:o(i)(!0,`mode "${P}" cannot clone. Please remove "props.clone" from when using the "${P}" plugin`)}c(N),I.forEach(B=>{const K=B.oldIndex,V=this.props.clone(B.item,O);T.splice(K,1,V)})}T=T.map(N=>Object.assign(N,{selected:!1})),C(T,this.sortable,S)}onUpdate(O){const{list:E,setList:C}=this.props,P=d(O,E);c(P),f(P);const I=p(P,E);return C(I,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:E,setList:C}=this.props,P=E.map((I,T)=>{let N=I;return T===O.oldIndex&&(N=Object.assign(I,{chosen:!0})),N});C(P,this.sortable,S)}onUnchoose(O){const{list:E,setList:C}=this.props,P=E.map((I,T)=>{let N=I;return T===O.oldIndex&&(N=Object.assign(N,{chosen:!1})),N});C(P,this.sortable,S)}onSpill(O){const{removeOnSpill:E,revertOnSpill:C}=this.props;E&&!C&&s(O.item)}onSelect(O){const{list:E,setList:C}=this.props,P=E.map(I=>Object.assign(I,{selected:!1}));O.newIndicies.forEach(I=>{const T=I.index;if(T===-1){console.log(`"${O.type}" had indice of "${I.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}P[T].selected=!0}),C(P,this.sortable,S)}onDeselect(O){const{list:E,setList:C}=this.props,P=E.map(I=>Object.assign(I,{selected:!1}));O.newIndicies.forEach(I=>{const T=I.index;T!==-1&&(P[T].selected=!0)}),C(P,this.sortable,S)}}k.defaultProps={clone:w=>w};var _={};l(e.exports,_)})(dx);const fD="_container_xt7ji_1",dD="_list_xt7ji_6",pD="_item_xt7ji_15",hD="_keyField_xt7ji_29",mD="_valueField_xt7ji_34",gD="_header_xt7ji_39",vD="_dragHandle_xt7ji_45",yD="_deleteButton_xt7ji_55",wD="_addItemButton_xt7ji_65",bD="_separator_xt7ji_72",kt={container:fD,list:dD,item:pD,keyField:hD,valueField:mD,header:gD,dragHandle:vD,deleteButton:yD,addItemButton:wD,separator:bD};function Vm({name:e,label:t,value:n,onChange:r,optional:i=!1,newItemValue:o={key:"myKey",value:"myValue"}}){const[a,l]=F.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),s=Oi(r);F.useEffect(()=>{const f=SD(a);pk(f,n!=null?n:{})||s({name:e,value:f})},[e,s,a,n]);const u=F.useCallback(f=>{l(d=>d.filter(({id:p})=>p!==f))},[]),c=F.useCallback(()=>{l(f=>[...f,U({id:-1},o)].map((d,p)=>Q(U({},d),{id:p})))},[o]);return M("div",{className:kt.container,children:[b(Wo,{category:e!=null?e:t}),M("div",{className:kt.list,children:[M("div",{className:kt.item+" "+kt.header,children:[b("span",{className:kt.keyField,children:"Key"}),b("span",{className:kt.valueField,children:"Value"})]}),b(dx.exports.ReactSortable,{list:a,setList:l,handle:`.${kt.dragHandle}`,children:a.map((f,d)=>M("div",{className:kt.item,children:[b("div",{className:kt.dragHandle,title:"Reorder list",children:b(CN,{})}),b("input",{className:kt.keyField,type:"text",value:f.key,onChange:p=>{const h=[...a];h[d]=Q(U({},f),{key:p.target.value}),l(h)}}),b("span",{className:kt.separator,children:":"}),b("input",{className:kt.valueField,type:"text",value:f.value,onChange:p=>{const h=[...a];h[d]=Q(U({},f),{value:p.target.value}),l(h)}}),b(Ft,{className:kt.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:b(pm,{})})]},f.id))}),b(Ft,{className:kt.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:b(Vb,{})})]})]})}function SD(e){return e.reduce((n,{key:r,value:i})=>(n[r]=i,n),{})}const xD=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(Vm,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),ED="_container_162lp_1",CD="_checkbox_162lp_14",fd={container:ED,checkbox:CD},AD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices;return M("div",Q(U({ref:r,className:fd.container,style:{width:t.width}},n),{children:[b("label",{children:t.label}),b("div",{children:Object.keys(i).map((o,a)=>b("div",{className:fd.radio,children:M("label",{className:fd.checkbox,children:[b("input",{type:"checkbox",name:i[o],value:i[o],defaultChecked:a===0}),b("span",{children:o})]})},o))}),e]}))},kD={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},OD={title:"Checkbox Group",UiComponent:AD,SettingsComponent:xD,acceptsChildren:!1,defaultSettings:kD,iconSrc:SN,category:"Inputs",description:"Create a group of checkboxes that can be used to toggle multiple choices independently. The server will receive the input as a character vector of the selected values."},PD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",ID=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(cx,{label:"Starting value",name:"value",value:e.value}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),TD="_container_1x0tz_1",_D="_label_1x0tz_10",I1={container:TD,label:_D},ND=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var s;const i=(s=t.width)!=null?s:"auto",o=U({},t),[a,l]=H.exports.useState(o.value);return H.exports.useEffect(()=>{l(o.value)},[o.value]),M("div",Q(U({className:I1.container+" shiny::checkbox",style:{width:i},"aria-label":"shiny::checkbox",ref:r},n),{children:[M("label",{htmlFor:o.inputId,children:[b("input",{id:o.inputId,type:"checkbox",checked:a,onChange:u=>l(u.target.checked)}),b("span",{className:I1.label,children:o.label})]}),e]}))},DD={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},RD={title:"Checkbox Input",UiComponent:ND,SettingsComponent:ID,acceptsChildren:!1,defaultSettings:DD,iconSrc:PD,category:"Inputs",description:"Create a checkbox that can be used to specify logical values."},FD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",LD="_wrappedSection_1dn9g_1",MD="_sectionContainer_1dn9g_9",Ku={wrappedSection:LD,sectionContainer:MD},kx=({name:e,children:t})=>M("div",{className:Ku.sectionContainer,children:[b(Wo,{category:e}),b("div",{className:Ku.wrappedSection,children:t})]}),BD=({name:e,children:t})=>M("div",{className:Ku.sectionContainer,children:[b(Wo,{category:e}),b("div",{className:Ku.inputSection,children:t})]}),UD=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),M(kx,{name:"Values",children:[b(Cr,{name:"value",value:e.value}),b(Cr,{name:"min",value:e.min,optional:!0,defaultValue:0}),b(Cr,{name:"max",value:e.max,optional:!0,defaultValue:10}),b(Cr,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),b(Wo,{}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),zD="_container_yicbr_1",jD={container:zD},WD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var s;const i=U({},t),o=(s=i.width)!=null?s:"200px",[a,l]=H.exports.useState(i.value);return H.exports.useEffect(()=>{l(i.value)},[i.value]),M("div",Q(U({className:jD.container+" shiny::numericInput",style:{width:o},"aria-label":"shiny::numericInput",ref:r},n),{children:[b("span",{children:i.label}),b("input",{type:"number",value:a,onChange:u=>l(Number(u.target.value)),min:i.min,max:i.max,step:i.step}),e]}))},YD={inputId:"myNumericInput",label:"Numeric Input",value:10},HD={title:"Numeric Input",UiComponent:WD,SettingsComponent:UD,acceptsChildren:!1,defaultSettings:YD,iconSrc:FD,category:"Inputs",description:"An input control for entry of numeric values"},$D=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>M(Ke,{children:[b(Ae,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),b(Gn,{name:"width",units:["px","%"],value:t}),b(Gn,{name:"height",units:["px","%"],value:n})]}),VD=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:i,compRef:o})=>M("div",Q(U({className:Dp.container,ref:o,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},i),{children:[b(ux,{outputId:e}),r]})),GD={title:"Plot Output",UiComponent:VD,SettingsComponent:$D,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:lx,category:"Outputs",description:"Render a `renderPlot()` within an application page."},JD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",QD=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(Vm,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),XD="_container_sgn7c_1",T1={container:XD},qD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices,o=Object.keys(i),a=Object.values(i),[l,s]=F.useState(a[0]);return F.useEffect(()=>{a.includes(l)||s(a[0])},[l,a]),M("div",Q(U({ref:r,className:T1.container,style:{width:t.width}},n),{children:[b("label",{children:t.label}),b("div",{children:a.map((u,c)=>b("div",{className:T1.radio,children:M("label",{children:[b("input",{type:"radio",name:t.inputId,value:u,onChange:f=>s(f.target.value),checked:u===l}),b("span",{children:o[c]})]})},u))}),e]}))},KD={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},ZD={title:"Radio Buttons",UiComponent:qD,SettingsComponent:QD,acceptsChildren:!1,defaultSettings:KD,iconSrc:JD,category:"Inputs",description:"Create a set of radio buttons used to select an item from a list."},eR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",tR=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(Vm,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),nR="_container_1e5dd_1",rR={container:nR},iR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices,o=t.inputId;return M("div",Q(U({ref:r,className:rR.container},n),{children:[b("label",{htmlFor:o,children:t.label}),b("select",{id:o,children:Object.keys(i).map((a,l)=>b("option",{value:i[a],children:a},a))}),e]}))},oR={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},aR={title:"Select Input",UiComponent:iR,SettingsComponent:tR,acceptsChildren:!1,defaultSettings:oR,iconSrc:eR,category:"Inputs",description:"Create a select list that can be used to choose a single or multiple items from a list of values."},lR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",sR=({settings:e})=>{const t=U({},e);return M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:t.inputId}),b(Ae,{name:"label",value:t.label}),M(kx,{name:"Values",children:[b(Cr,{name:"min",value:t.min}),b(Cr,{name:"max",value:t.max}),b(Cr,{name:"value",label:"start",value:t.value}),b(Cr,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),b(Wo,{}),b(Gn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},uR="_container_1f2js_1",cR="_sliderWrapper_1f2js_11",fR="_sliderInput_1f2js_16",dd={container:uR,sliderWrapper:cR,sliderInput:fR},dR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=U({},t),{width:o="200px"}=i,[a,l]=H.exports.useState(i.value);return M("div",Q(U({className:dd.container+" shiny::sliderInput",style:{width:o},"aria-label":"shiny::sliderInput",ref:r},n),{children:[b("div",{children:i.label}),b("div",{className:dd.sliderWrapper,children:b("input",{type:"range",min:i.min,max:i.max,value:a,onChange:s=>l(Number(s.target.value)),className:"slider "+dd.sliderInput,"aria-label":"slider input","data-min":i.min,"data-max":i.max,draggable:!0,onDragStartCapture:s=>{s.stopPropagation(),s.preventDefault()}})}),M("div",{children:[b(sx,{type:"input",name:i.inputId})," = ",a]}),e]}))},pR={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},hR={title:"Slider Input",UiComponent:dR,SettingsComponent:sR,acceptsChildren:!1,defaultSettings:pR,iconSrc:lR,category:"Inputs",description:"Constructs a slider widget to select a number from a range. _(Dates and date-times not currently supported.)_"},mR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",gR=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),M(BD,{name:"Values",children:[b(Ae,{name:"value",value:e.value}),b(Ae,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),vR="_container_yicbr_1",yR={container:vR},wR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i="200px",o="auto",a=U({},t),[l,s]=H.exports.useState(a.value);return H.exports.useEffect(()=>{s(a.value)},[a.value]),M("div",Q(U({className:yR.container+" shiny::textInput",style:{height:o,width:i},"aria-label":"shiny::textInput",ref:r},n),{children:[b("label",{htmlFor:a.inputId,children:a.label}),b("input",{id:a.inputId,type:"text",value:l,onChange:u=>s(u.target.value),placeholder:a.placeholder}),e]}))},bR={inputId:"myTextInput",label:"Text Input",value:""},SR={title:"Text Input",UiComponent:wR,SettingsComponent:gR,acceptsChildren:!1,defaultSettings:bR,iconSrc:mR,category:"Inputs",description:"Create an input control for entry of unstructured text values."},xR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",ER=({settings:e})=>b(Ae,{label:"Output ID",name:"outputId",value:e.outputId}),CR="_container_1i6yi_1",AR={container:CR},kR=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>M("div",Q(U({className:AR.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",M("code",{children:["output$",e.outputId]}),t]})),OR={title:"Text Output",UiComponent:kR,SettingsComponent:ER,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:xR,category:"Outputs",description:` - Render a reactive output variable as text within an application page. - Usually paired with \`renderText()\`. - `},PR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",IR=({settings:e})=>{var t;return b(Ae,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},TR="_container_1xnzo_1",_R={container:TR},NR=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:i="shiny-ui-output"}=e;return M("div",Q(U({className:_R.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[M("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",i,"!"]}),t]}))},DR={title:"Dynamic UI Output",UiComponent:NR,SettingsComponent:IR,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:PR,category:"Outputs",description:` - Render a reactive output variable as HTML within an application page. - The text will be included within an HTML \`div\` tag, and is presumed to - contain HTML content which should not be escaped. - `};function RR(e){return Bt({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function FR(e){return Bt({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function LR(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const MR="_container_p6wnj_1",BR="_infoMsg_p6wnj_14",UR="_codeHolder_p6wnj_19",Up={container:MR,infoMsg:BR,codeHolder:UR},zR=({settings:e})=>M("div",{children:[b("div",{className:lr.container,children:M("span",{className:Up.infoMsg,children:[b(RR,{}),"Unknown function call. Can't modify with visual editor."]})}),b(Wo,{category:"Code"}),b("div",{className:lr.container,children:b("pre",{className:Up.codeHolder,children:LR(e.text)})})]}),jR=20,WR=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const i=e.text.slice(0,jR).replaceAll(/\s$/g,"")+"...";return M("div",Q(U({className:Up.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[M("div",{children:["unknown ui output: ",b("code",{children:i})]}),t]}))},YR={title:"Unknown UI Function",UiComponent:WR,SettingsComponent:zR,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},kn={"shiny::actionButton":bN,"shiny::numericInput":HD,"shiny::sliderInput":hR,"shiny::textInput":SR,"shiny::checkboxInput":RD,"shiny::checkboxGroupInput":OD,"shiny::selectInput":aR,"shiny::radioButtons":ZD,"shiny::plotOutput":GD,"shiny::textOutput":OR,"shiny::uiOutput":DR,"gridlayout::grid_page":hN,"gridlayout::grid_card":U5,"gridlayout::grid_card_text":cN,"gridlayout::grid_card_plot":Q5,unknownUiFunction:YR};function Ox(e,t){return Rb(e,t,Math.min(e.length,t.length))}function Px(e,{path:t}){var i;for(let o of Object.values(kn)){const a=(i=o==null?void 0:o.stateUpdateSubscribers)==null?void 0:i.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=HR(e,t);if(!jm(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function HR(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const i=n.length===0?e:Fr(e,n);if(!jm(i))throw new Error("Somehow trying to enter a leaf node");return{parentNode:i,indexToNode:r}}function $R(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:i}){const o=Fr(e,t);if(!kn[o.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(o.uiChildren)||(o.uiChildren=[]);const a=r==="last"?o.uiChildren.length:r;if(i!==void 0){const l=[...t,a];if(Ox(i,l))throw new Error("Invalid move request");if(ym(i,l)){const s=i[i.length-1];o.uiChildren=kO(o.uiChildren,s,a);return}Px(e,{path:i})}o.uiChildren=xl(o.uiChildren,a,n)}function VR({fromPath:e,toPath:t}){if(e==null)return!0;if(Ox(e,t))return!1;if(ym(e,t)){const n=e.length,r=e[n-1],i=t[n-1];if(r===i||r===i-1)return!1}return!0}function GR(e,{path:t,node:n}){var i;for(let o of Object.values(kn)){const a=(i=o==null?void 0:o.stateUpdateSubscribers)==null?void 0:i.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=Fr(e,t);Object.assign(r,n)}const Gm={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},Ix=nm({name:"uiTree",initialState:Gm,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>Tx(t.payload.initialState),UPDATE_NODE:(e,t)=>{GR(e,t.payload)},PLACE_NODE:(e,t)=>{$R(e,t.payload)},DELETE_NODE:(e,t)=>{Px(e,t.payload)}}});function Tx(e){const t=kn[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return AO(r,n).length>0&&(e.uiArguments=U(U({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(o=>Tx(o)),e}const{UPDATE_NODE:_x,PLACE_NODE:JR,DELETE_NODE:Nx,INIT_STATE:QR,SET_FULL_STATE:XR}=Ix.actions;function Dx(){const e=Jr();return F.useCallback(n=>{e(JR(n))},[e])}const qR=Ix.reducer,Rx=uk();Rx.startListening({actionCreator:Nx,effect:(e,t)=>og(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Vl(n,r)&&t.dispatch(mk()),r.lengtho)return;const a=[...r];a[n.length-1]=o-1,t.dispatch(Lb({path:a}))})});const KR=Rx.middleware,ZR=W2({reducer:{uiTree:qR,selectedPath:gk,connectedToServer:dk},middleware:e=>e().concat(KR)}),eF=({children:e})=>b($A,{store:ZR,children:e}),tF=!1;function nF(){const e=window.location.host+window.location.pathname;return(window.location.protocol==="https:"?"wss:":"ws:")+"//"+e}const uu={ws:null,msg:null},Fx=Q(U({},uu),{status:"connecting"});function rF(e,t){switch(t.type){case"CONNECTED":return Q(U({},uu),{status:"connected",ws:t.ws});case"FAILED":return Q(U({},uu),{status:"failed-to-open"});case"CLOSED":return Q(U({},uu),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function iF(){const[e,t]=F.useReducer(rF,Fx),n=F.useRef(!1);return F.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=nF(),i=new WebSocket(r);return i.onerror=o=>{console.error("Error with httpuv websocket connection",o)},i.onopen=o=>{n.current=!0,t({type:"CONNECTED",ws:i})},i.onclose=o=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>i.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const Lx=F.createContext(Fx),oF=({children:e})=>{const t=iF();return b(Lx.Provider,{value:t,children:e})};function Mx(){return F.useContext(Lx)}function aF(e){return JSON.parse(e.data)}function Bx(e,t){e.addEventListener("message",n=>{t(aF(n))})}function zp(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const lF="_appViewerHolder_wu0cb_1",sF="_title_wu0cb_55",uF="_appContainer_wu0cb_89",cF="_previewFrame_wu0cb_109",fF="_expandButton_wu0cb_134",dF="_reloadButton_wu0cb_135",pF="_spin_wu0cb_160",hF="_restartButton_wu0cb_198",mF="_loadingMessage_wu0cb_225",gF="_error_wu0cb_236",_t={appViewerHolder:lF,title:sF,appContainer:uF,previewFrame:cF,expandButton:fF,reloadButton:dF,spin:pF,restartButton:hF,loadingMessage:mF,error:gF},vF="_fakeApp_t3dh1_1",yF="_fakeDashboard_t3dh1_7",wF="_header_t3dh1_22",bF="_sidebar_t3dh1_31",SF="_top_t3dh1_35",xF="_bottom_t3dh1_39",ga={fakeApp:vF,fakeDashboard:yF,header:wF,sidebar:bF,top:SF,bottom:xF},EF=()=>b("div",{className:_t.appContainer,children:M("div",{className:ga.fakeDashboard+" "+_t.previewFrame,children:[b("div",{className:ga.header,children:b("h1",{children:"App preview not available"})}),b("div",{className:ga.sidebar}),b("div",{className:ga.top}),b("div",{className:ga.bottom})]})});function CF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function AF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function kF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function OF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const PF="_logs_xjp5l_2",IF="_logsContents_xjp5l_25",TF="_expandTab_xjp5l_29",_F="_clearLogsButton_xjp5l_69",NF="_logLine_xjp5l_75",DF="_noLogsMsg_xjp5l_81",RF="_expandedLogs_xjp5l_93",FF="_expandLogsButton_xjp5l_101",LF="_unseenLogsNotification_xjp5l_108",MF="_slidein_xjp5l_1",ti={logs:PF,logsContents:IF,expandTab:TF,clearLogsButton:_F,logLine:NF,noLogsMsg:DF,expandedLogs:RF,expandLogsButton:FF,unseenLogsNotification:LF,slidein:MF};function BF({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:i}=UF(e),o=e.length===0;return M("div",{className:ti.logs,"data-expanded":n,children:[M("button",{className:ti.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[b(kF,{className:ti.unseenLogsNotification,"data-show":i}),"App Logs",n?b(CF,{}):b(AF,{})]}),M("div",{className:ti.logsContents,children:[o?b("p",{className:ti.noLogsMsg,children:"No recent logs"}):e.map((a,l)=>b("p",{className:ti.logLine,children:a},l)),o?null:b(Ft,{variant:"icon",title:"clear logs",className:ti.clearLogsButton,onClick:t,children:b(OF,{})})]})]})}function UF(e){const[t,n]=F.useState(!1),[r,i]=F.useState(!1),[o,a]=F.useState(null),[l,s]=F.useState(new Date),u=F.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),i(!1)},[t]);return F.useEffect(()=>{s(new Date)},[e]),F.useEffect(()=>{if(t||e.length===0){i(!1);return}if(o===null||o{u==="connected"&&(tl(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>tl(c,{path:"APP-PREVIEW-RESTART"})),h(()=>()=>tl(c,{path:"APP-PREVIEW-STOP"})),Bx(c,y=>{if(!zF(y))return;const{path:S,payload:k}=y;switch(S){case"SHINY_READY":s(!1),a(!1),n(k);break;case"SHINY_LOGS":i(WF(k));break;case"SHINY_CRASH":s(k);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:y})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=F.useState(()=>()=>console.log("No app running to reset")),[p,h]=F.useState(()=>()=>console.log("No app running to stop")),g=F.useCallback(()=>{i([])},[]),v={appLogs:r,clearLogs:g,restartApp:f,stopApp:p};return o?Object.assign(v,{status:"no-preview",appLoc:null}):l?Object.assign(v,{status:"crashed",error:l,appLoc:null}):t?Object.assign(v,{status:"finished",appLoc:t,error:null}):Object.assign(v,{status:"loading",appLoc:null,error:null})}function WF(e){return Array.isArray(e)?e:[e]}function YF(){const e=HF();return $F(e.width)}function HF(){const[e,t]=F.useState(_1()),n=F.useMemo(()=>xm(()=>{t(_1())},500),[]);return F.useEffect(()=>(window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function $F(e){const t=AE-Ux*2,n=e-zx*2;return t/n}function _1(){const{innerWidth:e,innerHeight:t}=window;return{width:e,height:t}}const Ux=16,zx=55;function VF(){const e=F.useRef(null),[t,n]=F.useState(!1),r=F.useCallback(()=>{n(f=>!f)},[]),{status:i,appLoc:o,appLogs:a,clearLogs:l,restartApp:s}=jF(),u=YF(),c=F.useCallback(f=>{!e.current||!o||(e.current.src=o,QF(f.currentTarget))},[o]);return i==="no-preview"&&!tF?null:M(Ke,{children:[M("h3",{className:_t.title+" "+ix.panelTitleHeader,children:[b(Ft,{variant:["transparent","icon"],className:_t.reloadButton,title:"Reload app session",onClick:c,children:b(zp,{})}),"App Preview"]}),b("div",{className:_t.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Ux}px`,"--expanded-inset-horizontal":`${zx}px`},children:i==="loading"?b(JF,{}):i==="crashed"?b(GF,{onClick:s}):M(Ke,{children:[b(Ft,{variant:["transparent","icon"],className:_t.reloadButton,title:"Reload app session",onClick:c,children:b(zp,{})}),M("div",{className:_t.appContainer,children:[i==="no-preview"?b(EF,{}):b("iframe",{className:_t.previewFrame,src:o,title:"Application Preview",ref:e}),b(Ft,{variant:"icon",className:_t.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?b(FR,{}):b(CO,{})})]}),b(BF,{appLogs:a,clearLogs:l})]})})]})}function GF({onClick:e}){return M("div",{className:_t.appContainer,children:[M("p",{children:["App preview crashed.",b("br",{})," Try and restart?"]}),M(Ft,{className:_t.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",b(zp,{})]})]})}function JF(){return b("div",{className:_t.loadingMessage,children:b("h2",{children:"Loading app preview..."})})}function QF(e){e.classList.add(_t.spin),e.addEventListener("animationend",()=>e.classList.remove(_t.spin),!1)}const XF=e=>b("svg",Q(U({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:b("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class qF{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function KF(){const e=Hl(c=>c.uiTree),t=Jr(),[n,r]=F.useState(!1),[i,o]=F.useState(!1),a=F.useRef(new qF({comparisonFn:ZF}));F.useEffect(()=>{if(!e||e===Gm)return;const c=a.current;c.addEntry(e),o(c.canGoBackwards()),r(c.canGoForwards())},[e]);const l=F.useCallback(c=>{t(XR({state:c}))},[t]),s=F.useCallback(()=>{console.log("Navigating backwards"),l(a.current.goBackwards())},[l]),u=F.useCallback(()=>{console.log("Navigating forwards"),l(a.current.goForwards())},[l]);return{goBackward:s,goForward:u,canGoBackward:i,canGoForward:n}}function ZF(e,t){return typeof t=="undefined"?!1:e===t}const eL="_container_1d7pe_1",tL={container:eL};function nL(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=KF();return M("div",{className:tL.container+" undo-redo-buttons",children:[b(Ft,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:b($k,{height:"100%"})}),b(Ft,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:b(Hk,{height:"100%"})})]})}const rL="_elementsPalette_qmlez_1",iL="_OptionContainer_qmlez_18",oL="_OptionItem_qmlez_24",aL="_OptionIcon_qmlez_33",lL="_OptionLabel_qmlez_41",Ra={elementsPalette:rL,OptionContainer:iL,OptionItem:oL,OptionIcon:aL,OptionLabel:lL};function sL({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r,description:i=n}=kn[e],o={uiName:e,uiArguments:r},a=H.exports.useRef(null);return $b({ref:a,nodeInfo:{node:o}}),t===void 0?null:b(QS,{popoverContent:i,contentIsMd:!0,openDelayMs:500,triggerEl:b("div",{className:Ra.OptionContainer,children:M("div",{ref:a,className:Ra.OptionItem,"data-ui-name":e,children:[b("img",{src:t,alt:n,className:Ra.OptionIcon}),b("label",{className:Ra.OptionLabel,children:n})]})})})}const N1=["Inputs","Outputs","gridlayout","uncategorized"];function uL(e,t){var i,o;const n=N1.indexOf(((i=kn[e])==null?void 0:i.category)||"uncategorized"),r=N1.indexOf(((o=kn[t])==null?void 0:o.category)||"uncategorized");return nr?1:0}function cL({availableUi:e=kn}){const t=H.exports.useMemo(()=>Object.keys(e).sort(uL),[e]);return b("div",{className:Ra.elementsPalette,children:t.map(n=>b(sL,{uiName:n},n))})}function jx(e){return function(t){return typeof t===e}}var fL=jx("function"),dL=function(e){return e===null},D1=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},R1=function(e){return!pL(e)&&!dL(e)&&(fL(e)||typeof e=="object")},pL=jx("undefined"),jp=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function hL(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!Nt(e[r],t[r]))return!1;return!0}function mL(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),i=e.byteLength;i--;)if(n.getUint8(i)!==r.getUint8(i))return!1;return!0}function gL(e,t){var n,r,i,o;if(e.size!==t.size)return!1;try{for(var a=jp(e.entries()),l=a.next();!l.done;l=a.next()){var s=l.value;if(!t.has(s[0]))return!1}}catch(f){n={error:f}}finally{try{l&&!l.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=jp(e.entries()),c=u.next();!c.done;c=u.next()){var s=c.value;if(!Nt(s[1],t.get(s[0])))return!1}}catch(f){i={error:f}}finally{try{c&&!c.done&&(o=u.return)&&o.call(u)}finally{if(i)throw i.error}}return!0}function vL(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var i=jp(e.entries()),o=i.next();!o.done;o=i.next()){var a=o.value;if(!t.has(a[0]))return!1}}catch(l){n={error:l}}finally{try{o&&!o.done&&(r=i.return)&&r.call(i)}finally{if(n)throw n.error}}return!0}function Nt(e,t){if(e===t)return!0;if(e&&R1(e)&&t&&R1(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return hL(e,t);if(e instanceof Map&&t instanceof Map)return gL(e,t);if(e instanceof Set&&t instanceof Set)return vL(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return mL(e,t);if(D1(e)&&D1(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var i=n.length;i--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[i]))return!1;for(var i=n.length;i--!==0;){var o=n[i];if(!(o==="_owner"&&e.$$typeof)&&!Nt(e[o],t[o]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var yL=["innerHTML","ownerDocument","style","attributes","nodeValue"],wL=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],bL=["bigint","boolean","null","number","string","symbol","undefined"];function Zc(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(SL(t))return t}function In(e){return function(t){return Zc(t)===e}}function SL(e){return wL.includes(e)}function Yo(e){return function(t){return typeof t===e}}function xL(e){return bL.includes(e)}function D(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(D.array(e))return"Array";if(D.plainFunction(e))return"Function";var t=Zc(e);return t||"Object"}D.array=Array.isArray;D.arrayOf=function(e,t){return!D.array(e)&&!D.function(t)?!1:e.every(function(n){return t(n)})};D.asyncGeneratorFunction=function(e){return Zc(e)==="AsyncGeneratorFunction"};D.asyncFunction=In("AsyncFunction");D.bigint=Yo("bigint");D.boolean=function(e){return e===!0||e===!1};D.date=In("Date");D.defined=function(e){return!D.undefined(e)};D.domElement=function(e){return D.object(e)&&!D.plainObject(e)&&e.nodeType===1&&D.string(e.nodeName)&&yL.every(function(t){return t in e})};D.empty=function(e){return D.string(e)&&e.length===0||D.array(e)&&e.length===0||D.object(e)&&!D.map(e)&&!D.set(e)&&Object.keys(e).length===0||D.set(e)&&e.size===0||D.map(e)&&e.size===0};D.error=In("Error");D.function=Yo("function");D.generator=function(e){return D.iterable(e)&&D.function(e.next)&&D.function(e.throw)};D.generatorFunction=In("GeneratorFunction");D.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};D.iterable=function(e){return!D.nullOrUndefined(e)&&D.function(e[Symbol.iterator])};D.map=In("Map");D.nan=function(e){return Number.isNaN(e)};D.null=function(e){return e===null};D.nullOrUndefined=function(e){return D.null(e)||D.undefined(e)};D.number=function(e){return Yo("number")(e)&&!D.nan(e)};D.numericString=function(e){return D.string(e)&&e.length>0&&!Number.isNaN(Number(e))};D.object=function(e){return!D.nullOrUndefined(e)&&(D.function(e)||typeof e=="object")};D.oneOf=function(e,t){return D.array(e)?e.indexOf(t)>-1:!1};D.plainFunction=In("Function");D.plainObject=function(e){if(Zc(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};D.primitive=function(e){return D.null(e)||xL(typeof e)};D.promise=In("Promise");D.propertyOf=function(e,t,n){if(!D.object(e)||!t)return!1;var r=e[t];return D.function(n)?n(r):D.defined(r)};D.regexp=In("RegExp");D.set=In("Set");D.string=Yo("string");D.symbol=Yo("symbol");D.undefined=Yo("undefined");D.weakMap=In("WeakMap");D.weakSet=In("WeakSet");function EL(){for(var e=[],t=0;ts);return D.undefined(r)||(u=u&&s===r),D.undefined(o)||(u=u&&l===o),u}function L1(e,t,n){var r=n.key,i=n.type,o=n.value,a=Bn(e,r),l=Bn(t,r),s=i==="added"?a:l,u=i==="added"?l:a;if(!D.nullOrUndefined(o)){if(D.defined(s)){if(D.array(s)||D.plainObject(s))return CL(s,u,o)}else return Nt(u,o);return!1}return[a,l].every(D.array)?!u.every(Jm(s)):[a,l].every(D.plainObject)?AL(Object.keys(s),Object.keys(u)):![a,l].every(function(c){return D.primitive(c)&&D.defined(c)})&&(i==="added"?!D.defined(a)&&D.defined(l):D.defined(a)&&!D.defined(l))}function M1(e,t,n){var r=n===void 0?{}:n,i=r.key,o=Bn(e,i),a=Bn(t,i);if(!Wx(o,a))throw new TypeError("Inputs have different types");if(!EL(o,a))throw new TypeError("Inputs don't have length");return[o,a].every(D.plainObject)&&(o=Object.keys(o),a=Object.keys(a)),[o,a]}function B1(e){return function(t){var n=t[0],r=t[1];return D.array(e)?Nt(e,r)||e.some(function(i){return Nt(i,r)||D.array(r)&&Jm(r)(i)}):D.plainObject(e)&&e[n]?!!e[n]&&Nt(e[n],r):Nt(e,r)}}function AL(e,t){return t.some(function(n){return!e.includes(n)})}function U1(e){return function(t){return D.array(e)?e.some(function(n){return Nt(n,t)||D.array(t)&&Jm(t)(n)}):Nt(e,t)}}function va(e,t){return D.array(e)?e.some(function(n){return Nt(n,t)}):Nt(e,t)}function Jm(e){return function(t){return e.some(function(n){return Nt(n,t)})}}function Wx(){for(var e=[],t=0;t=0)return 1;return 0}();function ZL(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function e8(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},KL))}}var t8=ts&&window.Promise,n8=t8?ZL:e8;function Qx(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Ii(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function Qm(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function ns(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Ii(e),n=t.overflow,r=t.overflowX,i=t.overflowY;return/(auto|scroll|overlay)/.test(n+i+r)?e:ns(Qm(e))}function Xx(e){return e&&e.referenceNode?e.referenceNode:e}var H1=ts&&!!(window.MSInputMethodContext&&document.documentMode),$1=ts&&/MSIE 10/.test(navigator.userAgent);function Ho(e){return e===11?H1:e===10?$1:H1||$1}function Oo(e){if(!e)return document.documentElement;for(var t=Ho(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Ii(n,"position")==="static"?Oo(n):n}function r8(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Oo(e.firstElementChild)===e}function Wp(e){return e.parentNode!==null?Wp(e.parentNode):e}function ec(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,i=n?t:e,o=document.createRange();o.setStart(r,0),o.setEnd(i,0);var a=o.commonAncestorContainer;if(e!==a&&t!==a||r.contains(i))return r8(a)?a:Oo(a);var l=Wp(e);return l.host?ec(l.host,t):ec(e,Wp(t).host)}function Po(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var i=e.ownerDocument.documentElement,o=e.ownerDocument.scrollingElement||i;return o[n]}return e[n]}function i8(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Po(t,"top"),i=Po(t,"left"),o=n?-1:1;return e.top+=r*o,e.bottom+=r*o,e.left+=i*o,e.right+=i*o,e}function V1(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function G1(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],Ho(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function qx(e){var t=e.body,n=e.documentElement,r=Ho(10)&&getComputedStyle(n);return{height:G1("Height",t,n,r),width:G1("Width",t,n,r)}}var o8=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},a8=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=Ho(10),i=t.nodeName==="HTML",o=Yp(e),a=Yp(t),l=ns(e),s=Ii(t),u=parseFloat(s.borderTopWidth),c=parseFloat(s.borderLeftWidth);n&&i&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=$r({top:o.top-a.top-u,left:o.left-a.left-c,width:o.width,height:o.height});if(f.marginTop=0,f.marginLeft=0,!r&&i){var d=parseFloat(s.marginTop),p=parseFloat(s.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(l):t===l&&l.nodeName!=="BODY")&&(f=i8(f,t)),f}function l8(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=Xm(e,n),i=Math.max(n.clientWidth,window.innerWidth||0),o=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Po(n),l=t?0:Po(n,"left"),s={top:a-r.top+r.marginTop,left:l-r.left+r.marginLeft,width:i,height:o};return $r(s)}function Kx(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Ii(e,"position")==="fixed")return!0;var n=Qm(e);return n?Kx(n):!1}function Zx(e){if(!e||!e.parentElement||Ho())return document.documentElement;for(var t=e.parentElement;t&&Ii(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function qm(e,t,n,r){var i=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,o={top:0,left:0},a=i?Zx(e):ec(e,Xx(t));if(r==="viewport")o=l8(a,i);else{var l=void 0;r==="scrollParent"?(l=ns(Qm(t)),l.nodeName==="BODY"&&(l=e.ownerDocument.documentElement)):r==="window"?l=e.ownerDocument.documentElement:l=r;var s=Xm(l,a,i);if(l.nodeName==="HTML"&&!Kx(a)){var u=qx(e.ownerDocument),c=u.height,f=u.width;o.top+=s.top-s.marginTop,o.bottom=c+s.top,o.left+=s.left-s.marginLeft,o.right=f+s.left}else o=s}n=n||0;var d=typeof n=="number";return o.left+=d?n:n.left||0,o.top+=d?n:n.top||0,o.right-=d?n:n.right||0,o.bottom-=d?n:n.bottom||0,o}function s8(e){var t=e.width,n=e.height;return t*n}function eE(e,t,n,r,i){var o=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=qm(n,r,o,i),l={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},s=Object.keys(l).map(function(d){return tn({key:d},l[d],{area:s8(l[d])})}).sort(function(d,p){return p.area-d.area}),u=s.filter(function(d){var p=d.width,h=d.height;return p>=n.clientWidth&&h>=n.clientHeight}),c=u.length>0?u[0].key:s[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function tE(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,i=r?Zx(t):ec(t,Xx(n));return Xm(n,i,r)}function nE(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),i=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),o={width:e.offsetWidth+i,height:e.offsetHeight+r};return o}function tc(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function rE(e,t,n){n=n.split("-")[0];var r=nE(e),i={width:r.width,height:r.height},o=["right","left"].indexOf(n)!==-1,a=o?"top":"left",l=o?"left":"top",s=o?"height":"width",u=o?"width":"height";return i[a]=t[a]+t[s]/2-r[s]/2,n===l?i[l]=t[l]-r[u]:i[l]=t[tc(l)],i}function rs(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function u8(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(i){return i[t]===n});var r=rs(e,function(i){return i[t]===n});return e.indexOf(r)}function iE(e,t,n){var r=n===void 0?e:e.slice(0,u8(e,"name",n));return r.forEach(function(i){i.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var o=i.function||i.fn;i.enabled&&Qx(o)&&(t.offsets.popper=$r(t.offsets.popper),t.offsets.reference=$r(t.offsets.reference),t=o(t,i))}),t}function c8(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=tE(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=eE(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=rE(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=iE(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function oE(e,t){return e.some(function(n){var r=n.name,i=n.enabled;return i&&r===t})}function Km(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=l[f]+h-a[p]),e.offsets.popper=$r(e.offsets.popper);var g=l[f]+l[u]/2-h/2,v=Ii(e.instance.popper),m=parseFloat(v["margin"+c]),y=parseFloat(v["border"+c+"Width"]),S=g-e.offsets.popper[f]-m-y;return S=Math.max(Math.min(a[u]-h,S),0),e.arrowElement=r,e.offsets.arrow=(n={},Io(n,f,Math.round(S)),Io(n,d,""),n),e}function E8(e){return e==="end"?"start":e==="start"?"end":e}var uE=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],pd=uE.slice(3);function J1(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=pd.indexOf(e),r=pd.slice(n+1).concat(pd.slice(0,n));return t?r.reverse():r}var hd={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function C8(e,t){if(oE(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=qm(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],i=tc(r),o=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case hd.FLIP:a=[r,i];break;case hd.CLOCKWISE:a=J1(r);break;case hd.COUNTERCLOCKWISE:a=J1(r,!0);break;default:a=t.behavior}return a.forEach(function(l,s){if(r!==l||a.length===s+1)return e;r=e.placement.split("-")[0],i=tc(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),g=f(u.top)f(n.bottom),m=r==="left"&&p||r==="right"&&h||r==="top"&&g||r==="bottom"&&v,y=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(y&&o==="start"&&p||y&&o==="end"&&h||!y&&o==="start"&&g||!y&&o==="end"&&v),k=!!t.flipVariationsByContent&&(y&&o==="start"&&h||y&&o==="end"&&p||!y&&o==="start"&&v||!y&&o==="end"&&g),_=S||k;(d||m||_)&&(e.flipped=!0,(d||m)&&(r=a[s+1]),_&&(o=E8(o)),e.placement=r+(o?"-"+o:""),e.offsets.popper=tn({},e.offsets.popper,rE(e.instance.popper,e.offsets.reference,e.placement)),e=iE(e.instance.modifiers,e,"flip"))}),e}function A8(e){var t=e.offsets,n=t.popper,r=t.reference,i=e.placement.split("-")[0],o=Math.floor,a=["top","bottom"].indexOf(i)!==-1,l=a?"right":"bottom",s=a?"left":"top",u=a?"width":"height";return n[l]o(r[l])&&(e.offsets.popper[s]=o(r[l])),e}function k8(e,t,n,r){var i=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),o=+i[1],a=i[2];if(!o)return e;if(a.indexOf("%")===0){var l=void 0;switch(a){case"%p":l=n;break;case"%":case"%r":default:l=r}var s=$r(l);return s[t]/100*o}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*o}else return o}function O8(e,t,n,r){var i=[0,0],o=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),l=a.indexOf(rs(a,function(c){return c.search(/,|\s/)!==-1}));a[l]&&a[l].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var s=/\s*,\s*|\s+/,u=l!==-1?[a.slice(0,l).concat([a[l].split(s)[0]]),[a[l].split(s)[1]].concat(a.slice(l+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!o:o)?"height":"width",p=!1;return c.reduce(function(h,g){return h[h.length-1]===""&&["+","-"].indexOf(g)!==-1?(h[h.length-1]=g,p=!0,h):p?(h[h.length-1]+=g,p=!1,h):h.concat(g)},[]).map(function(h){return k8(h,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){Zm(d)&&(i[f]+=d*(c[p-1]==="-"?-1:1))})}),i}function P8(e,t){var n=t.offset,r=e.placement,i=e.offsets,o=i.popper,a=i.reference,l=r.split("-")[0],s=void 0;return Zm(+n)?s=[+n,0]:s=O8(n,o,a,l),l==="left"?(o.top+=s[0],o.left-=s[1]):l==="right"?(o.top+=s[0],o.left+=s[1]):l==="top"?(o.left+=s[0],o.top-=s[1]):l==="bottom"&&(o.left+=s[0],o.top+=s[1]),e.popper=o,e}function I8(e,t){var n=t.boundariesElement||Oo(e.instance.popper);e.instance.reference===n&&(n=Oo(n));var r=Km("transform"),i=e.instance.popper.style,o=i.top,a=i.left,l=i[r];i.top="",i.left="",i[r]="";var s=qm(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);i.top=o,i.left=a,i[r]=l,t.boundaries=s;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var h=c[p];return c[p]s[p]&&!t.escapeWithReference&&(g=Math.min(c[h],s[p]-(p==="right"?c.width:c.height))),Io({},h,g)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=tn({},c,f[p](d))}),e.offsets.popper=c,e}function T8(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var i=e.offsets,o=i.reference,a=i.popper,l=["bottom","top"].indexOf(n)!==-1,s=l?"left":"top",u=l?"width":"height",c={start:Io({},s,o[s]),end:Io({},s,o[s]+o[u]-a[u])};e.offsets.popper=tn({},a,c[r])}return e}function _8(e){if(!sE(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=rs(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};o8(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=n8(this.update.bind(this)),this.options=tn({},e.Defaults,i),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(tn({},e.Defaults.modifiers,i.modifiers)).forEach(function(a){r.options.modifiers[a]=tn({},e.Defaults.modifiers[a]||{},i.modifiers?i.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return tn({name:a},r.options.modifiers[a])}).sort(function(a,l){return a.order-l.order}),this.modifiers.forEach(function(a){a.enabled&&Qx(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var o=this.options.eventsEnabled;o&&this.enableEventListeners(),this.state.eventsEnabled=o}return a8(e,[{key:"update",value:function(){return c8.call(this)}},{key:"destroy",value:function(){return f8.call(this)}},{key:"enableEventListeners",value:function(){return p8.call(this)}},{key:"disableEventListeners",value:function(){return m8.call(this)}}]),e}();ef.Utils=(typeof window!="undefined"?window:global).PopperUtils;ef.placements=uE;ef.Defaults=R8;const Q1=ef;var cE={},fE={exports:{}};(function(e,t){(function(n,r){var i=r(n);e.exports=i})(f0,function(n){var r=["N","E","A","D"];function i(E,C){E.super_=C,E.prototype=Object.create(C.prototype,{constructor:{value:E,enumerable:!1,writable:!0,configurable:!0}})}function o(E,C){Object.defineProperty(this,"kind",{value:E,enumerable:!0}),C&&C.length&&Object.defineProperty(this,"path",{value:C,enumerable:!0})}function a(E,C,P){a.super_.call(this,"E",E),Object.defineProperty(this,"lhs",{value:C,enumerable:!0}),Object.defineProperty(this,"rhs",{value:P,enumerable:!0})}i(a,o);function l(E,C){l.super_.call(this,"N",E),Object.defineProperty(this,"rhs",{value:C,enumerable:!0})}i(l,o);function s(E,C){s.super_.call(this,"D",E),Object.defineProperty(this,"lhs",{value:C,enumerable:!0})}i(s,o);function u(E,C,P){u.super_.call(this,"A",E),Object.defineProperty(this,"index",{value:C,enumerable:!0}),Object.defineProperty(this,"item",{value:P,enumerable:!0})}i(u,o);function c(E,C,P){var I=E.slice((P||C)+1||E.length);return E.length=C<0?E.length+C:C,E.push.apply(E,I),E}function f(E){var C=typeof E;return C!=="object"?C:E===Math?"math":E===null?"null":Array.isArray(E)?"array":Object.prototype.toString.call(E)==="[object Date]"?"date":typeof E.toString=="function"&&/^\/.*\//.test(E.toString())?"regexp":"object"}function d(E){var C=0;if(E.length===0)return C;for(var P=0;P0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,N),pe=se!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,N);if(!fe&&pe)P.push(new l(V,C));else if(!pe&&fe)P.push(new s(V,E));else if(f(E)!==f(C))P.push(new a(V,E,C));else if(f(E)==="date"&&E-C!==0)P.push(new a(V,E,C));else if(te==="object"&&E!==null&&C!==null){for(q=B.length-1;q>-1;--q)if(B[q].lhs===E){X=!0;break}if(X)E!==C&&P.push(new a(V,E,C));else{if(B.push({lhs:E,rhs:C}),Array.isArray(E)){for(K&&(E.sort(function(Ee,We){return p(Ee)-p(We)}),C.sort(function(Ee,We){return p(Ee)-p(We)})),q=C.length-1,x=E.length-1;q>x;)P.push(new u(V,q,new l(void 0,C[q--])));for(;x>q;)P.push(new u(V,x,new s(void 0,E[x--])));for(;q>=0;--q)h(E[q],C[q],P,I,V,q,B,K)}else{var he=Object.keys(E),be=Object.keys(C);for(q=0;q=0?(h(E[A],C[A],P,I,V,A,B,K),be[X]=null):h(E[A],void 0,P,I,V,A,B,K);for(q=0;q -*/var F8={set:B8,get:L8,has:M8,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:U8};function L8(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,i){return r&&r[i]},e)}else return typeof t=="number"?e[t]:e;else return e}function M8(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(i,o,a,l){return a==l.length-1?n.own?!!(i&&i.hasOwnProperty(o)):i!==null&&typeof i=="object"&&o in i:i&&i[o]},e)}else return typeof t=="number"?t in e:!1;else return!1}function B8(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(i,o,a){const l=Number.isInteger(Number(r[a+1]));return i[o]=i[o]||(l?[]:{}),r.length==a+1&&(i[o]=n),i[o]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function U8(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var i=t.split("."),o=!1,a;return a=!!i.reduce(function(l,s){return o=o||l===n||!!l&&l[s]===n,l&&l[s]},e),r.validPath?o&&a:o}else return!1;else return!1}Object.defineProperty(cE,"__esModule",{value:!0});var z8=fE.exports,Ot=F8;function j8(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(i)?i.indexOf(l)>=0:l===i;return s&&(o?u:!o)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var i=Ot.get(e,n),o=Ot.get(t,n),a=Array.isArray(r)?r.indexOf(i)<0:i!==r,l=Array.isArray(r)?r.indexOf(o)>=0:o===r;return a&&l},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return X1(Ot.get(e,n),Ot.get(t,n))&&Ot.get(e,n)Ot.get(t,n)}}}var H8=cE.default=Y8;function q1(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Fe(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function dE(e,t){if(e==null)return{};var n=V8(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Kn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function pE(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:Kn(e)}function ls(e){var t=$8();return function(){var r=nc(e),i;if(t){var o=nc(this).constructor;i=Reflect.construct(r,arguments,o)}else i=r.apply(this,arguments);return pE(this,i)}}var G8={flip:{padding:20},preventOverflow:{padding:10}},ye={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},Rn=Hx.canUseDOM,ya=Rr.createPortal!==void 0;function md(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Us(e){var t=e.title,n=e.data,r=e.warn,i=r===void 0?!1:r,o=e.debug,a=o===void 0?!1:o,l=i?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(s){D.plainObject(s)&&s.key?l.apply(console,[s.key,s.value]):l.apply(console,[s])}):l.apply(console,[n]),console.groupEnd())}function J8(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function Q8(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function X8(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,i;i=function(a){n(a),Q8(e,t,i)},J8(e,t,i,r)}function Z1(){}var hE=function(e){as(n,e);var t=ls(n);function n(r){var i;return is(this,n),i=t.call(this,r),Rn?(i.node=document.createElement("div"),r.id&&(i.node.id=r.id),r.zIndex&&(i.node.style.zIndex=r.zIndex),document.body.appendChild(i.node),i):pE(i)}return os(n,[{key:"componentDidMount",value:function(){!Rn||ya||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!Rn||ya||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!Rn||!this.node||(ya||Rr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!Rn)return null;var i=this.props,o=i.children,a=i.setRef;if(ya)return Rr.createPortal(o,this.node);var l=Rr.unstable_renderSubtreeIntoContainer(this,o.length>1?b("div",{children:o}):o[0],this.node);return a(l),null}},{key:"renderReact16",value:function(){var i=this.props,o=i.hasChildren,a=i.placement,l=i.target;return o?this.renderPortal():l||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return ya?this.renderReact16():null}}]),n}(F.Component);pt(hE,"propTypes",{children:R.exports.oneOfType([R.exports.element,R.exports.array]),hasChildren:R.exports.bool,id:R.exports.oneOfType([R.exports.string,R.exports.number]),placement:R.exports.string,setRef:R.exports.func.isRequired,target:R.exports.oneOfType([R.exports.object,R.exports.string]),zIndex:R.exports.number});var mE=function(e){as(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return os(n,[{key:"parentStyle",get:function(){var i=this.props,o=i.placement,a=i.styles,l=a.arrow.length,s={pointerEvents:"none",position:"absolute",width:"100%"};return o.startsWith("top")?(s.bottom=0,s.left=0,s.right=0,s.height=l):o.startsWith("bottom")?(s.left=0,s.right=0,s.top=0,s.height=l):o.startsWith("left")?(s.right=0,s.top=0,s.bottom=0):o.startsWith("right")&&(s.left=0,s.top=0),s}},{key:"render",value:function(){var i=this.props,o=i.placement,a=i.setArrowRef,l=i.styles,s=l.arrow,u=s.color,c=s.display,f=s.length,d=s.margin,p=s.position,h=s.spread,g={display:c,position:p},v,m=h,y=f;return o.startsWith("top")?(v="0,0 ".concat(m/2,",").concat(y," ").concat(m,",0"),g.bottom=0,g.marginLeft=d,g.marginRight=d):o.startsWith("bottom")?(v="".concat(m,",").concat(y," ").concat(m/2,",0 0,").concat(y),g.top=0,g.marginLeft=d,g.marginRight=d):o.startsWith("left")?(y=h,m=f,v="0,0 ".concat(m,",").concat(y/2," 0,").concat(y),g.right=0,g.marginTop=d,g.marginBottom=d):o.startsWith("right")&&(y=h,m=f,v="".concat(m,",").concat(y," ").concat(m,",0 0,").concat(y/2),g.left=0,g.marginTop=d,g.marginBottom=d),b("div",{className:"__floater__arrow",style:this.parentStyle,children:b("span",{ref:a,style:g,children:b("svg",{width:m,height:y,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:b("polygon",{points:v,fill:u})})})})}}]),n}(F.Component);pt(mE,"propTypes",{placement:R.exports.string.isRequired,setArrowRef:R.exports.func.isRequired,styles:R.exports.object.isRequired});var q8=["color","height","width"],gE=function(t){var n=t.handleClick,r=t.styles,i=r.color,o=r.height,a=r.width,l=dE(r,q8);return b("button",{"aria-label":"close",onClick:n,style:l,type:"button",children:b("svg",{width:"".concat(a,"px"),height:"".concat(o,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:b("g",{children:b("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:i})})})})};gE.propTypes={handleClick:R.exports.func.isRequired,styles:R.exports.object.isRequired};var vE=function(t){var n=t.content,r=t.footer,i=t.handleClick,o=t.open,a=t.positionWrapper,l=t.showCloseButton,s=t.title,u=t.styles,c={content:F.isValidElement(n)?n:b("div",{className:"__floater__content",style:u.content,children:n})};return s&&(c.title=F.isValidElement(s)?s:b("div",{className:"__floater__title",style:u.title,children:s})),r&&(c.footer=F.isValidElement(r)?r:b("div",{className:"__floater__footer",style:u.footer,children:r})),(l||a)&&!D.boolean(o)&&(c.close=b(gE,{styles:u.close,handleClick:i})),M("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};vE.propTypes={content:R.exports.node.isRequired,footer:R.exports.node,handleClick:R.exports.func.isRequired,open:R.exports.bool,positionWrapper:R.exports.bool.isRequired,showCloseButton:R.exports.bool.isRequired,styles:R.exports.object.isRequired,title:R.exports.node};var yE=function(e){as(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return os(n,[{key:"style",get:function(){var i=this.props,o=i.disableAnimation,a=i.component,l=i.placement,s=i.hideArrow,u=i.status,c=i.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,h=c.floaterClosing,g=c.floaterOpening,v=c.floaterWithAnimation,m=c.floaterWithComponent,y={};return s||(l.startsWith("top")?y.padding="0 0 ".concat(f,"px"):l.startsWith("bottom")?y.padding="".concat(f,"px 0 0"):l.startsWith("left")?y.padding="0 ".concat(f,"px 0 0"):l.startsWith("right")&&(y.padding="0 0 0 ".concat(f,"px"))),[ye.OPENING,ye.OPEN].indexOf(u)!==-1&&(y=Fe(Fe({},y),g)),u===ye.CLOSING&&(y=Fe(Fe({},y),h)),u===ye.OPEN&&!o&&(y=Fe(Fe({},y),v)),l==="center"&&(y=Fe(Fe({},y),p)),a&&(y=Fe(Fe({},y),m)),Fe(Fe({},d),y)}},{key:"render",value:function(){var i=this.props,o=i.component,a=i.handleClick,l=i.hideArrow,s=i.setFloaterRef,u=i.status,c={},f=["__floater"];return o?F.isValidElement(o)?c.content=F.cloneElement(o,{closeFn:a}):c.content=o({closeFn:a}):c.content=b(vE,U({},this.props)),u===ye.OPEN&&f.push("__floater__open"),l||(c.arrow=b(mE,U({},this.props))),b("div",{ref:s,className:f.join(" "),style:this.style,children:M("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(F.Component);pt(yE,"propTypes",{component:R.exports.oneOfType([R.exports.func,R.exports.element]),content:R.exports.node,disableAnimation:R.exports.bool.isRequired,footer:R.exports.node,handleClick:R.exports.func.isRequired,hideArrow:R.exports.bool.isRequired,open:R.exports.bool,placement:R.exports.string.isRequired,positionWrapper:R.exports.bool.isRequired,setArrowRef:R.exports.func.isRequired,setFloaterRef:R.exports.func.isRequired,showCloseButton:R.exports.bool,status:R.exports.string.isRequired,styles:R.exports.object.isRequired,title:R.exports.node});var wE=function(e){as(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return os(n,[{key:"render",value:function(){var i=this.props,o=i.children,a=i.handleClick,l=i.handleMouseEnter,s=i.handleMouseLeave,u=i.setChildRef,c=i.setWrapperRef,f=i.style,d=i.styles,p;if(o)if(F.Children.count(o)===1)if(!F.isValidElement(o))p=b("span",{children:o});else{var h=D.function(o.type)?"innerRef":"ref";p=F.cloneElement(F.Children.only(o),pt({},h,u))}else p=o;return p?b("span",{ref:c,style:Fe(Fe({},d),f),onClick:a,onMouseEnter:l,onMouseLeave:s,children:p}):null}}]),n}(F.Component);pt(wE,"propTypes",{children:R.exports.node,handleClick:R.exports.func.isRequired,handleMouseEnter:R.exports.func.isRequired,handleMouseLeave:R.exports.func.isRequired,setChildRef:R.exports.func.isRequired,setWrapperRef:R.exports.func.isRequired,style:R.exports.object,styles:R.exports.object.isRequired});var K8={zIndex:100};function Z8(e){var t=Dn(K8,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var e7=["arrow","flip","offset"],t7=["position","top","right","bottom","left"],eg=function(e){as(n,e);var t=ls(n);function n(r){var i;return is(this,n),i=t.call(this,r),pt(Kn(i),"setArrowRef",function(o){i.arrowRef=o}),pt(Kn(i),"setChildRef",function(o){i.childRef=o}),pt(Kn(i),"setFloaterRef",function(o){i.floaterRef||(i.floaterRef=o)}),pt(Kn(i),"setWrapperRef",function(o){i.wrapperRef=o}),pt(Kn(i),"handleTransitionEnd",function(){var o=i.state.status,a=i.props.callback;i.wrapperPopper&&i.wrapperPopper.instance.update(),i.setState({status:o===ye.OPENING?ye.OPEN:ye.IDLE},function(){var l=i.state.status;a(l===ye.OPEN?"open":"close",i.props)})}),pt(Kn(i),"handleClick",function(){var o=i.props,a=o.event,l=o.open;if(!D.boolean(l)){var s=i.state,u=s.positionWrapper,c=s.status;(i.event==="click"||i.event==="hover"&&u)&&(Us({title:"click",data:[{event:a,status:c===ye.OPEN?"closing":"opening"}],debug:i.debug}),i.toggle())}}),pt(Kn(i),"handleMouseEnter",function(){var o=i.props,a=o.event,l=o.open;if(!(D.boolean(l)||md())){var s=i.state.status;i.event==="hover"&&s===ye.IDLE&&(Us({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:i.debug}),clearTimeout(i.eventDelayTimeout),i.toggle())}}),pt(Kn(i),"handleMouseLeave",function(){var o=i.props,a=o.event,l=o.eventDelay,s=o.open;if(!(D.boolean(s)||md())){var u=i.state,c=u.status,f=u.positionWrapper;i.event==="hover"&&(Us({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:i.debug}),l?[ye.OPENING,ye.OPEN].indexOf(c)!==-1&&!f&&!i.eventDelayTimeout&&(i.eventDelayTimeout=setTimeout(function(){delete i.eventDelayTimeout,i.toggle()},l*1e3)):i.toggle(ye.IDLE))}}),i.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ye.INIT,statusWrapper:ye.INIT},i._isMounted=!1,Rn&&window.addEventListener("load",function(){i.popper&&i.popper.instance.update(),i.wrapperPopper&&i.wrapperPopper.instance.update()}),i}return os(n,[{key:"componentDidMount",value:function(){if(!!Rn){var i=this.state.positionWrapper,o=this.props,a=o.children,l=o.open,s=o.target;this._isMounted=!0,Us({title:"init",data:{hasChildren:!!a,hasTarget:!!s,isControlled:D.boolean(l),positionWrapper:i,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&s&&D.boolean(l)}}},{key:"componentDidUpdate",value:function(i,o){if(!!Rn){var a=this.props,l=a.autoOpen,s=a.open,u=a.target,c=a.wrapperOptions,f=H8(o,this.state),d=f.changedFrom,p=f.changedTo;if(i.open!==s){var h;D.boolean(s)&&(h=s?ye.OPENING:ye.CLOSING),this.toggle(h)}(i.wrapperOptions.position!==c.position||i.target!==u)&&this.changeWrapperPosition(this.props),p("status",ye.IDLE)&&s?this.toggle(ye.OPEN):d("status",ye.INIT,ye.IDLE)&&l&&this.toggle(ye.OPEN),this.popper&&p("status",ye.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ye.OPENING)||p("status",ye.CLOSING))&&X8(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!Rn||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var i=this,o=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,l=this.props,s=l.disableFlip,u=l.getPopper,c=l.hideArrow,f=l.offset,d=l.placement,p=l.wrapperOptions,h=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ye.IDLE});else if(o&&this.floaterRef){var g=this.options,v=g.arrow,m=g.flip,y=g.offset,S=dE(g,e7);new Q1(o,this.floaterRef,{placement:d,modifiers:Fe({arrow:Fe({enabled:!c,element:this.arrowRef},v),flip:Fe({enabled:!s,behavior:h},m),offset:Fe({offset:"0, ".concat(f,"px")},y)},S),onCreate:function(w){i.popper=w,u(w,"floater"),i._isMounted&&i.setState({currentPlacement:w.placement,status:ye.IDLE}),d!==w.placement&&setTimeout(function(){w.instance.update()},1)},onUpdate:function(w){i.popper=w;var O=i.state.currentPlacement;i._isMounted&&w.placement!==O&&i.setState({currentPlacement:w.placement})}})}if(a){var k=D.undefined(p.offset)?0:p.offset;new Q1(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(k,"px")},flip:{enabled:!1}},onCreate:function(w){i.wrapperPopper=w,i._isMounted&&i.setState({statusWrapper:ye.IDLE}),u(w,"wrapper"),d!==w.placement&&setTimeout(function(){w.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(i){var o=i.target,a=i.wrapperOptions;this.setState({positionWrapper:a.position&&!!o})}},{key:"toggle",value:function(i){var o=this.state.status,a=o===ye.OPEN?ye.CLOSING:ye.OPENING;D.undefined(i)||(a=i),this.setState({status:a})}},{key:"debug",get:function(){var i=this.props.debug;return i||!!global.ReactFloaterDebug}},{key:"event",get:function(){var i=this.props,o=i.disableHoverToClick,a=i.event;return a==="hover"&&md()&&!o?"click":a}},{key:"options",get:function(){var i=this.props.options;return Dn(G8,i||{})}},{key:"styles",get:function(){var i=this,o=this.state,a=o.status,l=o.positionWrapper,s=o.statusWrapper,u=this.props.styles,c=Dn(Z8(u),u);if(l){var f;[ye.IDLE].indexOf(a)===-1||[ye.IDLE].indexOf(s)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Fe(Fe({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Fe(Fe({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},l||(t7.forEach(function(p){i.wrapperStyles[p]=d[p]}),c.wrapper=Fe(Fe({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!Rn)return null;var i=this.props.target;return i?D.domElement(i)?i:document.querySelector(i):this.childRef||this.wrapperRef}},{key:"render",value:function(){var i=this.state,o=i.currentPlacement,a=i.positionWrapper,l=i.status,s=this.props,u=s.children,c=s.component,f=s.content,d=s.disableAnimation,p=s.footer,h=s.hideArrow,g=s.id,v=s.open,m=s.showCloseButton,y=s.style,S=s.target,k=s.title,_=b(wE,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:y,styles:this.styles.wrapper,children:u}),w={};return a?w.wrapperInPortal=_:w.wrapperAsChildren=_,M("span",{children:[M(hE,{hasChildren:!!u,id:g,placement:o,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[b(yE,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:h||o==="center",open:v,placement:o,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:m,status:l,styles:this.styles,title:k}),w.wrapperInPortal]}),w.wrapperAsChildren]})}}]),n}(F.Component);pt(eg,"propTypes",{autoOpen:R.exports.bool,callback:R.exports.func,children:R.exports.node,component:Y1(R.exports.oneOfType([R.exports.func,R.exports.element]),function(e){return!e.content}),content:Y1(R.exports.node,function(e){return!e.component}),debug:R.exports.bool,disableAnimation:R.exports.bool,disableFlip:R.exports.bool,disableHoverToClick:R.exports.bool,event:R.exports.oneOf(["hover","click"]),eventDelay:R.exports.number,footer:R.exports.node,getPopper:R.exports.func,hideArrow:R.exports.bool,id:R.exports.oneOfType([R.exports.string,R.exports.number]),offset:R.exports.number,open:R.exports.bool,options:R.exports.object,placement:R.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:R.exports.bool,style:R.exports.object,styles:R.exports.object,target:R.exports.oneOfType([R.exports.object,R.exports.string]),title:R.exports.node,wrapperOptions:R.exports.shape({offset:R.exports.number,placement:R.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:R.exports.bool})});pt(eg,"defaultProps",{autoOpen:!1,callback:Z1,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:Z1,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function e0(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function $(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function ic(e,t){if(e==null)return{};var n=r7(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function je(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function bE(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return je(e)}function _i(e){var t=n7();return function(){var r=rc(e),i;if(t){var o=rc(this).constructor;i=Reflect.construct(r,arguments,o)}else i=r.apply(this,arguments);return bE(this,i)}}var ge={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},bt={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ce={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},me={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},er=Hx.canUseDOM,wa=Pl.exports.createPortal!==void 0;function SE(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function gd(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function ba(e){var t=[],n=function r(i){if(typeof i=="string"||typeof i=="number")t.push(i);else if(Array.isArray(i))i.forEach(function(a){return r(a)});else if(i&&i.props){var o=i.props.children;Array.isArray(o)?o.forEach(function(a){return r(a)}):r(o)}};return n(e),t.join(" ").trim()}function n0(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function i7(e,t){return!D.plainObject(e)||!D.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function o7(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(i,o,a,l){return o+o+a+a+l+l}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function r0(e){return e.disableBeacon||e.placement==="center"}function Gp(e,t){var n,r=H.exports.isValidElement(e)||H.exports.isValidElement(t),i=D.undefined(e)||D.undefined(t);if(gd(e)!==gd(t)||r||i)return!1;if(D.domElement(e))return e.isSameNode(t);if(D.number(e))return e===t;if(D.function(e))return e.toString()===t.toString();for(var o in e)if(n0(e,o)){if(typeof e[o]=="undefined"||typeof t[o]=="undefined")return!1;if(n=gd(e[o]),["object","array"].indexOf(n)!==-1&&Gp(e[o],t[o])||n==="function"&&Gp(e[o],t[o]))continue;if(e[o]!==t[o])return!1}for(var a in t)if(n0(t,a)&&typeof e[a]=="undefined")return!1;return!0}function i0(){return["chrome","safari","firefox","opera"].indexOf(SE())===-1}function xi(e){var t=e.title,n=e.data,r=e.warn,i=r===void 0?!1:r,o=e.debug,a=o===void 0?!1:o,l=i?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(s){D.plainObject(s)&&s.key?l.apply(console,[s.key,s.value]):l.apply(console,[s])}):l.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var a7={action:"",controlled:!1,index:0,lifecycle:ce.INIT,size:0,status:me.IDLE},o0=["action","index","lifecycle","status"];function l7(e){var t=new Map,n=new Map,r=function(){function i(){var o=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},l=a.continuous,s=l===void 0?!1:l,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;pr(this,i),Z(this,"listener",void 0),Z(this,"setSteps",function(d){var p=o.getState(),h=p.size,g=p.status,v={size:d.length,status:g};n.set("steps",d),g===me.WAITING&&!h&&d.length&&(v.status=me.RUNNING),o.setState(v)}),Z(this,"addListener",function(d){o.listener=d}),Z(this,"update",function(d){if(!i7(d,o0))throw new Error("State is not valid. Valid keys: ".concat(o0.join(", ")));o.setState($({},o.getNextState($($($({},o.getState()),d),{},{action:d.action||ge.UPDATE}),!0)))}),Z(this,"start",function(d){var p=o.getState(),h=p.index,g=p.size;o.setState($($({},o.getNextState({action:ge.START,index:D.number(d)?d:h},!0)),{},{status:g?me.RUNNING:me.WAITING}))}),Z(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=o.getState(),h=p.index,g=p.status;[me.FINISHED,me.SKIPPED].indexOf(g)===-1&&o.setState($($({},o.getNextState({action:ge.STOP,index:h+(d?1:0)})),{},{status:me.PAUSED}))}),Z(this,"close",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState($({},o.getNextState({action:ge.CLOSE,index:p+1})))}),Z(this,"go",function(d){var p=o.getState(),h=p.controlled,g=p.status;if(!(h||g!==me.RUNNING)){var v=o.getSteps()[d];o.setState($($({},o.getNextState({action:ge.GO,index:d})),{},{status:v?g:me.FINISHED}))}}),Z(this,"info",function(){return o.getState()}),Z(this,"next",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState(o.getNextState({action:ge.NEXT,index:p+1}))}),Z(this,"open",function(){var d=o.getState(),p=d.status;p===me.RUNNING&&o.setState($({},o.getNextState({action:ge.UPDATE,lifecycle:ce.TOOLTIP})))}),Z(this,"prev",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState($({},o.getNextState({action:ge.PREV,index:p-1})))}),Z(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=o.getState(),h=p.controlled;h||o.setState($($({},o.getNextState({action:ge.RESET,index:0})),{},{status:d?me.RUNNING:me.READY}))}),Z(this,"skip",function(){var d=o.getState(),p=d.status;p===me.RUNNING&&o.setState({action:ge.SKIP,lifecycle:ce.INIT,status:me.SKIPPED})}),this.setState({action:ge.INIT,controlled:D.number(u),continuous:s,index:D.number(u)?u:0,lifecycle:ce.INIT,status:f.length?me.READY:me.IDLE},!0),this.setSteps(f)}return hr(i,[{key:"setState",value:function(a){var l=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,s=this.getState(),u=$($({},s),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,h=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",h),l&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(s)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:$({},a7)}},{key:"getNextState",value:function(a){var l=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,s=this.getState(),u=s.action,c=s.controlled,f=s.index,d=s.size,p=s.status,h=D.number(a.index)?a.index:f,g=c&&!l?f:Math.min(Math.max(h,0),d);return{action:a.action||u,controlled:c,index:g,lifecycle:a.lifecycle||ce.INIT,size:a.size||d,status:g===d?me.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var l=JSON.stringify(a),s=JSON.stringify(this.getState());return l!==s}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),i}();return new r(e)}function nl(){return document.scrollingElement||document.createElement("body")}function xE(e){return e?e.getBoundingClientRect():{}}function s7(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function Lr(e){return typeof e=="string"?document.querySelector(e):e}function u7(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function tf(e,t,n){var r=Vx(e);if(r.isSameNode(nl()))return n?document:nl();var i=r.scrollHeight>r.offsetHeight;return!i&&!t?(r.style.overflow="initial",nl()):r}function nf(e,t){if(!e)return!1;var n=tf(e,t);return!n.isSameNode(nl())}function c7(e){return e.offsetParent!==document.body}function To(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:u7(e).position===t?!0:To(e.parentNode,t)}function f7(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,i=n.visibility;if(r==="none"||i==="hidden")return!1}t=t.parentNode}return!0}function d7(e,t,n){var r=xE(e),i=tf(e,n),o=nf(e,n),a=0;i instanceof HTMLElement&&(a=i.scrollTop);var l=r.top+(!o&&!To(e)?a:0);return Math.floor(l-t)}function Jp(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?Jp(e.offsetParent)+e.offsetTop:e.offsetTop:0}function p7(e,t,n){if(!e)return 0;var r=Vx(e),i=Jp(e);return nf(e,n)&&!c7(e)&&(i-=Jp(r)),Math.floor(i-t)}function h7(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:nl(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,i){var o=t.scrollTop,a=e>o?e-o:o-e;IL.top(t,e,{duration:a<100?50:n},function(l){return l&&l.message!=="Element already at target scroll position"?i(l):r()})})}function m7(e){function t(r,i,o,a,l,s){var u=a||"<>",c=s||o;if(i[o]==null)return r?new Error("Required ".concat(l," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=Dn(g7,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return D.plainObject(e)?e.target?!0:(xi({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(xi({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function l0(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return D.array(e)?e.every(function(n){return EE(n,t)}):(xi({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var w7=hr(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(pr(this,e),Z(this,"element",void 0),Z(this,"options",void 0),Z(this,"canBeTabbed",function(i){var o=i.tabIndex;(o===null||o<0)&&(o=void 0);var a=isNaN(o);return!a&&n.canHaveFocus(i)}),Z(this,"canHaveFocus",function(i){var o=/input|select|textarea|button|object/,a=i.nodeName.toLowerCase(),l=o.test(a)&&!i.getAttribute("disabled")||a==="a"&&!!i.getAttribute("href");return l&&n.isVisible(i)}),Z(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),Z(this,"handleKeyDown",function(i){var o=n.options.keyCode,a=o===void 0?9:o;i.keyCode===a&&n.interceptTab(i)}),Z(this,"interceptTab",function(i){var o=n.findValidTabElements();if(!!o.length){i.preventDefault();var a=i.shiftKey,l=o.indexOf(document.activeElement);l===-1||!a&&l+1===o.length?l=0:a&&l===0?l=o.length-1:l+=a?-1:1,o[l].focus()}}),Z(this,"isHidden",function(i){var o=i.offsetWidth<=0&&i.offsetHeight<=0,a=window.getComputedStyle(i);return o&&!i.innerHTML?!0:o&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),Z(this,"isVisible",function(i){for(var o=i;o;)if(o instanceof HTMLElement){if(o===document.body)break;if(n.isHidden(o))return!1;o=o.parentNode}return!0}),Z(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),Z(this,"checkFocus",function(i){document.activeElement!==i&&(i.focus(),window.requestAnimationFrame(function(){return n.checkFocus(i)}))}),Z(this,"setFocus",function(){var i=n.options.selector;if(!!i){var o=n.element.querySelector(i);o&&window.requestAnimationFrame(function(){return n.checkFocus(o)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),b7=function(e){Ti(n,e);var t=_i(n);function n(r){var i;if(pr(this,n),i=t.call(this,r),Z(je(i),"setBeaconRef",function(s){i.beacon=s}),!r.beaconComponent){var o=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),l=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(l)),o.appendChild(a)}return i}return hr(n,[{key:"componentDidMount",value:function(){var i=this,o=this.props.shouldFocus;setTimeout(function(){D.domElement(i.beacon)&&o&&i.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var i=document.getElementById("joyride-beacon-animation");i&&i.parentNode.removeChild(i)}},{key:"render",value:function(){var i=this.props,o=i.beaconComponent,a=i.locale,l=i.onClickOrHover,s=i.styles,u={"aria-label":a.open,onClick:l,onMouseEnter:l,ref:this.setBeaconRef,title:a.open},c;if(o){var f=o;c=b(f,U({},u))}else c=M("button",Q(U({className:"react-joyride__beacon",style:s.beacon,type:"button"},u),{children:[b("span",{style:s.beaconInner}),b("span",{style:s.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(F.Component),S7=function(t){var n=t.styles;return b("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},x7=["mixBlendMode","zIndex"],E7=function(e){Ti(n,e);var t=_i(n);function n(){var r;pr(this,n);for(var i=arguments.length,o=new Array(i),a=0;a=p&&g<=p+c,y=v>=f&&v<=f+h,S=y&&m;S!==s&&r.updateState({mouseOverSpotlight:S})}),Z(je(r),"handleScroll",function(){var l=r.props.target,s=Lr(l);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else To(s,"sticky")&&r.updateState({})}),Z(je(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return hr(n,[{key:"componentDidMount",value:function(){var i=this.props;i.debug,i.disableScrolling;var o=i.disableScrollParentFix,a=i.target,l=Lr(a);this.scrollParent=tf(l,o,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(i){var o=this,a=this.props,l=a.lifecycle,s=a.spotlightClicks,u=Zu(i,this.props),c=u.changed;c("lifecycle",ce.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=o.state.isScrolling;f||o.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(s&&l===ce.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):l!==ce.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var i=this.state.showSpotlight,o=this.props,a=o.disableScrollParentFix,l=o.spotlightClicks,s=o.spotlightPadding,u=o.styles,c=o.target,f=Lr(c),d=xE(f),p=To(f),h=d7(f,s,a);return $($({},i0()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+s*2),left:Math.round(d.left-s),opacity:i?1:0,pointerEvents:l?"none":"auto",position:p?"fixed":"absolute",top:h,transition:"opacity 0.2s",width:Math.round(d.width+s*2)})}},{key:"updateState",value:function(i){!this._isMounted||this.setState(i)}},{key:"render",value:function(){var i=this.state,o=i.mouseOverSpotlight,a=i.showSpotlight,l=this.props,s=l.disableOverlay,u=l.disableOverlayClose,c=l.lifecycle,f=l.onClickOverlay,d=l.placement,p=l.styles;if(s||c!==ce.TOOLTIP)return null;var h=p.overlay;i0()&&(h=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var g=$({cursor:u?"default":"pointer",height:s7(),pointerEvents:o?"none":"auto"},h),v=d!=="center"&&a&&b(S7,{styles:this.spotlightStyles});if(SE()==="safari"){g.mixBlendMode,g.zIndex;var m=ic(g,x7);v=b("div",{style:$({},m),children:v}),delete g.backgroundColor}return b("div",{className:"react-joyride__overlay",style:g,onClick:f,children:v})}}]),n}(F.Component),C7=["styles"],A7=["color","height","width"],k7=function(t){var n=t.styles,r=ic(t,C7),i=n.color,o=n.height,a=n.width,l=ic(n,A7);return b("button",Q(U({style:l,type:"button"},r),{children:b("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof o=="number"?"".concat(o,"px"):o,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:b("g",{children:b("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:i})})})}))},O7=function(e){Ti(n,e);var t=_i(n);function n(){return pr(this,n),t.apply(this,arguments)}return hr(n,[{key:"render",value:function(){var i=this.props,o=i.backProps,a=i.closeProps,l=i.continuous,s=i.index,u=i.isLastStep,c=i.primaryProps,f=i.size,d=i.skipProps,p=i.step,h=i.tooltipProps,g=p.content,v=p.hideBackButton,m=p.hideCloseButton,y=p.hideFooter,S=p.showProgress,k=p.showSkipButton,_=p.title,w=p.styles,O=p.locale,E=O.back,C=O.close,P=O.last,I=O.next,T=O.skip,N={primary:C};return l&&(N.primary=u?P:I,S&&(N.primary=M("span",{children:[N.primary," (",s+1,"/",f,")"]}))),k&&!u&&(N.skip=b("button",Q(U({style:w.buttonSkip,type:"button","aria-live":"off"},d),{children:T}))),!v&&s>0&&(N.back=b("button",Q(U({style:w.buttonBack,type:"button"},o),{children:E}))),N.close=!m&&b(k7,U({styles:w.buttonClose},a)),M("div",Q(U({className:"react-joyride__tooltip",style:w.tooltip},h),{children:[M("div",{style:w.tooltipContainer,children:[_&&b("h4",{style:w.tooltipTitle,"aria-label":_,children:_}),b("div",{style:w.tooltipContent,children:g})]}),!y&&M("div",{style:w.tooltipFooter,children:[b("div",{style:w.tooltipFooterSpacer,children:N.skip}),N.back,b("button",Q(U({style:w.buttonNext,type:"button"},c),{children:N.primary}))]}),N.close]}),"JoyrideTooltip")}}]),n}(F.Component),P7=["beaconComponent","tooltipComponent"],I7=function(e){Ti(n,e);var t=_i(n);function n(){var r;pr(this,n);for(var i=arguments.length,o=new Array(i),a=0;a0||a===ge.PREV),w=y("action")||y("index")||y("lifecycle")||y("status"),O=S("lifecycle",[ce.TOOLTIP,ce.INIT],ce.INIT),E=y("action",[ge.NEXT,ge.PREV,ge.SKIP,ge.CLOSE]);if(E&&(O||u)&&l($($({},k),{},{index:i.index,lifecycle:ce.COMPLETE,step:i.step,type:bt.STEP_AFTER})),y("index")&&f>0&&d===ce.INIT&&h===me.RUNNING&&g.placement==="center"&&v({lifecycle:ce.READY}),w&&g){var C=Lr(g.target),P=!!C,I=P&&f7(C);I?(S("status",me.READY,me.RUNNING)||S("lifecycle",ce.INIT,ce.READY))&&l($($({},k),{},{step:g,type:bt.STEP_BEFORE})):(console.warn(P?"Target not visible":"Target not mounted",g),l($($({},k),{},{type:bt.TARGET_NOT_FOUND,step:g})),u||v({index:f+([ge.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ce.INIT,ce.READY)&&v({lifecycle:r0(g)||_?ce.TOOLTIP:ce.BEACON}),y("index")&&xi({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),y("lifecycle",ce.BEACON)&&l($($({},k),{},{step:g,type:bt.BEACON})),y("lifecycle",ce.TOOLTIP)&&(l($($({},k),{},{step:g,type:bt.TOOLTIP})),this.scope=new w7(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ce.TOOLTIP,ce.INIT],ce.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var i=this.props,o=i.step,a=i.lifecycle;return!!(r0(o)||a===ce.TOOLTIP)}},{key:"render",value:function(){var i=this.props,o=i.continuous,a=i.debug,l=i.helpers,s=i.index,u=i.lifecycle,c=i.nonce,f=i.shouldScroll,d=i.size,p=i.step,h=Lr(p.target);return!EE(p)||!D.domElement(h)?null:M("div",{className:"react-joyride__step",children:[b(T7,{id:"react-joyride-portal",children:b(E7,Q(U({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),b(eg,Q(U({component:b(I7,{continuous:o,helpers:l,index:s,isLastStep:s+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(s),isPositioned:p.isFixed||To(h),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:b(b7,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(s))}}]),n}(F.Component),CE=function(e){Ti(n,e);var t=_i(n);function n(r){var i;return pr(this,n),i=t.call(this,r),Z(je(i),"initStore",function(){var o=i.props,a=o.debug,l=o.getHelpers,s=o.run,u=o.stepIndex;i.store=new l7($($({},i.props),{},{controlled:s&&D.number(u)})),i.helpers=i.store.getHelpers();var c=i.store.addListener;return xi({title:"init",data:[{key:"props",value:i.props},{key:"state",value:i.state}],debug:a}),c(i.syncState),l(i.helpers),i.store.getState()}),Z(je(i),"callback",function(o){var a=i.props.callback;D.function(a)&&a(o)}),Z(je(i),"handleKeyboard",function(o){var a=i.state,l=a.index,s=a.lifecycle,u=i.props.steps,c=u[l],f=window.Event?o.which:o.keyCode;s===ce.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&i.store.close()}),Z(je(i),"syncState",function(o){i.setState(o)}),Z(je(i),"setPopper",function(o,a){a==="wrapper"?i.beaconPopper=o:i.tooltipPopper=o}),Z(je(i),"shouldScroll",function(o,a,l,s,u,c,f){return!o&&(a!==0||l||s===ce.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!To(c))&&f.lifecycle!==s&&[ce.BEACON,ce.TOOLTIP].indexOf(s)!==-1}),i.state=i.initStore(),i}return hr(n,[{key:"componentDidMount",value:function(){if(!!er){var i=this.props,o=i.disableCloseOnEsc,a=i.debug,l=i.run,s=i.steps,u=this.store.start;l0(s,a)&&l&&u(),o||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(i,o){if(!!er){var a=this.state,l=a.action,s=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,h=d.run,g=d.stepIndex,v=d.steps,m=i.steps,y=i.stepIndex,S=this.store,k=S.reset,_=S.setSteps,w=S.start,O=S.stop,E=S.update,C=Zu(i,this.props),P=C.changed,I=Zu(o,this.state),T=I.changed,N=I.changedFrom,B=xa(v[u],this.props),K=!Gp(m,v),V=D.number(g)&&P("stepIndex"),le=Lr(B==null?void 0:B.target);if(K&&(l0(v,p)?_(v):console.warn("Steps are not valid",v)),P("run")&&(h?w(g):O()),V){var te=y=0?w:0,s===me.RUNNING&&h7(w,_,g)}}}},{key:"render",value:function(){if(!er)return null;var i=this.state,o=i.index,a=i.status,l=this.props,s=l.continuous,u=l.debug,c=l.nonce,f=l.scrollToFirstStep,d=l.steps,p=xa(d[o],this.props),h;return a===me.RUNNING&&p&&(h=b(_7,Q(U({},this.state),{callback:this.callback,continuous:s,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(o!==0||f),step:p,update:this.store.update}))),b("div",{className:"react-joyride",children:h})}}]),n}(F.Component);Z(CE,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const N7=M("div",{children:[b("p",{children:"You can see how the changes impact your app with the app preview."}),b("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),b("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),D7=M("div",{children:[b("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),b("p",{children:"You can click on elements to select them or drag them around to move them."}),b("p",{children:"Cards can be resized by dragging resize handles on the sides."}),b("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),b("p",{children:b("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),R7=M("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",b("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",b("span",{className:gp.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),F7=M("div",{children:[b("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),b("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),L7=[{target:".app-view",content:D7,disableBeacon:!0},{target:".elements-panel",content:R7,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:F7,placement:"left-start"},{target:".app-preview",content:N7,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function M7(){const[e,t]=H.exports.useState(0),[n,r]=H.exports.useState(!1),i=H.exports.useCallback(a=>{const{action:l,index:s,status:u,type:c}=a;console.log({action:l,index:s,status:u,type:c}),(c===bt.STEP_AFTER||c===bt.TARGET_NOT_FOUND)&&(l===ge.NEXT?t(s+1):l===ge.PREV?t(s-1):l===ge.CLOSE&&r(!1)),c===bt.TOUR_END&&(l===ge.NEXT&&(r(!1),t(0)),l===ge.SKIP&&r(!1))},[]),o=H.exports.useCallback(()=>{r(!0)},[]);return M(Ke,{children:[M(Ft,{onClick:o,title:"Take a guided tour of app",variant:"transparent",children:[b(zk,{id:"tour",size:"24px"}),"Tour App"]}),b(CE,{callback:i,steps:L7,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:U7})]})}const s0="#e07189",B7="#f6d5dc",U7={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:s0},beaconOuter:{backgroundColor:B7,border:`2px solid ${s0}`}},z7="_container_17s66_1",j7="_elementsPanel_17s66_28",W7="_propertiesPanel_17s66_37",Y7="_editorHolder_17s66_52",H7="_titledPanel_17s66_65",$7="_panelTitleHeader_17s66_77",V7="_header_17s66_86",G7="_rightSide_17s66_94",J7="_divider_17s66_115",Q7="_title_17s66_65",X7="_shinyLogo_17s66_126",Pt={container:z7,elementsPanel:j7,propertiesPanel:W7,editorHolder:Y7,titledPanel:H7,panelTitleHeader:$7,header:V7,rightSide:G7,divider:J7,title:Q7,shinyLogo:X7},q7="_container_1fh41_1",K7="_node_1fh41_12",u0={container:q7,node:K7};function Z7({tree:e,path:t,onSelect:n}){const r=t.length;let i=[];for(let o=0;o<=r;o++){const a=Fr(e,t.slice(0,o));if(a===void 0)return null;i.push(kn[a.uiName].title)}return b("div",{className:u0.container,children:i.map((o,a)=>b("div",{className:u0.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:eM(o)},o+a))})}function eM(e){return e.replace(/[a-z]+::/,"")}const tM="_settingsPanel_zsgzt_1",nM="_currentElementAbout_zsgzt_10",rM="_settingsForm_zsgzt_17",iM="_settingsInputs_zsgzt_24",oM="_buttonsHolder_zsgzt_28",aM="_validationErrorMsg_zsgzt_45",Ea={settingsPanel:tM,currentElementAbout:nM,settingsForm:rM,settingsInputs:iM,buttonsHolder:oM,validationErrorMsg:aM};function lM(e){const t=Jr(),[n,r]=Hb(),[i,o]=H.exports.useState(n!==null?Fr(e,n):null),a=H.exports.useRef(!1),l=H.exports.useMemo(()=>xm(u=>{!n||!a.current||t(_x({path:n,node:u}))},250),[t,n]);return H.exports.useEffect(()=>{if(a.current=!1,n===null){o(null);return}Fr(e,n)!==void 0&&o(Fr(e,n))},[e,n]),H.exports.useEffect(()=>{!i||l(i)},[i,l]),{currentNode:i,updateArgumentsByName:({name:u,value:c})=>{o(f=>Q(U({},f),{uiArguments:Q(U({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function sM({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:i}=lM(e);if(r===null)return b("div",{children:"Select an element to edit properties"});if(t===null)return M("div",{children:["Error finding requested node at path ",r.join(".")]});const o=r.length===0,{uiName:a,uiArguments:l}=t,s=kn[a].SettingsComponent;return M("div",{className:Ea.settingsPanel+" properties-panel",children:[b("div",{className:Ea.currentElementAbout,children:b(Z7,{tree:e,path:r,onSelect:i})}),b("form",{className:Ea.settingsForm,onSubmit:uM,children:b("div",{className:Ea.settingsInputs,children:b(oP,{onChange:n,children:b(s,{settings:l})})})}),b("div",{className:Ea.buttonsHolder,children:o?null:b(Yb,{path:r})})]})}function uM(e){e.preventDefault()}function cM(e){return["INITIAL-DATA"].includes(e.path)}function fM(){const e=Jr(),t=Hl(r=>r.uiTree),n=H.exports.useCallback(r=>{e(QR({initialState:r}))},[e]);return{tree:t,setTree:n}}function dM(){const{tree:e,setTree:t}=fM(),{status:n,ws:r}=Mx(),[i,o]=H.exports.useState("loading"),a=H.exports.useRef(null),l=Hl(s=>s.uiTree);return H.exports.useEffect(()=>{n==="connected"&&(Bx(r,s=>{!cM(s)||(a.current=s.payload,t(s.payload),o("connected"))}),tl(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(o("no-backend"),t(pM),console.log("Running in static mode"))},[t,n,r]),H.exports.useEffect(()=>{l===Gm||l===a.current||n==="connected"&&tl(r,{path:"STATE-UPDATE",payload:l})},[l,n,r]),{status:i,tree:e}}const pM={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},AE=236,hM={"--properties-panel-width":`${AE}px`};function mM(){const{status:e,tree:t}=dM();return e==="loading"?b(gM,{}):M(Kk,{children:[M("div",{className:Pt.container,style:hM,children:[M("div",{className:Pt.header,children:[b(XF,{className:Pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),b("h1",{className:Pt.title,children:"Shiny UI Editor"}),M("div",{className:Pt.rightSide,children:[b(M7,{}),b("div",{className:Pt.divider}),b(nL,{})]})]}),M("div",{className:`${Pt.elementsPanel} ${Pt.titledPanel} elements-panel`,children:[b("h3",{className:Pt.panelTitleHeader,children:"Elements"}),b(cL,{})]}),b("div",{className:Pt.editorHolder+" app-view",children:b(mm,U({},t))}),M("div",{className:`${Pt.propertiesPanel}`,children:[M("div",{className:`${Pt.titledPanel} properties-panel`,children:[b("h3",{className:Pt.panelTitleHeader,children:"Properties"}),b(sM,{tree:t})]}),b("div",{className:`${Pt.titledPanel} app-preview`,children:b(VF,{})})]})]}),b(vM,{})]})}function gM(){return b("h3",{children:"Loading initial state from server"})}function vM(){return Hl(t=>t.connectedToServer)?null:b(ox,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:b("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const yM=()=>b(eF,{children:b(oF,{children:b(mM,{})})}),wM="modulepreload",bM=function(e,t){return new URL(e,t).href},c0={},SM=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(i=>{if(i=bM(i,r),i in c0)return;c0[i]=!0;const o=i.endsWith(".css"),a=o?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${i}"]${a}`))return;const l=document.createElement("link");if(l.rel=o?"stylesheet":wM,o||(l.as="script",l.crossOrigin=""),l.href=i,document.head.appendChild(l),o)return new Promise((s,u)=>{l.addEventListener("load",s),l.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${i}`)))})})).then(()=>t())},xM=e=>{e&&e instanceof Function&&SM(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:i,getTTFB:o})=>{t(e),n(e),r(e),i(e),o(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function EM(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}Rr.render(b(H.exports.StrictMode,{children:b(yM,{})}),document.getElementById("root"));EM();xM(); diff --git a/docs/articles/demo-app/assets/index.26bc0247.js b/docs/articles/demo-app/assets/index.26bc0247.js deleted file mode 100644 index be58e7993..000000000 --- a/docs/articles/demo-app/assets/index.26bc0247.js +++ /dev/null @@ -1,178 +0,0 @@ -var YE=Object.defineProperty,$E=Object.defineProperties;var HE=Object.getOwnPropertyDescriptors;var ys=Object.getOwnPropertySymbols;var yg=Object.prototype.hasOwnProperty,wg=Object.prototype.propertyIsEnumerable;var bg=Math.pow,vg=(e,t,n)=>t in e?YE(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,U=(e,t)=>{for(var n in t||(t={}))yg.call(t,n)&&vg(e,n,t[n]);if(ys)for(var n of ys(t))wg.call(t,n)&&vg(e,n,t[n]);return e},Q=(e,t)=>$E(e,HE(t));var bn=(e,t)=>{var n={};for(var r in e)yg.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&ys)for(var r of ys(e))t.indexOf(r)<0&&wg.call(e,r)&&(n[r]=e[r]);return n};var Sg=(e,t,n)=>new Promise((r,i)=>{var o=s=>{try{l(n.next(s))}catch(u){i(u)}},a=s=>{try{l(n.throw(s))}catch(u){i(u)}},l=s=>s.done?r(s.value):Promise.resolve(s.value).then(o,a);l((n=n.apply(e,t)).next())});const VE=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const i of document.querySelectorAll('link[rel="modulepreload"]'))r(i);new MutationObserver(i=>{for(const o of i)if(o.type==="childList")for(const a of o.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(i){const o={};return i.integrity&&(o.integrity=i.integrity),i.referrerpolicy&&(o.referrerPolicy=i.referrerpolicy),i.crossorigin==="use-credentials"?o.credentials="include":i.crossorigin==="anonymous"?o.credentials="omit":o.credentials="same-origin",o}function r(i){if(i.ep)return;i.ep=!0;const o=n(i);fetch(i.href,o)}};VE();var k0=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function sh(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function O0(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var i=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,i.get?i:{enumerable:!0,get:function(){return e[r]}})}),n}var $={exports:{}},we={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var xg=Object.getOwnPropertySymbols,GE=Object.prototype.hasOwnProperty,JE=Object.prototype.propertyIsEnumerable;function QE(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function XE(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(o){return t[o]});if(r.join("")!=="0123456789")return!1;var i={};return"abcdefghijklmnopqrst".split("").forEach(function(o){i[o]=o}),Object.keys(Object.assign({},i)).join("")==="abcdefghijklmnopqrst"}catch(o){return!1}}var P0=XE()?Object.assign:function(e,t){for(var n,r=QE(e),i,o=1;o=y},i=function(){},e.unstable_forceFrameRate=function(x){0>x||125>>1,pe=x[fe];if(pe!==void 0&&0E(be,X))Ye!==void 0&&0>E(Ye,be)?(x[fe]=Ye,x[Ce]=X,fe=Ce):(x[fe]=be,x[he]=X,fe=he);else if(Ye!==void 0&&0>E(Ye,X))x[fe]=Ye,x[Ce]=X,fe=Ce;else break e}}return A}return null}function E(x,A){var X=x.sortIndex-A.sortIndex;return X!==0?X:x.id-A.id}var C=[],P=[],I=1,T=null,N=3,B=!1,K=!1,V=!1;function le(x){for(var A=w(P);A!==null;){if(A.callback===null)O(P);else if(A.startTime<=x)O(P),A.sortIndex=A.expirationTime,_(C,A);else break;A=w(P)}}function te(x){if(V=!1,le(x),!K)if(w(C)!==null)K=!0,t(se);else{var A=w(P);A!==null&&n(te,A.startTime-x)}}function se(x,A){K=!1,V&&(V=!1,r()),B=!0;var X=N;try{for(le(A),T=w(C);T!==null&&(!(T.expirationTime>A)||x&&!e.unstable_shouldYield());){var fe=T.callback;if(typeof fe=="function"){T.callback=null,N=T.priorityLevel;var pe=fe(T.expirationTime<=A);A=e.unstable_now(),typeof pe=="function"?T.callback=pe:T===w(C)&&O(C),le(A)}else O(C);T=w(C)}if(T!==null)var he=!0;else{var be=w(P);be!==null&&n(te,be.startTime-A),he=!1}return he}finally{T=null,N=X,B=!1}}var q=i;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(x){x.callback=null},e.unstable_continueExecution=function(){K||B||(K=!0,t(se))},e.unstable_getCurrentPriorityLevel=function(){return N},e.unstable_getFirstCallbackNode=function(){return w(C)},e.unstable_next=function(x){switch(N){case 1:case 2:case 3:var A=3;break;default:A=N}var X=N;N=A;try{return x()}finally{N=X}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=q,e.unstable_runWithPriority=function(x,A){switch(x){case 1:case 2:case 3:case 4:case 5:break;default:x=3}var X=N;N=x;try{return A()}finally{N=X}},e.unstable_scheduleCallback=function(x,A,X){var fe=e.unstable_now();switch(typeof X=="object"&&X!==null?(X=X.delay,X=typeof X=="number"&&0fe?(x.sortIndex=X,_(P,x),w(C)===null&&x===w(P)&&(V?r():V=!0,n(te,X-fe))):(x.sortIndex=pe,_(C,x),K||B||(K=!0,t(se))),x},e.unstable_wrapCallback=function(x){var A=N;return function(){var X=N;N=A;try{return x.apply(this,arguments)}finally{N=X}}}})(Y0);(function(e){e.exports=Y0})(W0);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var sc=$.exports,Ue=P0,rt=W0.exports;function j(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function Ct(e,t,n,r,i,o,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=i,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=o,this.removeEmptyString=a}var ft={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){ft[e]=new Ct(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];ft[t]=new Ct(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){ft[e]=new Ct(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){ft[e]=new Ct(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){ft[e]=new Ct(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){ft[e]=new Ct(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){ft[e]=new Ct(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){ft[e]=new Ct(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){ft[e]=new Ct(e,5,!1,e.toLowerCase(),null,!1,!1)});var hh=/[\-:]([a-z])/g;function mh(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(hh,mh);ft[t]=new Ct(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(hh,mh);ft[t]=new Ct(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(hh,mh);ft[t]=new Ct(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){ft[e]=new Ct(e,1,!1,e.toLowerCase(),null,!1,!1)});ft.xlinkHref=new Ct("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){ft[e]=new Ct(e,1,!1,e.toLowerCase(),null,!0,!0)});function gh(e,t,n,r){var i=ft.hasOwnProperty(t)?ft[t]:null,o=i!==null?i.type===0:r?!1:!(!(2l||i[a]!==o[l])return` -`+i[a].replace(" at new "," at ");while(1<=a&&0<=l);break}}}finally{Ef=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Pa(e):""}function aC(e){switch(e.tag){case 5:return Pa(e.type);case 16:return Pa("Lazy");case 13:return Pa("Suspense");case 19:return Pa("SuspenseList");case 0:case 2:case 15:return e=bs(e.type,!1),e;case 11:return e=bs(e.type.render,!1),e;case 22:return e=bs(e.type._render,!1),e;case 1:return e=bs(e.type,!0),e;default:return""}}function Ki(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case br:return"Fragment";case ci:return"Portal";case Ba:return"Profiler";case vh:return"StrictMode";case Ua:return"Suspense";case pu:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case wh:return(e.displayName||"Context")+".Consumer";case yh:return(e._context.displayName||"Context")+".Provider";case uc:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case cc:return Ki(e.type);case Sh:return Ki(e._render);case bh:t=e._payload,e=e._init;try{return Ki(e(t))}catch(n){}}return null}function zr(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function V0(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function lC(e){var t=V0(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var i=n.get,o=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return i.call(this)},set:function(a){r=""+a,o.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function Ss(e){e._valueTracker||(e._valueTracker=lC(e))}function G0(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=V0(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function hu(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function Nd(e,t){var n=t.checked;return Ue({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function Ig(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=zr(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function J0(e,t){t=t.checked,t!=null&&gh(e,"checked",t,!1)}function Dd(e,t){J0(e,t);var n=zr(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Rd(e,t.type,n):t.hasOwnProperty("defaultValue")&&Rd(e,t.type,zr(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function Tg(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Rd(e,t,n){(t!=="number"||hu(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function sC(e){var t="";return sc.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function Fd(e,t){return e=Ue({children:void 0},t),(t=sC(t.children))&&(e.children=t),e}function Zi(e,t,n,r){if(e=e.options,t){t={};for(var i=0;i=n.length))throw Error(j(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:zr(n)}}function Q0(e,t){var n=zr(t.value),r=zr(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function Ng(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Md={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function X0(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Bd(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?X0(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var xs,q0=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,i){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,i)})}:e}(function(e,t){if(e.namespaceURI!==Md.svg||"innerHTML"in e)e.innerHTML=t;else{for(xs=xs||document.createElement("div"),xs.innerHTML=""+t.valueOf().toString()+"",t=xs.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function ll(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var za={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},uC=["Webkit","ms","Moz","O"];Object.keys(za).forEach(function(e){uC.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),za[t]=za[e]})});function K0(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||za.hasOwnProperty(e)&&za[e]?(""+t).trim():t+"px"}function Z0(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,i=K0(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,i):e[n]=i}}var cC=Ue({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Ud(e,t){if(t){if(cC[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(j(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(j(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(j(61))}if(t.style!=null&&typeof t.style!="object")throw Error(j(62))}}function zd(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function Ch(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var jd=null,eo=null,to=null;function Dg(e){if(e=Dl(e)){if(typeof jd!="function")throw Error(j(280));var t=e.stateNode;t&&(t=gc(t),jd(e.stateNode,e.type,t))}}function ew(e){eo?to?to.push(e):to=[e]:eo=e}function tw(){if(eo){var e=eo,t=to;if(to=eo=null,Dg(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function dc(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-jr(t),e[t]=n}var jr=Math.clz32?Math.clz32:kC,CC=Math.log,AC=Math.LN2;function kC(e){return e===0?32:31-(CC(e)/AC|0)|0}var OC=rt.unstable_UserBlockingPriority,PC=rt.unstable_runWithPriority,Hs=!0;function IC(e,t,n,r){fi||kh();var i=_h,o=fi;fi=!0;try{nw(i,e,t,n,r)}finally{(fi=o)||Oh()}}function TC(e,t,n,r){PC(OC,_h.bind(null,e,t,n,r))}function _h(e,t,n,r){if(Hs){var i;if((i=(t&4)===0)&&0=Wa),Yg=String.fromCharCode(32),$g=!1;function ww(e,t){switch(e){case"keyup":return ZC.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function bw(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var Hi=!1;function tA(e,t){switch(e){case"compositionend":return bw(t);case"keypress":return t.which!==32?null:($g=!0,Yg);case"textInput":return e=t.data,e===Yg&&$g?null:e;default:return null}}function nA(e,t){if(Hi)return e==="compositionend"||!Lh&&ww(e,t)?(e=vw(),Vs=Dh=Cr=null,Hi=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Jg(n)}}function Cw(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?Cw(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Xg(){for(var e=window,t=hu();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=hu(e.document)}return t}function Vd(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var dA=dr&&"documentMode"in document&&11>=document.documentMode,Vi=null,Gd=null,$a=null,Jd=!1;function qg(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;Jd||Vi==null||Vi!==hu(r)||(r=Vi,"selectionStart"in r&&Vd(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),$a&&pl($a,r)||($a=r,r=yu(Gd,"onSelect"),0Ji||(e.current=Xd[Ji],Xd[Ji]=null,Ji--)}function Ge(e,t){Ji++,Xd[Ji]=e.current,e.current=t}var Wr={},wt=Qr(Wr),Ft=Qr(!1),yi=Wr;function yo(e,t){var n=e.type.contextTypes;if(!n)return Wr;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var i={},o;for(o in n)i[o]=t[o];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=i),i}function Lt(e){return e=e.childContextTypes,e!=null}function Su(){Re(Ft),Re(wt)}function av(e,t,n){if(wt.current!==Wr)throw Error(j(168));Ge(wt,t),Ge(Ft,n)}function Nw(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var i in r)if(!(i in e))throw Error(j(108,Ki(t)||"Unknown",i));return Ue({},n,r)}function Js(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||Wr,yi=wt.current,Ge(wt,e),Ge(Ft,Ft.current),!0}function lv(e,t,n){var r=e.stateNode;if(!r)throw Error(j(169));n?(e=Nw(e,t,yi),r.__reactInternalMemoizedMergedChildContext=e,Re(Ft),Re(wt),Ge(wt,e)):Re(Ft),Ge(Ft,n)}var Bh=null,mi=null,mA=rt.unstable_runWithPriority,Uh=rt.unstable_scheduleCallback,qd=rt.unstable_cancelCallback,gA=rt.unstable_shouldYield,sv=rt.unstable_requestPaint,Kd=rt.unstable_now,vA=rt.unstable_getCurrentPriorityLevel,vc=rt.unstable_ImmediatePriority,Dw=rt.unstable_UserBlockingPriority,Rw=rt.unstable_NormalPriority,Fw=rt.unstable_LowPriority,Lw=rt.unstable_IdlePriority,Lf={},yA=sv!==void 0?sv:function(){},nr=null,Qs=null,Mf=!1,uv=Kd(),vt=1e4>uv?Kd:function(){return Kd()-uv};function wo(){switch(vA()){case vc:return 99;case Dw:return 98;case Rw:return 97;case Fw:return 96;case Lw:return 95;default:throw Error(j(332))}}function Mw(e){switch(e){case 99:return vc;case 98:return Dw;case 97:return Rw;case 96:return Fw;case 95:return Lw;default:throw Error(j(332))}}function wi(e,t){return e=Mw(e),mA(e,t)}function ml(e,t,n){return e=Mw(e),Uh(e,t,n)}function Kn(){if(Qs!==null){var e=Qs;Qs=null,qd(e)}Bw()}function Bw(){if(!Mf&&nr!==null){Mf=!0;var e=0;try{var t=nr;wi(99,function(){for(;eO?(E=w,w=null):E=w.sibling;var C=d(v,w,y[O],S);if(C===null){w===null&&(w=E);break}e&&w&&C.alternate===null&&t(v,w),m=o(C,m,O),_===null?k=C:_.sibling=C,_=C,w=E}if(O===y.length)return n(v,w),k;if(w===null){for(;OO?(E=w,w=null):E=w.sibling;var P=d(v,w,C.value,S);if(P===null){w===null&&(w=E);break}e&&w&&P.alternate===null&&t(v,w),m=o(P,m,O),_===null?k=P:_.sibling=P,_=P,w=E}if(C.done)return n(v,w),k;if(w===null){for(;!C.done;O++,C=y.next())C=f(v,C.value,S),C!==null&&(m=o(C,m,O),_===null?k=C:_.sibling=C,_=C);return k}for(w=r(v,w);!C.done;O++,C=y.next())C=p(w,v,O,C.value,S),C!==null&&(e&&C.alternate!==null&&w.delete(C.key===null?O:C.key),m=o(C,m,O),_===null?k=C:_.sibling=C,_=C);return e&&w.forEach(function(I){return t(v,I)}),k}return function(v,m,y,S){var k=typeof y=="object"&&y!==null&&y.type===br&&y.key===null;k&&(y=y.props.children);var _=typeof y=="object"&&y!==null;if(_)switch(y.$$typeof){case Oa:e:{for(_=y.key,k=m;k!==null;){if(k.key===_){switch(k.tag){case 7:if(y.type===br){n(v,k.sibling),m=i(k,y.props.children),m.return=v,v=m;break e}break;default:if(k.elementType===y.type){n(v,k.sibling),m=i(k,y.props),m.ref=aa(v,k,y),m.return=v,v=m;break e}}n(v,k);break}else t(v,k);k=k.sibling}y.type===br?(m=lo(y.props.children,v.mode,S,y.key),m.return=v,v=m):(S=Zs(y.type,y.key,y.props,null,v.mode,S),S.ref=aa(v,m,y),S.return=v,v=S)}return a(v);case ci:e:{for(k=y.key;m!==null;){if(m.key===k)if(m.tag===4&&m.stateNode.containerInfo===y.containerInfo&&m.stateNode.implementation===y.implementation){n(v,m.sibling),m=i(m,y.children||[]),m.return=v,v=m;break e}else{n(v,m);break}else t(v,m);m=m.sibling}m=Yf(y,v.mode,S),m.return=v,v=m}return a(v)}if(typeof y=="string"||typeof y=="number")return y=""+y,m!==null&&m.tag===6?(n(v,m.sibling),m=i(m,y),m.return=v,v=m):(n(v,m),m=Wf(y,v.mode,S),m.return=v,v=m),a(v);if(As(y))return h(v,m,y,S);if(ea(y))return g(v,m,y,S);if(_&&ks(v,y),typeof y=="undefined"&&!k)switch(v.tag){case 1:case 22:case 0:case 11:case 15:throw Error(j(152,Ki(v.type)||"Component"))}return n(v,m)}}var ku=Yw(!0),$w=Yw(!1),Rl={},Wn=Qr(Rl),vl=Qr(Rl),yl=Qr(Rl);function pi(e){if(e===Rl)throw Error(j(174));return e}function ep(e,t){switch(Ge(yl,t),Ge(vl,e),Ge(Wn,Rl),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Bd(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Bd(t,e)}Re(Wn),Ge(Wn,t)}function bo(){Re(Wn),Re(vl),Re(yl)}function hv(e){pi(yl.current);var t=pi(Wn.current),n=Bd(t,e.type);t!==n&&(Ge(vl,e),Ge(Wn,n))}function Yh(e){vl.current===e&&(Re(Wn),Re(vl))}var Ve=Qr(0);function Ou(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var or=null,kr=null,Yn=!1;function Hw(e,t){var n=rn(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function mv(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function tp(e){if(Yn){var t=kr;if(t){var n=t;if(!mv(e,t)){if(t=no(n.nextSibling),!t||!mv(e,t)){e.flags=e.flags&-1025|2,Yn=!1,or=e;return}Hw(or,n)}or=e,kr=no(t.firstChild)}else e.flags=e.flags&-1025|2,Yn=!1,or=e}}function gv(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;or=e}function Os(e){if(e!==or)return!1;if(!Yn)return gv(e),Yn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!Qd(t,e.memoizedProps))for(t=kr;t;)Hw(e,t),t=no(t.nextSibling);if(gv(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(j(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){kr=no(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}kr=null}}else kr=or?no(e.stateNode.nextSibling):null;return!0}function Bf(){kr=or=null,Yn=!1}var io=[];function $h(){for(var e=0;eo))throw Error(j(301));o+=1,ut=ht=null,t.updateQueue=null,Ha.current=EA,e=n(r,i)}while(Va)}if(Ha.current=Nu,t=ht!==null&&ht.next!==null,wl=0,ut=ht=Qe=null,Pu=!1,t)throw Error(j(300));return e}function hi(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return ut===null?Qe.memoizedState=ut=e:ut=ut.next=e,ut}function Pi(){if(ht===null){var e=Qe.alternate;e=e!==null?e.memoizedState:null}else e=ht.next;var t=ut===null?Qe.memoizedState:ut.next;if(t!==null)ut=t,ht=e;else{if(e===null)throw Error(j(310));ht=e,e={memoizedState:ht.memoizedState,baseState:ht.baseState,baseQueue:ht.baseQueue,queue:ht.queue,next:null},ut===null?Qe.memoizedState=ut=e:ut=ut.next=e}return ut}function Un(e,t){return typeof t=="function"?t(e):t}function la(e){var t=Pi(),n=t.queue;if(n===null)throw Error(j(311));n.lastRenderedReducer=e;var r=ht,i=r.baseQueue,o=n.pending;if(o!==null){if(i!==null){var a=i.next;i.next=o.next,o.next=a}r.baseQueue=i=o,n.pending=null}if(i!==null){i=i.next,r=r.baseState;var l=a=o=null,s=i;do{var u=s.lane;if((wl&u)===u)l!==null&&(l=l.next={lane:0,action:s.action,eagerReducer:s.eagerReducer,eagerState:s.eagerState,next:null}),r=s.eagerReducer===e?s.eagerState:e(r,s.action);else{var c={lane:u,action:s.action,eagerReducer:s.eagerReducer,eagerState:s.eagerState,next:null};l===null?(a=l=c,o=r):l=l.next=c,Qe.lanes|=u,Fl|=u}s=s.next}while(s!==null&&s!==i);l===null?o=r:l.next=a,nn(r,t.memoizedState)||(Pn=!0),t.memoizedState=r,t.baseState=o,t.baseQueue=l,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function sa(e){var t=Pi(),n=t.queue;if(n===null)throw Error(j(311));n.lastRenderedReducer=e;var r=n.dispatch,i=n.pending,o=t.memoizedState;if(i!==null){n.pending=null;var a=i=i.next;do o=e(o,a.action),a=a.next;while(a!==i);nn(o,t.memoizedState)||(Pn=!0),t.memoizedState=o,t.baseQueue===null&&(t.baseState=o),n.lastRenderedState=o}return[o,r]}function vv(e,t,n){var r=t._getVersion;r=r(t._source);var i=t._workInProgressVersionPrimary;if(i!==null?e=i===r:(e=e.mutableReadLanes,(e=(wl&e)===e)&&(t._workInProgressVersionPrimary=r,io.push(t))),e)return n(t._source);throw io.push(t),Error(j(350))}function Vw(e,t,n,r){var i=Et;if(i===null)throw Error(j(349));var o=t._getVersion,a=o(t._source),l=Ha.current,s=l.useState(function(){return vv(i,t,n)}),u=s[1],c=s[0];s=ut;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,h=f.source;f=f.subscribe;var g=Qe;return e.memoizedState={refs:d,source:t,subscribe:r},l.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var v=o(t._source);if(!nn(a,v)){v=n(t._source),nn(c,v)||(u(v),v=Rr(g),i.mutableReadLanes|=v&i.pendingLanes),v=i.mutableReadLanes,i.entangledLanes|=v;for(var m=i.entanglements,y=v;0n?98:n,function(){e(!0)}),wi(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[Ar]=t,e[bu]=r,tb(e,t,!1,!1),t.stateNode=e,a=zd(n,r),n){case"dialog":Ne("cancel",e),Ne("close",e),i=r;break;case"iframe":case"object":case"embed":Ne("load",e),i=r;break;case"video":case"audio":for(i=0;ifp&&(t.flags|=64,o=!0,ca(r,!1),t.lanes=33554432)}else{if(!o)if(e=Ou(a),e!==null){if(t.flags|=64,o=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),ca(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!Yn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*vt()-r.renderingStartTime>fp&&n!==1073741824&&(t.flags|=64,o=!0,ca(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=vt(),n.sibling=null,t=Ve.current,Ge(Ve,o?t&1|2:t&1),n):null;case 23:case 24:return em(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(j(156,t.tag))}function kA(e){switch(e.tag){case 1:Lt(e.type)&&Su();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(bo(),Re(Ft),Re(wt),$h(),t=e.flags,(t&64)!==0)throw Error(j(285));return e.flags=t&-4097|64,e;case 5:return Yh(e),null;case 13:return Re(Ve),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return Re(Ve),null;case 4:return bo(),null;case 10:return jh(e),null;case 23:case 24:return em(),null;default:return null}}function Xh(e,t){try{var n="",r=t;do n+=aC(r),r=r.return;while(r);var i=n}catch(o){i=` -Error generating stack: `+o.message+` -`+o.stack}return{value:e,source:t,stack:i}}function ap(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var OA=typeof WeakMap=="function"?WeakMap:Map;function ib(e,t,n){n=Nr(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){Ru||(Ru=!0,dp=r),ap(e,t)},n}function ob(e,t,n){n=Nr(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var i=t.value;n.payload=function(){return ap(e,t),r(i)}}var o=e.stateNode;return o!==null&&typeof o.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(zn===null?zn=new Set([this]):zn.add(this),ap(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var PA=typeof WeakSet=="function"?WeakSet:Set;function Tv(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){Lr(e,n)}else t.current=null}function IA(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Cn(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Mh(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(j(163))}function TA(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var i=e;r=i.next,i=i.tag,(i&4)!==0&&(i&1)!==0&&(hb(n,e),BA(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Cn(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&fv(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}fv(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&Tw(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&uw(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(j(163))}function _v(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var i=n.memoizedProps.style;i=i!=null&&i.hasOwnProperty("display")?i.display:null,r.style.display=K0("display",i)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function Nv(e,t){if(mi&&typeof mi.onCommitFiberUnmount=="function")try{mi.onCommitFiberUnmount(Bh,t)}catch(o){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,i=r.destroy;if(r=r.tag,i!==void 0)if((r&4)!==0)hb(t,n);else{r=t;try{i()}catch(o){Lr(r,o)}}n=n.next}while(n!==e)}break;case 1:if(Tv(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(o){Lr(t,o)}break;case 5:Tv(t);break;case 4:ab(e,t)}}function Dv(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function Rv(e){return e.tag===5||e.tag===3||e.tag===4}function Fv(e){e:{for(var t=e.return;t!==null;){if(Rv(t))break e;t=t.return}throw Error(j(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(j(161))}n.flags&16&&(ll(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||Rv(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?lp(e,n,t):sp(e,n,t)}function lp(e,t,n){var r=e.tag,i=r===5||r===6;if(i)e=i?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=wu));else if(r!==4&&(e=e.child,e!==null))for(lp(e,t,n),e=e.sibling;e!==null;)lp(e,t,n),e=e.sibling}function sp(e,t,n){var r=e.tag,i=r===5||r===6;if(i)e=i?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(sp(e,t,n),e=e.sibling;e!==null;)sp(e,t,n),e=e.sibling}function ab(e,t){for(var n=t,r=!1,i,o;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(j(160));switch(i=r.stateNode,r.tag){case 5:o=!1;break e;case 3:i=i.containerInfo,o=!0;break e;case 4:i=i.containerInfo,o=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,l=n,s=l;;)if(Nv(a,s),s.child!==null&&s.tag!==4)s.child.return=s,s=s.child;else{if(s===l)break e;for(;s.sibling===null;){if(s.return===null||s.return===l)break e;s=s.return}s.sibling.return=s.return,s=s.sibling}o?(a=i,l=n.stateNode,a.nodeType===8?a.parentNode.removeChild(l):a.removeChild(l)):i.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){i=n.stateNode.containerInfo,o=!0,n.child.return=n,n=n.child;continue}}else if(Nv(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function jf(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var i=e!==null?e.memoizedProps:r;e=t.type;var o=t.updateQueue;if(t.updateQueue=null,o!==null){for(n[bu]=r,e==="input"&&r.type==="radio"&&r.name!=null&&J0(n,r),zd(e,i),t=zd(e,r),i=0;ii&&(i=a),n&=~o}if(n=i,n=vt()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*NA(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}ct!==5&&(ct=2),s=Xh(s,l),d=a;do{switch(d.tag){case 3:o=s,d.flags|=4096,t&=-t,d.lanes|=t;var _=ib(d,o,t);cv(d,_);break e;case 1:o=s;var w=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof w.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(zn===null||!zn.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var E=ob(d,o,t);cv(d,E);break e}}d=d.return}while(d!==null)}pb(n)}catch(C){t=C,et===n&&n!==null&&(et=n=n.return);continue}break}while(1)}function fb(){var e=Du.current;return Du.current=Nu,e===null?Nu:e}function _a(e,t){var n=ne;ne|=16;var r=fb();Et===e&&yt===t||ao(e,t);do try{RA();break}catch(i){cb(e,i)}while(1);if(zh(),ne=n,Du.current=r,et!==null)throw Error(j(261));return Et=null,yt=0,ct}function RA(){for(;et!==null;)db(et)}function FA(){for(;et!==null&&!gA();)db(et)}function db(e){var t=mb(e.alternate,e,bi);e.memoizedProps=e.pendingProps,t===null?pb(e):et=t,qh.current=null}function pb(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=AA(n,t,bi),n!==null){et=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(bi&1073741824)!==0||(n.mode&4)===0){for(var r=0,i=n.child;i!==null;)r|=i.lanes|i.childLanes,i=i.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(l=a,a=_,_=l),l=Qg(y,_),o=Qg(y,a),l&&o&&(k.rangeCount!==1||k.anchorNode!==l.node||k.anchorOffset!==l.offset||k.focusNode!==o.node||k.focusOffset!==o.offset)&&(S=S.createRange(),S.setStart(l.node,l.offset),k.removeAllRanges(),_>a?(k.addRange(S),k.extend(o.node,o.offset)):(S.setEnd(o.node,o.offset),k.addRange(S)))))),S=[],k=y;k=k.parentNode;)k.nodeType===1&&S.push({element:k,left:k.scrollLeft,top:k.scrollTop});for(typeof y.focus=="function"&&y.focus(),y=0;yvt()-Zh?ao(e,0):Kh|=n),cn(e,t)}function jA(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=wo()===99?1:2:(ir===0&&(ir=Bo),t=zi(62914560&~ir),t===0&&(t=4194304))),n=Vt(),e=bc(e,t),e!==null&&(dc(e,t,n),cn(e,n))}var mb;mb=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||Ft.current)Pn=!0;else if((n&r)!==0)Pn=(e.flags&16384)!==0;else{switch(Pn=!1,t.tag){case 3:Ev(t),Bf();break;case 5:hv(t);break;case 1:Lt(t.type)&&Js(t);break;case 4:ep(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var i=t.type._context;Ge(xu,i._currentValue),i._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?Cv(e,t,n):(Ge(Ve,Ve.current&1),t=ar(e,t,n),t!==null?t.sibling:null);Ge(Ve,Ve.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return Iv(e,t,n);t.flags|=64}if(i=t.memoizedState,i!==null&&(i.rendering=null,i.tail=null,i.lastEffect=null),Ge(Ve,Ve.current),r)break;return null;case 23:case 24:return t.lanes=0,Uf(e,t,n)}return ar(e,t,n)}else Pn=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=yo(t,wt.current),ro(t,n),i=Vh(null,t,r,e,i,n),t.flags|=1,typeof i=="object"&&i!==null&&typeof i.render=="function"&&i.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,Lt(r)){var o=!0;Js(t)}else o=!1;t.memoizedState=i.state!==null&&i.state!==void 0?i.state:null,Wh(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&Au(t,r,a,e),i.updater=yc,t.stateNode=i,i._reactInternals=t,Zd(t,r,e,n),t=ip(null,t,r,!0,o,n)}else t.tag=0,Nt(null,t,i,n),t=t.child;return t;case 16:i=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=i._init,i=o(i._payload),t.type=i,o=t.tag=YA(i),e=Cn(i,e),o){case 0:t=rp(null,t,i,e,n);break e;case 1:t=xv(null,t,i,e,n);break e;case 11:t=bv(null,t,i,e,n);break e;case 14:t=Sv(null,t,i,Cn(i.type,e),r,n);break e}throw Error(j(306,i,""))}return t;case 0:return r=t.type,i=t.pendingProps,i=t.elementType===r?i:Cn(r,i),rp(e,t,r,i,n);case 1:return r=t.type,i=t.pendingProps,i=t.elementType===r?i:Cn(r,i),xv(e,t,r,i,n);case 3:if(Ev(t),r=t.updateQueue,e===null||r===null)throw Error(j(282));if(r=t.pendingProps,i=t.memoizedState,i=i!==null?i.element:null,zw(e,t),gl(t,r,null,n),r=t.memoizedState.element,r===i)Bf(),t=ar(e,t,n);else{if(i=t.stateNode,(o=i.hydrate)&&(kr=no(t.stateNode.containerInfo.firstChild),or=t,o=Yn=!0),o){if(e=i.mutableSourceEagerHydrationData,e!=null)for(i=0;i1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:um(e)?2:cm(e)?3:0}function so(e,t){return jo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function N2(e,t){return jo(e)===2?e.get(t):e[t]}function Rb(e,t,n){var r=jo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function Fb(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function um(e){return B2&&e instanceof Map}function cm(e){return U2&&e instanceof Set}function ai(e){return e.o||e.t}function fm(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Mb(e);delete t[Me];for(var n=uo(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=D2),Object.freeze(e),t&&Si(e,function(n,r){return dm(r,!0)},!0)),e}function D2(){kn(2)}function pm(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function ur(e){var t=Sp[e];return t||kn(18,e),t}function R2(e,t){Sp[e]||(Sp[e]=t)}function yp(){return bl}function Hf(e,t){t&&(ur("Patches"),e.u=[],e.s=[],e.v=t)}function Lu(e){wp(e),e.p.forEach(F2),e.p=null}function wp(e){e===bl&&(bl=e.l)}function jv(e){return bl={p:[],l:bl,h:e,m:!0,_:0}}function F2(e){var t=e[Me];t.i===0||t.i===1?t.j():t.O=!0}function Vf(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||ur("ES5").S(t,e,r),r?(n[Me].P&&(Lu(t),kn(4)),Gr(e)&&(e=Mu(t,e),t.l||Bu(t,e)),t.u&&ur("Patches").M(n[Me],e,t.u,t.s)):e=Mu(t,n,[]),Lu(t),t.u&&t.v(t.u,t.s),e!==Lb?e:void 0}function Mu(e,t,n){if(pm(t))return t;var r=t[Me];if(!r)return Si(t,function(o,a){return Wv(e,r,t,o,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Bu(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var i=r.i===4||r.i===5?r.o=fm(r.k):r.o;Si(r.i===3?new Set(i):i,function(o,a){return Wv(e,r,i,o,a,n)}),Bu(e,i,!1),n&&e.u&&ur("Patches").R(r,n,e.u,e.s)}return r.o}function Wv(e,t,n,r,i,o){if(Vr(i)){var a=Mu(e,i,o&&t&&t.i!==3&&!so(t.D,r)?o.concat(r):void 0);if(Rb(n,r,a),!Vr(a))return;e.m=!1}if(Gr(i)&&!pm(i)){if(!e.h.F&&e._<1)return;Mu(e,i),t&&t.A.l||Bu(e,i)}}function Bu(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&dm(t,n)}function Gf(e,t){var n=e[Me];return(n?ai(n):e)[t]}function Yv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Sr(e){e.P||(e.P=!0,e.l&&Sr(e.l))}function Jf(e){e.o||(e.o=fm(e.t))}function bp(e,t,n){var r=um(t)?ur("MapSet").N(t,n):cm(t)?ur("MapSet").T(t,n):e.g?function(i,o){var a=Array.isArray(i),l={i:a?1:0,A:o?o.A:yp(),P:!1,I:!1,D:{},l:o,t:i,k:null,o:null,j:null,C:!1},s=l,u=co;a&&(s=[l],u=eu);var c=Proxy.revocable(s,u),f=c.revoke,d=c.proxy;return l.k=d,l.j=f,d}(t,n):ur("ES5").J(t,n);return(n?n.A:yp()).p.push(r),r}function L2(e){return Vr(e)||kn(22,e),function t(n){if(!Gr(n))return n;var r,i=n[Me],o=jo(n);if(i){if(!i.P&&(i.i<4||!ur("ES5").K(i)))return i.t;i.I=!0,r=$v(n,o),i.I=!1}else r=$v(n,o);return Si(r,function(a,l){i&&N2(i.t,a)===l||Rb(r,a,t(l))}),o===3?new Set(r):r}(e)}function $v(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return fm(e)}function M2(){function e(o,a){var l=i[o];return l?l.enumerable=a:i[o]=l={configurable:!0,enumerable:a,get:function(){var s=this[Me];return co.get(s,o)},set:function(s){var u=this[Me];co.set(u,o,s)}},l}function t(o){for(var a=o.length-1;a>=0;a--){var l=o[a][Me];if(!l.P)switch(l.i){case 5:r(l)&&Sr(l);break;case 4:n(l)&&Sr(l)}}}function n(o){for(var a=o.t,l=o.k,s=uo(l),u=s.length-1;u>=0;u--){var c=s[u];if(c!==Me){var f=a[c];if(f===void 0&&!so(a,c))return!0;var d=l[c],p=d&&d[Me];if(p?p.t!==f:!Fb(d,f))return!0}}var h=!!a[Me];return s.length!==uo(a).length+(h?0:1)}function r(o){var a=o.k;if(a.length!==o.t.length)return!0;var l=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!l||l.get)}var i={};R2("ES5",{J:function(o,a){var l=Array.isArray(o),s=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?g-1:0),m=1;m1?u-1:0),f=1;f=0;i--){var o=r[i];if(o.path.length===0&&o.op==="replace"){n=o.value;break}}i>-1&&(r=r.slice(i+1));var a=ur("Patches").$;return Vr(n)?a(n,r):this.produce(n,function(l){return a(l,r)})},e}(),Gt=new j2,W2=Gt.produce;Gt.produceWithPatches.bind(Gt);Gt.setAutoFreeze.bind(Gt);Gt.setUseProxies.bind(Gt);Gt.applyPatches.bind(Gt);Gt.createDraft.bind(Gt);Gt.finishDraft.bind(Gt);const tu=W2;function Y2(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Jv(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Qv(e){for(var t=1;t0&&o[o.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!o||u[1]>o[0]&&u[1]0)for(var S=p.getState(),k=Array.from(n.values()),_=0,w=k;_!1}}),Ok=()=>{const e=qr();return R.useCallback(()=>{e(Pk())},[e])},{DISCONNECTED_FROM_SERVER:Pk}=Qb.actions,Ik=Qb.reducer;function Ql(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(o)),i=Object.keys(t).filter(o=>!n.includes(o));if(!Ql(r,i))return!1;for(let o of r)if(e[o]!==t[o])return!1;return!0}function Xb(e,t,n){return n===0?!0:Ql(e.slice(0,n),t.slice(0,n))}function _k(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:Xb(e,t,n)}const qb=mm({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:Kb,RESET_SELECTION:GM,STEP_BACK_SELECTION:Nk}=qb.actions,Dk=qb.reducer;function On(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:wm(e)?2:bm(e)?3:0}function Ep(e,t){return Wo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function Rk(e,t){return Wo(e)===2?e.get(t):e[t]}function Zb(e,t,n){var r=Wo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function Fk(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function wm(e){return Uk&&e instanceof Map}function bm(e){return zk&&e instanceof Set}function li(e){return e.o||e.t}function Sm(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Wk(e);delete t[Jt];for(var n=Am(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=Lk),Object.freeze(e),t&&El(e,function(n,r){return xm(r,!0)},!0)),e}function Lk(){On(2)}function Em(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function $n(e){var t=Yk[e];return t||On(18,e),t}function ny(){return Cl}function Xf(e,t){t&&($n("Patches"),e.u=[],e.s=[],e.v=t)}function Wu(e){Cp(e),e.p.forEach(Mk),e.p=null}function Cp(e){e===Cl&&(Cl=e.l)}function ry(e){return Cl={p:[],l:Cl,h:e,m:!0,_:0}}function Mk(e){var t=e[Jt];t.i===0||t.i===1?t.j():t.O=!0}function qf(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||$n("ES5").S(t,e,r),r?(n[Jt].P&&(Wu(t),On(4)),xi(e)&&(e=Yu(t,e),t.l||$u(t,e)),t.u&&$n("Patches").M(n[Jt].t,e,t.u,t.s)):e=Yu(t,n,[]),Wu(t),t.u&&t.v(t.u,t.s),e!==eS?e:void 0}function Yu(e,t,n){if(Em(t))return t;var r=t[Jt];if(!r)return El(t,function(o,a){return iy(e,r,t,o,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return $u(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var i=r.i===4||r.i===5?r.o=Sm(r.k):r.o;El(r.i===3?new Set(i):i,function(o,a){return iy(e,r,i,o,a,n)}),$u(e,i,!1),n&&e.u&&$n("Patches").R(r,n,e.u,e.s)}return r.o}function iy(e,t,n,r,i,o){if(xo(i)){var a=Yu(e,i,o&&t&&t.i!==3&&!Ep(t.D,r)?o.concat(r):void 0);if(Zb(n,r,a),!xo(a))return;e.m=!1}if(xi(i)&&!Em(i)){if(!e.h.F&&e._<1)return;Yu(e,i),t&&t.A.l||$u(e,i)}}function $u(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&xm(t,n)}function Kf(e,t){var n=e[Jt];return(n?li(n):e)[t]}function oy(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Ap(e){e.P||(e.P=!0,e.l&&Ap(e.l))}function Zf(e){e.o||(e.o=Sm(e.t))}function kp(e,t,n){var r=wm(t)?$n("MapSet").N(t,n):bm(t)?$n("MapSet").T(t,n):e.g?function(i,o){var a=Array.isArray(i),l={i:a?1:0,A:o?o.A:ny(),P:!1,I:!1,D:{},l:o,t:i,k:null,o:null,j:null,C:!1},s=l,u=Op;a&&(s=[l],u=Na);var c=Proxy.revocable(s,u),f=c.revoke,d=c.proxy;return l.k=d,l.j=f,d}(t,n):$n("ES5").J(t,n);return(n?n.A:ny()).p.push(r),r}function Bk(e){return xo(e)||On(22,e),function t(n){if(!xi(n))return n;var r,i=n[Jt],o=Wo(n);if(i){if(!i.P&&(i.i<4||!$n("ES5").K(i)))return i.t;i.I=!0,r=ay(n,o),i.I=!1}else r=ay(n,o);return El(r,function(a,l){i&&Rk(i.t,a)===l||Zb(r,a,t(l))}),o===3?new Set(r):r}(e)}function ay(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Sm(e)}var ly,Cl,Cm=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",Uk=typeof Map!="undefined",zk=typeof Set!="undefined",sy=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",eS=Cm?Symbol.for("immer-nothing"):((ly={})["immer-nothing"]=!0,ly),uy=Cm?Symbol.for("immer-draftable"):"__$immer_draftable",Jt=Cm?Symbol.for("immer-state"):"__$immer_state",jk=""+Object.prototype.constructor,Am=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,Wk=Object.getOwnPropertyDescriptors||function(e){var t={};return Am(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},Yk={},Op={get:function(e,t){if(t===Jt)return e;var n=li(e);if(!Ep(n,t))return function(i,o,a){var l,s=oy(o,a);return s?"value"in s?s.value:(l=s.get)===null||l===void 0?void 0:l.call(i.k):void 0}(e,n,t);var r=n[t];return e.I||!xi(r)?r:r===Kf(e.t,t)?(Zf(e),e.o[t]=kp(e.A.h,r,e)):r},has:function(e,t){return t in li(e)},ownKeys:function(e){return Reflect.ownKeys(li(e))},set:function(e,t,n){var r=oy(li(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var i=Kf(li(e),t),o=i==null?void 0:i[Jt];if(o&&o.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(Fk(n,i)&&(n!==void 0||Ep(e.t,t)))return!0;Zf(e),Ap(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Kf(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,Zf(e),Ap(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=li(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){On(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){On(12)}},Na={};El(Op,function(e,t){Na[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Na.deleteProperty=function(e,t){return Na.set.call(this,e,t,void 0)},Na.set=function(e,t,n){return Op.set.call(this,e[0],t,n,e[0])};var $k=function(){function e(n){var r=this;this.g=sy,this.F=!0,this.produce=function(i,o,a){if(typeof i=="function"&&typeof o!="function"){var l=o;o=i;var s=r;return function(g){var v=this;g===void 0&&(g=l);for(var m=arguments.length,y=Array(m>1?m-1:0),S=1;S1?c-1:0),d=1;d=0;i--){var o=r[i];if(o.path.length===0&&o.op==="replace"){n=o.value;break}}i>-1&&(r=r.slice(i+1));var a=$n("Patches").$;return xo(n)?a(n,r):this.produce(n,function(l){return a(l,r)})},e}(),Qt=new $k,Hk=Qt.produce;Qt.produceWithPatches.bind(Qt);Qt.setAutoFreeze.bind(Qt);Qt.setUseProxies.bind(Qt);Qt.applyPatches.bind(Qt);Qt.createDraft.bind(Qt);Qt.finishDraft.bind(Qt);const Yo=Hk,Vk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function Gk(e){const t=qr();return $.exports.useCallback(()=>{e!==null&&t(Jx({path:e}))},[t,e])}const Jk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",Qk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",Xk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",Pp="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",tS="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",nS="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",qk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",Kk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",Zk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",eO="_icon_1467k_1",tO={icon:eO},nO={undo:Zk,redo:qk,tour:Kk,alignTop:Xk,alignBottom:Qk,alignCenter:Jk,alignSpread:Pp,alignTextCenter:Pp,alignTextLeft:tS,alignTextRight:nS};function rO({id:e,alt:t=e,size:n}){return b("img",{src:nO[e],alt:t,className:tO.icon,style:n?{height:n}:{}})}var rS={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},cy=$.exports.createContext&&$.exports.createContext(rS),Ei=globalThis&&globalThis.__assign||function(){return Ei=Object.assign||function(e){for(var t,n=1,r=arguments.length;nb("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:b("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),km=e=>M("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[b("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),b("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),b("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),sO=e=>b("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:b("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),uO="_button_1dliw_1",cO="_regular_1dliw_26",fO="_icon_1dliw_34",dO="_transparent_1dliw_42",ed={button:uO,regular:cO,delete:"_delete_1dliw_30",icon:fO,transparent:dO},Mt=i=>{var o=i,{children:e,variant:t="regular",className:n}=o,r=bn(o,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(l=>ed[l]).join(" "):ed[t]:"";return b("button",Q(U({className:ed.button+" "+a+(n?" "+n:"")},r),{children:e}))},pO="_deleteButton_1en02_1",hO={deleteButton:pO};function oS({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=Gk(e);return M(Mt,{className:hO.deleteButton,onClick:i=>{i.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[b(km,{}),t?null:"Delete Element"]})}function aS(){const e=qr(),t=Gl(r=>r.selectedPath),n=$.exports.useCallback(r=>{e(Kb({path:r}))},[e]);return[t,n]}const Om=R.createContext([null,e=>{}]),mO=({children:e})=>{const t=R.useState(null);return b(Om.Provider,{value:t,children:e})};function gO(){return R.useContext(Om)}function lS({ref:e,nodeInfo:t,immovable:n=!1}){const r=R.useRef(!1),[,i]=R.useContext(Om),o=R.useCallback(()=>{r.current===!1||n||(i(null),r.current=!1,document.body.removeEventListener("dragover",fy),document.body.removeEventListener("drop",o))},[n,i]),a=R.useCallback(l=>{l.stopPropagation(),i(t),r.current=!0,document.body.addEventListener("dragover",fy),document.body.addEventListener("drop",o)},[o,t,i]);R.useEffect(()=>{var s;if(((s=t.currentPath)==null?void 0:s.length)===0||n)return;const l=e.current;if(!!l)return l.setAttribute("draggable","true"),l.addEventListener("dragstart",a),l.addEventListener("dragend",o),()=>{l.removeEventListener("dragstart",a),l.removeEventListener("dragend",o)}},[o,n,t.currentPath,a,e])}function fy(e){e.preventDefault()}const vO="_leaf_1yzht_1",yO="_selectedOverlay_1yzht_5",wO="_container_1yzht_15",dy={leaf:vO,selectedOverlay:yO,container:wO};function bO({ref:e,path:t}){R.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const Pm=r=>{var i=r,{path:e=[],canMove:t=!0}=i,n=bn(i,["path","canMove"]);const o=R.useRef(null),{uiName:a,uiArguments:l,uiChildren:s}=n,[u,c]=aS(),f=u?Ql(e,u):!1,d=In[a],p=g=>{g.stopPropagation(),c(e)};if(lS({ref:o,nodeInfo:{node:n,currentPath:e},immovable:!t}),bO({ref:o,path:e}),d.acceptsChildren===!0){const g=d.UiComponent;return b(g,{uiArguments:l,uiChildren:s!=null?s:[],compRef:o,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?b("div",{className:dy.selectedOverlay}):null})}const h=d.UiComponent;return b(h,{uiArguments:l,compRef:o,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?b("div",{className:dy.selectedOverlay}):null})},Im=R.forwardRef((i,r)=>{var o=i,{className:e="",children:t}=o,n=bn(o,["className","children"]);const a=e+" card";return b("div",Q(U({ref:r,className:a},n),{children:t}))}),SO=R.forwardRef((r,n)=>{var i=r,{className:e=""}=i,t=bn(i,["className"]);const o=e+" card-header";return b("div",U({ref:n,className:o},t))}),xO="_container_rm196_1",EO="_withTitle_rm196_13",CO="_panelTitle_rm196_22",AO="_contentHolder_rm196_27",kO="_dropWatcher_rm196_67",OO="_lastDropWatcher_rm196_75",PO="_firstDropWatcher_rm196_78",IO="_middleDropWatcher_rm196_89",TO="_onlyDropWatcher_rm196_93",_O="_hoveringOverSwap_rm196_98",NO="_availableToSwap_rm196_99",DO="_pulse_rm196_1",RO="_emptyGridCard_rm196_143",FO="_emptyMessage_rm196_160",$t={container:xO,withTitle:EO,panelTitle:CO,contentHolder:AO,dropWatcher:kO,lastDropWatcher:OO,firstDropWatcher:PO,middleDropWatcher:IO,onlyDropWatcher:TO,hoveringOverSwap:_O,availableToSwap:NO,pulse:DO,emptyGridCard:RO,emptyMessage:FO},LO="_canAcceptDrop_1oxcd_1",MO="_pulse_1oxcd_1",BO="_hoveringOver_1oxcd_32",Ip={canAcceptDrop:LO,pulse:MO,hoveringOver:BO};function Tm({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:i=Ip.canAcceptDrop,hoveringOverClass:o=Ip.hoveringOver}){const[a,l]=gO(),{addCanAcceptDropHighlight:s,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=UO({watcherRef:e,canAcceptDropClass:i,hoveringOverClass:o}),d=a?t(a):!1,p=R.useCallback(v=>{v.preventDefault(),v.stopPropagation(),u(),r==null||r()},[u,r]),h=R.useCallback(v=>{v.preventDefault(),c()},[c]),g=R.useCallback(v=>{if(v.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),l(null)},[d,a,n,c,l]);R.useEffect(()=>{const v=e.current;if(!!v)return d&&(s(),v.addEventListener("dragenter",p),v.addEventListener("dragleave",h),v.addEventListener("dragover",p),v.addEventListener("drop",g)),()=>{f(),v.removeEventListener("dragenter",p),v.removeEventListener("dragleave",h),v.removeEventListener("dragover",p),v.removeEventListener("drop",g)}},[s,d,h,p,g,f,e])}function UO({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=R.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),i=R.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),o=R.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=R.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:i,removeHoveredOverHighlight:o,removeAllHighlights:a}}function zO({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Qx(),i=R.useCallback(({node:a,currentPath:l})=>py(a)!==null&&uF({fromPath:l,toPath:[...n,t]}),[t,n]),o=R.useCallback(({node:a,currentPath:l})=>{const s=py(a);if(!s)throw new Error("No node to place...");r({node:s,currentPath:l,parentPath:n,positionInChildren:t})},[t,n,r]);Tm({watcherRef:e,getCanAcceptDrop:i,onDrop:o})}function py(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function _m(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const i=n-1;return Ql(e.slice(0,i),t.slice(0,i))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function jO(e){return zt({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function hy(e){return zt({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function my(e){return zt({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function sS(e){return zt({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}const Hu=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+o*r)};function gy(e){let t=1/0,n=-1/0;for(let o of e)on&&(n=o);const r=n-t,i=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===i-1}}function uS(e,t){return[...new Array(t)].fill(e)}function WO(e,t){return e.filter(n=>!t.includes(n))}function Tp(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function Al(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function YO(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const i=r[t];return r[t]=void 0,r=Al(r,n,i),r.filter(o=>typeof o!="undefined")}function $O(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const i=e[r-1];return[...e].splice(0,r-1).join(t)+n+i}var Bc=cS;function cS(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],i={}.toString.call(r).slice(8,-1);i=="Array"||i=="Object"?t[n]=cS(r):i=="Date"?t[n]=new Date(r.getTime()):i=="RegExp"?t[n]=RegExp(r.source,HO(r)):t[n]=r}return t}function HO(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Xl(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function VO(e,t={}){const n=new Set;for(let r of e)for(let i of r)t.ignore&&t.ignore.includes(i)||n.add(i);return[...n]}function GO(e,{index:t,arr:n,dir:r}){const i=Bc(e);switch(r){case"rows":return Al(i,t,n);case"cols":return i.map((o,a)=>Al(o,t,n[a]))}}function JO(e,{index:t,dir:n}){const r=Bc(e);switch(n){case"rows":return Tp(r,t);case"cols":return r.map((i,o)=>Tp(i,t))}}const Gn=".";function Nm(e){const t=new Map;return QO(e).forEach(({itemRows:n,itemCols:r},i)=>{if(i===Gn)return;const o=gy(n),a=gy(r);t.set(i,{colStart:a.minVal,rowStart:o.minVal,colSpan:a.span+1,rowSpan:o.span+1,isValid:o.isSequence&&a.isSequence})}),t}function QO(e){var i;const t=new Map,{numRows:n,numCols:r}=Xl(e);for(let o=0;o1,c=r>1,f=[];return(vy({colRange:s,rowIndex:e-1,layoutAreas:i})||u)&&f.push("up"),(vy({colRange:s,rowIndex:o+1,layoutAreas:i})||u)&&f.push("down"),(yy({rowRange:l,colIndex:n-1,layoutAreas:i})||c)&&f.push("left"),(yy({rowRange:l,colIndex:a+1,layoutAreas:i})||c)&&f.push("right"),f}function vy({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===Gn)}function yy({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===Gn)}const qO="_marker_rkm38_1",KO="_dragger_rkm38_30",ZO="_move_rkm38_50",wy={marker:qO,dragger:KO,move:ZO};function kl({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function eP(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=kl(e)),"colSpan"in t&&(t=kl(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function tP({row:e,col:t}){return`row${e}-col${t}`}function nP({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:i,colStart:o,colEnd:a}=kl(t),l=n.length,s=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:i,growExtent:1};u=r-1,c=1,f=i;break;case"left":if(o===1)return{shrinkExtent:a,growExtent:1};u=o-1,c=1,f=a;break;case"down":if(i===l)return{shrinkExtent:r,growExtent:l};u=i+1,c=l,f=r;break;case"right":if(a===s)return{shrinkExtent:o,growExtent:s};u=a+1,c=s,f=o;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[h,g]=d?[o,a]:[r,i],v=(S,k)=>{const[_,w]=d?[S,k]:[k,S];return n[_-1][w-1]!==Gn},m=Hu(h,g),y=Hu(u,c);for(let S of y)for(let k of m)if(v(S,k))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function fS(e,t,n){const r=t=r&&e<=i}function rP({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=_p(t.getPropertyValue("gap")),o=_p(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],l=iP(t,e),s=l.length,u=[];for(let c=0;cfS(o,s,u));if(a===void 0)return;const l=aP[n];return i[l]=a.index,i}const aP={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function lP({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const i=kl(t),o=R.useRef(null),a=R.useCallback(u=>{const c=e.current,f=o.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=oP({mousePos:u,dragState:f});d&&Sy(c,d)},[e]),l=R.useCallback(()=>{const u=e.current,c=o.current;if(!u||!c)return;const f=c.gridItemExtent;eP(f,i)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),by("on")},[i,a,r,e]);return R.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),h=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:g,growExtent:v}=nP({dragDirection:u,gridLocation:t,layoutAreas:n});o.current={dragHandle:u,gridItemExtent:kl(t),tractExtents:rP({dir:h,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:m})=>fS(m,g,v))},Sy(e.current,o.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",l,{once:!0}),by("off")},[l,t,n,a,e])}function by(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function Sy(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:i}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(i+1))}function sP({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const i=R.useRef(null),o=lP({overlayRef:i,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=R.useMemo(()=>XO({gridLocation:t,layoutAreas:n}),[t,n]),l=R.useMemo(()=>{let s=[];for(let u of a)s.push(b("div",{className:wy.dragger+" "+u,onMouseDown:c=>{uP(c),o(u)},children:cP[u]},u));return s},[a,o]);return R.useEffect(()=>{var s;(s=i.current)==null||s.style.setProperty("--grid-area",e)},[e]),b("div",{ref:i,className:wy.marker+" grid-area-overlay",children:l})}function uP(e){e.preventDefault(),e.stopPropagation()}const cP={up:b(my,{}),down:b(my,{}),left:b(hy,{}),right:b(hy,{})};function fP({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=R.useRef(null);return Tm({watcherRef:r,onDrop:i=>{n(Q(U({},i),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),b("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function dP(e,t){const{numRows:n,numCols:r}=Xl(e),i=[];for(let o=0;o{const o=r==="rows"?"cols":"rows",a=dS(i);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const l=Nm(i.areas);let s=uS(Gn,a[o].length);l.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=Dp(u,r);if(f<=t&&d>t){const h=Dp(u,o);for(let g=h.itemStart-1;g1}function gP(e,{index:t,dir:n}){let r=[];return e.forEach((i,o)=>{const{itemStart:a,itemEnd:l}=Dp(i,n);a===t&&a===l&&r.push(o)}),r}const vP="_ResizableGrid_i4cq9_1",yP={ResizableGrid:vP,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function gS(e){var i,o;const t=((i=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:i[0])||"px",n=(o=e.match(/^[\d|\.]*/g))==null?void 0:o[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function xr(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const wP="_container_jk9tt_8",bP="_label_jk9tt_26",SP="_mainInput_jk9tt_59",cr={container:wP,label:bP,mainInput:SP},vS=R.createContext(null);function Ii(e){const t=R.useContext(vS);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const xP=({onChange:e,children:t})=>b(vS.Provider,{value:e,children:t});function EP({name:e,isDisabled:t,defaultValue:n}){const r=Ii(),i=`Click to ${t?"set":"unset"} ${e} property`;return b("input",{"aria-label":i,type:"checkbox",checked:!t,title:i,onChange:o=>{r({name:e,value:o.target.checked?n:void 0})}})}function Dm({name:e,label:t,optional:n,isDisabled:r,defaultValue:i,mainInput:o,width_setting:a="full"}){return M("label",{className:cr.container,"data-disabled":r,"data-width-setting":a,children:[M("div",{className:cr.label,children:[n?b(EP,{name:e,isDisabled:r,defaultValue:i}):null,t!=null?t:e,":"]}),b("div",{className:cr.mainInput,children:o})]})}const CP="_numericInput_n1lnu_1",AP={numericInput:CP};function Rm({value:e,ariaLabel:t,onChange:n,min:r,max:i,disabled:o=!1}){var l;const a=R.useCallback((s=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+s*c;r&&(f=Math.max(f,r)),i&&(f=Math.min(f,i)),n(f)},[i,r,n,e]);return b("input",{className:AP.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:o,value:(l=e==null?void 0:e.toString())!=null?l:"",onChange:s=>n(Number(s.target.value)),min:r,onKeyDown:s=>{(s.key==="ArrowUp"||s.key==="ArrowDown")&&(s.preventDefault(),a(s.key==="ArrowUp"?1:-1,s.shiftKey))}})}function Or({name:e,label:t,value:n,min:r=0,max:i,onChange:o,optional:a=!1,defaultValue:l=1,disabled:s=n===void 0}){const u=Ii(o);return b(Dm,{name:e,label:t,optional:a,isDisabled:s,defaultValue:l,width_setting:"fit",mainInput:b(Rm,{ariaLabel:t!=null?t:e,disabled:s,value:n,onChange:c=>u({name:e,value:c}),min:r,max:i})})}var Fm=kP;function kP(e,t,n){var r=null,i=null,o=function(){r&&(clearTimeout(r),i=null,r=null)},a=function(){var s=i;o(),s&&s()},l=function(){if(!t)return e.apply(this,arguments);var s=this,u=arguments,c=n&&!r;if(o(),i=function(){e.apply(s,u)},r=setTimeout(function(){if(r=null,!c){var f=i;return i=null,f()}},t),c)return i()};return l.cancel=o,l.flush=a,l}const Ey=["http","https","mailto","tel"];function OP(e){const t=(e||"").trim(),n=t.charAt(0);if(n==="#"||n==="/")return t;const r=t.indexOf(":");if(r===-1)return t;let i=-1;for(;++ii||(i=t.indexOf("#"),i!==-1&&r>i)?t:"javascript:void(0)"}/*! - * Determine if an object is a Buffer - * - * @author Feross Aboukhadijeh - * @license MIT - */var Lm=function(t){return t!=null&&t.constructor!=null&&typeof t.constructor.isBuffer=="function"&&t.constructor.isBuffer(t)};function ho(e){return!e||typeof e!="object"?"":"position"in e||"type"in e?Cy(e.position):"start"in e||"end"in e?Cy(e):"line"in e||"column"in e?Rp(e):""}function Rp(e){return Ay(e&&e.line)+":"+Ay(e&&e.column)}function Cy(e){return Rp(e&&e.start)+"-"+Rp(e&&e.end)}function Ay(e){return e&&typeof e=="number"?e:1}class mn extends Error{constructor(t,n,r){const i=[null,null];let o={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof n=="string"&&(r=n,n=void 0),typeof r=="string"){const a=r.indexOf(":");a===-1?i[1]=r:(i[0]=r.slice(0,a),i[1]=r.slice(a+1))}n&&("type"in n||"position"in n?n.position&&(o=n.position):"start"in n||"end"in n?o=n:("line"in n||"column"in n)&&(o.start=n)),this.name=ho(n)||"1:1",this.message=typeof t=="object"?t.message:t,this.stack=typeof t=="object"?t.stack:"",this.reason=this.message,this.fatal,this.line=o.start.line,this.column=o.start.column,this.source=i[0],this.ruleId=i[1],this.position=o,this.actual,this.expected,this.file,this.url,this.note}}mn.prototype.file="";mn.prototype.name="";mn.prototype.reason="";mn.prototype.message="";mn.prototype.stack="";mn.prototype.fatal=null;mn.prototype.column=null;mn.prototype.line=null;mn.prototype.source=null;mn.prototype.ruleId=null;mn.prototype.position=null;const Dn={basename:PP,dirname:IP,extname:TP,join:_P,sep:"/"};function PP(e,t){if(t!==void 0&&typeof t!="string")throw new TypeError('"ext" argument must be a string');ql(e);let n=0,r=-1,i=e.length,o;if(t===void 0||t.length===0||t.length>e.length){for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else r<0&&(o=!0,r=i+1);return r<0?"":e.slice(n,r)}if(t===e)return"";let a=-1,l=t.length-1;for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else a<0&&(o=!0,a=i+1),l>-1&&(e.charCodeAt(i)===t.charCodeAt(l--)?l<0&&(r=i):(l=-1,r=a));return n===r?r=a:r<0&&(r=e.length),e.slice(n,r)}function IP(e){if(ql(e),e.length===0)return".";let t=-1,n=e.length,r;for(;--n;)if(e.charCodeAt(n)===47){if(r){t=n;break}}else r||(r=!0);return t<0?e.charCodeAt(0)===47?"/":".":t===1&&e.charCodeAt(0)===47?"//":e.slice(0,t)}function TP(e){ql(e);let t=e.length,n=-1,r=0,i=-1,o=0,a;for(;t--;){const l=e.charCodeAt(t);if(l===47){if(a){r=t+1;break}continue}n<0&&(a=!0,n=t+1),l===46?i<0?i=t:o!==1&&(o=1):i>-1&&(o=-1)}return i<0||n<0||o===0||o===1&&i===n-1&&i===r+1?"":e.slice(i,n)}function _P(...e){let t=-1,n;for(;++t0&&e.charCodeAt(e.length-1)===47&&(n+="/"),t?"/"+n:n}function DP(e,t){let n="",r=0,i=-1,o=0,a=-1,l,s;for(;++a<=e.length;){if(a2){if(s=n.lastIndexOf("/"),s!==n.length-1){s<0?(n="",r=0):(n=n.slice(0,s),r=n.length-1-n.lastIndexOf("/")),i=a,o=0;continue}}else if(n.length>0){n="",r=0,i=a,o=0;continue}}t&&(n=n.length>0?n+"/..":"..",r=2)}else n.length>0?n+="/"+e.slice(i+1,a):n=e.slice(i+1,a),r=a-i-1;i=a,o=0}else l===46&&o>-1?o++:o=-1}return n}function ql(e){if(typeof e!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(e))}const RP={cwd:FP};function FP(){return"/"}function Fp(e){return e!==null&&typeof e=="object"&&e.href&&e.origin}function LP(e){if(typeof e=="string")e=new URL(e);else if(!Fp(e)){const t=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+e+"`");throw t.code="ERR_INVALID_ARG_TYPE",t}if(e.protocol!=="file:"){const t=new TypeError("The URL must be of scheme file");throw t.code="ERR_INVALID_URL_SCHEME",t}return MP(e)}function MP(e){if(e.hostname!==""){const r=new TypeError('File URL host must be "localhost" or empty on darwin');throw r.code="ERR_INVALID_FILE_URL_HOST",r}const t=e.pathname;let n=-1;for(;++na.length;let s;l&&a.push(i);try{s=e.apply(this,a)}catch(u){const c=u;if(l&&n)throw c;return i(c)}l||(s instanceof Promise?s.then(o,i):s instanceof Error?i(s):o(s))}function i(a,...l){n||(n=!0,t(a,...l))}function o(a){i(null,a)}}class gn extends Error{constructor(t,n,r){const i=[null,null];let o={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof n=="string"&&(r=n,n=void 0),typeof r=="string"){const a=r.indexOf(":");a===-1?i[1]=r:(i[0]=r.slice(0,a),i[1]=r.slice(a+1))}n&&("type"in n||"position"in n?n.position&&(o=n.position):"start"in n||"end"in n?o=n:("line"in n||"column"in n)&&(o.start=n)),this.name=ho(n)||"1:1",this.message=typeof t=="object"?t.message:t,this.stack=typeof t=="object"?t.stack:"",this.reason=this.message,this.fatal,this.line=o.start.line,this.column=o.start.column,this.source=i[0],this.ruleId=i[1],this.position=o,this.actual,this.expected,this.file,this.url,this.note}}gn.prototype.file="";gn.prototype.name="";gn.prototype.reason="";gn.prototype.message="";gn.prototype.stack="";gn.prototype.fatal=null;gn.prototype.column=null;gn.prototype.line=null;gn.prototype.source=null;gn.prototype.ruleId=null;gn.prototype.position=null;const Rn={basename:jP,dirname:WP,extname:YP,join:$P,sep:"/"};function jP(e,t){if(t!==void 0&&typeof t!="string")throw new TypeError('"ext" argument must be a string');Kl(e);let n=0,r=-1,i=e.length,o;if(t===void 0||t.length===0||t.length>e.length){for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else r<0&&(o=!0,r=i+1);return r<0?"":e.slice(n,r)}if(t===e)return"";let a=-1,l=t.length-1;for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else a<0&&(o=!0,a=i+1),l>-1&&(e.charCodeAt(i)===t.charCodeAt(l--)?l<0&&(r=i):(l=-1,r=a));return n===r?r=a:r<0&&(r=e.length),e.slice(n,r)}function WP(e){if(Kl(e),e.length===0)return".";let t=-1,n=e.length,r;for(;--n;)if(e.charCodeAt(n)===47){if(r){t=n;break}}else r||(r=!0);return t<0?e.charCodeAt(0)===47?"/":".":t===1&&e.charCodeAt(0)===47?"//":e.slice(0,t)}function YP(e){Kl(e);let t=e.length,n=-1,r=0,i=-1,o=0,a;for(;t--;){const l=e.charCodeAt(t);if(l===47){if(a){r=t+1;break}continue}n<0&&(a=!0,n=t+1),l===46?i<0?i=t:o!==1&&(o=1):i>-1&&(o=-1)}return i<0||n<0||o===0||o===1&&i===n-1&&i===r+1?"":e.slice(i,n)}function $P(...e){let t=-1,n;for(;++t0&&e.charCodeAt(e.length-1)===47&&(n+="/"),t?"/"+n:n}function VP(e,t){let n="",r=0,i=-1,o=0,a=-1,l,s;for(;++a<=e.length;){if(a2){if(s=n.lastIndexOf("/"),s!==n.length-1){s<0?(n="",r=0):(n=n.slice(0,s),r=n.length-1-n.lastIndexOf("/")),i=a,o=0;continue}}else if(n.length>0){n="",r=0,i=a,o=0;continue}}t&&(n=n.length>0?n+"/..":"..",r=2)}else n.length>0?n+="/"+e.slice(i+1,a):n=e.slice(i+1,a),r=a-i-1;i=a,o=0}else l===46&&o>-1?o++:o=-1}return n}function Kl(e){if(typeof e!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(e))}const GP={cwd:JP};function JP(){return"/"}function Mp(e){return e!==null&&typeof e=="object"&&e.href&&e.origin}function QP(e){if(typeof e=="string")e=new URL(e);else if(!Mp(e)){const t=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+e+"`");throw t.code="ERR_INVALID_ARG_TYPE",t}if(e.protocol!=="file:"){const t=new TypeError("The URL must be of scheme file");throw t.code="ERR_INVALID_URL_SCHEME",t}return XP(e)}function XP(e){if(e.hostname!==""){const r=new TypeError('File URL host must be "localhost" or empty on darwin');throw r.code="ERR_INVALID_FILE_URL_HOST",r}const t=e.pathname;let n=-1;for(;++n{if(w||!O||!E)_(w);else{const C=o.stringify(O,E);C==null||(t3(C)?E.value=C:E.result=C),_(w,E)}});function _(w,O){w||!O?S(w):y?y(O):v(null,O)}}}function h(g){let v;o.freeze(),ld("processSync",o.Parser),sd("processSync",o.Compiler);const m=da(g);return o.process(m,y),By("processSync","process",v),m;function y(S){v=!0,Oy(S)}}}function Ly(e,t){return typeof e=="function"&&e.prototype&&(ZP(e.prototype)||t in e.prototype)}function ZP(e){let t;for(t in e)if(wS.call(e,t))return!0;return!1}function ld(e,t){if(typeof t!="function")throw new TypeError("Cannot `"+e+"` without `Parser`")}function sd(e,t){if(typeof t!="function")throw new TypeError("Cannot `"+e+"` without `Compiler`")}function ud(e,t){if(t)throw new Error("Cannot call `"+e+"` on a frozen processor.\nCreate a new processor first, by calling it: use `processor()` instead of `processor`.")}function My(e){if(!Lp(e)||typeof e.type!="string")throw new TypeError("Expected node, got `"+e+"`")}function By(e,t,n){if(!n)throw new Error("`"+e+"` finished async. Use `"+t+"` instead")}function da(e){return e3(e)?e:new qP(e)}function e3(e){return Boolean(e&&typeof e=="object"&&"message"in e&&"messages"in e)}function t3(e){return typeof e=="string"||Lm(e)}function n3(e,t){var{includeImageAlt:n=!0}=t||{};return SS(e,n)}function SS(e,t){return e&&typeof e=="object"&&(e.value||(t?e.alt:"")||"children"in e&&Uy(e.children,t)||Array.isArray(e)&&Uy(e,t))||""}function Uy(e,t){for(var n=[],r=-1;++ri?0:i+t:t=t>i?i:t,n=n>0?n:0,r.length<1e4)a=Array.from(r),a.unshift(t,n),[].splice.apply(e,a);else for(n&&[].splice.apply(e,[t,n]);o0?(Jn(e,e.length,0,t),e):t}const zy={}.hasOwnProperty;function r3(e){const t={};let n=-1;for(;++na))return;const O=t.events.length;let E=O,C,P;for(;E--;)if(t.events[E][0]==="exit"&&t.events[E][1].type==="chunkFlow"){if(C){P=t.events[E][1].end;break}C=!0}for(m(r),w=O;wS;){const _=n[k];t.containerState=_[1],_[0].exit.call(t,e)}n.length=S}function y(){i.write([null]),o=void 0,i=void 0,t.containerState._closeFlow=void 0}}function m3(e,t,n){return Oe(e,e.attempt(this.parser.constructs.document,t,n),"linePrefix",this.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function Yy(e){if(e===null||ln(e)||u3(e))return 1;if(c3(e))return 2}function Mm(e,t,n){const r=[];let i=-1;for(;++i1&&e[n][1].end.offset-e[n][1].start.offset>1?2:1;const f=Object.assign({},e[r][1].end),d=Object.assign({},e[n][1].start);$y(f,-s),$y(d,s),a={type:s>1?"strongSequence":"emphasisSequence",start:f,end:Object.assign({},e[r][1].end)},l={type:s>1?"strongSequence":"emphasisSequence",start:Object.assign({},e[n][1].start),end:d},o={type:s>1?"strongText":"emphasisText",start:Object.assign({},e[r][1].end),end:Object.assign({},e[n][1].start)},i={type:s>1?"strong":"emphasis",start:Object.assign({},a.start),end:Object.assign({},l.end)},e[r][1].end=Object.assign({},a.start),e[n][1].start=Object.assign({},l.end),u=[],e[r][1].end.offset-e[r][1].start.offset&&(u=tn(u,[["enter",e[r][1],t],["exit",e[r][1],t]])),u=tn(u,[["enter",i,t],["enter",a,t],["exit",a,t],["enter",o,t]]),u=tn(u,Mm(t.parser.constructs.insideSpan.null,e.slice(r+1,n),t)),u=tn(u,[["exit",o,t],["enter",l,t],["exit",l,t],["exit",i,t]]),e[n][1].end.offset-e[n][1].start.offset?(c=2,u=tn(u,[["enter",e[n][1],t],["exit",e[n][1],t]])):c=0,Jn(e,r-1,n-r+3,u),n=r+u.length-c-2;break}}for(n=-1;++n=4?a(u):n(u)}function a(u){return u===null?s(u):re(u)?e.attempt(O3,a,s)(u):(e.enter("codeFlowValue"),l(u))}function l(u){return u===null||re(u)?(e.exit("codeFlowValue"),a(u)):(e.consume(u),l)}function s(u){return e.exit("codeIndented"),t(u)}}function I3(e,t,n){const r=this;return i;function i(a){return r.parser.lazy[r.now().line]?n(a):re(a)?(e.enter("lineEnding"),e.consume(a),e.exit("lineEnding"),i):Oe(e,o,"linePrefix",4+1)(a)}function o(a){const l=r.events[r.events.length-1];return l&&l[1].type==="linePrefix"&&l[2].sliceSerialize(l[1],!0).length>=4?t(a):re(a)?i(a):n(a)}}const T3={name:"codeText",tokenize:D3,resolve:_3,previous:N3};function _3(e){let t=e.length-4,n=3,r,i;if((e[n][1].type==="lineEnding"||e[n][1].type==="space")&&(e[t][1].type==="lineEnding"||e[t][1].type==="space")){for(r=n;++r=4?t(a):e.interrupt(r.parser.constructs.flow,n,t)(a)}}function kS(e,t,n,r,i,o,a,l,s){const u=s||Number.POSITIVE_INFINITY;let c=0;return f;function f(m){return m===60?(e.enter(r),e.enter(i),e.enter(o),e.consume(m),e.exit(o),d):m===null||m===41||Up(m)?n(m):(e.enter(r),e.enter(a),e.enter(l),e.enter("chunkString",{contentType:"string"}),g(m))}function d(m){return m===62?(e.enter(o),e.consume(m),e.exit(o),e.exit(i),e.exit(r),t):(e.enter(l),e.enter("chunkString",{contentType:"string"}),p(m))}function p(m){return m===62?(e.exit("chunkString"),e.exit(l),d(m)):m===null||m===60||re(m)?n(m):(e.consume(m),m===92?h:p)}function h(m){return m===60||m===62||m===92?(e.consume(m),p):p(m)}function g(m){return m===40?++c>u?n(m):(e.consume(m),g):m===41?c--?(e.consume(m),g):(e.exit("chunkString"),e.exit(l),e.exit(a),e.exit(r),t(m)):m===null||ln(m)?c?n(m):(e.exit("chunkString"),e.exit(l),e.exit(a),e.exit(r),t(m)):Up(m)?n(m):(e.consume(m),m===92?v:g)}function v(m){return m===40||m===41||m===92?(e.consume(m),g):g(m)}}function OS(e,t,n,r,i,o){const a=this;let l=0,s;return u;function u(p){return e.enter(r),e.enter(i),e.consume(p),e.exit(i),e.enter(o),c}function c(p){return p===null||p===91||p===93&&!s||p===94&&!l&&"_hiddenFootnoteSupport"in a.parser.constructs||l>999?n(p):p===93?(e.exit(o),e.enter(i),e.consume(p),e.exit(i),e.exit(r),t):re(p)?(e.enter("lineEnding"),e.consume(p),e.exit("lineEnding"),c):(e.enter("chunkString",{contentType:"string"}),f(p))}function f(p){return p===null||p===91||p===93||re(p)||l++>999?(e.exit("chunkString"),c(p)):(e.consume(p),s=s||!Ke(p),p===92?d:f)}function d(p){return p===91||p===92||p===93?(e.consume(p),l++,f):f(p)}}function PS(e,t,n,r,i,o){let a;return l;function l(d){return e.enter(r),e.enter(i),e.consume(d),e.exit(i),a=d===40?41:d,s}function s(d){return d===a?(e.enter(i),e.consume(d),e.exit(i),e.exit(r),t):(e.enter(o),u(d))}function u(d){return d===a?(e.exit(o),s(a)):d===null?n(d):re(d)?(e.enter("lineEnding"),e.consume(d),e.exit("lineEnding"),Oe(e,u,"linePrefix")):(e.enter("chunkString",{contentType:"string"}),c(d))}function c(d){return d===a||d===null||re(d)?(e.exit("chunkString"),u(d)):(e.consume(d),d===92?f:c)}function f(d){return d===a||d===92?(e.consume(d),c):c(d)}}function Xa(e,t){let n;return r;function r(i){return re(i)?(e.enter("lineEnding"),e.consume(i),e.exit("lineEnding"),n=!0,r):Ke(i)?Oe(e,r,n?"linePrefix":"lineSuffix")(i):t(i)}}function mo(e){return e.replace(/[\t\n\r ]+/g," ").replace(/^ | $/g,"").toLowerCase().toUpperCase()}const z3={name:"definition",tokenize:W3},j3={tokenize:Y3,partial:!0};function W3(e,t,n){const r=this;let i;return o;function o(s){return e.enter("definition"),OS.call(r,e,a,n,"definitionLabel","definitionLabelMarker","definitionLabelString")(s)}function a(s){return i=mo(r.sliceSerialize(r.events[r.events.length-1][1]).slice(1,-1)),s===58?(e.enter("definitionMarker"),e.consume(s),e.exit("definitionMarker"),Xa(e,kS(e,e.attempt(j3,Oe(e,l,"whitespace"),Oe(e,l,"whitespace")),n,"definitionDestination","definitionDestinationLiteral","definitionDestinationLiteralMarker","definitionDestinationRaw","definitionDestinationString"))):n(s)}function l(s){return s===null||re(s)?(e.exit("definition"),r.parser.defined.includes(i)||r.parser.defined.push(i),t(s)):n(s)}}function Y3(e,t,n){return r;function r(a){return ln(a)?Xa(e,i)(a):n(a)}function i(a){return a===34||a===39||a===40?PS(e,Oe(e,o,"whitespace"),n,"definitionTitle","definitionTitleMarker","definitionTitleString")(a):n(a)}function o(a){return a===null||re(a)?t(a):n(a)}}const $3={name:"hardBreakEscape",tokenize:H3};function H3(e,t,n){return r;function r(o){return e.enter("hardBreakEscape"),e.enter("escapeMarker"),e.consume(o),i}function i(o){return re(o)?(e.exit("escapeMarker"),e.exit("hardBreakEscape"),t(o)):n(o)}}const V3={name:"headingAtx",tokenize:J3,resolve:G3};function G3(e,t){let n=e.length-2,r=3,i,o;return e[r][1].type==="whitespace"&&(r+=2),n-2>r&&e[n][1].type==="whitespace"&&(n-=2),e[n][1].type==="atxHeadingSequence"&&(r===n-1||n-4>r&&e[n-2][1].type==="whitespace")&&(n-=r+1===n?2:4),n>r&&(i={type:"atxHeadingText",start:e[r][1].start,end:e[n][1].end},o={type:"chunkText",start:e[r][1].start,end:e[n][1].end,contentType:"text"},Jn(e,r,n-r+1,[["enter",i,t],["enter",o,t],["exit",o,t],["exit",i,t]])),e}function J3(e,t,n){const r=this;let i=0;return o;function o(c){return e.enter("atxHeading"),e.enter("atxHeadingSequence"),a(c)}function a(c){return c===35&&i++<6?(e.consume(c),a):c===null||ln(c)?(e.exit("atxHeadingSequence"),r.interrupt?t(c):l(c)):n(c)}function l(c){return c===35?(e.enter("atxHeadingSequence"),s(c)):c===null||re(c)?(e.exit("atxHeading"),t(c)):Ke(c)?Oe(e,l,"whitespace")(c):(e.enter("atxHeadingText"),u(c))}function s(c){return c===35?(e.consume(c),s):(e.exit("atxHeadingSequence"),l(c))}function u(c){return c===null||c===35||ln(c)?(e.exit("atxHeadingText"),l(c)):(e.consume(c),u)}}const Q3=["address","article","aside","base","basefont","blockquote","body","caption","center","col","colgroup","dd","details","dialog","dir","div","dl","dt","fieldset","figcaption","figure","footer","form","frame","frameset","h1","h2","h3","h4","h5","h6","head","header","hr","html","iframe","legend","li","link","main","menu","menuitem","nav","noframes","ol","optgroup","option","p","param","section","summary","table","tbody","td","tfoot","th","thead","title","tr","track","ul"],Gy=["pre","script","style","textarea"],X3={name:"htmlFlow",tokenize:Z3,resolveTo:K3,concrete:!0},q3={tokenize:e4,partial:!0};function K3(e){let t=e.length;for(;t--&&!(e[t][0]==="enter"&&e[t][1].type==="htmlFlow"););return t>1&&e[t-2][1].type==="linePrefix"&&(e[t][1].start=e[t-2][1].start,e[t+1][1].start=e[t-2][1].start,e.splice(t-2,2)),e}function Z3(e,t,n){const r=this;let i,o,a,l,s;return u;function u(A){return e.enter("htmlFlow"),e.enter("htmlFlowData"),e.consume(A),c}function c(A){return A===33?(e.consume(A),f):A===47?(e.consume(A),h):A===63?(e.consume(A),i=3,r.interrupt?t:se):Fn(A)?(e.consume(A),a=String.fromCharCode(A),o=!0,g):n(A)}function f(A){return A===45?(e.consume(A),i=2,d):A===91?(e.consume(A),i=5,a="CDATA[",l=0,p):Fn(A)?(e.consume(A),i=4,r.interrupt?t:se):n(A)}function d(A){return A===45?(e.consume(A),r.interrupt?t:se):n(A)}function p(A){return A===a.charCodeAt(l++)?(e.consume(A),l===a.length?r.interrupt?t:I:p):n(A)}function h(A){return Fn(A)?(e.consume(A),a=String.fromCharCode(A),g):n(A)}function g(A){return A===null||A===47||A===62||ln(A)?A!==47&&o&&Gy.includes(a.toLowerCase())?(i=1,r.interrupt?t(A):I(A)):Q3.includes(a.toLowerCase())?(i=6,A===47?(e.consume(A),v):r.interrupt?t(A):I(A)):(i=7,r.interrupt&&!r.parser.lazy[r.now().line]?n(A):o?y(A):m(A)):A===45||Ht(A)?(e.consume(A),a+=String.fromCharCode(A),g):n(A)}function v(A){return A===62?(e.consume(A),r.interrupt?t:I):n(A)}function m(A){return Ke(A)?(e.consume(A),m):C(A)}function y(A){return A===47?(e.consume(A),C):A===58||A===95||Fn(A)?(e.consume(A),S):Ke(A)?(e.consume(A),y):C(A)}function S(A){return A===45||A===46||A===58||A===95||Ht(A)?(e.consume(A),S):k(A)}function k(A){return A===61?(e.consume(A),_):Ke(A)?(e.consume(A),k):y(A)}function _(A){return A===null||A===60||A===61||A===62||A===96?n(A):A===34||A===39?(e.consume(A),s=A,w):Ke(A)?(e.consume(A),_):(s=null,O(A))}function w(A){return A===null||re(A)?n(A):A===s?(e.consume(A),E):(e.consume(A),w)}function O(A){return A===null||A===34||A===39||A===60||A===61||A===62||A===96||ln(A)?k(A):(e.consume(A),O)}function E(A){return A===47||A===62||Ke(A)?y(A):n(A)}function C(A){return A===62?(e.consume(A),P):n(A)}function P(A){return Ke(A)?(e.consume(A),P):A===null||re(A)?I(A):n(A)}function I(A){return A===45&&i===2?(e.consume(A),K):A===60&&i===1?(e.consume(A),V):A===62&&i===4?(e.consume(A),q):A===63&&i===3?(e.consume(A),se):A===93&&i===5?(e.consume(A),te):re(A)&&(i===6||i===7)?e.check(q3,q,T)(A):A===null||re(A)?T(A):(e.consume(A),I)}function T(A){return e.exit("htmlFlowData"),N(A)}function N(A){return A===null?x(A):re(A)?e.attempt({tokenize:B,partial:!0},N,x)(A):(e.enter("htmlFlowData"),I(A))}function B(A,X,fe){return pe;function pe(be){return A.enter("lineEnding"),A.consume(be),A.exit("lineEnding"),he}function he(be){return r.parser.lazy[r.now().line]?fe(be):X(be)}}function K(A){return A===45?(e.consume(A),se):I(A)}function V(A){return A===47?(e.consume(A),a="",le):I(A)}function le(A){return A===62&&Gy.includes(a.toLowerCase())?(e.consume(A),q):Fn(A)&&a.length<8?(e.consume(A),a+=String.fromCharCode(A),le):I(A)}function te(A){return A===93?(e.consume(A),se):I(A)}function se(A){return A===62?(e.consume(A),q):A===45&&i===2?(e.consume(A),se):I(A)}function q(A){return A===null||re(A)?(e.exit("htmlFlowData"),x(A)):(e.consume(A),q)}function x(A){return e.exit("htmlFlow"),t(A)}}function e4(e,t,n){return r;function r(i){return e.exit("htmlFlowData"),e.enter("lineEndingBlank"),e.consume(i),e.exit("lineEndingBlank"),e.attempt(Uc,t,n)}}const t4={name:"htmlText",tokenize:n4};function n4(e,t,n){const r=this;let i,o,a,l;return s;function s(x){return e.enter("htmlText"),e.enter("htmlTextData"),e.consume(x),u}function u(x){return x===33?(e.consume(x),c):x===47?(e.consume(x),O):x===63?(e.consume(x),_):Fn(x)?(e.consume(x),P):n(x)}function c(x){return x===45?(e.consume(x),f):x===91?(e.consume(x),o="CDATA[",a=0,v):Fn(x)?(e.consume(x),k):n(x)}function f(x){return x===45?(e.consume(x),d):n(x)}function d(x){return x===null||x===62?n(x):x===45?(e.consume(x),p):h(x)}function p(x){return x===null||x===62?n(x):h(x)}function h(x){return x===null?n(x):x===45?(e.consume(x),g):re(x)?(l=h,te(x)):(e.consume(x),h)}function g(x){return x===45?(e.consume(x),q):h(x)}function v(x){return x===o.charCodeAt(a++)?(e.consume(x),a===o.length?m:v):n(x)}function m(x){return x===null?n(x):x===93?(e.consume(x),y):re(x)?(l=m,te(x)):(e.consume(x),m)}function y(x){return x===93?(e.consume(x),S):m(x)}function S(x){return x===62?q(x):x===93?(e.consume(x),S):m(x)}function k(x){return x===null||x===62?q(x):re(x)?(l=k,te(x)):(e.consume(x),k)}function _(x){return x===null?n(x):x===63?(e.consume(x),w):re(x)?(l=_,te(x)):(e.consume(x),_)}function w(x){return x===62?q(x):_(x)}function O(x){return Fn(x)?(e.consume(x),E):n(x)}function E(x){return x===45||Ht(x)?(e.consume(x),E):C(x)}function C(x){return re(x)?(l=C,te(x)):Ke(x)?(e.consume(x),C):q(x)}function P(x){return x===45||Ht(x)?(e.consume(x),P):x===47||x===62||ln(x)?I(x):n(x)}function I(x){return x===47?(e.consume(x),q):x===58||x===95||Fn(x)?(e.consume(x),T):re(x)?(l=I,te(x)):Ke(x)?(e.consume(x),I):q(x)}function T(x){return x===45||x===46||x===58||x===95||Ht(x)?(e.consume(x),T):N(x)}function N(x){return x===61?(e.consume(x),B):re(x)?(l=N,te(x)):Ke(x)?(e.consume(x),N):I(x)}function B(x){return x===null||x===60||x===61||x===62||x===96?n(x):x===34||x===39?(e.consume(x),i=x,K):re(x)?(l=B,te(x)):Ke(x)?(e.consume(x),B):(e.consume(x),i=void 0,le)}function K(x){return x===i?(e.consume(x),V):x===null?n(x):re(x)?(l=K,te(x)):(e.consume(x),K)}function V(x){return x===62||x===47||ln(x)?I(x):n(x)}function le(x){return x===null||x===34||x===39||x===60||x===61||x===96?n(x):x===62||ln(x)?I(x):(e.consume(x),le)}function te(x){return e.exit("htmlTextData"),e.enter("lineEnding"),e.consume(x),e.exit("lineEnding"),Oe(e,se,"linePrefix",r.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function se(x){return e.enter("htmlTextData"),l(x)}function q(x){return x===62?(e.consume(x),e.exit("htmlTextData"),e.exit("htmlText"),t):n(x)}}const Um={name:"labelEnd",tokenize:s4,resolveTo:l4,resolveAll:a4},r4={tokenize:u4},i4={tokenize:c4},o4={tokenize:f4};function a4(e){let t=-1,n;for(;++t-1&&(a[0]=a[0].slice(r)),o>0&&a.push(e[i].slice(0,o))),a}function F4(e,t){let n=-1;const r=[];let i;for(;++n13&&n<32||n>126&&n<160||n>55295&&n<57344||n>64975&&n<65008||(n&65535)===65535||(n&65535)===65534||n>1114111?"\uFFFD":String.fromCharCode(n)}const Q4=/\\([!-/:-@[-`{-~])|&(#(?:\d{1,7}|x[\da-f]{1,6})|[\da-z]{1,31});/gi;function X4(e){return e.replace(Q4,q4)}function q4(e,t,n){if(t)return t;if(n.charCodeAt(0)===35){const i=n.charCodeAt(1),o=i===120||i===88;return _S(n.slice(o?2:1),o?16:10)}return Bm(n)||e}const jp={}.hasOwnProperty,K4=function(e,t,n){return typeof t!="string"&&(n=t,t=void 0),Z4(n)(J4(V4(n).document().write(G4()(e,t,!0))))};function Z4(e={}){const t=NS({transforms:[],canContainEols:["emphasis","fragment","heading","paragraph","strong"],enter:{autolink:s(ti),autolinkProtocol:T,autolinkEmail:T,atxHeading:s(Qo),blockQuote:s(vf),characterEscape:T,characterReference:T,codeFenced:s(Jo),codeFencedFenceInfo:u,codeFencedFenceMeta:u,codeIndented:s(Jo,u),codeText:s(yf,u),codeTextData:T,data:T,codeFlowValue:T,definition:s(wf),definitionDestinationString:u,definitionLabelString:u,definitionTitleString:u,emphasis:s(fs),hardBreakEscape:s(ds),hardBreakTrailing:s(ds),htmlFlow:s(ps,u),htmlFlowData:T,htmlText:s(ps,u),htmlTextData:T,image:s(Zn),label:u,link:s(ti),listItem:s(hs),listItemValue:g,listOrdered:s(Xo,h),listUnordered:s(Xo),paragraph:s(qo),reference:he,referenceString:u,resourceDestinationString:u,resourceTitleString:u,setextHeading:s(Qo),strong:s(ms),thematicBreak:s(vs)},exit:{atxHeading:f(),atxHeadingSequence:E,autolink:f(),autolinkEmail:ei,autolinkProtocol:wn,blockQuote:f(),characterEscapeValue:N,characterReferenceMarkerHexadecimal:Ce,characterReferenceMarkerNumeric:Ce,characterReferenceValue:Ye,codeFenced:f(S),codeFencedFence:y,codeFencedFenceInfo:v,codeFencedFenceMeta:m,codeFlowValue:N,codeIndented:f(k),codeText:f(te),codeTextData:N,data:N,definition:f(),definitionDestinationString:O,definitionLabelString:_,definitionTitleString:w,emphasis:f(),hardBreakEscape:f(K),hardBreakTrailing:f(K),htmlFlow:f(V),htmlFlowData:N,htmlText:f(le),htmlTextData:N,image:f(q),label:A,labelText:x,lineEnding:B,link:f(se),listItem:f(),listOrdered:f(),listUnordered:f(),paragraph:f(),referenceString:be,resourceDestinationString:X,resourceTitleString:fe,resource:pe,setextHeading:f(I),setextHeadingLineSequence:P,setextHeadingText:C,strong:f(),thematicBreak:f()}},e.mdastExtensions||[]),n={};return r;function r(L){let Y={type:"root",children:[]};const oe=[Y],Ae=[],Zt=[],Ko={stack:oe,tokenStack:Ae,config:t,enter:c,exit:d,buffer:u,resume:p,setData:o,getData:a};let _e=-1;for(;++_e0){const at=Ae[Ae.length-1];(at[1]||Xy).call(Ko,void 0,at[0])}for(Y.position={start:l(L.length>0?L[0][1].start:{line:1,column:1,offset:0}),end:l(L.length>0?L[L.length-2][1].end:{line:1,column:1,offset:0})},_e=-1;++_e{const r=this.data("settings");return K4(n,Object.assign({},r,e,{extensions:this.data("micromarkExtensions")||[],mdastExtensions:this.data("fromMarkdownExtensions")||[]}))}})}var tt=function(e,t,n){var r={type:String(e)};return n==null&&(typeof t=="string"||Array.isArray(t))?n=t:Object.assign(r,t),Array.isArray(n)?r.children=n:n!=null&&(r.value=String(n)),r};const iu={}.hasOwnProperty;function nI(e,t){const n=t.data||{};return"value"in t&&!(iu.call(n,"hName")||iu.call(n,"hProperties")||iu.call(n,"hChildren"))?e.augment(t,tt("text",t.value)):e(t,"div",bt(e,t))}function DS(e,t,n){const r=t&&t.type;let i;if(!r)throw new Error("Expected node, got `"+t+"`");return iu.call(e.handlers,r)?i=e.handlers[r]:e.passThrough&&e.passThrough.includes(r)?i=rI:i=e.unknownHandler,(typeof i=="function"?i:nI)(e,t,n)}function rI(e,t){return"children"in t?Q(U({},t),{children:bt(e,t)}):t}function bt(e,t){const n=[];if("children"in t){const r=t.children;let i=-1;for(;++i":""))+")"})),d;function d(){let p=[],h,g,v;if((!t||i(l,s,u[u.length-1]||null))&&(p=fI(n(l,u)),p[0]===qy))return p;if(l.children&&p[0]!==uI)for(g=(r?l.children.length:-1)+o,v=u.concat(l);g>-1&&g-1?r.offset:null}}}function dI(e){return!e||!e.position||!e.position.start||!e.position.start.line||!e.position.start.column||!e.position.end||!e.position.end.line||!e.position.end.column}const Ky={}.hasOwnProperty;function pI(e){const t=Object.create(null);if(!e||!e.type)throw new Error("mdast-util-definitions expected node");return FS(e,"definition",r=>{const i=Zy(r.identifier);i&&!Ky.call(t,i)&&(t[i]=r)}),n;function n(r){const i=Zy(r);return i&&Ky.call(t,i)?t[i]:null}}function Zy(e){return String(e||"").toUpperCase()}const hI={'"':"quot","&":"amp","<":"lt",">":"gt"};function mI(e){return e.replace(/["&<>]/g,t);function t(n){return"&"+hI[n]+";"}}function US(e,t){const n=mI(gI(e||""));if(!t)return n;const r=n.indexOf(":"),i=n.indexOf("?"),o=n.indexOf("#"),a=n.indexOf("/");return r<0||a>-1&&r>a||i>-1&&r>i||o>-1&&r>o||t.test(n.slice(0,r))?n:""}function gI(e){const t=[];let n=-1,r=0,i=0;for(;++n55295&&o<57344){const l=e.charCodeAt(n+1);o<56320&&l>56319&&l<57344?(a=String.fromCharCode(o,l),i=1):a="\uFFFD"}else a=String.fromCharCode(o);a&&(t.push(e.slice(r,n),encodeURIComponent(a)),r=n+i+1,a=""),i&&(n+=i,i=0)}return t.join("")+e.slice(r)}function lr(e,t){const n=[];let r=-1;for(t&&n.push(tt("text",` -`));++r0&&n.push(tt("text",` -`)),n}function vI(e){let t=-1;const n=[];for(;++t1?"-"+l:""),dataFootnoteBackref:!0,className:["data-footnote-backref"],ariaLabel:e.footnoteBackLabel},children:[{type:"text",value:"\u21A9"}]};l>1&&f.children.push({type:"element",tagName:"sup",children:[{type:"text",value:String(l)}]}),s.length>0&&s.push({type:"text",value:" "}),s.push(f)}const u=i[i.length-1];if(u&&u.type==="element"&&u.tagName==="p"){const f=u.children[u.children.length-1];f&&f.type==="text"?f.value+=" ":u.children.push({type:"text",value:" "}),u.children.push(...s)}else i.push(...s);const c={type:"element",tagName:"li",properties:{id:e.clobberPrefix+"fn-"+a},children:lr(i,!0)};r.position&&(c.position=r.position),n.push(c)}return n.length===0?null:{type:"element",tagName:"section",properties:{dataFootnotes:!0,className:["footnotes"]},children:[{type:"element",tagName:e.footnoteLabelTagName,properties:JSON.parse(JSON.stringify(e.footnoteLabelProperties)),children:[tt("text",e.footnoteLabel)]},{type:"text",value:` -`},{type:"element",tagName:"ol",properties:{},children:lr(n,!0)},{type:"text",value:` -`}]}}function yI(e,t){return e(t,"blockquote",lr(bt(e,t),!0))}function wI(e,t){return[e(t,"br"),tt("text",` -`)]}function bI(e,t){const n=t.value?t.value+` -`:"",r=t.lang&&t.lang.match(/^[^ \t]+(?=[ \t]|$)/),i={};r&&(i.className=["language-"+r]);const o=e(t,"code",i,[tt("text",n)]);return t.meta&&(o.data={meta:t.meta}),e(t.position,"pre",[o])}function SI(e,t){return e(t,"del",bt(e,t))}function xI(e,t){return e(t,"em",bt(e,t))}function zS(e,t){const n=String(t.identifier),r=US(n.toLowerCase()),i=e.footnoteOrder.indexOf(n);let o;i===-1?(e.footnoteOrder.push(n),e.footnoteCounts[n]=1,o=e.footnoteOrder.length):(e.footnoteCounts[n]++,o=i+1);const a=e.footnoteCounts[n];return e(t,"sup",[e(t.position,"a",{href:"#"+e.clobberPrefix+"fn-"+r,id:e.clobberPrefix+"fnref-"+r+(a>1?"-"+a:""),dataFootnoteRef:!0,ariaDescribedBy:"footnote-label"},[tt("text",String(o))])])}function EI(e,t){const n=e.footnoteById;let r=1;for(;r in n;)r++;const i=String(r);return n[i]={type:"footnoteDefinition",identifier:i,children:[{type:"paragraph",children:t.children}],position:t.position},zS(e,{type:"footnoteReference",identifier:i,position:t.position})}function CI(e,t){return e(t,"h"+t.depth,bt(e,t))}function AI(e,t){return e.dangerous?e.augment(t,tt("raw",t.value)):null}var e1={};function kI(e){var t,n,r=e1[e];if(r)return r;for(r=e1[e]=[],t=0;t<128;t++)n=String.fromCharCode(t),/^[0-9a-z]$/i.test(n)?r.push(n):r.push("%"+("0"+t.toString(16).toUpperCase()).slice(-2));for(t=0;t=55296&&o<=57343){if(o>=55296&&o<=56319&&r+1=56320&&a<=57343)){s+=encodeURIComponent(e[r]+e[r+1]),r++;continue}s+="%EF%BF%BD";continue}s+=encodeURIComponent(e[r])}return s}jc.defaultChars=";/?:@&=+$,-_.!~*'()#";jc.componentChars="-_.!~*'()";var Wc=jc;function jS(e,t){const n=t.referenceType;let r="]";if(n==="collapsed"?r+="[]":n==="full"&&(r+="["+(t.label||t.identifier)+"]"),t.type==="imageReference")return tt("text","!["+t.alt+r);const i=bt(e,t),o=i[0];o&&o.type==="text"?o.value="["+o.value:i.unshift(tt("text","["));const a=i[i.length-1];return a&&a.type==="text"?a.value+=r:i.push(tt("text",r)),i}function OI(e,t){const n=e.definition(t.identifier);if(!n)return jS(e,t);const r={src:Wc(n.url||""),alt:t.alt};return n.title!==null&&n.title!==void 0&&(r.title=n.title),e(t,"img",r)}function PI(e,t){const n={src:Wc(t.url),alt:t.alt};return t.title!==null&&t.title!==void 0&&(n.title=t.title),e(t,"img",n)}function II(e,t){return e(t,"code",[tt("text",t.value.replace(/\r?\n|\r/g," "))])}function TI(e,t){const n=e.definition(t.identifier);if(!n)return jS(e,t);const r={href:Wc(n.url||"")};return n.title!==null&&n.title!==void 0&&(r.title=n.title),e(t,"a",r,bt(e,t))}function _I(e,t){const n={href:Wc(t.url)};return t.title!==null&&t.title!==void 0&&(n.title=t.title),e(t,"a",n,bt(e,t))}function NI(e,t,n){const r=bt(e,t),i=n?DI(n):WS(t),o={},a=[];if(typeof t.checked=="boolean"){let u;r[0]&&r[0].type==="element"&&r[0].tagName==="p"?u=r[0]:(u=e(null,"p",[]),r.unshift(u)),u.children.length>0&&u.children.unshift(tt("text"," ")),u.children.unshift(e(null,"input",{type:"checkbox",checked:t.checked,disabled:!0})),o.className=["task-list-item"]}let l=-1;for(;++l1:t}function RI(e,t){const n={},r=t.ordered?"ol":"ul",i=bt(e,t);let o=-1;for(typeof t.start=="number"&&t.start!==1&&(n.start=t.start);++o0,!0),r[0]),i=r.index+r[0].length,r=n.exec(t);return o.push(r1(t.slice(i),i>0,!1)),o.join("")}function r1(e,t,n){let r=0,i=e.length;if(t){let o=e.codePointAt(r);for(;o===t1||o===n1;)r++,o=e.codePointAt(r)}if(n){let o=e.codePointAt(i-1);for(;o===t1||o===n1;)i--,o=e.codePointAt(i-1)}return i>r?e.slice(r,i):""}function zI(e,t){return e.augment(t,tt("text",UI(String(t.value))))}function jI(e,t){return e(t,"hr")}const WI={blockquote:yI,break:wI,code:bI,delete:SI,emphasis:xI,footnoteReference:zS,footnote:EI,heading:CI,html:AI,imageReference:OI,image:PI,inlineCode:II,linkReference:TI,link:_I,listItem:NI,list:RI,paragraph:FI,root:LI,strong:MI,table:BI,text:zI,thematicBreak:jI,toml:_s,yaml:_s,definition:_s,footnoteDefinition:_s};function _s(){return null}const YI={}.hasOwnProperty;function $I(e,t){const n=t||{},r=n.allowDangerousHtml||!1,i={};return a.dangerous=r,a.clobberPrefix=n.clobberPrefix===void 0||n.clobberPrefix===null?"user-content-":n.clobberPrefix,a.footnoteLabel=n.footnoteLabel||"Footnotes",a.footnoteLabelTagName=n.footnoteLabelTagName||"h2",a.footnoteLabelProperties=n.footnoteLabelProperties||{id:"footnote-label",className:["sr-only"]},a.footnoteBackLabel=n.footnoteBackLabel||"Back to content",a.definition=pI(e),a.footnoteById=i,a.footnoteOrder=[],a.footnoteCounts={},a.augment=o,a.handlers=U(U({},WI),n.handlers),a.unknownHandler=n.unknownHandler,a.passThrough=n.passThrough,FS(e,"footnoteDefinition",l=>{const s=String(l.identifier).toUpperCase();YI.call(i,s)||(i[s]=l)}),a;function o(l,s){if(l&&"data"in l&&l.data){const u=l.data;u.hName&&(s.type!=="element"&&(s={type:"element",tagName:"",properties:{},children:[]}),s.tagName=u.hName),s.type==="element"&&u.hProperties&&(s.properties=U(U({},s.properties),u.hProperties)),"children"in s&&s.children&&u.hChildren&&(s.children=u.hChildren)}if(l){const u="type"in l?l:{position:l};dI(u)||(s.position={start:LS(u),end:MS(u)})}return s}function a(l,s,u,c){return Array.isArray(u)&&(c=u,u={}),o(l,{type:"element",tagName:s,properties:u||{},children:c||[]})}}function YS(e,t){const n=$I(e,t),r=DS(n,e,null),i=vI(n);return i&&r.children.push(tt("text",` -`),i),Array.isArray(r)?{type:"root",children:r}:r}const HI=function(e,t){return e&&"run"in e?GI(e,t):JI(e||t)},VI=HI;function GI(e,t){return(n,r,i)=>{e.run(YS(n,t),r,o=>{i(o)})}}function JI(e){return t=>YS(t,e)}class Zl{constructor(t,n,r){this.property=t,this.normal=n,r&&(this.space=r)}}Zl.prototype.property={};Zl.prototype.normal={};Zl.prototype.space=null;function $S(e,t){const n={},r={};let i=-1;for(;++i4&&n.slice(0,4)==="data"&&ZI.test(t)){if(t.charAt(4)==="-"){const o=t.slice(5).replace(o1,rT);r="data"+o.charAt(0).toUpperCase()+o.slice(1)}else{const o=t.slice(4);if(!o1.test(o)){let a=o.replace(eT,nT);a.charAt(0)!=="-"&&(a="-"+a),t="data"+a}}i=zm}return new i(r,t)}function nT(e){return"-"+e.toLowerCase()}function rT(e){return e.charAt(1).toUpperCase()}const a1={classId:"classID",dataType:"datatype",itemId:"itemID",strokeDashArray:"strokeDasharray",strokeDashOffset:"strokeDashoffset",strokeLineCap:"strokeLinecap",strokeLineJoin:"strokeLinejoin",strokeMiterLimit:"strokeMiterlimit",typeOf:"typeof",xLinkActuate:"xlinkActuate",xLinkArcRole:"xlinkArcrole",xLinkHref:"xlinkHref",xLinkRole:"xlinkRole",xLinkShow:"xlinkShow",xLinkTitle:"xlinkTitle",xLinkType:"xlinkType",xmlnsXLink:"xmlnsXlink"},iT=$S([GS,VS,XS,qS,qI],"html"),oT=$S([GS,VS,XS,qS,KI],"svg"),KS=function(e){if(e==null)return uT;if(typeof e=="string")return sT(e);if(typeof e=="object")return Array.isArray(e)?aT(e):lT(e);if(typeof e=="function")return Yc(e);throw new Error("Expected function, string, or object as test")};function aT(e){const t=[];let n=-1;for(;++n":""))+")"})),d;function d(){let p=[],h,g,v;if((!t||i(l,s,u[u.length-1]||null))&&(p=pT(n(l,u)),p[0]===l1))return p;if(l.children&&p[0]!==fT)for(g=(r?l.children.length:-1)+o,v=u.concat(l);g>-1&&g{hT(t,"element",(n,r,i)=>{const o=i;let a;if(e.allowedElements?a=!e.allowedElements.includes(n.tagName):e.disallowedElements&&(a=e.disallowedElements.includes(n.tagName)),!a&&e.allowElement&&typeof r=="number"&&(a=!e.allowElement(n,r,o)),a&&typeof r=="number")return e.unwrapDisallowed&&n.children?o.children.splice(r,1,...n.children):o.children.splice(r,1),r})}}var ZS={exports:{}},xe={};/** - * @license React - * react-is.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var jm=Symbol.for("react.element"),Wm=Symbol.for("react.portal"),$c=Symbol.for("react.fragment"),Hc=Symbol.for("react.strict_mode"),Vc=Symbol.for("react.profiler"),Gc=Symbol.for("react.provider"),Jc=Symbol.for("react.context"),gT=Symbol.for("react.server_context"),Qc=Symbol.for("react.forward_ref"),Xc=Symbol.for("react.suspense"),qc=Symbol.for("react.suspense_list"),Kc=Symbol.for("react.memo"),Zc=Symbol.for("react.lazy"),vT=Symbol.for("react.offscreen"),ex;ex=Symbol.for("react.module.reference");function yn(e){if(typeof e=="object"&&e!==null){var t=e.$$typeof;switch(t){case jm:switch(e=e.type,e){case $c:case Vc:case Hc:case Xc:case qc:return e;default:switch(e=e&&e.$$typeof,e){case gT:case Jc:case Qc:case Zc:case Kc:case Gc:return e;default:return t}}case Wm:return t}}}xe.ContextConsumer=Jc;xe.ContextProvider=Gc;xe.Element=jm;xe.ForwardRef=Qc;xe.Fragment=$c;xe.Lazy=Zc;xe.Memo=Kc;xe.Portal=Wm;xe.Profiler=Vc;xe.StrictMode=Hc;xe.Suspense=Xc;xe.SuspenseList=qc;xe.isAsyncMode=function(){return!1};xe.isConcurrentMode=function(){return!1};xe.isContextConsumer=function(e){return yn(e)===Jc};xe.isContextProvider=function(e){return yn(e)===Gc};xe.isElement=function(e){return typeof e=="object"&&e!==null&&e.$$typeof===jm};xe.isForwardRef=function(e){return yn(e)===Qc};xe.isFragment=function(e){return yn(e)===$c};xe.isLazy=function(e){return yn(e)===Zc};xe.isMemo=function(e){return yn(e)===Kc};xe.isPortal=function(e){return yn(e)===Wm};xe.isProfiler=function(e){return yn(e)===Vc};xe.isStrictMode=function(e){return yn(e)===Hc};xe.isSuspense=function(e){return yn(e)===Xc};xe.isSuspenseList=function(e){return yn(e)===qc};xe.isValidElementType=function(e){return typeof e=="string"||typeof e=="function"||e===$c||e===Vc||e===Hc||e===Xc||e===qc||e===vT||typeof e=="object"&&e!==null&&(e.$$typeof===Zc||e.$$typeof===Kc||e.$$typeof===Gc||e.$$typeof===Jc||e.$$typeof===Qc||e.$$typeof===ex||e.getModuleId!==void 0)};xe.typeOf=yn;(function(e){e.exports=xe})(ZS);const yT=sh(ZS.exports);function wT(e){var t=e&&typeof e=="object"&&e.type==="text"?e.value||"":e;return typeof t=="string"&&t.replace(/[ \t\n\f\r]/g,"")===""}function bT(e){return e.join(" ").trim()}function ST(e,t){var n=t||{};return e[e.length-1]===""&&(e=e.concat("")),e.join((n.padRight?" ":"")+","+(n.padLeft===!1?"":" ")).trim()}var s1=/\/\*[^*]*\*+([^/*][^*]*\*+)*\//g,xT=/\n/g,ET=/^\s*/,CT=/^(\*?[-#/*\\\w]+(\[[0-9a-z_-]+\])?)\s*/,AT=/^:\s*/,kT=/^((?:'(?:\\'|.)*?'|"(?:\\"|.)*?"|\([^)]*?\)|[^};])+)/,OT=/^[;\s]*/,PT=/^\s+|\s+$/g,IT=` -`,u1="/",c1="*",ui="",TT="comment",_T="declaration",NT=function(e,t){if(typeof e!="string")throw new TypeError("First argument must be a string");if(!e)return[];t=t||{};var n=1,r=1;function i(h){var g=h.match(xT);g&&(n+=g.length);var v=h.lastIndexOf(IT);r=~v?h.length-v:r+h.length}function o(){var h={line:n,column:r};return function(g){return g.position=new a(h),u(),g}}function a(h){this.start=h,this.end={line:n,column:r},this.source=t.source}a.prototype.content=e;function l(h){var g=new Error(t.source+":"+n+":"+r+": "+h);if(g.reason=h,g.filename=t.source,g.line=n,g.column=r,g.source=e,!t.silent)throw g}function s(h){var g=h.exec(e);if(!!g){var v=g[0];return i(v),e=e.slice(v.length),g}}function u(){s(ET)}function c(h){var g;for(h=h||[];g=f();)g!==!1&&h.push(g);return h}function f(){var h=o();if(!(u1!=e.charAt(0)||c1!=e.charAt(1))){for(var g=2;ui!=e.charAt(g)&&(c1!=e.charAt(g)||u1!=e.charAt(g+1));)++g;if(g+=2,ui===e.charAt(g-1))return l("End of comment missing");var v=e.slice(2,g-2);return r+=2,i(v),e=e.slice(g),r+=2,h({type:TT,comment:v})}}function d(){var h=o(),g=s(CT);if(!!g){if(f(),!s(AT))return l("property missing ':'");var v=s(kT),m=h({type:_T,property:f1(g[0].replace(s1,ui)),value:v?f1(v[0].replace(s1,ui)):ui});return s(OT),m}}function p(){var h=[];c(h);for(var g;g=d();)g!==!1&&(h.push(g),c(h));return h}return u(),p()};function f1(e){return e?e.replace(PT,ui):ui}var DT=NT;function RT(e,t){var n=null;if(!e||typeof e!="string")return n;for(var r,i=DT(e),o=typeof t=="function",a,l,s=0,u=i.length;s0?R.createElement(d,l,c):R.createElement(d,l)}function BT(e){let t=-1;for(;++tString(t)).join("")}const d1={}.hasOwnProperty,YT="https://github.com/remarkjs/react-markdown/blob/main/changelog.md",Ns={plugins:{to:"plugins",id:"change-plugins-to-remarkplugins"},renderers:{to:"components",id:"change-renderers-to-components"},astPlugins:{id:"remove-buggy-html-in-markdown-parser"},allowDangerousHtml:{id:"remove-buggy-html-in-markdown-parser"},escapeHtml:{id:"remove-buggy-html-in-markdown-parser"},source:{to:"children",id:"change-source-to-children"},allowNode:{to:"allowElement",id:"replace-allownode-allowedtypes-and-disallowedtypes"},allowedTypes:{to:"allowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},disallowedTypes:{to:"disallowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},includeNodeIndex:{to:"includeElementIndex",id:"change-includenodeindex-to-includeelementindex"}};function Ym(e){for(const o in Ns)if(d1.call(Ns,o)&&d1.call(e,o)){const a=Ns[o];console.warn(`[react-markdown] Warning: please ${a.to?`use \`${a.to}\` instead of`:"remove"} \`${o}\` (see <${YT}#${a.id}> for more info)`),delete Ns[o]}const t=KP().use(tI).use(e.remarkPlugins||[]).use(VI,Q(U({},e.remarkRehypeOptions),{allowDangerousHtml:!0})).use(e.rehypePlugins||[]).use(mT,e),n=new BP;typeof e.children=="string"?n.value=e.children:e.children!==void 0&&e.children!==null&&console.warn(`[react-markdown] Warning: please pass a string as \`children\` (not: \`${e.children}\`)`);const r=t.runSync(t.parse(n),n);if(r.type!=="root")throw new TypeError("Expected a `root` node");let i=b(Ze,{children:tx({options:e,schema:iT,listDepth:0},r)});return e.className&&(i=b("div",{className:e.className,children:i})),i}Ym.defaultProps={transformLinkUri:OP};Ym.propTypes={children:F.exports.string,className:F.exports.string,allowElement:F.exports.func,allowedElements:F.exports.arrayOf(F.exports.string),disallowedElements:F.exports.arrayOf(F.exports.string),unwrapDisallowed:F.exports.bool,remarkPlugins:F.exports.arrayOf(F.exports.oneOfType([F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.oneOfType([F.exports.bool,F.exports.string,F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.any)]))])),rehypePlugins:F.exports.arrayOf(F.exports.oneOfType([F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.oneOfType([F.exports.bool,F.exports.string,F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.any)]))])),sourcePos:F.exports.bool,rawSourcePos:F.exports.bool,skipHtml:F.exports.bool,includeElementIndex:F.exports.bool,transformLinkUri:F.exports.oneOfType([F.exports.func,F.exports.bool]),linkTarget:F.exports.oneOfType([F.exports.func,F.exports.string]),transformImageUri:F.exports.func,components:F.exports.object};var p1=function(t){return t.reduce(function(n,r){var i=r[0],o=r[1];return n[i]=o,n},{})},h1=typeof window!="undefined"&&window.document&&window.document.createElement?$.exports.useLayoutEffect:$.exports.useEffect,Bt="top",fn="bottom",dn="right",Ut="left",$m="auto",es=[Bt,fn,dn,Ut],Eo="start",Ol="end",$T="clippingParents",nx="viewport",pa="popper",HT="reference",m1=es.reduce(function(e,t){return e.concat([t+"-"+Eo,t+"-"+Ol])},[]),rx=[].concat(es,[$m]).reduce(function(e,t){return e.concat([t,t+"-"+Eo,t+"-"+Ol])},[]),VT="beforeRead",GT="read",JT="afterRead",QT="beforeMain",XT="main",qT="afterMain",KT="beforeWrite",ZT="write",e_="afterWrite",t_=[VT,GT,JT,QT,XT,qT,KT,ZT,e_];function Qn(e){return e?(e.nodeName||"").toLowerCase():null}function _n(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function Co(e){var t=_n(e).Element;return e instanceof t||e instanceof Element}function sn(e){var t=_n(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function ix(e){if(typeof ShadowRoot=="undefined")return!1;var t=_n(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function n_(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},i=t.attributes[n]||{},o=t.elements[n];!sn(o)||!Qn(o)||(Object.assign(o.style,r),Object.keys(i).forEach(function(a){var l=i[a];l===!1?o.removeAttribute(a):o.setAttribute(a,l===!0?"":l)}))})}function r_(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var i=t.elements[r],o=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),l=a.reduce(function(s,u){return s[u]="",s},{});!sn(i)||!Qn(i)||(Object.assign(i.style,l),Object.keys(o).forEach(function(s){i.removeAttribute(s)}))})}}const i_={name:"applyStyles",enabled:!0,phase:"write",fn:n_,effect:r_,requires:["computeStyles"]};function Hn(e){return e.split("-")[0]}var gi=Math.max,Vu=Math.min,Ao=Math.round;function ko(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,i=1;if(sn(e)&&t){var o=e.offsetHeight,a=e.offsetWidth;a>0&&(r=Ao(n.width)/a||1),o>0&&(i=Ao(n.height)/o||1)}return{width:n.width/r,height:n.height/i,top:n.top/i,right:n.right/r,bottom:n.bottom/i,left:n.left/r,x:n.left/r,y:n.top/i}}function Hm(e){var t=ko(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function ox(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&ix(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function pr(e){return _n(e).getComputedStyle(e)}function o_(e){return["table","td","th"].indexOf(Qn(e))>=0}function Zr(e){return((Co(e)?e.ownerDocument:e.document)||window.document).documentElement}function ef(e){return Qn(e)==="html"?e:e.assignedSlot||e.parentNode||(ix(e)?e.host:null)||Zr(e)}function g1(e){return!sn(e)||pr(e).position==="fixed"?null:e.offsetParent}function a_(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&sn(e)){var r=pr(e);if(r.position==="fixed")return null}for(var i=ef(e);sn(i)&&["html","body"].indexOf(Qn(i))<0;){var o=pr(i);if(o.transform!=="none"||o.perspective!=="none"||o.contain==="paint"||["transform","perspective"].indexOf(o.willChange)!==-1||t&&o.willChange==="filter"||t&&o.filter&&o.filter!=="none")return i;i=i.parentNode}return null}function ts(e){for(var t=_n(e),n=g1(e);n&&o_(n)&&pr(n).position==="static";)n=g1(n);return n&&(Qn(n)==="html"||Qn(n)==="body"&&pr(n).position==="static")?t:n||a_(e)||t}function Vm(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function qa(e,t,n){return gi(e,Vu(t,n))}function l_(e,t,n){var r=qa(e,t,n);return r>n?n:r}function ax(){return{top:0,right:0,bottom:0,left:0}}function lx(e){return Object.assign({},ax(),e)}function sx(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var s_=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,lx(typeof t!="number"?t:sx(t,es))};function u_(e){var t,n=e.state,r=e.name,i=e.options,o=n.elements.arrow,a=n.modifiersData.popperOffsets,l=Hn(n.placement),s=Vm(l),u=[Ut,dn].indexOf(l)>=0,c=u?"height":"width";if(!(!o||!a)){var f=s_(i.padding,n),d=Hm(o),p=s==="y"?Bt:Ut,h=s==="y"?fn:dn,g=n.rects.reference[c]+n.rects.reference[s]-a[s]-n.rects.popper[c],v=a[s]-n.rects.reference[s],m=ts(o),y=m?s==="y"?m.clientHeight||0:m.clientWidth||0:0,S=g/2-v/2,k=f[p],_=y-d[c]-f[h],w=y/2-d[c]/2+S,O=qa(k,w,_),E=s;n.modifiersData[r]=(t={},t[E]=O,t.centerOffset=O-w,t)}}function c_(e){var t=e.state,n=e.options,r=n.element,i=r===void 0?"[data-popper-arrow]":r;i!=null&&(typeof i=="string"&&(i=t.elements.popper.querySelector(i),!i)||!ox(t.elements.popper,i)||(t.elements.arrow=i))}const f_={name:"arrow",enabled:!0,phase:"main",fn:u_,effect:c_,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Oo(e){return e.split("-")[1]}var d_={top:"auto",right:"auto",bottom:"auto",left:"auto"};function p_(e){var t=e.x,n=e.y,r=window,i=r.devicePixelRatio||1;return{x:Ao(t*i)/i||0,y:Ao(n*i)/i||0}}function v1(e){var t,n=e.popper,r=e.popperRect,i=e.placement,o=e.variation,a=e.offsets,l=e.position,s=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,h=a.y,g=h===void 0?0:h,v=typeof c=="function"?c({x:p,y:g}):{x:p,y:g};p=v.x,g=v.y;var m=a.hasOwnProperty("x"),y=a.hasOwnProperty("y"),S=Ut,k=Bt,_=window;if(u){var w=ts(n),O="clientHeight",E="clientWidth";if(w===_n(n)&&(w=Zr(n),pr(w).position!=="static"&&l==="absolute"&&(O="scrollHeight",E="scrollWidth")),w=w,i===Bt||(i===Ut||i===dn)&&o===Ol){k=fn;var C=f&&_.visualViewport?_.visualViewport.height:w[O];g-=C-r.height,g*=s?1:-1}if(i===Ut||(i===Bt||i===fn)&&o===Ol){S=dn;var P=f&&_.visualViewport?_.visualViewport.width:w[E];p-=P-r.width,p*=s?1:-1}}var I=Object.assign({position:l},u&&d_),T=c===!0?p_({x:p,y:g}):{x:p,y:g};if(p=T.x,g=T.y,s){var N;return Object.assign({},I,(N={},N[k]=y?"0":"",N[S]=m?"0":"",N.transform=(_.devicePixelRatio||1)<=1?"translate("+p+"px, "+g+"px)":"translate3d("+p+"px, "+g+"px, 0)",N))}return Object.assign({},I,(t={},t[k]=y?g+"px":"",t[S]=m?p+"px":"",t.transform="",t))}function h_(e){var t=e.state,n=e.options,r=n.gpuAcceleration,i=r===void 0?!0:r,o=n.adaptive,a=o===void 0?!0:o,l=n.roundOffsets,s=l===void 0?!0:l,u={placement:Hn(t.placement),variation:Oo(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:i,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,v1(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:s})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,v1(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:s})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const m_={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:h_,data:{}};var Ds={passive:!0};function g_(e){var t=e.state,n=e.instance,r=e.options,i=r.scroll,o=i===void 0?!0:i,a=r.resize,l=a===void 0?!0:a,s=_n(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return o&&u.forEach(function(c){c.addEventListener("scroll",n.update,Ds)}),l&&s.addEventListener("resize",n.update,Ds),function(){o&&u.forEach(function(c){c.removeEventListener("scroll",n.update,Ds)}),l&&s.removeEventListener("resize",n.update,Ds)}}const v_={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:g_,data:{}};var y_={left:"right",right:"left",bottom:"top",top:"bottom"};function ou(e){return e.replace(/left|right|bottom|top/g,function(t){return y_[t]})}var w_={start:"end",end:"start"};function y1(e){return e.replace(/start|end/g,function(t){return w_[t]})}function Gm(e){var t=_n(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Jm(e){return ko(Zr(e)).left+Gm(e).scrollLeft}function b_(e){var t=_n(e),n=Zr(e),r=t.visualViewport,i=n.clientWidth,o=n.clientHeight,a=0,l=0;return r&&(i=r.width,o=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,l=r.offsetTop)),{width:i,height:o,x:a+Jm(e),y:l}}function S_(e){var t,n=Zr(e),r=Gm(e),i=(t=e.ownerDocument)==null?void 0:t.body,o=gi(n.scrollWidth,n.clientWidth,i?i.scrollWidth:0,i?i.clientWidth:0),a=gi(n.scrollHeight,n.clientHeight,i?i.scrollHeight:0,i?i.clientHeight:0),l=-r.scrollLeft+Jm(e),s=-r.scrollTop;return pr(i||n).direction==="rtl"&&(l+=gi(n.clientWidth,i?i.clientWidth:0)-o),{width:o,height:a,x:l,y:s}}function Qm(e){var t=pr(e),n=t.overflow,r=t.overflowX,i=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+i+r)}function ux(e){return["html","body","#document"].indexOf(Qn(e))>=0?e.ownerDocument.body:sn(e)&&Qm(e)?e:ux(ef(e))}function Ka(e,t){var n;t===void 0&&(t=[]);var r=ux(e),i=r===((n=e.ownerDocument)==null?void 0:n.body),o=_n(r),a=i?[o].concat(o.visualViewport||[],Qm(r)?r:[]):r,l=t.concat(a);return i?l:l.concat(Ka(ef(a)))}function Hp(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function x_(e){var t=ko(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function w1(e,t){return t===nx?Hp(b_(e)):Co(t)?x_(t):Hp(S_(Zr(e)))}function E_(e){var t=Ka(ef(e)),n=["absolute","fixed"].indexOf(pr(e).position)>=0,r=n&&sn(e)?ts(e):e;return Co(r)?t.filter(function(i){return Co(i)&&ox(i,r)&&Qn(i)!=="body"}):[]}function C_(e,t,n){var r=t==="clippingParents"?E_(e):[].concat(t),i=[].concat(r,[n]),o=i[0],a=i.reduce(function(l,s){var u=w1(e,s);return l.top=gi(u.top,l.top),l.right=Vu(u.right,l.right),l.bottom=Vu(u.bottom,l.bottom),l.left=gi(u.left,l.left),l},w1(e,o));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function cx(e){var t=e.reference,n=e.element,r=e.placement,i=r?Hn(r):null,o=r?Oo(r):null,a=t.x+t.width/2-n.width/2,l=t.y+t.height/2-n.height/2,s;switch(i){case Bt:s={x:a,y:t.y-n.height};break;case fn:s={x:a,y:t.y+t.height};break;case dn:s={x:t.x+t.width,y:l};break;case Ut:s={x:t.x-n.width,y:l};break;default:s={x:t.x,y:t.y}}var u=i?Vm(i):null;if(u!=null){var c=u==="y"?"height":"width";switch(o){case Eo:s[u]=s[u]-(t[c]/2-n[c]/2);break;case Ol:s[u]=s[u]+(t[c]/2-n[c]/2);break}}return s}function Pl(e,t){t===void 0&&(t={});var n=t,r=n.placement,i=r===void 0?e.placement:r,o=n.boundary,a=o===void 0?$T:o,l=n.rootBoundary,s=l===void 0?nx:l,u=n.elementContext,c=u===void 0?pa:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,h=p===void 0?0:p,g=lx(typeof h!="number"?h:sx(h,es)),v=c===pa?HT:pa,m=e.rects.popper,y=e.elements[d?v:c],S=C_(Co(y)?y:y.contextElement||Zr(e.elements.popper),a,s),k=ko(e.elements.reference),_=cx({reference:k,element:m,strategy:"absolute",placement:i}),w=Hp(Object.assign({},m,_)),O=c===pa?w:k,E={top:S.top-O.top+g.top,bottom:O.bottom-S.bottom+g.bottom,left:S.left-O.left+g.left,right:O.right-S.right+g.right},C=e.modifiersData.offset;if(c===pa&&C){var P=C[i];Object.keys(E).forEach(function(I){var T=[dn,fn].indexOf(I)>=0?1:-1,N=[Bt,fn].indexOf(I)>=0?"y":"x";E[I]+=P[N]*T})}return E}function A_(e,t){t===void 0&&(t={});var n=t,r=n.placement,i=n.boundary,o=n.rootBoundary,a=n.padding,l=n.flipVariations,s=n.allowedAutoPlacements,u=s===void 0?rx:s,c=Oo(r),f=c?l?m1:m1.filter(function(h){return Oo(h)===c}):es,d=f.filter(function(h){return u.indexOf(h)>=0});d.length===0&&(d=f);var p=d.reduce(function(h,g){return h[g]=Pl(e,{placement:g,boundary:i,rootBoundary:o,padding:a})[Hn(g)],h},{});return Object.keys(p).sort(function(h,g){return p[h]-p[g]})}function k_(e){if(Hn(e)===$m)return[];var t=ou(e);return[y1(e),t,y1(t)]}function O_(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var i=n.mainAxis,o=i===void 0?!0:i,a=n.altAxis,l=a===void 0?!0:a,s=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,h=p===void 0?!0:p,g=n.allowedAutoPlacements,v=t.options.placement,m=Hn(v),y=m===v,S=s||(y||!h?[ou(v)]:k_(v)),k=[v].concat(S).reduce(function(fe,pe){return fe.concat(Hn(pe)===$m?A_(t,{placement:pe,boundary:c,rootBoundary:f,padding:u,flipVariations:h,allowedAutoPlacements:g}):pe)},[]),_=t.rects.reference,w=t.rects.popper,O=new Map,E=!0,C=k[0],P=0;P=0,K=B?"width":"height",V=Pl(t,{placement:I,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),le=B?N?dn:Ut:N?fn:Bt;_[K]>w[K]&&(le=ou(le));var te=ou(le),se=[];if(o&&se.push(V[T]<=0),l&&se.push(V[le]<=0,V[te]<=0),se.every(function(fe){return fe})){C=I,E=!1;break}O.set(I,se)}if(E)for(var q=h?3:1,x=function(pe){var he=k.find(function(be){var Ce=O.get(be);if(Ce)return Ce.slice(0,pe).every(function(Ye){return Ye})});if(he)return C=he,"break"},A=q;A>0;A--){var X=x(A);if(X==="break")break}t.placement!==C&&(t.modifiersData[r]._skip=!0,t.placement=C,t.reset=!0)}}const P_={name:"flip",enabled:!0,phase:"main",fn:O_,requiresIfExists:["offset"],data:{_skip:!1}};function b1(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function S1(e){return[Bt,dn,fn,Ut].some(function(t){return e[t]>=0})}function I_(e){var t=e.state,n=e.name,r=t.rects.reference,i=t.rects.popper,o=t.modifiersData.preventOverflow,a=Pl(t,{elementContext:"reference"}),l=Pl(t,{altBoundary:!0}),s=b1(a,r),u=b1(l,i,o),c=S1(s),f=S1(u);t.modifiersData[n]={referenceClippingOffsets:s,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const T_={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:I_};function __(e,t,n){var r=Hn(e),i=[Ut,Bt].indexOf(r)>=0?-1:1,o=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=o[0],l=o[1];return a=a||0,l=(l||0)*i,[Ut,dn].indexOf(r)>=0?{x:l,y:a}:{x:a,y:l}}function N_(e){var t=e.state,n=e.options,r=e.name,i=n.offset,o=i===void 0?[0,0]:i,a=rx.reduce(function(c,f){return c[f]=__(f,t.rects,o),c},{}),l=a[t.placement],s=l.x,u=l.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=s,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const D_={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:N_};function R_(e){var t=e.state,n=e.name;t.modifiersData[n]=cx({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const F_={name:"popperOffsets",enabled:!0,phase:"read",fn:R_,data:{}};function L_(e){return e==="x"?"y":"x"}function M_(e){var t=e.state,n=e.options,r=e.name,i=n.mainAxis,o=i===void 0?!0:i,a=n.altAxis,l=a===void 0?!1:a,s=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,h=n.tetherOffset,g=h===void 0?0:h,v=Pl(t,{boundary:s,rootBoundary:u,padding:f,altBoundary:c}),m=Hn(t.placement),y=Oo(t.placement),S=!y,k=Vm(m),_=L_(k),w=t.modifiersData.popperOffsets,O=t.rects.reference,E=t.rects.popper,C=typeof g=="function"?g(Object.assign({},t.rects,{placement:t.placement})):g,P=typeof C=="number"?{mainAxis:C,altAxis:C}:Object.assign({mainAxis:0,altAxis:0},C),I=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,T={x:0,y:0};if(!!w){if(o){var N,B=k==="y"?Bt:Ut,K=k==="y"?fn:dn,V=k==="y"?"height":"width",le=w[k],te=le+v[B],se=le-v[K],q=p?-E[V]/2:0,x=y===Eo?O[V]:E[V],A=y===Eo?-E[V]:-O[V],X=t.elements.arrow,fe=p&&X?Hm(X):{width:0,height:0},pe=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:ax(),he=pe[B],be=pe[K],Ce=qa(0,O[V],fe[V]),Ye=S?O[V]/2-q-Ce-he-P.mainAxis:x-Ce-he-P.mainAxis,wn=S?-O[V]/2+q+Ce+be+P.mainAxis:A+Ce+be+P.mainAxis,ei=t.elements.arrow&&ts(t.elements.arrow),vf=ei?k==="y"?ei.clientTop||0:ei.clientLeft||0:0,Jo=(N=I==null?void 0:I[k])!=null?N:0,yf=le+Ye-Jo-vf,wf=le+wn-Jo,fs=qa(p?Vu(te,yf):te,le,p?gi(se,wf):se);w[k]=fs,T[k]=fs-le}if(l){var Qo,ds=k==="x"?Bt:Ut,ps=k==="x"?fn:dn,Zn=w[_],ti=_==="y"?"height":"width",Xo=Zn+v[ds],hs=Zn-v[ps],qo=[Bt,Ut].indexOf(m)!==-1,ms=(Qo=I==null?void 0:I[_])!=null?Qo:0,gs=qo?Xo:Zn-O[ti]-E[ti]-ms+P.altAxis,vs=qo?Zn+O[ti]+E[ti]-ms-P.altAxis:hs,L=p&&qo?l_(gs,Zn,vs):qa(p?gs:Xo,Zn,p?vs:hs);w[_]=L,T[_]=L-Zn}t.modifiersData[r]=T}}const B_={name:"preventOverflow",enabled:!0,phase:"main",fn:M_,requiresIfExists:["offset"]};function U_(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function z_(e){return e===_n(e)||!sn(e)?Gm(e):U_(e)}function j_(e){var t=e.getBoundingClientRect(),n=Ao(t.width)/e.offsetWidth||1,r=Ao(t.height)/e.offsetHeight||1;return n!==1||r!==1}function W_(e,t,n){n===void 0&&(n=!1);var r=sn(t),i=sn(t)&&j_(t),o=Zr(t),a=ko(e,i),l={scrollLeft:0,scrollTop:0},s={x:0,y:0};return(r||!r&&!n)&&((Qn(t)!=="body"||Qm(o))&&(l=z_(t)),sn(t)?(s=ko(t,!0),s.x+=t.clientLeft,s.y+=t.clientTop):o&&(s.x=Jm(o))),{x:a.left+l.scrollLeft-s.x,y:a.top+l.scrollTop-s.y,width:a.width,height:a.height}}function Y_(e){var t=new Map,n=new Set,r=[];e.forEach(function(o){t.set(o.name,o)});function i(o){n.add(o.name);var a=[].concat(o.requires||[],o.requiresIfExists||[]);a.forEach(function(l){if(!n.has(l)){var s=t.get(l);s&&i(s)}}),r.push(o)}return e.forEach(function(o){n.has(o.name)||i(o)}),r}function $_(e){var t=Y_(e);return t_.reduce(function(n,r){return n.concat(t.filter(function(i){return i.phase===r}))},[])}function H_(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function V_(e){var t=e.reduce(function(n,r){var i=n[r.name];return n[r.name]=i?Object.assign({},i,r,{options:Object.assign({},i.options,r.options),data:Object.assign({},i.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var x1={placement:"bottom",modifiers:[],strategy:"absolute"};function E1(){for(var e=arguments.length,t=new Array(e),n=0;n{const[l,s]=R.useState(null),[u,c]=R.useState(null),[f,d]=R.useState(null),{styles:p,attributes:h,update:g}=n6(l,u,{placement:e,modifiers:[{name:"arrow",options:{element:f}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),v=R.useMemo(()=>Q(U({},p.popper),{backgroundColor:i}),[i,p.popper]),m=R.useMemo(()=>{let S;function k(){S=setTimeout(()=>{g==null||g(),u==null||u.setAttribute("data-show","")},o)}function _(){clearTimeout(S),u==null||u.removeAttribute("data-show")}return{[t==="hover"?"onMouseEnter":"onClick"]:()=>k(),onMouseLeave:()=>_(),onPointerDown:()=>_()}},[o,u,t,g]),y=typeof n!="string"?n:r?b(Ym,{className:Rs.popoverMarkdown,children:n}):b("div",{className:Rs.textContent,children:n});return M(Ze,{children:[R.cloneElement(a,Q(U({},m),{ref:s})),M("div",Q(U({ref:c,className:Rs.popover,style:v},h.popper),{children:[y,b("div",{ref:d,className:Rs.popperArrow,style:p.arrow})]}))]})},Xm=l=>{var s=l,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:i,openDelayMs:o=0}=s,a=bn(s,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);return b(fx,{placement:t,showOn:n,popoverContent:r,bgColor:i,openDelayMs:o,triggerEl:b("button",Q(U({},a),{children:e}))})},l6="_infoIcon_15ri6_1",s6="_container_15ri6_10",u6="_header_15ri6_15",c6="_info_15ri6_1",f6="_unit_15ri6_27",d6="_description_15ri6_31",ji={infoIcon:l6,container:s6,header:u6,info:c6,unit:f6,description:d6},dx=({units:e})=>b(Xm,{className:ji.infoIcon,popoverContent:b(p6,{units:e}),openDelayMs:500,placement:"auto",children:b(aO,{})});function p6({units:e}){return M("div",{className:ji.container,children:[b("div",{className:ji.header,children:"CSS size options"}),b("div",{className:ji.info,children:e.map(t=>M(R.Fragment,{children:[b("div",{className:ji.unit,children:t}),b("div",{className:ji.description,children:h6[t]})]},t))})]})}const h6={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},m6="_wrapper_13r28_1",g6="_unitSelector_13r28_10",Gu={wrapper:m6,unitSelector:g6};function v6(e){const[t,n]=$.exports.useState(gS(e)),r=$.exports.useCallback(o=>{if(o===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:o})},[t.unit]),i=$.exports.useCallback(o=>{n(a=>{const l=a.unit;return o==="auto"?{unit:o,count:null}:l==="auto"?{unit:o,count:px[o]}:{unit:o,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:i}}const px={fr:1,px:10,rem:1,"%":100};function y6({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:i,updateCount:o,updateUnit:a}=v6(e!=null?e:"auto"),l=R.useMemo(()=>Fm(u=>{t(u)},500),[t]);if(R.useEffect(()=>{const u=xr(i);if(e!==u)return l(xr(i)),()=>l.cancel()},[i,l,e]),e===void 0&&!r)return null;const s=r||i.count===null;return M("div",{className:Gu.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(xr(i))},children:[b(Rm,{ariaLabel:"value-count",value:s?void 0:i.count,disabled:s,onChange:o,min:0}),b("select",{className:Gu.unitSelector,"aria-label":"value-unit",name:"value-unit",value:i.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>b("option",{value:u,children:u},u))}),b(dx,{units:n})]})}function Xn(l){var s=l,{name:e,label:t,onChange:n,optional:r,value:i,defaultValue:o="10px"}=s,a=bn(s,["name","label","onChange","optional","value","defaultValue"]);const u=Ii(n),c=i===void 0;return b(Dm,{name:e,label:t,optional:r,isDisabled:c,defaultValue:o,width_setting:"fit",mainInput:b(y6,Q(U({value:i!=null?i:o},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function w6({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:i}=gS(e),o=R.useCallback(s=>{if(s===void 0){if(i!=="auto")throw new Error("Undefined count with auto units");t(xr({unit:i,count:null}));return}if(i==="auto"){console.error("How did you change the count of an auto unit?");return}t(xr({unit:i,count:s}))},[t,i]),a=R.useCallback(s=>{if(s==="auto"){t(xr({unit:s,count:null}));return}if(i==="auto"){t(xr({unit:s,count:px[s]}));return}t(xr({unit:s,count:r}))},[r,t,i]),l=r===null;return M("div",{className:Gu.wrapper,"aria-label":"Css Unit Input",children:[b(Rm,{ariaLabel:"value-count",value:l?void 0:r,disabled:l,onChange:o,min:0}),b("select",{className:Gu.unitSelector,"aria-label":"value-unit",name:"value-unit",value:i,onChange:s=>a(s.target.value),children:n.map(s=>b("option",{value:s,children:s},s))}),b(dx,{units:n})]})}const b6="_tractInfoDisplay_9993b_1",S6="_sizeWidget_9993b_61",x6="_hoverListener_9993b_88",E6="_buttons_9993b_108",C6="_tractAddButton_9993b_121",A6="_deleteButton_9993b_122",Xi={tractInfoDisplay:b6,sizeWidget:S6,hoverListener:x6,buttons:E6,tractAddButton:C6,deleteButton:A6},k6=["fr","px"];function O6({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:i}){const o=$.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=$.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),l=$.exports.useCallback(()=>a(t),[a,t]),s=$.exports.useCallback(()=>a(t+1),[a,t]),u=$.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return M("div",{className:Xi.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[b("div",{className:Xi.hoverListener}),M("div",{className:Xi.sizeWidget,onClick:I6,children:[M("div",{className:Xi.buttons,children:[b(C1,{dir:e,onClick:l}),b(P6,{onClick:u,deletionConflicts:i}),b(C1,{dir:e,onClick:s})]}),b(w6,{value:n,units:k6,onChange:o})]})]})}const hx=200;function P6({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return b(Xm,{className:Xi.deleteButton,onClick:mx(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:hx,children:b(km,{})})}function C1({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return b(Xm,{className:Xi.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:mx(t),openDelayMs:hx,children:b(sS,{})})}function mx(e){return function(t){t.currentTarget.blur(),e==null||e()}}function A1({dir:e,sizes:t,areas:n,onUpdate:r}){const i=$.exports.useCallback(({dir:o,index:a})=>mS(n,{dir:o,index:a+1}),[n]);return b(Ze,{children:t.map((o,a)=>b(O6,{index:a,dir:e,size:o,onUpdate:r,deletionConflicts:i({dir:e,index:a})},e+a))})}function I6(e){e.stopPropagation()}const T6="_columnSizer_3i83d_1",_6="_rowSizer_3i83d_2",k1={columnSizer:T6,rowSizer:_6};function O1({dir:e,index:t,onStartDrag:n}){return b("div",{className:e==="rows"?k1.rowSizer:k1.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function N6(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const Ju=40,D6=.15,gx=e=>t=>Math.round(t/e)*e,R6=5,qm=gx(R6),F6=.01,L6=gx(F6),P1=e=>Number(e.toFixed(4));function M6(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const i=L6(e*t),o=n.count+i,a=r.count-i;return(i<0?o/a:a/o)=o.length?null:o[u];if(c==="auto"||f==="auto"){const h=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=h[s],o[s]=c),f==="auto"&&(f=h[u],o[u]=f),r.style[i]=h.join(" ")}const d=j6(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=Q(U({dir:t,mouseStart:yx(e,t),originalSizes:o,currentSizes:[...o],beforeIndex:s,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=W6({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function $6({mousePosition:e,drag:t,container:n}){const i=yx(e,t.dir)-t.mouseStart,o=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=U6(i,t);break;case"after-pixel":a=z6(i,t);break;case"both-pixel":a=B6(i,t);break;case"both-relative":a=M6(i,t);break}a!=="no-change"&&(a.beforeSize&&(o[t.beforeIndex]=a.beforeSize),a.afterSize&&(o[t.afterIndex]=a.afterSize),t.currentSizes=o,t.dir==="cols"?n.style.gridTemplateColumns=o.join(" "):n.style.gridTemplateRows=o.join(" "))}function H6(e){return e.match(/[0-9|.]+px/)!==null}function vx(e){return e.match(/[0-9|.]+fr/)!==null}function Qu(e){if(vx(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(H6(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function yx(e,t){return t==="rows"?e.clientY:e.clientX}function V6(e){return e.some(t=>vx(t))}function G6(e){return e.some(t=>t==="auto")}function I1(e,t){const n=Math.abs(t-e)+1,r=ee+o*r)}function J6({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(i=>`"${i.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function T1(e){return e.split(" ")}function Q6(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function X6(e){const t=T1(e.style.gridTemplateRows),n=T1(e.style.gridTemplateColumns),r=Q6(e.style.gridTemplateAreas),i=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:i}}function q6({containerRef:e,onDragEnd:t}){return R.useCallback(({e:r,dir:i,index:o})=>{const a=N6(e,"How are you dragging on an element without a container?");r.preventDefault();const l=Y6({mousePosition:r,dir:i,index:o,container:a}),{beforeIndex:s,afterIndex:u}=l,c=_1(a,{dir:i,index:s,size:l.currentSizes[s]}),f=_1(a,{dir:i,index:u,size:l.currentSizes[u]});K6(a,l.dir,{move:d=>{$6({mousePosition:d,drag:l,container:a}),c.update(l.currentSizes[s]),f.update(l.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(X6(a))}})},[e,t])}function _1(e,{dir:t,index:n,size:r}){const i=document.createElement("div"),o=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(i.style,o,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,i.appendChild(a),e.appendChild(i),{remove:()=>i.remove(),update:l=>{a.innerHTML=l}}}function K6(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const i=()=>{o(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",i),r.addEventListener("mouseleave",i);function o(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",i),r.removeEventListener("mouseleave",i),r.remove()}}const Z6="1fr";function e5(i){var o=i,{className:e,children:t,onNewLayout:n}=o,r=bn(o,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:l}=r,s=$.exports.useRef(null),u=J6(r),c=I1(2,l.length),f=I1(2,a.length),d=q6({containerRef:s,onDragEnd:n}),p=[yP.ResizableGrid];e&&p.push(e);const h=$.exports.useCallback(v=>{switch(v.type){case"ADD":return pS(r,{afterIndex:v.index,dir:v.dir,size:Z6});case"RESIZE":return t5(r,v);case"DELETE":return hS(r,v)}},[r]),g=$.exports.useCallback(v=>n(h(v)),[h,n]);return M("div",{className:p.join(" "),ref:s,style:u,children:[c.map(v=>b(O1,{dir:"cols",index:v,onStartDrag:d},"cols"+v)),f.map(v=>b(O1,{dir:"rows",index:v,onStartDrag:d},"rows"+v)),t,b(A1,{dir:"cols",sizes:l,areas:r.areas,onUpdate:g}),b(A1,{dir:"rows",sizes:a,areas:r.areas,onUpdate:g})]})}function t5(e,{dir:t,index:n,size:r}){return Yo(e,i=>{i[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function n5(e,r){var i=r,{name:t}=i,n=bn(i,["name"]);const{rowStart:o,colStart:a}=n,l="rowEnd"in n?n.rowEnd:o+n.rowSpan-1,s="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Bc(e.areas);for(let c=0;c=o-1&&c=a-1&&d{for(let i of n)r5(r,i)})}function i5(e,t){return wx(e,t)}function o5(e,t,n){return Yo(e,({areas:r})=>{const{numRows:i,numCols:o}=Xl(r);for(let a=0;a{const o=n==="rows"?"row_sizes":"col_sizes";i[o][t-1]=r})}function l5(e,{item_a:t,item_b:n}){return t===n?e:Yo(e,r=>{const{n_rows:i,n_cols:o}=s5(r.areas);let a=!1,l=!1;for(let s=0;s{a.current&&r&&setTimeout(()=>{var l;return(l=a==null?void 0:a.current)==null?void 0:l.focus()},1)},[r]),b("input",{ref:a,className:d5.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:o,onChange:l=>n(l.target.value),disabled:i})}function ke({name:e,label:t,value:n,placeholder:r,onChange:i,autoFocus:o=!1,optional:a=!1,defaultValue:l="my-text"}){const s=Ii(i),u=n===void 0,c=R.useRef(null);return R.useEffect(()=>{c.current&&o&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[o]),b(Dm,{name:e,label:t,optional:a,isDisabled:u,defaultValue:l,width_setting:"full",mainInput:b(p5,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>s({name:e,value:f}),autoFocus:o,disabled:u})})}const h5="_container_17s66_1",m5="_elementsPanel_17s66_28",g5="_propertiesPanel_17s66_37",v5="_editorHolder_17s66_52",y5="_titledPanel_17s66_65",w5="_panelTitleHeader_17s66_77",b5="_header_17s66_86",S5="_rightSide_17s66_94",x5="_divider_17s66_115",E5="_title_17s66_65",C5="_shinyLogo_17s66_126",bx={container:h5,elementsPanel:m5,propertiesPanel:g5,editorHolder:v5,titledPanel:y5,panelTitleHeader:w5,header:b5,rightSide:S5,divider:x5,title:E5,shinyLogo:C5},A5="_portalHolder_18ua3_1",k5="_portalModal_18ua3_11",O5="_title_18ua3_21",P5="_body_18ua3_25",I5="_portalForm_18ua3_30",T5="_portalFormInputs_18ua3_35",_5="_portalFormFooter_18ua3_42",N5="_validationMsg_18ua3_48",D5="_infoText_18ua3_53",Fs={portalHolder:A5,portalModal:k5,title:O5,body:P5,portalForm:I5,portalFormInputs:T5,portalFormFooter:_5,validationMsg:N5,infoText:D5},R5=({children:e,el:t="div"})=>{const[n]=$.exports.useState(document.createElement(t));return $.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),_l.exports.createPortal(e,n)},Sx=({children:e,title:t,label:n,onConfirm:r,onCancel:i})=>b(R5,{children:b("div",{className:Fs.portalHolder,onClick:()=>i(),onKeyDown:o=>{o.key==="Escape"&&i()},children:M("div",{className:Fs.portalModal,onClick:o=>o.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?b("div",{className:Fs.title+" "+bx.panelTitleHeader,children:t}):null,b("div",{className:Fs.body,children:e})]})})}),F5="_portalHolder_18ua3_1",L5="_portalModal_18ua3_11",M5="_title_18ua3_21",B5="_body_18ua3_25",U5="_portalForm_18ua3_30",z5="_portalFormInputs_18ua3_35",j5="_portalFormFooter_18ua3_42",W5="_validationMsg_18ua3_48",Y5="_infoText_18ua3_53",ha={portalHolder:F5,portalModal:L5,title:M5,body:B5,portalForm:U5,portalFormInputs:z5,portalFormFooter:j5,validationMsg:W5,infoText:Y5};function $5({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[i,o]=R.useState(r),[a,l]=R.useState(null),s=R.useCallback(c=>{c&&c.preventDefault();const f=H5({name:i,existingAreaNames:n});if(f){l(f);return}t(i)},[n,i,t]),u=R.useCallback(({value:c})=>{l(null),o(c!=null?c:r)},[r]);return M(Sx,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(i),onCancel:e,children:[b("form",{className:ha.portalForm,onSubmit:s,children:M("div",{className:ha.portalFormInputs,children:[b("span",{className:ha.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),b(ke,{label:"Name of new grid area",name:"New-Item-Name",value:i,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?b("div",{className:ha.validationMsg,children:a}):null]})}),M("div",{className:ha.portalFormFooter,children:[b(Mt,{variant:"delete",onClick:e,children:"Cancel"}),b(Mt,{onClick:()=>s(),children:"Done"})]})]})}function H5({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const V5="_container_1hvsg_1",G5={container:V5},xx=R.createContext(null),J5=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:i,compRef:o})=>{const a=qr(),l=Qx(),{onClick:s}=r,{uniqueAreas:u}=hP(e),_=e,{areas:c}=_,f=bn(_,["areas"]),d=w=>{a(Gx({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:U(U({},f),w)}}))},p=R.useMemo(()=>Nm(c),[c]),[h,g]=R.useState(null),v=w=>{const{node:O,currentPath:E,pos:C}=w,P=E!==void 0,I=Np.includes(O.uiName);if(P&&I&&"area"in O.uiArguments&&O.uiArguments.area){const T=O.uiArguments.area;m({type:"MOVE_ITEM",name:T,pos:C});return}g(w)},m=w=>{d(Km(e,w))},y=u.map(w=>b(sP,{area:w,areas:c,gridLocation:p.get(w),onNewPos:O=>m({type:"MOVE_ITEM",name:w,pos:O})},w)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},k=(w,{node:O,currentPath:E,pos:C})=>{if(Np.includes(O.uiName)){const P=Q(U({},O.uiArguments),{area:w});O.uiArguments=P}else O={uiName:"gridlayout::grid_card",uiArguments:{area:w},uiChildren:[O]};l({parentPath:[],node:O,currentPath:E}),m({type:"ADD_ITEM",name:w,pos:C}),g(null)};return M(xx.Provider,{value:m,children:[b("div",{ref:o,style:S,className:G5.container,onClick:s,draggable:!1,onDragStart:()=>{},children:M(e5,Q(U({},e),{onNewLayout:d,children:[pP(c).map(({row:w,col:O})=>b(fP,{gridRow:w,gridColumn:O,onDroppedNode:v},tP({row:w,col:O}))),t==null?void 0:t.map((w,O)=>b(Pm,U({path:[...i.path,O]},w),i.path.join(".")+O)),n,y]}))}),h?b($5,{info:h,onCancel:()=>g(null),onDone:w=>k(w,h),existingAreaNames:u}):null]})};function Q5(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function X5(){return R.useContext(xx)}function Zm({containerRef:e,path:t,area:n}){const r=X5(),i=R.useCallback(({node:a,currentPath:l})=>l===void 0||!Np.includes(a.uiName)?!1:_m(l,t),[t]),o=R.useCallback(a=>{var s;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const l=(s=a.node.uiArguments.area)!=null?s:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:l})},[n,r]);Tm({watcherRef:e,getCanAcceptDrop:i,onDrop:o,canAcceptDropClass:$t.availableToSwap,hoveringOverClass:$t.hoveringOverSwap})}const q5=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:i},children:o,eventHandlers:a,compRef:l})=>{const s=r.length>0;return Zm({containerRef:l,area:e,path:i}),M(Im,{className:$t.container+" "+(n?$t.withTitle:""),ref:l,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?b(SO,{className:$t.panelTitle,children:n}):null,M("div",{className:$t.contentHolder,"data-alignment":"top",children:[b(N1,{index:0,parentPath:i,numChildren:r.length}),s?r==null?void 0:r.map((u,c)=>M(R.Fragment,{children:[b(Pm,U({path:[...i,c]},u)),b(N1,{index:c+1,numChildren:r.length,parentPath:i})]},i.join(".")+c)):b(Z5,{path:i})]}),o]})};function N1({index:e,numChildren:t,parentPath:n}){const r=R.useRef(null);zO({watcherRef:r,positionInChildren:e,parentPath:n});const i=K5(e,t);return b("div",{ref:r,className:$t.dropWatcher+" "+i,"aria-label":"drop watcher"})}function K5(e,t){return e===0&&t===0?$t.onlyDropWatcher:e===0?$t.firstDropWatcher:e===t?$t.lastDropWatcher:$t.middleDropWatcher}function Z5({path:e}){return M("div",{className:$t.emptyGridCard,children:[b("span",{className:$t.emptyMessage,children:"Empty grid card"}),b(oS,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const eN=({settings:e})=>{var t;return M(Ze,{children:[b(ke,{name:"area",label:"Name of grid area",value:e.area}),b(ke,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),b(Xn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},tN={area:"default-area",item_gap:"12px"},nN={title:"Grid Card",UiComponent:q5,SettingsComponent:eN,acceptsChildren:!0,defaultSettings:tN,iconSrc:Vk,category:"gridlayout",description:"The standard element for placing elements on the grid in a simple card container."},Ex="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function rN(e){return zt({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const Cx=({type:e,name:t,className:n})=>M("code",{className:n,children:[M("span",{style:{opacity:.55},children:[e,"$"]}),b("span",{children:t})]}),iN="_container_1rlbk_1",oN="_plotPlaceholder_1rlbk_5",aN="_label_1rlbk_19",Vp={container:iN,plotPlaceholder:oN,label:aN};function Ax({outputId:e}){const t=$.exports.useRef(null),n=lN(t),r=n===null?100:Math.min(n.width,n.height);return M("div",{ref:t,className:Vp.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[b(Cx,{className:Vp.label,type:"output",name:e}),b(rN,{size:`calc(${r}px - 80px)`})]})}function lN(e){const[t,n]=$.exports.useState(null);return $.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(i=>{if(!e.current)return;const{offsetHeight:o,offsetWidth:a}=e.current;n({width:a,height:o})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const sN="_gridCardPlot_1a94v_1",uN={gridCardPlot:sN},cN=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:i,compRef:o})=>(Zm({containerRef:o,area:t,path:r}),M(Im,Q(U({ref:o,style:{gridArea:t},className:uN.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},i),{children:[b(Ax,{outputId:e!=null?e:t}),n]}))),fN=({settings:{area:e,outputId:t}})=>M(Ze,{children:[b(ke,{name:"area",label:"Name of grid area",value:e}),b(ke,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),dN={title:"Grid Plot Card",UiComponent:cN,SettingsComponent:fN,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:Ex,category:"gridlayout",description:"A wrapper for `shiny::plotOutput()` that uses `gridlayout`-friendly sizing defaults. \n For when you want to have a grid area filled entirely with a single plot."},pN="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",hN="_textPanel_525i2_1",mN={textPanel:hN},gN=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:i},eventHandlers:o,compRef:a})=>(Zm({containerRef:a,area:t,path:i}),M(Im,Q(U({ref:a,className:mN.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},o),{children:[b("h1",{children:e}),r]}))),vN="_checkboxInput_12wa8_1",yN="_checkboxLabel_12wa8_10",D1={checkboxInput:vN,checkboxLabel:yN};function kx({name:e,label:t,value:n,onChange:r,disabled:i,noLabel:o}){const a=Ii(r),l=o?void 0:t!=null?t:e,s=`${e}-checkbox-input`,u=M(Ze,{children:[b("input",{className:D1.checkboxInput,id:s,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:i,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),b("label",{className:D1.checkboxLabel,htmlFor:s,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return l!==void 0?M("div",{className:cr.container,children:[M("label",{className:cr.label,children:[l,":"]}),u]}):u}const wN="_radioContainer_1regb_1",bN="_option_1regb_15",SN="_radioInput_1regb_22",xN="_radioLabel_1regb_26",EN="_icon_1regb_41",ma={radioContainer:wN,option:bN,radioInput:SN,radioLabel:xN,icon:EN};function CN({name:e,label:t,options:n,currentSelection:r,onChange:i,optionsPerColumn:o}){const a=Object.keys(n),l=Ii(i),s=$.exports.useMemo(()=>({gridTemplateColumns:o?`repeat(${o}, 1fr)`:void 0}),[o]);return M("div",{className:cr.container,"data-full-width":"true",children:[M("label",{htmlFor:e,className:cr.label,children:[t!=null?t:e,":"]}),b("fieldset",{className:ma.radioContainer,id:e,style:s,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return M("div",{className:ma.option,children:[b("input",{className:ma.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>l({name:e,value:u}),checked:u===r}),b("label",{className:ma.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?b("img",{src:c,alt:f,className:ma.icon}):c})]},u)})})]})}const AN={start:{icon:tS,label:"left"},center:{icon:Pp,label:"center"},end:{icon:nS,label:"right"}},kN=({settings:e})=>{var t;return M(Ze,{children:[b(ke,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),b(ke,{name:"content",label:"Panel content",value:e.content}),b(CN,{name:"alignment",label:"Text Alignment",options:AN,currentSelection:e.alignment,optionsPerColumn:3}),b(kx,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},ON={title:"Grid Text Card",UiComponent:gN,SettingsComponent:kN,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:pN,category:"gridlayout",description:"A grid card that contains just text that is vertically centered within the panel. Useful for app titles or displaying text-based statistics."},PN=({settings:e})=>b(Ze,{children:b(Xn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function eg(e){return e.uiChildren!==void 0}function Br(e,t){let n=e,r;for(r of t){if(!eg(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function IN(e,{path:t,node:n}){var l;const r=Ox({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:i}=r,o=Q5(i.uiChildren)[t[0]],a=(l=n.uiArguments.area)!=null?l:Gn;o!==a&&(i.uiArguments=Km(i.uiArguments,{type:"RENAME_ITEM",oldName:o,newName:a}))}function TN(e,{path:t}){const n=Ox({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:i}=n,o=i.uiArguments.area;if(!o){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Km(r.uiArguments,{type:"REMOVE_ITEM",name:o})}function Ox({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=Br(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const _N={title:"Grid Page",UiComponent:J5,SettingsComponent:PN,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:IN,DELETE_NODE:TN},category:"gridlayout"},NN="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",DN=({settings:e})=>{const{inputId:t,label:n}=e;return M(Ze,{children:[b(ke,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),b(ke,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},RN="_container_tyghz_1",FN={container:RN},LN=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:i="My Action Button",width:o}=e;return M("div",Q(U({className:FN.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[b(Mt,{style:o?{width:o}:void 0,children:i}),t]}))},MN={title:"Action Button",UiComponent:LN,SettingsComponent:DN,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:NN,category:"Inputs",description:"Creates an action button whose value is initially zero, and increments by one each time it is pressed."},BN="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",UN="_categoryDivider_8d7ls_1",zN={categoryDivider:UN};function Ho({category:e}){return b("div",{className:zN.categoryDivider,children:b("span",{children:e?`${e}:`:null})})}function jN(e){return zt({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var Px={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function R1(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function qn(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function $N(e,t){if(e==null)return{};var n=YN(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function HN(e){return VN(e)||GN(e)||JN(e)||QN()}function VN(e){if(Array.isArray(e))return Gp(e)}function GN(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function JN(e,t){if(!!e){if(typeof e=="string")return Gp(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Gp(e,t)}}function Gp(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function qN(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function An(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Xu(e,t):Xu(e,t))||r&&e===n)return e;if(e===n)break}while(e=qN(e))}return null}var L1=/\s+/g;function je(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(L1," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(L1," ")}}function J(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function vi(e,t){var n="";if(typeof e=="string")n=e;else do{var r=J(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var i=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return i&&new i(n)}function Nx(e,t,n){if(e){var r=e.getElementsByTagName(t),i=0,o=r.length;if(n)for(;i=o:a=i<=o,!a)return r;if(r===Vn())break;r=Pr(r,!1)}return!1}function Po(e,t,n,r){for(var i=0,o=0,a=e.children;o2&&arguments[2]!==void 0?arguments[2]:{},i=r.evt,o=$N(r,iD);rs.pluginEvent.bind(ee)(t,n,qn({dragEl:W,parentEl:$e,ghostEl:ae,rootEl:Fe,nextEl:si,lastDownEl:su,cloneEl:ze,cloneHidden:Er,dragStarted:Ra,putSortable:st,activeSortable:ee.active,originalEvent:i,oldIndex:qi,oldDraggableIndex:tl,newIndex:Yt,newDraggableIndex:wr,hideGhostForTarget:Bx,unhideGhostForTarget:Ux,cloneNowHidden:function(){Er=!0},cloneNowShown:function(){Er=!1},dispatchSortableEvent:function(l){St({sortable:n,name:l,originalEvent:i})}},o))};function St(e){Da(qn({putSortable:st,cloneEl:ze,targetEl:W,rootEl:Fe,oldIndex:qi,oldDraggableIndex:tl,newIndex:Yt,newDraggableIndex:wr},e))}var W,$e,ae,Fe,si,su,ze,Er,qi,Yt,tl,wr,Ls,st,Wi=!1,qu=!1,Ku=[],ni,xn,vd,yd,z1,j1,Ra,Mi,nl,rl=!1,Ms=!1,uu,dt,wd=[],Jp=!1,Zu=[],tf=typeof document!="undefined",Bs=Ix,W1=ns||mr?"cssFloat":"float",oD=tf&&!Tx&&!Ix&&"draggable"in document.createElement("div"),Fx=function(){if(!!tf){if(mr)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),Lx=function(t,n){var r=J(t),i=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),o=Po(t,0,n),a=Po(t,1,n),l=o&&J(o),s=a&&J(a),u=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Be(o).width,c=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Be(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(o&&l.float&&l.float!=="none"){var f=l.float==="left"?"left":"right";return a&&(s.clear==="both"||s.clear===f)?"vertical":"horizontal"}return o&&(l.display==="block"||l.display==="flex"||l.display==="table"||l.display==="grid"||u>=i&&r[W1]==="none"||a&&r[W1]==="none"&&u+c>i)?"vertical":"horizontal"},aD=function(t,n,r){var i=r?t.left:t.top,o=r?t.right:t.bottom,a=r?t.width:t.height,l=r?n.left:n.top,s=r?n.right:n.bottom,u=r?n.width:n.height;return i===l||o===s||i+a/2===l+u/2},lD=function(t,n){var r;return Ku.some(function(i){var o=i[gt].options.emptyInsertThreshold;if(!(!o||tg(i))){var a=Be(i),l=t>=a.left-o&&t<=a.right+o,s=n>=a.top-o&&n<=a.bottom+o;if(l&&s)return r=i}}),r},Mx=function(t){function n(o,a){return function(l,s,u,c){var f=l.options.group.name&&s.options.group.name&&l.options.group.name===s.options.group.name;if(o==null&&(a||f))return!0;if(o==null||o===!1)return!1;if(a&&o==="clone")return o;if(typeof o=="function")return n(o(l,s,u,c),a)(l,s,u,c);var d=(a?l:s).options.group.name;return o===!0||typeof o=="string"&&o===d||o.join&&o.indexOf(d)>-1}}var r={},i=t.group;(!i||lu(i)!="object")&&(i={name:i}),r.name=i.name,r.checkPull=n(i.pull,!0),r.checkPut=n(i.put),r.revertClone=i.revertClone,t.group=r},Bx=function(){!Fx&&ae&&J(ae,"display","none")},Ux=function(){!Fx&&ae&&J(ae,"display","")};tf&&!Tx&&document.addEventListener("click",function(e){if(qu)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),qu=!1,!1},!0);var ri=function(t){if(W){t=t.touches?t.touches[0]:t;var n=lD(t.clientX,t.clientY);if(n){var r={};for(var i in t)t.hasOwnProperty(i)&&(r[i]=t[i]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[gt]._onDragOver(r)}}},sD=function(t){W&&W.parentNode[gt]._isOutsideThisEl(t.target)};function ee(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=pn({},t),e[gt]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return Lx(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,l){a.setData("Text",l.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:ee.supportPointer!==!1&&"PointerEvent"in window&&!Za,emptyInsertThreshold:5};rs.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);Mx(t);for(var i in this)i.charAt(0)==="_"&&typeof this[i]=="function"&&(this[i]=this[i].bind(this));this.nativeDraggable=t.forceFallback?!1:oD,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ve(e,"pointerdown",this._onTapStart):(ve(e,"mousedown",this._onTapStart),ve(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ve(e,"dragover",this),ve(e,"dragenter",this)),Ku.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),pn(this,tD())}ee.prototype={constructor:ee,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Mi=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,W):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,i=this.options,o=i.preventOnFilter,a=t.type,l=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,s=(l||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||s,c=i.filter;if(gD(r),!W&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||i.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&Za&&s&&s.tagName.toUpperCase()==="SELECT")&&(s=An(s,i.draggable,r,!1),!(s&&s.animated)&&su!==s)){if(qi=He(s),tl=He(s,i.draggable),typeof c=="function"){if(c.call(this,t,s,this)){St({sortable:n,rootEl:u,name:"filter",targetEl:s,toEl:r,fromEl:r}),kt("filter",n,{evt:t}),o&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=An(u,f.trim(),r,!1),f)return St({sortable:n,rootEl:f,name:"filter",targetEl:s,fromEl:r,toEl:r}),kt("filter",n,{evt:t}),!0}),c)){o&&t.cancelable&&t.preventDefault();return}i.handle&&!An(u,i.handle,r,!1)||this._prepareDragStart(t,l,s)}}},_prepareDragStart:function(t,n,r){var i=this,o=i.el,a=i.options,l=o.ownerDocument,s;if(r&&!W&&r.parentNode===o){var u=Be(r);if(Fe=o,W=r,$e=W.parentNode,si=W.nextSibling,su=r,Ls=a.group,ee.dragged=W,ni={target:W,clientX:(n||t).clientX,clientY:(n||t).clientY},z1=ni.clientX-u.left,j1=ni.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,W.style["will-change"]="all",s=function(){if(kt("delayEnded",i,{evt:t}),ee.eventCanceled){i._onDrop();return}i._disableDelayedDragEvents(),!F1&&i.nativeDraggable&&(W.draggable=!0),i._triggerDragStart(t,n),St({sortable:i,name:"choose",originalEvent:t}),je(W,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){Nx(W,c.trim(),bd)}),ve(l,"dragover",ri),ve(l,"mousemove",ri),ve(l,"touchmove",ri),ve(l,"mouseup",i._onDrop),ve(l,"touchend",i._onDrop),ve(l,"touchcancel",i._onDrop),F1&&this.nativeDraggable&&(this.options.touchStartThreshold=4,W.draggable=!0),kt("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(ns||mr))){if(ee.eventCanceled){this._onDrop();return}ve(l,"mouseup",i._disableDelayedDrag),ve(l,"touchend",i._disableDelayedDrag),ve(l,"touchcancel",i._disableDelayedDrag),ve(l,"mousemove",i._delayedDragTouchMoveHandler),ve(l,"touchmove",i._delayedDragTouchMoveHandler),a.supportPointer&&ve(l,"pointermove",i._delayedDragTouchMoveHandler),i._dragStartTimer=setTimeout(s,a.delay)}else s()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){W&&bd(W),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;de(t,"mouseup",this._disableDelayedDrag),de(t,"touchend",this._disableDelayedDrag),de(t,"touchcancel",this._disableDelayedDrag),de(t,"mousemove",this._delayedDragTouchMoveHandler),de(t,"touchmove",this._delayedDragTouchMoveHandler),de(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ve(document,"pointermove",this._onTouchMove):n?ve(document,"touchmove",this._onTouchMove):ve(document,"mousemove",this._onTouchMove):(ve(W,"dragend",this),ve(Fe,"dragstart",this._onDragStart));try{document.selection?cu(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(Wi=!1,Fe&&W){kt("dragStarted",this,{evt:n}),this.nativeDraggable&&ve(document,"dragover",sD);var r=this.options;!t&&je(W,r.dragClass,!1),je(W,r.ghostClass,!0),ee.active=this,t&&this._appendGhost(),St({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(xn){this._lastX=xn.clientX,this._lastY=xn.clientY,Bx();for(var t=document.elementFromPoint(xn.clientX,xn.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(xn.clientX,xn.clientY),t!==n);)n=t;if(W.parentNode[gt]._isOutsideThisEl(t),n)do{if(n[gt]){var r=void 0;if(r=n[gt]._onDragOver({clientX:xn.clientX,clientY:xn.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);Ux()}},_onTouchMove:function(t){if(ni){var n=this.options,r=n.fallbackTolerance,i=n.fallbackOffset,o=t.touches?t.touches[0]:t,a=ae&&vi(ae,!0),l=ae&&a&&a.a,s=ae&&a&&a.d,u=Bs&&dt&&B1(dt),c=(o.clientX-ni.clientX+i.x)/(l||1)+(u?u[0]-wd[0]:0)/(l||1),f=(o.clientY-ni.clientY+i.y)/(s||1)+(u?u[1]-wd[1]:0)/(s||1);if(!ee.active&&!Wi){if(r&&Math.max(Math.abs(o.clientX-this._lastX),Math.abs(o.clientY-this._lastY))=0&&(St({rootEl:$e,name:"add",toEl:$e,fromEl:Fe,originalEvent:t}),St({sortable:this,name:"remove",toEl:$e,originalEvent:t}),St({rootEl:$e,name:"sort",toEl:$e,fromEl:Fe,originalEvent:t}),St({sortable:this,name:"sort",toEl:$e,originalEvent:t})),st&&st.save()):Yt!==qi&&Yt>=0&&(St({sortable:this,name:"update",toEl:$e,originalEvent:t}),St({sortable:this,name:"sort",toEl:$e,originalEvent:t})),ee.active&&((Yt==null||Yt===-1)&&(Yt=qi,wr=tl),St({sortable:this,name:"end",toEl:$e,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){kt("nulling",this),Fe=W=$e=ae=si=ze=su=Er=ni=xn=Ra=Yt=wr=qi=tl=Mi=nl=st=Ls=ee.dragged=ee.ghost=ee.clone=ee.active=null,Zu.forEach(function(t){t.checked=!0}),Zu.length=vd=yd=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":W&&(this._onDragOver(t),uD(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,i=0,o=r.length,a=this.options;ir.right+i||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+i}function pD(e,t,n,r,i,o,a,l){var s=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(l&&uuc+u*o/2:sf-uu)return-nl}else if(s>c+u*(1-i)/2&&sf-u*o/2)?s>c+u/2?1:-1:0}function hD(e){return He(W)1&&(ie.forEach(function(l){o.addAnimationState({target:l,rect:Ot?Be(l):a}),md(l),l.fromRect=a,r.removeAnimationState(l)}),Ot=!1,SD(!this.options.removeCloneOnHide,i))},dragOverCompleted:function(n){var r=n.sortable,i=n.isOwner,o=n.insertion,a=n.activeSortable,l=n.parentEl,s=n.putSortable,u=this.options;if(o){if(i&&a._hideClone(),va=!1,u.animation&&ie.length>1&&(Ot||!i&&!a.options.sort&&!s)){var c=Be(Ie,!1,!0,!0);ie.forEach(function(d){d!==Ie&&(U1(d,c),l.appendChild(d))}),Ot=!0}if(!i)if(Ot||js(),ie.length>1){var f=zs;a._showClone(r),a.options.animation&&!zs&&f&&Wt.forEach(function(d){a.addAnimationState({target:d,rect:ya}),d.fromRect=ya,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,i=n.isOwner,o=n.activeSortable;if(ie.forEach(function(l){l.thisAnimationDuration=null}),o.options.animation&&!i&&o.multiDrag.isMultiDrag){ya=pn({},r);var a=vi(Ie,!0);ya.top-=a.f,ya.left-=a.e}},dragOverAnimationComplete:function(){Ot&&(Ot=!1,js())},drop:function(n){var r=n.originalEvent,i=n.rootEl,o=n.parentEl,a=n.sortable,l=n.dispatchSortableEvent,s=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=o.children;if(!Bi)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),je(Ie,f.selectedClass,!~ie.indexOf(Ie)),~ie.indexOf(Ie))ie.splice(ie.indexOf(Ie),1),ga=null,Da({sortable:a,rootEl:i,name:"deselect",targetEl:Ie,originalEvent:r});else{if(ie.push(Ie),Da({sortable:a,rootEl:i,name:"select",targetEl:Ie,originalEvent:r}),r.shiftKey&&ga&&a.el.contains(ga)){var p=He(ga),h=He(Ie);if(~p&&~h&&p!==h){var g,v;for(h>p?(v=p,g=h):(v=h,g=p+1);v1){var m=Be(Ie),y=He(Ie,":not(."+this.options.selectedClass+")");if(!va&&f.animation&&(Ie.thisAnimationDuration=null),c.captureAnimationState(),!va&&(f.animation&&(Ie.fromRect=m,ie.forEach(function(k){if(k.thisAnimationDuration=null,k!==Ie){var _=Ot?Be(k):m;k.fromRect=_,c.addAnimationState({target:k,rect:_})}})),js(),ie.forEach(function(k){d[y]?o.insertBefore(k,d[y]):o.appendChild(k),y++}),s===He(Ie))){var S=!1;ie.forEach(function(k){if(k.sortableIndex!==He(k)){S=!0;return}}),S&&l("update")}ie.forEach(function(k){md(k)}),c.animateAll()}En=c}(i===o||u&&u.lastPutMode!=="clone")&&Wt.forEach(function(k){k.parentNode&&k.parentNode.removeChild(k)})}},nullingGlobal:function(){this.isMultiDrag=Bi=!1,Wt.length=0},destroyGlobal:function(){this._deselectMultiDrag(),de(document,"pointerup",this._deselectMultiDrag),de(document,"mouseup",this._deselectMultiDrag),de(document,"touchend",this._deselectMultiDrag),de(document,"keydown",this._checkKeyDown),de(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof Bi!="undefined"&&Bi)&&En===this.sortable&&!(n&&An(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;ie.length;){var r=ie[0];je(r,this.options.selectedClass,!1),ie.shift(),Da({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},pn(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[gt];!r||!r.options.multiDrag||~ie.indexOf(n)||(En&&En!==r&&(En.multiDrag._deselectMultiDrag(),En=r),je(n,r.options.selectedClass,!0),ie.push(n))},deselect:function(n){var r=n.parentNode[gt],i=ie.indexOf(n);!r||!r.options.multiDrag||!~i||(je(n,r.options.selectedClass,!1),ie.splice(i,1))}},eventProperties:function(){var n=this,r=[],i=[];return ie.forEach(function(o){r.push({multiDragElement:o,index:o.sortableIndex});var a;Ot&&o!==Ie?a=-1:Ot?a=He(o,":not(."+n.options.selectedClass+")"):a=He(o),i.push({multiDragElement:o,index:a})}),{items:HN(ie),clones:[].concat(Wt),oldIndicies:r,newIndicies:i}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function SD(e,t){ie.forEach(function(n,r){var i=t.children[n.sortableIndex+(e?Number(r):0)];i?t.insertBefore(n,i):t.appendChild(n)})}function $1(e,t){Wt.forEach(function(n,r){var i=t.children[n.sortableIndex+(e?Number(r):0)];i?t.insertBefore(n,i):t.appendChild(n)})}function js(){ie.forEach(function(e){e!==Ie&&e.parentNode&&e.parentNode.removeChild(e)})}ee.mount(new vD);ee.mount(ig,rg);const xD=Object.freeze(Object.defineProperty({__proto__:null,default:ee,MultiDrag:bD,Sortable:ee,Swap:yD},Symbol.toStringTag,{value:"Module"})),ED=O0(xD);var jx={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],i=0;i$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>k);function s(w){w.parentElement!==null&&w.parentElement.removeChild(w)}function u(w,O,E){const C=w.children[E]||null;w.insertBefore(O,C)}function c(w){w.forEach(O=>s(O.element))}function f(w){w.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(w,O){const E=v(w),C={parentElement:w.from};let P=[];switch(E){case"normal":P=[{element:w.item,newIndex:w.newIndex,oldIndex:w.oldIndex,parentElement:w.from}];break;case"swap":const N=U({element:w.item,oldIndex:w.oldIndex,newIndex:w.newIndex},C),B=U({element:w.swapItem,oldIndex:w.newIndex,newIndex:w.oldIndex},C);P=[N,B];break;case"multidrag":P=w.oldIndicies.map((K,V)=>U({element:K.multiDragElement,oldIndex:K.index,newIndex:w.newIndicies[V].index},C));break}return m(P,O)}function p(w,O){const E=h(w,O);return g(w,E)}function h(w,O){const E=[...O];return w.concat().reverse().forEach(C=>E.splice(C.oldIndex,1)),E}function g(w,O,E,C){const P=[...O];return w.forEach(I=>{const T=C&&E&&C(I.item,E);P.splice(I.newIndex,0,T||I.item)}),P}function v(w){return w.oldIndicies&&w.oldIndicies.length>0?"multidrag":w.swapItem?"swap":"normal"}function m(w,O){return w.map(C=>Q(U({},C),{item:O[C.oldIndex]})).sort((C,P)=>C.oldIndex-P.oldIndex)}function y(w){const wn=w,{list:O,setList:E,children:C,tag:P,style:I,className:T,clone:N,onAdd:B,onChange:K,onChoose:V,onClone:le,onEnd:te,onFilter:se,onRemove:q,onSort:x,onStart:A,onUnchoose:X,onUpdate:fe,onMove:pe,onSpill:he,onSelect:be,onDeselect:Ce}=wn;return bn(wn,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class k extends r.Component{constructor(O){super(O),this.ref=r.createRef();const E=[...O.list].map(C=>Object.assign(C,{chosen:!1,selected:!1}));O.setList(E,this.sortable,S),o(i)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();o(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:E,className:C,id:P}=this.props,I={style:E,className:C,id:P},T=!O||O===null?"div":O;return r.createElement(T,U({ref:this.ref},I),this.getChildren())}getChildren(){const{children:O,dataIdAttr:E,selectedClass:C="sortable-selected",chosenClass:P="sortable-chosen",dragClass:I="sortable-drag",fallbackClass:T="sortable-falback",ghostClass:N="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:K="sortable-filter",list:V}=this.props;if(!O||O==null)return null;const le=E||"data-id";return r.Children.map(O,(te,se)=>{if(te===void 0)return;const q=V[se]||{},{className:x}=te.props,A=typeof K=="string"&&{[K.replace(".","")]:!!q.filtered},X=o(n)(x,U({[C]:q.selected,[P]:q.chosen},A));return r.cloneElement(te,{[le]:te.key,className:X})})}get sortable(){const O=this.ref.current;if(O===null)return null;const E=Object.keys(O).find(C=>C.includes("Sortable"));return E?O[E]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],E=["onChange","onClone","onFilter","onSort"],C=y(this.props);O.forEach(I=>C[I]=this.prepareOnHandlerPropAndDOM(I)),E.forEach(I=>C[I]=this.prepareOnHandlerProp(I));const P=(I,T)=>{const{onMove:N}=this.props,B=I.willInsertAfter||-1;if(!N)return B;const K=N(I,T,this.sortable,S);return typeof K=="undefined"?!1:K};return Q(U({},C),{onMove:P})}prepareOnHandlerPropAndDOM(O){return E=>{this.callOnHandlerProp(E,O),this[O](E)}}prepareOnHandlerProp(O){return E=>{this.callOnHandlerProp(E,O)}}callOnHandlerProp(O,E){const C=this.props[E];C&&C(O,this.sortable,S)}onAdd(O){const{list:E,setList:C,clone:P}=this.props,I=[...S.dragging.props.list],T=d(O,I);c(T);const N=g(T,E,O,P).map(B=>Object.assign(B,{selected:!1}));C(N,this.sortable,S)}onRemove(O){const{list:E,setList:C}=this.props,P=v(O),I=d(O,E);f(I);let T=[...E];if(O.pullMode!=="clone")T=h(I,T);else{let N=I;switch(P){case"multidrag":N=I.map((B,K)=>Q(U({},B),{element:O.clones[K]}));break;case"normal":N=I.map(B=>Q(U({},B),{element:O.clone}));break;case"swap":default:o(i)(!0,`mode "${P}" cannot clone. Please remove "props.clone" from when using the "${P}" plugin`)}c(N),I.forEach(B=>{const K=B.oldIndex,V=this.props.clone(B.item,O);T.splice(K,1,V)})}T=T.map(N=>Object.assign(N,{selected:!1})),C(T,this.sortable,S)}onUpdate(O){const{list:E,setList:C}=this.props,P=d(O,E);c(P),f(P);const I=p(P,E);return C(I,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:E,setList:C}=this.props,P=E.map((I,T)=>{let N=I;return T===O.oldIndex&&(N=Object.assign(I,{chosen:!0})),N});C(P,this.sortable,S)}onUnchoose(O){const{list:E,setList:C}=this.props,P=E.map((I,T)=>{let N=I;return T===O.oldIndex&&(N=Object.assign(N,{chosen:!1})),N});C(P,this.sortable,S)}onSpill(O){const{removeOnSpill:E,revertOnSpill:C}=this.props;E&&!C&&s(O.item)}onSelect(O){const{list:E,setList:C}=this.props,P=E.map(I=>Object.assign(I,{selected:!1}));O.newIndicies.forEach(I=>{const T=I.index;if(T===-1){console.log(`"${O.type}" had indice of "${I.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}P[T].selected=!0}),C(P,this.sortable,S)}onDeselect(O){const{list:E,setList:C}=this.props,P=E.map(I=>Object.assign(I,{selected:!1}));O.newIndicies.forEach(I=>{const T=I.index;T!==-1&&(P[T].selected=!0)}),C(P,this.sortable,S)}}k.defaultProps={clone:w=>w};var _={};l(e.exports,_)})(Px);const PD="_container_xt7ji_1",ID="_list_xt7ji_6",TD="_item_xt7ji_15",_D="_keyField_xt7ji_29",ND="_valueField_xt7ji_34",DD="_header_xt7ji_39",RD="_dragHandle_xt7ji_45",FD="_deleteButton_xt7ji_55",LD="_addItemButton_xt7ji_65",MD="_separator_xt7ji_72",Pt={container:PD,list:ID,item:TD,keyField:_D,valueField:ND,header:DD,dragHandle:RD,deleteButton:FD,addItemButton:LD,separator:MD};function og({name:e,label:t,value:n,onChange:r,optional:i=!1,newItemValue:o={key:"myKey",value:"myValue"}}){const[a,l]=R.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),s=Ii(r);R.useEffect(()=>{const f=BD(a);Tk(f,n!=null?n:{})||s({name:e,value:f})},[e,s,a,n]);const u=R.useCallback(f=>{l(d=>d.filter(({id:p})=>p!==f))},[]),c=R.useCallback(()=>{l(f=>[...f,U({id:-1},o)].map((d,p)=>Q(U({},d),{id:p})))},[o]);return M("div",{className:Pt.container,children:[b(Ho,{category:e!=null?e:t}),M("div",{className:Pt.list,children:[M("div",{className:Pt.item+" "+Pt.header,children:[b("span",{className:Pt.keyField,children:"Key"}),b("span",{className:Pt.valueField,children:"Value"})]}),b(Px.exports.ReactSortable,{list:a,setList:l,handle:`.${Pt.dragHandle}`,children:a.map((f,d)=>M("div",{className:Pt.item,children:[b("div",{className:Pt.dragHandle,title:"Reorder list",children:b(jN,{})}),b("input",{className:Pt.keyField,type:"text",value:f.key,onChange:p=>{const h=[...a];h[d]=Q(U({},f),{key:p.target.value}),l(h)}}),b("span",{className:Pt.separator,children:":"}),b("input",{className:Pt.valueField,type:"text",value:f.value,onChange:p=>{const h=[...a];h[d]=Q(U({},f),{value:p.target.value}),l(h)}}),b(Mt,{className:Pt.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:b(km,{})})]},f.id))}),b(Mt,{className:Pt.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:b(sS,{})})]})]})}function BD(e){return e.reduce((n,{key:r,value:i})=>(n[r]=i,n),{})}const UD=({settings:e})=>M(Ze,{children:[b(ke,{name:"inputId",label:"Input ID",value:e.inputId}),b(ke,{name:"label",value:e.label}),b(og,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),b(Xn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),zD="_container_162lp_1",jD="_checkbox_162lp_14",Cd={container:zD,checkbox:jD},WD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices;return M("div",Q(U({ref:r,className:Cd.container,style:{width:t.width}},n),{children:[b("label",{children:t.label}),b("div",{children:Object.keys(i).map((o,a)=>b("div",{className:Cd.radio,children:M("label",{className:Cd.checkbox,children:[b("input",{type:"checkbox",name:i[o],value:i[o],defaultChecked:a===0}),b("span",{children:o})]})},o))}),e]}))},YD={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},$D={title:"Checkbox Group",UiComponent:WD,SettingsComponent:UD,acceptsChildren:!1,defaultSettings:YD,iconSrc:BN,category:"Inputs",description:"Create a group of checkboxes that can be used to toggle multiple choices independently. The server will receive the input as a character vector of the selected values."},HD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",VD=({settings:e})=>M(Ze,{children:[b(ke,{name:"inputId",label:"Input ID",value:e.inputId}),b(ke,{name:"label",value:e.label}),b(kx,{label:"Starting value",name:"value",value:e.value}),b(Xn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),GD="_container_1x0tz_1",JD="_label_1x0tz_10",H1={container:GD,label:JD},QD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var s;const i=(s=t.width)!=null?s:"auto",o=U({},t),[a,l]=$.exports.useState(o.value);return $.exports.useEffect(()=>{l(o.value)},[o.value]),M("div",Q(U({className:H1.container+" shiny::checkbox",style:{width:i},"aria-label":"shiny::checkbox",ref:r},n),{children:[M("label",{htmlFor:o.inputId,children:[b("input",{id:o.inputId,type:"checkbox",checked:a,onChange:u=>l(u.target.checked)}),b("span",{className:H1.label,children:o.label})]}),e]}))},XD={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},qD={title:"Checkbox Input",UiComponent:QD,SettingsComponent:VD,acceptsChildren:!1,defaultSettings:XD,iconSrc:HD,category:"Inputs",description:"Create a checkbox that can be used to specify logical values."},KD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",ZD="_wrappedSection_1dn9g_1",eR="_sectionContainer_1dn9g_9",tc={wrappedSection:ZD,sectionContainer:eR},Wx=({name:e,children:t})=>M("div",{className:tc.sectionContainer,children:[b(Ho,{category:e}),b("div",{className:tc.wrappedSection,children:t})]}),tR=({name:e,children:t})=>M("div",{className:tc.sectionContainer,children:[b(Ho,{category:e}),b("div",{className:tc.inputSection,children:t})]}),nR=({settings:e})=>M(Ze,{children:[b(ke,{name:"inputId",label:"Input ID",value:e.inputId}),b(ke,{name:"label",value:e.label}),M(Wx,{name:"Values",children:[b(Or,{name:"value",value:e.value}),b(Or,{name:"min",value:e.min,optional:!0,defaultValue:0}),b(Or,{name:"max",value:e.max,optional:!0,defaultValue:10}),b(Or,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),b(Ho,{}),b(Xn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),rR="_container_yicbr_1",iR={container:rR},oR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var s;const i=U({},t),o=(s=i.width)!=null?s:"200px",[a,l]=$.exports.useState(i.value);return $.exports.useEffect(()=>{l(i.value)},[i.value]),M("div",Q(U({className:iR.container+" shiny::numericInput",style:{width:o},"aria-label":"shiny::numericInput",ref:r},n),{children:[b("span",{children:i.label}),b("input",{type:"number",value:a,onChange:u=>l(Number(u.target.value)),min:i.min,max:i.max,step:i.step}),e]}))},aR={inputId:"myNumericInput",label:"Numeric Input",value:10},lR={title:"Numeric Input",UiComponent:oR,SettingsComponent:nR,acceptsChildren:!1,defaultSettings:aR,iconSrc:KD,category:"Inputs",description:"An input control for entry of numeric values"},sR=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>M(Ze,{children:[b(ke,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),b(Xn,{name:"width",units:["px","%"],value:t}),b(Xn,{name:"height",units:["px","%"],value:n})]}),uR=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:i,compRef:o})=>M("div",Q(U({className:Vp.container,ref:o,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},i),{children:[b(Ax,{outputId:e}),r]})),cR={title:"Plot Output",UiComponent:uR,SettingsComponent:sR,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:Ex,category:"Outputs",description:"Render a `renderPlot()` within an application page."},fR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",dR=({settings:e})=>M(Ze,{children:[b(ke,{name:"inputId",label:"Input ID",value:e.inputId}),b(ke,{name:"label",value:e.label}),b(og,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),b(Xn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),pR="_container_sgn7c_1",V1={container:pR},hR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices,o=Object.keys(i),a=Object.values(i),[l,s]=R.useState(a[0]);return R.useEffect(()=>{a.includes(l)||s(a[0])},[l,a]),M("div",Q(U({ref:r,className:V1.container,style:{width:t.width}},n),{children:[b("label",{children:t.label}),b("div",{children:a.map((u,c)=>b("div",{className:V1.radio,children:M("label",{children:[b("input",{type:"radio",name:t.inputId,value:u,onChange:f=>s(f.target.value),checked:u===l}),b("span",{children:o[c]})]})},u))}),e]}))},mR={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},gR={title:"Radio Buttons",UiComponent:hR,SettingsComponent:dR,acceptsChildren:!1,defaultSettings:mR,iconSrc:fR,category:"Inputs",description:"Create a set of radio buttons used to select an item from a list."},vR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",yR=({settings:e})=>M(Ze,{children:[b(ke,{name:"inputId",label:"Input ID",value:e.inputId}),b(ke,{name:"label",value:e.label}),b(og,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),wR="_container_1e5dd_1",bR={container:wR},SR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices,o=t.inputId;return M("div",Q(U({ref:r,className:bR.container},n),{children:[b("label",{htmlFor:o,children:t.label}),b("select",{id:o,children:Object.keys(i).map((a,l)=>b("option",{value:i[a],children:a},a))}),e]}))},xR={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},ER={title:"Select Input",UiComponent:SR,SettingsComponent:yR,acceptsChildren:!1,defaultSettings:xR,iconSrc:vR,category:"Inputs",description:"Create a select list that can be used to choose a single or multiple items from a list of values."},CR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",AR=({settings:e})=>{const t=U({},e);return M(Ze,{children:[b(ke,{name:"inputId",label:"Input ID",value:t.inputId}),b(ke,{name:"label",value:t.label}),M(Wx,{name:"Values",children:[b(Or,{name:"min",value:t.min}),b(Or,{name:"max",value:t.max}),b(Or,{name:"value",label:"start",value:t.value}),b(Or,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),b(Ho,{}),b(Xn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},kR="_container_1f2js_1",OR="_sliderWrapper_1f2js_11",PR="_sliderInput_1f2js_16",Ad={container:kR,sliderWrapper:OR,sliderInput:PR},IR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=U({},t),{width:o="200px"}=i,[a,l]=$.exports.useState(i.value);return M("div",Q(U({className:Ad.container+" shiny::sliderInput",style:{width:o},"aria-label":"shiny::sliderInput",ref:r},n),{children:[b("div",{children:i.label}),b("div",{className:Ad.sliderWrapper,children:b("input",{type:"range",min:i.min,max:i.max,value:a,onChange:s=>l(Number(s.target.value)),className:"slider "+Ad.sliderInput,"aria-label":"slider input","data-min":i.min,"data-max":i.max,draggable:!0,onDragStartCapture:s=>{s.stopPropagation(),s.preventDefault()}})}),M("div",{children:[b(Cx,{type:"input",name:i.inputId})," = ",a]}),e]}))},TR={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},_R={title:"Slider Input",UiComponent:IR,SettingsComponent:AR,acceptsChildren:!1,defaultSettings:TR,iconSrc:CR,category:"Inputs",description:"Constructs a slider widget to select a number from a range. _(Dates and date-times not currently supported.)_"},NR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",DR=({settings:e})=>M(Ze,{children:[b(ke,{name:"inputId",label:"Input ID",value:e.inputId}),b(ke,{name:"label",value:e.label}),M(tR,{name:"Values",children:[b(ke,{name:"value",value:e.value}),b(ke,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),b(Xn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),RR="_container_yicbr_1",FR={container:RR},LR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i="200px",o="auto",a=U({},t),[l,s]=$.exports.useState(a.value);return $.exports.useEffect(()=>{s(a.value)},[a.value]),M("div",Q(U({className:FR.container+" shiny::textInput",style:{height:o,width:i},"aria-label":"shiny::textInput",ref:r},n),{children:[b("label",{htmlFor:a.inputId,children:a.label}),b("input",{id:a.inputId,type:"text",value:l,onChange:u=>s(u.target.value),placeholder:a.placeholder}),e]}))},MR={inputId:"myTextInput",label:"Text Input",value:""},BR={title:"Text Input",UiComponent:LR,SettingsComponent:DR,acceptsChildren:!1,defaultSettings:MR,iconSrc:NR,category:"Inputs",description:"Create an input control for entry of unstructured text values."},UR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",zR=({settings:e})=>b(ke,{label:"Output ID",name:"outputId",value:e.outputId}),jR="_container_1i6yi_1",WR={container:jR},YR=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>M("div",Q(U({className:WR.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",M("code",{children:["output$",e.outputId]}),t]})),$R={title:"Text Output",UiComponent:YR,SettingsComponent:zR,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:UR,category:"Outputs",description:` - Render a reactive output variable as text within an application page. - Usually paired with \`renderText()\`. - `},HR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",VR=({settings:e})=>{var t;return b(ke,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},GR="_container_1xnzo_1",JR={container:GR},QR=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:i="shiny-ui-output"}=e;return M("div",Q(U({className:JR.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[M("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",i,"!"]}),t]}))},XR={title:"Dynamic UI Output",UiComponent:QR,SettingsComponent:VR,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:HR,category:"Outputs",description:` - Render a reactive output variable as HTML within an application page. - The text will be included within an HTML \`div\` tag, and is presumed to - contain HTML content which should not be escaped. - `};function qR(e){return zt({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function KR(e){return zt({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function ZR(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const eF="_container_p6wnj_1",tF="_infoMsg_p6wnj_14",nF="_codeHolder_p6wnj_19",Kp={container:eF,infoMsg:tF,codeHolder:nF},rF=({settings:e})=>M("div",{children:[b("div",{className:cr.container,children:M("span",{className:Kp.infoMsg,children:[b(qR,{}),"Unknown function call. Can't modify with visual editor."]})}),b(Ho,{category:"Code"}),b("div",{className:cr.container,children:b("pre",{className:Kp.codeHolder,children:ZR(e.text)})})]}),iF=20,oF=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const i=e.text.slice(0,iF).replaceAll(/\s$/g,"")+"...";return M("div",Q(U({className:Kp.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[M("div",{children:["unknown ui output: ",b("code",{children:i})]}),t]}))},aF={title:"Unknown UI Function",UiComponent:oF,SettingsComponent:rF,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},In={"shiny::actionButton":MN,"shiny::numericInput":lR,"shiny::sliderInput":_R,"shiny::textInput":BR,"shiny::checkboxInput":qD,"shiny::checkboxGroupInput":$D,"shiny::selectInput":ER,"shiny::radioButtons":gR,"shiny::plotOutput":cR,"shiny::textOutput":$R,"shiny::uiOutput":XR,"gridlayout::grid_page":_N,"gridlayout::grid_card":nN,"gridlayout::grid_card_text":ON,"gridlayout::grid_card_plot":dN,unknownUiFunction:aF};function Yx(e,t){return Xb(e,t,Math.min(e.length,t.length))}function $x(e,{path:t}){var i;for(let o of Object.values(In)){const a=(i=o==null?void 0:o.stateUpdateSubscribers)==null?void 0:i.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=lF(e,t);if(!eg(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function lF(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const i=n.length===0?e:Br(e,n);if(!eg(i))throw new Error("Somehow trying to enter a leaf node");return{parentNode:i,indexToNode:r}}function sF(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:i}){const o=Br(e,t);if(!In[o.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(o.uiChildren)||(o.uiChildren=[]);const a=r==="last"?o.uiChildren.length:r;if(i!==void 0){const l=[...t,a];if(Yx(i,l))throw new Error("Invalid move request");if(_m(i,l)){const s=i[i.length-1];o.uiChildren=YO(o.uiChildren,s,a);return}$x(e,{path:i})}o.uiChildren=Al(o.uiChildren,a,n)}function uF({fromPath:e,toPath:t}){if(e==null)return!0;if(Yx(e,t))return!1;if(_m(e,t)){const n=e.length,r=e[n-1],i=t[n-1];if(r===i||r===i-1)return!1}return!0}function cF(e,{path:t,node:n}){var i;for(let o of Object.values(In)){const a=(i=o==null?void 0:o.stateUpdateSubscribers)==null?void 0:i.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=Br(e,t);Object.assign(r,n)}const ag={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},Hx=mm({name:"uiTree",initialState:ag,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>Vx(t.payload.initialState),UPDATE_NODE:(e,t)=>{cF(e,t.payload)},PLACE_NODE:(e,t)=>{sF(e,t.payload)},DELETE_NODE:(e,t)=>{$x(e,t.payload)}}});function Vx(e){const t=In[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return WO(r,n).length>0&&(e.uiArguments=U(U({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(o=>Vx(o)),e}const{UPDATE_NODE:Gx,PLACE_NODE:fF,DELETE_NODE:Jx,INIT_STATE:dF,SET_FULL_STATE:pF}=Hx.actions;function Qx(){const e=qr();return R.useCallback(n=>{e(fF(n))},[e])}const hF=Hx.reducer,Xx=kk();Xx.startListening({actionCreator:Jx,effect:(e,t)=>Sg(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Ql(n,r)&&t.dispatch(Nk()),r.lengtho)return;const a=[...r];a[n.length-1]=o-1,t.dispatch(Kb({path:a}))})});const mF=Xx.middleware,gF=ok({reducer:{uiTree:hF,selectedPath:Dk,connectedToServer:Ik},middleware:e=>e().concat(mF)}),vF=({children:e})=>b(s2,{store:gF,children:e}),yF=!1,wF=!1,du={ws:null,msg:null},qx=Q(U({},du),{status:"connecting"});function bF(e,t){switch(t.type){case"CONNECTED":return Q(U({},du),{status:"connected",ws:t.ws});case"FAILED":return Q(U({},du),{status:"failed-to-open"});case"CLOSED":return Q(U({},du),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function SF(){const[e,t]=R.useReducer(bF,qx),n=R.useRef(!1);return R.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=yF?"localhost:8888":window.location.host,i=new WebSocket(`ws://${r}`);return i.onerror=o=>{console.error("Error with httpuv websocket connection",o)},i.onopen=o=>{n.current=!0,t({type:"CONNECTED",ws:i})},i.onclose=o=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>i.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const Kx=R.createContext(qx),xF=({children:e})=>{const t=SF();return b(Kx.Provider,{value:t,children:e})};function Zx(){return R.useContext(Kx)}function EF(e){return JSON.parse(e.data)}function eE(e,t){e.addEventListener("message",n=>{t(EF(n))})}function Zp(e){return zt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const CF="_appViewerHolder_wu0cb_1",AF="_title_wu0cb_55",kF="_appContainer_wu0cb_89",OF="_previewFrame_wu0cb_109",PF="_expandButton_wu0cb_134",IF="_reloadButton_wu0cb_135",TF="_spin_wu0cb_160",_F="_restartButton_wu0cb_198",NF="_loadingMessage_wu0cb_225",DF="_error_wu0cb_236",Dt={appViewerHolder:CF,title:AF,appContainer:kF,previewFrame:OF,expandButton:PF,reloadButton:IF,spin:TF,restartButton:_F,loadingMessage:NF,error:DF},RF="_fakeApp_t3dh1_1",FF="_fakeDashboard_t3dh1_7",LF="_header_t3dh1_22",MF="_sidebar_t3dh1_31",BF="_top_t3dh1_35",UF="_bottom_t3dh1_39",wa={fakeApp:RF,fakeDashboard:FF,header:LF,sidebar:MF,top:BF,bottom:UF},zF=()=>b("div",{className:Dt.appContainer,children:M("div",{className:wa.fakeDashboard+" "+Dt.previewFrame,children:[b("div",{className:wa.header,children:b("h1",{children:"App preview not available"})}),b("div",{className:wa.sidebar}),b("div",{className:wa.top}),b("div",{className:wa.bottom})]})});function jF(e){return zt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function WF(e){return zt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function YF(e){return zt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function $F(e){return zt({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const HF="_logs_xjp5l_2",VF="_logsContents_xjp5l_25",GF="_expandTab_xjp5l_29",JF="_clearLogsButton_xjp5l_69",QF="_logLine_xjp5l_75",XF="_noLogsMsg_xjp5l_81",qF="_expandedLogs_xjp5l_93",KF="_expandLogsButton_xjp5l_101",ZF="_unseenLogsNotification_xjp5l_108",eL="_slidein_xjp5l_1",ii={logs:HF,logsContents:VF,expandTab:GF,clearLogsButton:JF,logLine:QF,noLogsMsg:XF,expandedLogs:qF,expandLogsButton:KF,unseenLogsNotification:ZF,slidein:eL};function tL({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:i}=nL(e),o=e.length===0;return M("div",{className:ii.logs,"data-expanded":n,children:[M("button",{className:ii.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[b(YF,{className:ii.unseenLogsNotification,"data-show":i}),"App Logs",n?b(jF,{}):b(WF,{})]}),M("div",{className:ii.logsContents,children:[o?b("p",{className:ii.noLogsMsg,children:"No recent logs"}):e.map((a,l)=>b("p",{className:ii.logLine,children:a},l)),o?null:b(Mt,{variant:"icon",title:"clear logs",className:ii.clearLogsButton,onClick:t,children:b($F,{})})]})]})}function nL(e){const[t,n]=R.useState(!1),[r,i]=R.useState(!1),[o,a]=R.useState(null),[l,s]=R.useState(new Date),u=R.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),i(!1)},[t]);return R.useEffect(()=>{s(new Date)},[e]),R.useEffect(()=>{if(t||e.length===0){i(!1);return}if(o===null||o{u==="connected"&&(il(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>il(c,{path:"APP-PREVIEW-RESTART"})),h(()=>()=>il(c,{path:"APP-PREVIEW-STOP"})),eE(c,y=>{if(!rL(y))return;const{path:S,payload:k}=y;switch(S){case"SHINY_READY":s(!1),a(!1),n(k);break;case"SHINY_LOGS":i(oL(k));break;case"SHINY_CRASH":s(k);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:y})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=R.useState(()=>()=>console.log("No app running to reset")),[p,h]=R.useState(()=>()=>console.log("No app running to stop")),g=R.useCallback(()=>{i([])},[]),v={appLogs:r,clearLogs:g,restartApp:f,stopApp:p};return o?Object.assign(v,{status:"no-preview",appLoc:null}):l?Object.assign(v,{status:"crashed",error:l,appLoc:null}):t?Object.assign(v,{status:"finished",appLoc:t,error:null}):Object.assign(v,{status:"loading",appLoc:null,error:null})}function oL(e){return Array.isArray(e)?e:[e]}function aL(){const[e,t]=R.useState(.2),n=fL();return R.useEffect(()=>{!n||t(lL(n.width))},[n]),e}function lL(e){const t=WE-tE*2,n=e-nE*2;return t/n}const tE=16,nE=55;function sL(){const e=R.useRef(null),[t,n]=R.useState(!1),r=R.useCallback(()=>{n(f=>!f)},[]),{status:i,appLoc:o,appLogs:a,clearLogs:l,restartApp:s}=iL(),u=aL(),c=R.useCallback(f=>{!e.current||!o||(e.current.src=o,dL(f.currentTarget))},[o]);return i==="no-preview"&&!wF?null:M(Ze,{children:[M("h3",{className:Dt.title+" "+bx.panelTitleHeader,children:[b(Mt,{variant:["transparent","icon"],className:Dt.reloadButton,title:"Reload app session",onClick:c,children:b(Zp,{})}),"App Preview"]}),b("div",{className:Dt.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${tE}px`,"--expanded-inset-horizontal":`${nE}px`},children:i==="loading"?b(cL,{}):i==="crashed"?b(uL,{onClick:s}):M(Ze,{children:[b(Mt,{variant:["transparent","icon"],className:Dt.reloadButton,title:"Reload app session",onClick:c,children:b(Zp,{})}),M("div",{className:Dt.appContainer,children:[i==="no-preview"?b(zF,{}):b("iframe",{className:Dt.previewFrame,src:o,title:"Application Preview",ref:e}),b(Mt,{variant:"icon",className:Dt.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?b(KR,{}):b(jO,{})})]}),b(tL,{appLogs:a,clearLogs:l})]})})]})}function uL({onClick:e}){return M("div",{className:Dt.appContainer,children:[M("p",{children:["App preview crashed.",b("br",{})," Try and restart?"]}),M(Mt,{className:Dt.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",b(Zp,{})]})]})}function cL(){return b("div",{className:Dt.loadingMessage,children:b("h2",{children:"Loading app preview..."})})}function fL(){const[e,t]=R.useState(null),n=R.useMemo(()=>Fm(()=>{const{innerWidth:r,innerHeight:i}=window;t({width:r,height:i})},500),[]);return R.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function dL(e){e.classList.add(Dt.spin),e.addEventListener("animationend",()=>e.classList.remove(Dt.spin),!1)}const pL=e=>b("svg",Q(U({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:b("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class hL{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function mL(){const e=Gl(c=>c.uiTree),t=qr(),[n,r]=R.useState(!1),[i,o]=R.useState(!1),a=R.useRef(new hL({comparisonFn:gL}));R.useEffect(()=>{if(!e||e===ag)return;const c=a.current;c.addEntry(e),o(c.canGoBackwards()),r(c.canGoForwards())},[e]);const l=R.useCallback(c=>{t(pF({state:c}))},[t]),s=R.useCallback(()=>{console.log("Navigating backwards"),l(a.current.goBackwards())},[l]),u=R.useCallback(()=>{console.log("Navigating forwards"),l(a.current.goForwards())},[l]);return{goBackward:s,goForward:u,canGoBackward:i,canGoForward:n}}function gL(e,t){return typeof t=="undefined"?!1:e===t}const vL="_container_1d7pe_1",yL={container:vL};function wL(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=mL();return M("div",{className:yL.container+" undo-redo-buttons",children:[b(Mt,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:b(sO,{height:"100%"})}),b(Mt,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:b(lO,{height:"100%"})})]})}const bL="_elementsPalette_qmlez_1",SL="_OptionContainer_qmlez_18",xL="_OptionItem_qmlez_24",EL="_OptionIcon_qmlez_33",CL="_OptionLabel_qmlez_41",Ma={elementsPalette:bL,OptionContainer:SL,OptionItem:xL,OptionIcon:EL,OptionLabel:CL};function AL({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r,description:i=n}=In[e],o={uiName:e,uiArguments:r},a=$.exports.useRef(null);return lS({ref:a,nodeInfo:{node:o}}),t===void 0?null:b(fx,{popoverContent:i,contentIsMd:!0,openDelayMs:500,triggerEl:b("div",{className:Ma.OptionContainer,children:M("div",{ref:a,className:Ma.OptionItem,"data-ui-name":e,children:[b("img",{src:t,alt:n,className:Ma.OptionIcon}),b("label",{className:Ma.OptionLabel,children:n})]})})})}const G1=["Inputs","Outputs","gridlayout","uncategorized"];function kL(e,t){var i,o;const n=G1.indexOf(((i=In[e])==null?void 0:i.category)||"uncategorized"),r=G1.indexOf(((o=In[t])==null?void 0:o.category)||"uncategorized");return nr?1:0}function OL({availableUi:e=In}){const t=$.exports.useMemo(()=>Object.keys(e).sort(kL),[e]);return b("div",{className:Ma.elementsPalette,children:t.map(n=>b(AL,{uiName:n},n))})}function rE(e){return function(t){return typeof t===e}}var PL=rE("function"),IL=function(e){return e===null},J1=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},Q1=function(e){return!TL(e)&&!IL(e)&&(PL(e)||typeof e=="object")},TL=rE("undefined"),eh=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function _L(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!Rt(e[r],t[r]))return!1;return!0}function NL(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),i=e.byteLength;i--;)if(n.getUint8(i)!==r.getUint8(i))return!1;return!0}function DL(e,t){var n,r,i,o;if(e.size!==t.size)return!1;try{for(var a=eh(e.entries()),l=a.next();!l.done;l=a.next()){var s=l.value;if(!t.has(s[0]))return!1}}catch(f){n={error:f}}finally{try{l&&!l.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=eh(e.entries()),c=u.next();!c.done;c=u.next()){var s=c.value;if(!Rt(s[1],t.get(s[0])))return!1}}catch(f){i={error:f}}finally{try{c&&!c.done&&(o=u.return)&&o.call(u)}finally{if(i)throw i.error}}return!0}function RL(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var i=eh(e.entries()),o=i.next();!o.done;o=i.next()){var a=o.value;if(!t.has(a[0]))return!1}}catch(l){n={error:l}}finally{try{o&&!o.done&&(r=i.return)&&r.call(i)}finally{if(n)throw n.error}}return!0}function Rt(e,t){if(e===t)return!0;if(e&&Q1(e)&&t&&Q1(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return _L(e,t);if(e instanceof Map&&t instanceof Map)return DL(e,t);if(e instanceof Set&&t instanceof Set)return RL(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return NL(e,t);if(J1(e)&&J1(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var i=n.length;i--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[i]))return!1;for(var i=n.length;i--!==0;){var o=n[i];if(!(o==="_owner"&&e.$$typeof)&&!Rt(e[o],t[o]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var FL=["innerHTML","ownerDocument","style","attributes","nodeValue"],LL=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],ML=["bigint","boolean","null","number","string","symbol","undefined"];function nf(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(BL(t))return t}function Nn(e){return function(t){return nf(t)===e}}function BL(e){return LL.includes(e)}function Vo(e){return function(t){return typeof t===e}}function UL(e){return ML.includes(e)}function D(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(D.array(e))return"Array";if(D.plainFunction(e))return"Function";var t=nf(e);return t||"Object"}D.array=Array.isArray;D.arrayOf=function(e,t){return!D.array(e)&&!D.function(t)?!1:e.every(function(n){return t(n)})};D.asyncGeneratorFunction=function(e){return nf(e)==="AsyncGeneratorFunction"};D.asyncFunction=Nn("AsyncFunction");D.bigint=Vo("bigint");D.boolean=function(e){return e===!0||e===!1};D.date=Nn("Date");D.defined=function(e){return!D.undefined(e)};D.domElement=function(e){return D.object(e)&&!D.plainObject(e)&&e.nodeType===1&&D.string(e.nodeName)&&FL.every(function(t){return t in e})};D.empty=function(e){return D.string(e)&&e.length===0||D.array(e)&&e.length===0||D.object(e)&&!D.map(e)&&!D.set(e)&&Object.keys(e).length===0||D.set(e)&&e.size===0||D.map(e)&&e.size===0};D.error=Nn("Error");D.function=Vo("function");D.generator=function(e){return D.iterable(e)&&D.function(e.next)&&D.function(e.throw)};D.generatorFunction=Nn("GeneratorFunction");D.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};D.iterable=function(e){return!D.nullOrUndefined(e)&&D.function(e[Symbol.iterator])};D.map=Nn("Map");D.nan=function(e){return Number.isNaN(e)};D.null=function(e){return e===null};D.nullOrUndefined=function(e){return D.null(e)||D.undefined(e)};D.number=function(e){return Vo("number")(e)&&!D.nan(e)};D.numericString=function(e){return D.string(e)&&e.length>0&&!Number.isNaN(Number(e))};D.object=function(e){return!D.nullOrUndefined(e)&&(D.function(e)||typeof e=="object")};D.oneOf=function(e,t){return D.array(e)?e.indexOf(t)>-1:!1};D.plainFunction=Nn("Function");D.plainObject=function(e){if(nf(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};D.primitive=function(e){return D.null(e)||UL(typeof e)};D.promise=Nn("Promise");D.propertyOf=function(e,t,n){if(!D.object(e)||!t)return!1;var r=e[t];return D.function(n)?n(r):D.defined(r)};D.regexp=Nn("RegExp");D.set=Nn("Set");D.string=Vo("string");D.symbol=Vo("symbol");D.undefined=Vo("undefined");D.weakMap=Nn("WeakMap");D.weakSet=Nn("WeakSet");function zL(){for(var e=[],t=0;ts);return D.undefined(r)||(u=u&&s===r),D.undefined(o)||(u=u&&l===o),u}function q1(e,t,n){var r=n.key,i=n.type,o=n.value,a=jn(e,r),l=jn(t,r),s=i==="added"?a:l,u=i==="added"?l:a;if(!D.nullOrUndefined(o)){if(D.defined(s)){if(D.array(s)||D.plainObject(s))return jL(s,u,o)}else return Rt(u,o);return!1}return[a,l].every(D.array)?!u.every(lg(s)):[a,l].every(D.plainObject)?WL(Object.keys(s),Object.keys(u)):![a,l].every(function(c){return D.primitive(c)&&D.defined(c)})&&(i==="added"?!D.defined(a)&&D.defined(l):D.defined(a)&&!D.defined(l))}function K1(e,t,n){var r=n===void 0?{}:n,i=r.key,o=jn(e,i),a=jn(t,i);if(!iE(o,a))throw new TypeError("Inputs have different types");if(!zL(o,a))throw new TypeError("Inputs don't have length");return[o,a].every(D.plainObject)&&(o=Object.keys(o),a=Object.keys(a)),[o,a]}function Z1(e){return function(t){var n=t[0],r=t[1];return D.array(e)?Rt(e,r)||e.some(function(i){return Rt(i,r)||D.array(r)&&lg(r)(i)}):D.plainObject(e)&&e[n]?!!e[n]&&Rt(e[n],r):Rt(e,r)}}function WL(e,t){return t.some(function(n){return!e.includes(n)})}function e0(e){return function(t){return D.array(e)?e.some(function(n){return Rt(n,t)||D.array(t)&&lg(t)(n)}):Rt(e,t)}}function ba(e,t){return D.array(e)?e.some(function(n){return Rt(n,t)}):Rt(e,t)}function lg(e){return function(t){return e.some(function(n){return Rt(n,t)})}}function iE(){for(var e=[],t=0;t=0)return 1;return 0}();function S8(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function x8(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},b8))}}var E8=is&&window.Promise,C8=E8?S8:x8;function dE(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function _i(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function fg(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function os(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=_i(e),n=t.overflow,r=t.overflowX,i=t.overflowY;return/(auto|scroll|overlay)/.test(n+i+r)?e:os(fg(e))}function pE(e){return e&&e.referenceNode?e.referenceNode:e}var o0=is&&!!(window.MSInputMethodContext&&document.documentMode),a0=is&&/MSIE 10/.test(navigator.userAgent);function Go(e){return e===11?o0:e===10?a0:o0||a0}function To(e){if(!e)return document.documentElement;for(var t=Go(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&_i(n,"position")==="static"?To(n):n}function A8(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||To(e.firstElementChild)===e}function th(e){return e.parentNode!==null?th(e.parentNode):e}function rc(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,i=n?t:e,o=document.createRange();o.setStart(r,0),o.setEnd(i,0);var a=o.commonAncestorContainer;if(e!==a&&t!==a||r.contains(i))return A8(a)?a:To(a);var l=th(e);return l.host?rc(l.host,t):rc(e,th(t).host)}function _o(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var i=e.ownerDocument.documentElement,o=e.ownerDocument.scrollingElement||i;return o[n]}return e[n]}function k8(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=_o(t,"top"),i=_o(t,"left"),o=n?-1:1;return e.top+=r*o,e.bottom+=r*o,e.left+=i*o,e.right+=i*o,e}function l0(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function s0(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],Go(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function hE(e){var t=e.body,n=e.documentElement,r=Go(10)&&getComputedStyle(n);return{height:s0("Height",t,n,r),width:s0("Width",t,n,r)}}var O8=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},P8=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=Go(10),i=t.nodeName==="HTML",o=nh(e),a=nh(t),l=os(e),s=_i(t),u=parseFloat(s.borderTopWidth),c=parseFloat(s.borderLeftWidth);n&&i&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=Jr({top:o.top-a.top-u,left:o.left-a.left-c,width:o.width,height:o.height});if(f.marginTop=0,f.marginLeft=0,!r&&i){var d=parseFloat(s.marginTop),p=parseFloat(s.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(l):t===l&&l.nodeName!=="BODY")&&(f=k8(f,t)),f}function I8(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=dg(e,n),i=Math.max(n.clientWidth,window.innerWidth||0),o=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:_o(n),l=t?0:_o(n,"left"),s={top:a-r.top+r.marginTop,left:l-r.left+r.marginLeft,width:i,height:o};return Jr(s)}function mE(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(_i(e,"position")==="fixed")return!0;var n=fg(e);return n?mE(n):!1}function gE(e){if(!e||!e.parentElement||Go())return document.documentElement;for(var t=e.parentElement;t&&_i(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function pg(e,t,n,r){var i=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,o={top:0,left:0},a=i?gE(e):rc(e,pE(t));if(r==="viewport")o=I8(a,i);else{var l=void 0;r==="scrollParent"?(l=os(fg(t)),l.nodeName==="BODY"&&(l=e.ownerDocument.documentElement)):r==="window"?l=e.ownerDocument.documentElement:l=r;var s=dg(l,a,i);if(l.nodeName==="HTML"&&!mE(a)){var u=hE(e.ownerDocument),c=u.height,f=u.width;o.top+=s.top-s.marginTop,o.bottom=c+s.top,o.left+=s.left-s.marginLeft,o.right=f+s.left}else o=s}n=n||0;var d=typeof n=="number";return o.left+=d?n:n.left||0,o.top+=d?n:n.top||0,o.right-=d?n:n.right||0,o.bottom-=d?n:n.bottom||0,o}function T8(e){var t=e.width,n=e.height;return t*n}function vE(e,t,n,r,i){var o=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=pg(n,r,o,i),l={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},s=Object.keys(l).map(function(d){return on({key:d},l[d],{area:T8(l[d])})}).sort(function(d,p){return p.area-d.area}),u=s.filter(function(d){var p=d.width,h=d.height;return p>=n.clientWidth&&h>=n.clientHeight}),c=u.length>0?u[0].key:s[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function yE(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,i=r?gE(t):rc(t,pE(n));return dg(n,i,r)}function wE(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),i=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),o={width:e.offsetWidth+i,height:e.offsetHeight+r};return o}function ic(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function bE(e,t,n){n=n.split("-")[0];var r=wE(e),i={width:r.width,height:r.height},o=["right","left"].indexOf(n)!==-1,a=o?"top":"left",l=o?"left":"top",s=o?"height":"width",u=o?"width":"height";return i[a]=t[a]+t[s]/2-r[s]/2,n===l?i[l]=t[l]-r[u]:i[l]=t[ic(l)],i}function as(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function _8(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(i){return i[t]===n});var r=as(e,function(i){return i[t]===n});return e.indexOf(r)}function SE(e,t,n){var r=n===void 0?e:e.slice(0,_8(e,"name",n));return r.forEach(function(i){i.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var o=i.function||i.fn;i.enabled&&dE(o)&&(t.offsets.popper=Jr(t.offsets.popper),t.offsets.reference=Jr(t.offsets.reference),t=o(t,i))}),t}function N8(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=yE(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=vE(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=bE(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=SE(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function xE(e,t){return e.some(function(n){var r=n.name,i=n.enabled;return i&&r===t})}function hg(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=l[f]+h-a[p]),e.offsets.popper=Jr(e.offsets.popper);var g=l[f]+l[u]/2-h/2,v=_i(e.instance.popper),m=parseFloat(v["margin"+c]),y=parseFloat(v["border"+c+"Width"]),S=g-e.offsets.popper[f]-m-y;return S=Math.max(Math.min(a[u]-h,S),0),e.arrowElement=r,e.offsets.arrow=(n={},No(n,f,Math.round(S)),No(n,d,""),n),e}function H8(e){return e==="end"?"start":e==="start"?"end":e}var kE=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],kd=kE.slice(3);function u0(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=kd.indexOf(e),r=kd.slice(n+1).concat(kd.slice(0,n));return t?r.reverse():r}var Od={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function V8(e,t){if(xE(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=pg(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],i=ic(r),o=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case Od.FLIP:a=[r,i];break;case Od.CLOCKWISE:a=u0(r);break;case Od.COUNTERCLOCKWISE:a=u0(r,!0);break;default:a=t.behavior}return a.forEach(function(l,s){if(r!==l||a.length===s+1)return e;r=e.placement.split("-")[0],i=ic(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),g=f(u.top)f(n.bottom),m=r==="left"&&p||r==="right"&&h||r==="top"&&g||r==="bottom"&&v,y=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(y&&o==="start"&&p||y&&o==="end"&&h||!y&&o==="start"&&g||!y&&o==="end"&&v),k=!!t.flipVariationsByContent&&(y&&o==="start"&&h||y&&o==="end"&&p||!y&&o==="start"&&v||!y&&o==="end"&&g),_=S||k;(d||m||_)&&(e.flipped=!0,(d||m)&&(r=a[s+1]),_&&(o=H8(o)),e.placement=r+(o?"-"+o:""),e.offsets.popper=on({},e.offsets.popper,bE(e.instance.popper,e.offsets.reference,e.placement)),e=SE(e.instance.modifiers,e,"flip"))}),e}function G8(e){var t=e.offsets,n=t.popper,r=t.reference,i=e.placement.split("-")[0],o=Math.floor,a=["top","bottom"].indexOf(i)!==-1,l=a?"right":"bottom",s=a?"left":"top",u=a?"width":"height";return n[l]o(r[l])&&(e.offsets.popper[s]=o(r[l])),e}function J8(e,t,n,r){var i=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),o=+i[1],a=i[2];if(!o)return e;if(a.indexOf("%")===0){var l=void 0;switch(a){case"%p":l=n;break;case"%":case"%r":default:l=r}var s=Jr(l);return s[t]/100*o}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*o}else return o}function Q8(e,t,n,r){var i=[0,0],o=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),l=a.indexOf(as(a,function(c){return c.search(/,|\s/)!==-1}));a[l]&&a[l].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var s=/\s*,\s*|\s+/,u=l!==-1?[a.slice(0,l).concat([a[l].split(s)[0]]),[a[l].split(s)[1]].concat(a.slice(l+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!o:o)?"height":"width",p=!1;return c.reduce(function(h,g){return h[h.length-1]===""&&["+","-"].indexOf(g)!==-1?(h[h.length-1]=g,p=!0,h):p?(h[h.length-1]+=g,p=!1,h):h.concat(g)},[]).map(function(h){return J8(h,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){mg(d)&&(i[f]+=d*(c[p-1]==="-"?-1:1))})}),i}function X8(e,t){var n=t.offset,r=e.placement,i=e.offsets,o=i.popper,a=i.reference,l=r.split("-")[0],s=void 0;return mg(+n)?s=[+n,0]:s=Q8(n,o,a,l),l==="left"?(o.top+=s[0],o.left-=s[1]):l==="right"?(o.top+=s[0],o.left+=s[1]):l==="top"?(o.left+=s[0],o.top-=s[1]):l==="bottom"&&(o.left+=s[0],o.top+=s[1]),e.popper=o,e}function q8(e,t){var n=t.boundariesElement||To(e.instance.popper);e.instance.reference===n&&(n=To(n));var r=hg("transform"),i=e.instance.popper.style,o=i.top,a=i.left,l=i[r];i.top="",i.left="",i[r]="";var s=pg(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);i.top=o,i.left=a,i[r]=l,t.boundaries=s;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var h=c[p];return c[p]s[p]&&!t.escapeWithReference&&(g=Math.min(c[h],s[p]-(p==="right"?c.width:c.height))),No({},h,g)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=on({},c,f[p](d))}),e.offsets.popper=c,e}function K8(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var i=e.offsets,o=i.reference,a=i.popper,l=["bottom","top"].indexOf(n)!==-1,s=l?"left":"top",u=l?"width":"height",c={start:No({},s,o[s]),end:No({},s,o[s]+o[u]-a[u])};e.offsets.popper=on({},a,c[r])}return e}function Z8(e){if(!AE(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=as(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};O8(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=C8(this.update.bind(this)),this.options=on({},e.Defaults,i),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(on({},e.Defaults.modifiers,i.modifiers)).forEach(function(a){r.options.modifiers[a]=on({},e.Defaults.modifiers[a]||{},i.modifiers?i.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return on({name:a},r.options.modifiers[a])}).sort(function(a,l){return a.order-l.order}),this.modifiers.forEach(function(a){a.enabled&&dE(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var o=this.options.eventsEnabled;o&&this.enableEventListeners(),this.state.eventsEnabled=o}return P8(e,[{key:"update",value:function(){return N8.call(this)}},{key:"destroy",value:function(){return D8.call(this)}},{key:"enableEventListeners",value:function(){return F8.call(this)}},{key:"disableEventListeners",value:function(){return M8.call(this)}}]),e}();hf.Utils=(typeof window!="undefined"?window:global).PopperUtils;hf.placements=kE;hf.Defaults=n7;const c0=hf;var OE={},PE={exports:{}};(function(e,t){(function(n,r){var i=r(n);e.exports=i})(k0,function(n){var r=["N","E","A","D"];function i(E,C){E.super_=C,E.prototype=Object.create(C.prototype,{constructor:{value:E,enumerable:!1,writable:!0,configurable:!0}})}function o(E,C){Object.defineProperty(this,"kind",{value:E,enumerable:!0}),C&&C.length&&Object.defineProperty(this,"path",{value:C,enumerable:!0})}function a(E,C,P){a.super_.call(this,"E",E),Object.defineProperty(this,"lhs",{value:C,enumerable:!0}),Object.defineProperty(this,"rhs",{value:P,enumerable:!0})}i(a,o);function l(E,C){l.super_.call(this,"N",E),Object.defineProperty(this,"rhs",{value:C,enumerable:!0})}i(l,o);function s(E,C){s.super_.call(this,"D",E),Object.defineProperty(this,"lhs",{value:C,enumerable:!0})}i(s,o);function u(E,C,P){u.super_.call(this,"A",E),Object.defineProperty(this,"index",{value:C,enumerable:!0}),Object.defineProperty(this,"item",{value:P,enumerable:!0})}i(u,o);function c(E,C,P){var I=E.slice((P||C)+1||E.length);return E.length=C<0?E.length+C:C,E.push.apply(E,I),E}function f(E){var C=typeof E;return C!=="object"?C:E===Math?"math":E===null?"null":Array.isArray(E)?"array":Object.prototype.toString.call(E)==="[object Date]"?"date":typeof E.toString=="function"&&/^\/.*\//.test(E.toString())?"regexp":"object"}function d(E){var C=0;if(E.length===0)return C;for(var P=0;P0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,N),pe=se!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,N);if(!fe&&pe)P.push(new l(V,C));else if(!pe&&fe)P.push(new s(V,E));else if(f(E)!==f(C))P.push(new a(V,E,C));else if(f(E)==="date"&&E-C!==0)P.push(new a(V,E,C));else if(te==="object"&&E!==null&&C!==null){for(q=B.length-1;q>-1;--q)if(B[q].lhs===E){X=!0;break}if(X)E!==C&&P.push(new a(V,E,C));else{if(B.push({lhs:E,rhs:C}),Array.isArray(E)){for(K&&(E.sort(function(Ce,Ye){return p(Ce)-p(Ye)}),C.sort(function(Ce,Ye){return p(Ce)-p(Ye)})),q=C.length-1,x=E.length-1;q>x;)P.push(new u(V,q,new l(void 0,C[q--])));for(;x>q;)P.push(new u(V,x,new s(void 0,E[x--])));for(;q>=0;--q)h(E[q],C[q],P,I,V,q,B,K)}else{var he=Object.keys(E),be=Object.keys(C);for(q=0;q=0?(h(E[A],C[A],P,I,V,A,B,K),be[X]=null):h(E[A],void 0,P,I,V,A,B,K);for(q=0;q -*/var r7={set:a7,get:i7,has:o7,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:l7};function i7(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,i){return r&&r[i]},e)}else return typeof t=="number"?e[t]:e;else return e}function o7(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(i,o,a,l){return a==l.length-1?n.own?!!(i&&i.hasOwnProperty(o)):i!==null&&typeof i=="object"&&o in i:i&&i[o]},e)}else return typeof t=="number"?t in e:!1;else return!1}function a7(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(i,o,a){const l=Number.isInteger(Number(r[a+1]));return i[o]=i[o]||(l?[]:{}),r.length==a+1&&(i[o]=n),i[o]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function l7(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var i=t.split("."),o=!1,a;return a=!!i.reduce(function(l,s){return o=o||l===n||!!l&&l[s]===n,l&&l[s]},e),r.validPath?o&&a:o}else return!1;else return!1}Object.defineProperty(OE,"__esModule",{value:!0});var s7=PE.exports,It=r7;function u7(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(i)?i.indexOf(l)>=0:l===i;return s&&(o?u:!o)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var i=It.get(e,n),o=It.get(t,n),a=Array.isArray(r)?r.indexOf(i)<0:i!==r,l=Array.isArray(r)?r.indexOf(o)>=0:o===r;return a&&l},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return f0(It.get(e,n),It.get(t,n))&&It.get(e,n)It.get(t,n)}}}var d7=OE.default=f7;function d0(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Le(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function IE(e,t){if(e==null)return{};var n=h7(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function tr(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function TE(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:tr(e)}function cs(e){var t=p7();return function(){var r=oc(e),i;if(t){var o=oc(this).constructor;i=Reflect.construct(r,arguments,o)}else i=r.apply(this,arguments);return TE(this,i)}}var m7={flip:{padding:20},preventOverflow:{padding:10}},ye={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},Mn=aE.canUseDOM,Sa=Mr.createPortal!==void 0;function Pd(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ws(e){var t=e.title,n=e.data,r=e.warn,i=r===void 0?!1:r,o=e.debug,a=o===void 0?!1:o,l=i?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(s){D.plainObject(s)&&s.key?l.apply(console,[s.key,s.value]):l.apply(console,[s])}):l.apply(console,[n]),console.groupEnd())}function g7(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function v7(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function y7(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,i;i=function(a){n(a),v7(e,t,i)},g7(e,t,i,r)}function h0(){}var _E=function(e){us(n,e);var t=cs(n);function n(r){var i;return ls(this,n),i=t.call(this,r),Mn?(i.node=document.createElement("div"),r.id&&(i.node.id=r.id),r.zIndex&&(i.node.style.zIndex=r.zIndex),document.body.appendChild(i.node),i):TE(i)}return ss(n,[{key:"componentDidMount",value:function(){!Mn||Sa||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!Mn||Sa||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!Mn||!this.node||(Sa||Mr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!Mn)return null;var i=this.props,o=i.children,a=i.setRef;if(Sa)return Mr.createPortal(o,this.node);var l=Mr.unstable_renderSubtreeIntoContainer(this,o.length>1?b("div",{children:o}):o[0],this.node);return a(l),null}},{key:"renderReact16",value:function(){var i=this.props,o=i.hasChildren,a=i.placement,l=i.target;return o?this.renderPortal():l||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return Sa?this.renderReact16():null}}]),n}(R.Component);mt(_E,"propTypes",{children:F.exports.oneOfType([F.exports.element,F.exports.array]),hasChildren:F.exports.bool,id:F.exports.oneOfType([F.exports.string,F.exports.number]),placement:F.exports.string,setRef:F.exports.func.isRequired,target:F.exports.oneOfType([F.exports.object,F.exports.string]),zIndex:F.exports.number});var NE=function(e){us(n,e);var t=cs(n);function n(){return ls(this,n),t.apply(this,arguments)}return ss(n,[{key:"parentStyle",get:function(){var i=this.props,o=i.placement,a=i.styles,l=a.arrow.length,s={pointerEvents:"none",position:"absolute",width:"100%"};return o.startsWith("top")?(s.bottom=0,s.left=0,s.right=0,s.height=l):o.startsWith("bottom")?(s.left=0,s.right=0,s.top=0,s.height=l):o.startsWith("left")?(s.right=0,s.top=0,s.bottom=0):o.startsWith("right")&&(s.left=0,s.top=0),s}},{key:"render",value:function(){var i=this.props,o=i.placement,a=i.setArrowRef,l=i.styles,s=l.arrow,u=s.color,c=s.display,f=s.length,d=s.margin,p=s.position,h=s.spread,g={display:c,position:p},v,m=h,y=f;return o.startsWith("top")?(v="0,0 ".concat(m/2,",").concat(y," ").concat(m,",0"),g.bottom=0,g.marginLeft=d,g.marginRight=d):o.startsWith("bottom")?(v="".concat(m,",").concat(y," ").concat(m/2,",0 0,").concat(y),g.top=0,g.marginLeft=d,g.marginRight=d):o.startsWith("left")?(y=h,m=f,v="0,0 ".concat(m,",").concat(y/2," 0,").concat(y),g.right=0,g.marginTop=d,g.marginBottom=d):o.startsWith("right")&&(y=h,m=f,v="".concat(m,",").concat(y," ").concat(m,",0 0,").concat(y/2),g.left=0,g.marginTop=d,g.marginBottom=d),b("div",{className:"__floater__arrow",style:this.parentStyle,children:b("span",{ref:a,style:g,children:b("svg",{width:m,height:y,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:b("polygon",{points:v,fill:u})})})})}}]),n}(R.Component);mt(NE,"propTypes",{placement:F.exports.string.isRequired,setArrowRef:F.exports.func.isRequired,styles:F.exports.object.isRequired});var w7=["color","height","width"],DE=function(t){var n=t.handleClick,r=t.styles,i=r.color,o=r.height,a=r.width,l=IE(r,w7);return b("button",{"aria-label":"close",onClick:n,style:l,type:"button",children:b("svg",{width:"".concat(a,"px"),height:"".concat(o,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:b("g",{children:b("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:i})})})})};DE.propTypes={handleClick:F.exports.func.isRequired,styles:F.exports.object.isRequired};var RE=function(t){var n=t.content,r=t.footer,i=t.handleClick,o=t.open,a=t.positionWrapper,l=t.showCloseButton,s=t.title,u=t.styles,c={content:R.isValidElement(n)?n:b("div",{className:"__floater__content",style:u.content,children:n})};return s&&(c.title=R.isValidElement(s)?s:b("div",{className:"__floater__title",style:u.title,children:s})),r&&(c.footer=R.isValidElement(r)?r:b("div",{className:"__floater__footer",style:u.footer,children:r})),(l||a)&&!D.boolean(o)&&(c.close=b(DE,{styles:u.close,handleClick:i})),M("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};RE.propTypes={content:F.exports.node.isRequired,footer:F.exports.node,handleClick:F.exports.func.isRequired,open:F.exports.bool,positionWrapper:F.exports.bool.isRequired,showCloseButton:F.exports.bool.isRequired,styles:F.exports.object.isRequired,title:F.exports.node};var FE=function(e){us(n,e);var t=cs(n);function n(){return ls(this,n),t.apply(this,arguments)}return ss(n,[{key:"style",get:function(){var i=this.props,o=i.disableAnimation,a=i.component,l=i.placement,s=i.hideArrow,u=i.status,c=i.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,h=c.floaterClosing,g=c.floaterOpening,v=c.floaterWithAnimation,m=c.floaterWithComponent,y={};return s||(l.startsWith("top")?y.padding="0 0 ".concat(f,"px"):l.startsWith("bottom")?y.padding="".concat(f,"px 0 0"):l.startsWith("left")?y.padding="0 ".concat(f,"px 0 0"):l.startsWith("right")&&(y.padding="0 0 0 ".concat(f,"px"))),[ye.OPENING,ye.OPEN].indexOf(u)!==-1&&(y=Le(Le({},y),g)),u===ye.CLOSING&&(y=Le(Le({},y),h)),u===ye.OPEN&&!o&&(y=Le(Le({},y),v)),l==="center"&&(y=Le(Le({},y),p)),a&&(y=Le(Le({},y),m)),Le(Le({},d),y)}},{key:"render",value:function(){var i=this.props,o=i.component,a=i.handleClick,l=i.hideArrow,s=i.setFloaterRef,u=i.status,c={},f=["__floater"];return o?R.isValidElement(o)?c.content=R.cloneElement(o,{closeFn:a}):c.content=o({closeFn:a}):c.content=b(RE,U({},this.props)),u===ye.OPEN&&f.push("__floater__open"),l||(c.arrow=b(NE,U({},this.props))),b("div",{ref:s,className:f.join(" "),style:this.style,children:M("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(R.Component);mt(FE,"propTypes",{component:F.exports.oneOfType([F.exports.func,F.exports.element]),content:F.exports.node,disableAnimation:F.exports.bool.isRequired,footer:F.exports.node,handleClick:F.exports.func.isRequired,hideArrow:F.exports.bool.isRequired,open:F.exports.bool,placement:F.exports.string.isRequired,positionWrapper:F.exports.bool.isRequired,setArrowRef:F.exports.func.isRequired,setFloaterRef:F.exports.func.isRequired,showCloseButton:F.exports.bool,status:F.exports.string.isRequired,styles:F.exports.object.isRequired,title:F.exports.node});var LE=function(e){us(n,e);var t=cs(n);function n(){return ls(this,n),t.apply(this,arguments)}return ss(n,[{key:"render",value:function(){var i=this.props,o=i.children,a=i.handleClick,l=i.handleMouseEnter,s=i.handleMouseLeave,u=i.setChildRef,c=i.setWrapperRef,f=i.style,d=i.styles,p;if(o)if(R.Children.count(o)===1)if(!R.isValidElement(o))p=b("span",{children:o});else{var h=D.function(o.type)?"innerRef":"ref";p=R.cloneElement(R.Children.only(o),mt({},h,u))}else p=o;return p?b("span",{ref:c,style:Le(Le({},d),f),onClick:a,onMouseEnter:l,onMouseLeave:s,children:p}):null}}]),n}(R.Component);mt(LE,"propTypes",{children:F.exports.node,handleClick:F.exports.func.isRequired,handleMouseEnter:F.exports.func.isRequired,handleMouseLeave:F.exports.func.isRequired,setChildRef:F.exports.func.isRequired,setWrapperRef:F.exports.func.isRequired,style:F.exports.object,styles:F.exports.object.isRequired});var b7={zIndex:100};function S7(e){var t=Ln(b7,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var x7=["arrow","flip","offset"],E7=["position","top","right","bottom","left"],gg=function(e){us(n,e);var t=cs(n);function n(r){var i;return ls(this,n),i=t.call(this,r),mt(tr(i),"setArrowRef",function(o){i.arrowRef=o}),mt(tr(i),"setChildRef",function(o){i.childRef=o}),mt(tr(i),"setFloaterRef",function(o){i.floaterRef||(i.floaterRef=o)}),mt(tr(i),"setWrapperRef",function(o){i.wrapperRef=o}),mt(tr(i),"handleTransitionEnd",function(){var o=i.state.status,a=i.props.callback;i.wrapperPopper&&i.wrapperPopper.instance.update(),i.setState({status:o===ye.OPENING?ye.OPEN:ye.IDLE},function(){var l=i.state.status;a(l===ye.OPEN?"open":"close",i.props)})}),mt(tr(i),"handleClick",function(){var o=i.props,a=o.event,l=o.open;if(!D.boolean(l)){var s=i.state,u=s.positionWrapper,c=s.status;(i.event==="click"||i.event==="hover"&&u)&&(Ws({title:"click",data:[{event:a,status:c===ye.OPEN?"closing":"opening"}],debug:i.debug}),i.toggle())}}),mt(tr(i),"handleMouseEnter",function(){var o=i.props,a=o.event,l=o.open;if(!(D.boolean(l)||Pd())){var s=i.state.status;i.event==="hover"&&s===ye.IDLE&&(Ws({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:i.debug}),clearTimeout(i.eventDelayTimeout),i.toggle())}}),mt(tr(i),"handleMouseLeave",function(){var o=i.props,a=o.event,l=o.eventDelay,s=o.open;if(!(D.boolean(s)||Pd())){var u=i.state,c=u.status,f=u.positionWrapper;i.event==="hover"&&(Ws({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:i.debug}),l?[ye.OPENING,ye.OPEN].indexOf(c)!==-1&&!f&&!i.eventDelayTimeout&&(i.eventDelayTimeout=setTimeout(function(){delete i.eventDelayTimeout,i.toggle()},l*1e3)):i.toggle(ye.IDLE))}}),i.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ye.INIT,statusWrapper:ye.INIT},i._isMounted=!1,Mn&&window.addEventListener("load",function(){i.popper&&i.popper.instance.update(),i.wrapperPopper&&i.wrapperPopper.instance.update()}),i}return ss(n,[{key:"componentDidMount",value:function(){if(!!Mn){var i=this.state.positionWrapper,o=this.props,a=o.children,l=o.open,s=o.target;this._isMounted=!0,Ws({title:"init",data:{hasChildren:!!a,hasTarget:!!s,isControlled:D.boolean(l),positionWrapper:i,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&s&&D.boolean(l)}}},{key:"componentDidUpdate",value:function(i,o){if(!!Mn){var a=this.props,l=a.autoOpen,s=a.open,u=a.target,c=a.wrapperOptions,f=d7(o,this.state),d=f.changedFrom,p=f.changedTo;if(i.open!==s){var h;D.boolean(s)&&(h=s?ye.OPENING:ye.CLOSING),this.toggle(h)}(i.wrapperOptions.position!==c.position||i.target!==u)&&this.changeWrapperPosition(this.props),p("status",ye.IDLE)&&s?this.toggle(ye.OPEN):d("status",ye.INIT,ye.IDLE)&&l&&this.toggle(ye.OPEN),this.popper&&p("status",ye.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ye.OPENING)||p("status",ye.CLOSING))&&y7(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!Mn||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var i=this,o=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,l=this.props,s=l.disableFlip,u=l.getPopper,c=l.hideArrow,f=l.offset,d=l.placement,p=l.wrapperOptions,h=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ye.IDLE});else if(o&&this.floaterRef){var g=this.options,v=g.arrow,m=g.flip,y=g.offset,S=IE(g,x7);new c0(o,this.floaterRef,{placement:d,modifiers:Le({arrow:Le({enabled:!c,element:this.arrowRef},v),flip:Le({enabled:!s,behavior:h},m),offset:Le({offset:"0, ".concat(f,"px")},y)},S),onCreate:function(w){i.popper=w,u(w,"floater"),i._isMounted&&i.setState({currentPlacement:w.placement,status:ye.IDLE}),d!==w.placement&&setTimeout(function(){w.instance.update()},1)},onUpdate:function(w){i.popper=w;var O=i.state.currentPlacement;i._isMounted&&w.placement!==O&&i.setState({currentPlacement:w.placement})}})}if(a){var k=D.undefined(p.offset)?0:p.offset;new c0(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(k,"px")},flip:{enabled:!1}},onCreate:function(w){i.wrapperPopper=w,i._isMounted&&i.setState({statusWrapper:ye.IDLE}),u(w,"wrapper"),d!==w.placement&&setTimeout(function(){w.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(i){var o=i.target,a=i.wrapperOptions;this.setState({positionWrapper:a.position&&!!o})}},{key:"toggle",value:function(i){var o=this.state.status,a=o===ye.OPEN?ye.CLOSING:ye.OPENING;D.undefined(i)||(a=i),this.setState({status:a})}},{key:"debug",get:function(){var i=this.props.debug;return i||!!global.ReactFloaterDebug}},{key:"event",get:function(){var i=this.props,o=i.disableHoverToClick,a=i.event;return a==="hover"&&Pd()&&!o?"click":a}},{key:"options",get:function(){var i=this.props.options;return Ln(m7,i||{})}},{key:"styles",get:function(){var i=this,o=this.state,a=o.status,l=o.positionWrapper,s=o.statusWrapper,u=this.props.styles,c=Ln(S7(u),u);if(l){var f;[ye.IDLE].indexOf(a)===-1||[ye.IDLE].indexOf(s)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Le(Le({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Le(Le({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},l||(E7.forEach(function(p){i.wrapperStyles[p]=d[p]}),c.wrapper=Le(Le({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!Mn)return null;var i=this.props.target;return i?D.domElement(i)?i:document.querySelector(i):this.childRef||this.wrapperRef}},{key:"render",value:function(){var i=this.state,o=i.currentPlacement,a=i.positionWrapper,l=i.status,s=this.props,u=s.children,c=s.component,f=s.content,d=s.disableAnimation,p=s.footer,h=s.hideArrow,g=s.id,v=s.open,m=s.showCloseButton,y=s.style,S=s.target,k=s.title,_=b(LE,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:y,styles:this.styles.wrapper,children:u}),w={};return a?w.wrapperInPortal=_:w.wrapperAsChildren=_,M("span",{children:[M(_E,{hasChildren:!!u,id:g,placement:o,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[b(FE,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:h||o==="center",open:v,placement:o,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:m,status:l,styles:this.styles,title:k}),w.wrapperInPortal]}),w.wrapperAsChildren]})}}]),n}(R.Component);mt(gg,"propTypes",{autoOpen:F.exports.bool,callback:F.exports.func,children:F.exports.node,component:i0(F.exports.oneOfType([F.exports.func,F.exports.element]),function(e){return!e.content}),content:i0(F.exports.node,function(e){return!e.component}),debug:F.exports.bool,disableAnimation:F.exports.bool,disableFlip:F.exports.bool,disableHoverToClick:F.exports.bool,event:F.exports.oneOf(["hover","click"]),eventDelay:F.exports.number,footer:F.exports.node,getPopper:F.exports.func,hideArrow:F.exports.bool,id:F.exports.oneOfType([F.exports.string,F.exports.number]),offset:F.exports.number,open:F.exports.bool,options:F.exports.object,placement:F.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:F.exports.bool,style:F.exports.object,styles:F.exports.object,target:F.exports.oneOfType([F.exports.object,F.exports.string]),title:F.exports.node,wrapperOptions:F.exports.shape({offset:F.exports.number,placement:F.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:F.exports.bool})});mt(gg,"defaultProps",{autoOpen:!1,callback:h0,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:h0,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function m0(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function H(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function lc(e,t){if(e==null)return{};var n=A7(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function We(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function ME(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return We(e)}function Di(e){var t=C7();return function(){var r=ac(e),i;if(t){var o=ac(this).constructor;i=Reflect.construct(r,arguments,o)}else i=r.apply(this,arguments);return ME(this,i)}}var ge={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},xt={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ce={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},me={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},rr=aE.canUseDOM,xa=_l.exports.createPortal!==void 0;function BE(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function Id(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function Ea(e){var t=[],n=function r(i){if(typeof i=="string"||typeof i=="number")t.push(i);else if(Array.isArray(i))i.forEach(function(a){return r(a)});else if(i&&i.props){var o=i.props.children;Array.isArray(o)?o.forEach(function(a){return r(a)}):r(o)}};return n(e),t.join(" ").trim()}function v0(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function k7(e,t){return!D.plainObject(e)||!D.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function O7(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(i,o,a,l){return o+o+a+a+l+l}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function y0(e){return e.disableBeacon||e.placement==="center"}function ah(e,t){var n,r=$.exports.isValidElement(e)||$.exports.isValidElement(t),i=D.undefined(e)||D.undefined(t);if(Id(e)!==Id(t)||r||i)return!1;if(D.domElement(e))return e.isSameNode(t);if(D.number(e))return e===t;if(D.function(e))return e.toString()===t.toString();for(var o in e)if(v0(e,o)){if(typeof e[o]=="undefined"||typeof t[o]=="undefined")return!1;if(n=Id(e[o]),["object","array"].indexOf(n)!==-1&&ah(e[o],t[o])||n==="function"&&ah(e[o],t[o]))continue;if(e[o]!==t[o])return!1}for(var a in t)if(v0(t,a)&&typeof e[a]=="undefined")return!1;return!0}function w0(){return["chrome","safari","firefox","opera"].indexOf(BE())===-1}function Ci(e){var t=e.title,n=e.data,r=e.warn,i=r===void 0?!1:r,o=e.debug,a=o===void 0?!1:o,l=i?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(s){D.plainObject(s)&&s.key?l.apply(console,[s.key,s.value]):l.apply(console,[s])}):l.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var P7={action:"",controlled:!1,index:0,lifecycle:ce.INIT,size:0,status:me.IDLE},b0=["action","index","lifecycle","status"];function I7(e){var t=new Map,n=new Map,r=function(){function i(){var o=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},l=a.continuous,s=l===void 0?!1:l,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;gr(this,i),Z(this,"listener",void 0),Z(this,"setSteps",function(d){var p=o.getState(),h=p.size,g=p.status,v={size:d.length,status:g};n.set("steps",d),g===me.WAITING&&!h&&d.length&&(v.status=me.RUNNING),o.setState(v)}),Z(this,"addListener",function(d){o.listener=d}),Z(this,"update",function(d){if(!k7(d,b0))throw new Error("State is not valid. Valid keys: ".concat(b0.join(", ")));o.setState(H({},o.getNextState(H(H(H({},o.getState()),d),{},{action:d.action||ge.UPDATE}),!0)))}),Z(this,"start",function(d){var p=o.getState(),h=p.index,g=p.size;o.setState(H(H({},o.getNextState({action:ge.START,index:D.number(d)?d:h},!0)),{},{status:g?me.RUNNING:me.WAITING}))}),Z(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=o.getState(),h=p.index,g=p.status;[me.FINISHED,me.SKIPPED].indexOf(g)===-1&&o.setState(H(H({},o.getNextState({action:ge.STOP,index:h+(d?1:0)})),{},{status:me.PAUSED}))}),Z(this,"close",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState(H({},o.getNextState({action:ge.CLOSE,index:p+1})))}),Z(this,"go",function(d){var p=o.getState(),h=p.controlled,g=p.status;if(!(h||g!==me.RUNNING)){var v=o.getSteps()[d];o.setState(H(H({},o.getNextState({action:ge.GO,index:d})),{},{status:v?g:me.FINISHED}))}}),Z(this,"info",function(){return o.getState()}),Z(this,"next",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState(o.getNextState({action:ge.NEXT,index:p+1}))}),Z(this,"open",function(){var d=o.getState(),p=d.status;p===me.RUNNING&&o.setState(H({},o.getNextState({action:ge.UPDATE,lifecycle:ce.TOOLTIP})))}),Z(this,"prev",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState(H({},o.getNextState({action:ge.PREV,index:p-1})))}),Z(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=o.getState(),h=p.controlled;h||o.setState(H(H({},o.getNextState({action:ge.RESET,index:0})),{},{status:d?me.RUNNING:me.READY}))}),Z(this,"skip",function(){var d=o.getState(),p=d.status;p===me.RUNNING&&o.setState({action:ge.SKIP,lifecycle:ce.INIT,status:me.SKIPPED})}),this.setState({action:ge.INIT,controlled:D.number(u),continuous:s,index:D.number(u)?u:0,lifecycle:ce.INIT,status:f.length?me.READY:me.IDLE},!0),this.setSteps(f)}return vr(i,[{key:"setState",value:function(a){var l=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,s=this.getState(),u=H(H({},s),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,h=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",h),l&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(s)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:H({},P7)}},{key:"getNextState",value:function(a){var l=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,s=this.getState(),u=s.action,c=s.controlled,f=s.index,d=s.size,p=s.status,h=D.number(a.index)?a.index:f,g=c&&!l?f:Math.min(Math.max(h,0),d);return{action:a.action||u,controlled:c,index:g,lifecycle:a.lifecycle||ce.INIT,size:a.size||d,status:g===d?me.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var l=JSON.stringify(a),s=JSON.stringify(this.getState());return l!==s}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),i}();return new r(e)}function ol(){return document.scrollingElement||document.createElement("body")}function UE(e){return e?e.getBoundingClientRect():{}}function T7(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function Ur(e){return typeof e=="string"?document.querySelector(e):e}function _7(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function mf(e,t,n){var r=sE(e);if(r.isSameNode(ol()))return n?document:ol();var i=r.scrollHeight>r.offsetHeight;return!i&&!t?(r.style.overflow="initial",ol()):r}function gf(e,t){if(!e)return!1;var n=mf(e,t);return!n.isSameNode(ol())}function N7(e){return e.offsetParent!==document.body}function Do(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:_7(e).position===t?!0:Do(e.parentNode,t)}function D7(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,i=n.visibility;if(r==="none"||i==="hidden")return!1}t=t.parentNode}return!0}function R7(e,t,n){var r=UE(e),i=mf(e,n),o=gf(e,n),a=0;i instanceof HTMLElement&&(a=i.scrollTop);var l=r.top+(!o&&!Do(e)?a:0);return Math.floor(l-t)}function lh(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?lh(e.offsetParent)+e.offsetTop:e.offsetTop:0}function F7(e,t,n){if(!e)return 0;var r=sE(e),i=lh(e);return gf(e,n)&&!N7(e)&&(i-=lh(r)),Math.floor(i-t)}function L7(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:ol(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,i){var o=t.scrollTop,a=e>o?e-o:o-e;VL.top(t,e,{duration:a<100?50:n},function(l){return l&&l.message!=="Element already at target scroll position"?i(l):r()})})}function M7(e){function t(r,i,o,a,l,s){var u=a||"<>",c=s||o;if(i[o]==null)return r?new Error("Required ".concat(l," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=Ln(B7,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return D.plainObject(e)?e.target?!0:(Ci({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(Ci({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function x0(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return D.array(e)?e.every(function(n){return zE(n,t)}):(Ci({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var j7=vr(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(gr(this,e),Z(this,"element",void 0),Z(this,"options",void 0),Z(this,"canBeTabbed",function(i){var o=i.tabIndex;(o===null||o<0)&&(o=void 0);var a=isNaN(o);return!a&&n.canHaveFocus(i)}),Z(this,"canHaveFocus",function(i){var o=/input|select|textarea|button|object/,a=i.nodeName.toLowerCase(),l=o.test(a)&&!i.getAttribute("disabled")||a==="a"&&!!i.getAttribute("href");return l&&n.isVisible(i)}),Z(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),Z(this,"handleKeyDown",function(i){var o=n.options.keyCode,a=o===void 0?9:o;i.keyCode===a&&n.interceptTab(i)}),Z(this,"interceptTab",function(i){var o=n.findValidTabElements();if(!!o.length){i.preventDefault();var a=i.shiftKey,l=o.indexOf(document.activeElement);l===-1||!a&&l+1===o.length?l=0:a&&l===0?l=o.length-1:l+=a?-1:1,o[l].focus()}}),Z(this,"isHidden",function(i){var o=i.offsetWidth<=0&&i.offsetHeight<=0,a=window.getComputedStyle(i);return o&&!i.innerHTML?!0:o&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),Z(this,"isVisible",function(i){for(var o=i;o;)if(o instanceof HTMLElement){if(o===document.body)break;if(n.isHidden(o))return!1;o=o.parentNode}return!0}),Z(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),Z(this,"checkFocus",function(i){document.activeElement!==i&&(i.focus(),window.requestAnimationFrame(function(){return n.checkFocus(i)}))}),Z(this,"setFocus",function(){var i=n.options.selector;if(!!i){var o=n.element.querySelector(i);o&&window.requestAnimationFrame(function(){return n.checkFocus(o)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),W7=function(e){Ni(n,e);var t=Di(n);function n(r){var i;if(gr(this,n),i=t.call(this,r),Z(We(i),"setBeaconRef",function(s){i.beacon=s}),!r.beaconComponent){var o=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),l=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(l)),o.appendChild(a)}return i}return vr(n,[{key:"componentDidMount",value:function(){var i=this,o=this.props.shouldFocus;setTimeout(function(){D.domElement(i.beacon)&&o&&i.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var i=document.getElementById("joyride-beacon-animation");i&&i.parentNode.removeChild(i)}},{key:"render",value:function(){var i=this.props,o=i.beaconComponent,a=i.locale,l=i.onClickOrHover,s=i.styles,u={"aria-label":a.open,onClick:l,onMouseEnter:l,ref:this.setBeaconRef,title:a.open},c;if(o){var f=o;c=b(f,U({},u))}else c=M("button",Q(U({className:"react-joyride__beacon",style:s.beacon,type:"button"},u),{children:[b("span",{style:s.beaconInner}),b("span",{style:s.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(R.Component),Y7=function(t){var n=t.styles;return b("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},$7=["mixBlendMode","zIndex"],H7=function(e){Ni(n,e);var t=Di(n);function n(){var r;gr(this,n);for(var i=arguments.length,o=new Array(i),a=0;a=p&&g<=p+c,y=v>=f&&v<=f+h,S=y&&m;S!==s&&r.updateState({mouseOverSpotlight:S})}),Z(We(r),"handleScroll",function(){var l=r.props.target,s=Ur(l);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Do(s,"sticky")&&r.updateState({})}),Z(We(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return vr(n,[{key:"componentDidMount",value:function(){var i=this.props;i.debug,i.disableScrolling;var o=i.disableScrollParentFix,a=i.target,l=Ur(a);this.scrollParent=mf(l,o,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(i){var o=this,a=this.props,l=a.lifecycle,s=a.spotlightClicks,u=nc(i,this.props),c=u.changed;c("lifecycle",ce.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=o.state.isScrolling;f||o.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(s&&l===ce.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):l!==ce.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var i=this.state.showSpotlight,o=this.props,a=o.disableScrollParentFix,l=o.spotlightClicks,s=o.spotlightPadding,u=o.styles,c=o.target,f=Ur(c),d=UE(f),p=Do(f),h=R7(f,s,a);return H(H({},w0()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+s*2),left:Math.round(d.left-s),opacity:i?1:0,pointerEvents:l?"none":"auto",position:p?"fixed":"absolute",top:h,transition:"opacity 0.2s",width:Math.round(d.width+s*2)})}},{key:"updateState",value:function(i){!this._isMounted||this.setState(i)}},{key:"render",value:function(){var i=this.state,o=i.mouseOverSpotlight,a=i.showSpotlight,l=this.props,s=l.disableOverlay,u=l.disableOverlayClose,c=l.lifecycle,f=l.onClickOverlay,d=l.placement,p=l.styles;if(s||c!==ce.TOOLTIP)return null;var h=p.overlay;w0()&&(h=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var g=H({cursor:u?"default":"pointer",height:T7(),pointerEvents:o?"none":"auto"},h),v=d!=="center"&&a&&b(Y7,{styles:this.spotlightStyles});if(BE()==="safari"){g.mixBlendMode,g.zIndex;var m=lc(g,$7);v=b("div",{style:H({},m),children:v}),delete g.backgroundColor}return b("div",{className:"react-joyride__overlay",style:g,onClick:f,children:v})}}]),n}(R.Component),V7=["styles"],G7=["color","height","width"],J7=function(t){var n=t.styles,r=lc(t,V7),i=n.color,o=n.height,a=n.width,l=lc(n,G7);return b("button",Q(U({style:l,type:"button"},r),{children:b("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof o=="number"?"".concat(o,"px"):o,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:b("g",{children:b("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:i})})})}))},Q7=function(e){Ni(n,e);var t=Di(n);function n(){return gr(this,n),t.apply(this,arguments)}return vr(n,[{key:"render",value:function(){var i=this.props,o=i.backProps,a=i.closeProps,l=i.continuous,s=i.index,u=i.isLastStep,c=i.primaryProps,f=i.size,d=i.skipProps,p=i.step,h=i.tooltipProps,g=p.content,v=p.hideBackButton,m=p.hideCloseButton,y=p.hideFooter,S=p.showProgress,k=p.showSkipButton,_=p.title,w=p.styles,O=p.locale,E=O.back,C=O.close,P=O.last,I=O.next,T=O.skip,N={primary:C};return l&&(N.primary=u?P:I,S&&(N.primary=M("span",{children:[N.primary," (",s+1,"/",f,")"]}))),k&&!u&&(N.skip=b("button",Q(U({style:w.buttonSkip,type:"button","aria-live":"off"},d),{children:T}))),!v&&s>0&&(N.back=b("button",Q(U({style:w.buttonBack,type:"button"},o),{children:E}))),N.close=!m&&b(J7,U({styles:w.buttonClose},a)),M("div",Q(U({className:"react-joyride__tooltip",style:w.tooltip},h),{children:[M("div",{style:w.tooltipContainer,children:[_&&b("h4",{style:w.tooltipTitle,"aria-label":_,children:_}),b("div",{style:w.tooltipContent,children:g})]}),!y&&M("div",{style:w.tooltipFooter,children:[b("div",{style:w.tooltipFooterSpacer,children:N.skip}),N.back,b("button",Q(U({style:w.buttonNext,type:"button"},c),{children:N.primary}))]}),N.close]}),"JoyrideTooltip")}}]),n}(R.Component),X7=["beaconComponent","tooltipComponent"],q7=function(e){Ni(n,e);var t=Di(n);function n(){var r;gr(this,n);for(var i=arguments.length,o=new Array(i),a=0;a0||a===ge.PREV),w=y("action")||y("index")||y("lifecycle")||y("status"),O=S("lifecycle",[ce.TOOLTIP,ce.INIT],ce.INIT),E=y("action",[ge.NEXT,ge.PREV,ge.SKIP,ge.CLOSE]);if(E&&(O||u)&&l(H(H({},k),{},{index:i.index,lifecycle:ce.COMPLETE,step:i.step,type:xt.STEP_AFTER})),y("index")&&f>0&&d===ce.INIT&&h===me.RUNNING&&g.placement==="center"&&v({lifecycle:ce.READY}),w&&g){var C=Ur(g.target),P=!!C,I=P&&D7(C);I?(S("status",me.READY,me.RUNNING)||S("lifecycle",ce.INIT,ce.READY))&&l(H(H({},k),{},{step:g,type:xt.STEP_BEFORE})):(console.warn(P?"Target not visible":"Target not mounted",g),l(H(H({},k),{},{type:xt.TARGET_NOT_FOUND,step:g})),u||v({index:f+([ge.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ce.INIT,ce.READY)&&v({lifecycle:y0(g)||_?ce.TOOLTIP:ce.BEACON}),y("index")&&Ci({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),y("lifecycle",ce.BEACON)&&l(H(H({},k),{},{step:g,type:xt.BEACON})),y("lifecycle",ce.TOOLTIP)&&(l(H(H({},k),{},{step:g,type:xt.TOOLTIP})),this.scope=new j7(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ce.TOOLTIP,ce.INIT],ce.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var i=this.props,o=i.step,a=i.lifecycle;return!!(y0(o)||a===ce.TOOLTIP)}},{key:"render",value:function(){var i=this.props,o=i.continuous,a=i.debug,l=i.helpers,s=i.index,u=i.lifecycle,c=i.nonce,f=i.shouldScroll,d=i.size,p=i.step,h=Ur(p.target);return!zE(p)||!D.domElement(h)?null:M("div",{className:"react-joyride__step",children:[b(K7,{id:"react-joyride-portal",children:b(H7,Q(U({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),b(gg,Q(U({component:b(q7,{continuous:o,helpers:l,index:s,isLastStep:s+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(s),isPositioned:p.isFixed||Do(h),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:b(W7,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(s))}}]),n}(R.Component),jE=function(e){Ni(n,e);var t=Di(n);function n(r){var i;return gr(this,n),i=t.call(this,r),Z(We(i),"initStore",function(){var o=i.props,a=o.debug,l=o.getHelpers,s=o.run,u=o.stepIndex;i.store=new I7(H(H({},i.props),{},{controlled:s&&D.number(u)})),i.helpers=i.store.getHelpers();var c=i.store.addListener;return Ci({title:"init",data:[{key:"props",value:i.props},{key:"state",value:i.state}],debug:a}),c(i.syncState),l(i.helpers),i.store.getState()}),Z(We(i),"callback",function(o){var a=i.props.callback;D.function(a)&&a(o)}),Z(We(i),"handleKeyboard",function(o){var a=i.state,l=a.index,s=a.lifecycle,u=i.props.steps,c=u[l],f=window.Event?o.which:o.keyCode;s===ce.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&i.store.close()}),Z(We(i),"syncState",function(o){i.setState(o)}),Z(We(i),"setPopper",function(o,a){a==="wrapper"?i.beaconPopper=o:i.tooltipPopper=o}),Z(We(i),"shouldScroll",function(o,a,l,s,u,c,f){return!o&&(a!==0||l||s===ce.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!Do(c))&&f.lifecycle!==s&&[ce.BEACON,ce.TOOLTIP].indexOf(s)!==-1}),i.state=i.initStore(),i}return vr(n,[{key:"componentDidMount",value:function(){if(!!rr){var i=this.props,o=i.disableCloseOnEsc,a=i.debug,l=i.run,s=i.steps,u=this.store.start;x0(s,a)&&l&&u(),o||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(i,o){if(!!rr){var a=this.state,l=a.action,s=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,h=d.run,g=d.stepIndex,v=d.steps,m=i.steps,y=i.stepIndex,S=this.store,k=S.reset,_=S.setSteps,w=S.start,O=S.stop,E=S.update,C=nc(i,this.props),P=C.changed,I=nc(o,this.state),T=I.changed,N=I.changedFrom,B=Aa(v[u],this.props),K=!ah(m,v),V=D.number(g)&&P("stepIndex"),le=Ur(B==null?void 0:B.target);if(K&&(x0(v,p)?_(v):console.warn("Steps are not valid",v)),P("run")&&(h?w(g):O()),V){var te=y=0?w:0,s===me.RUNNING&&L7(w,_,g)}}}},{key:"render",value:function(){if(!rr)return null;var i=this.state,o=i.index,a=i.status,l=this.props,s=l.continuous,u=l.debug,c=l.nonce,f=l.scrollToFirstStep,d=l.steps,p=Aa(d[o],this.props),h;return a===me.RUNNING&&p&&(h=b(Z7,Q(U({},this.state),{callback:this.callback,continuous:s,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(o!==0||f),step:p,update:this.store.update}))),b("div",{className:"react-joyride",children:h})}}]),n}(R.Component);Z(jE,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const eM=M("div",{children:[b("p",{children:"You can see how the changes impact your app with the app preview."}),b("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),b("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),tM=M("div",{children:[b("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),b("p",{children:"You can click on elements to select them or drag them around to move them."}),b("p",{children:"Cards can be resized by dragging resize handles on the sides."}),b("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),b("p",{children:b("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),nM=M("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",b("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",b("span",{className:Ip.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),rM=M("div",{children:[b("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),b("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),iM=[{target:".app-view",content:tM,disableBeacon:!0},{target:".elements-panel",content:nM,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:rM,placement:"left-start"},{target:".app-preview",content:eM,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function oM(){const[e,t]=$.exports.useState(0),[n,r]=$.exports.useState(!1),i=$.exports.useCallback(a=>{const{action:l,index:s,status:u,type:c}=a;console.log({action:l,index:s,status:u,type:c}),(c===xt.STEP_AFTER||c===xt.TARGET_NOT_FOUND)&&(l===ge.NEXT?t(s+1):l===ge.PREV?t(s-1):l===ge.CLOSE&&r(!1)),c===xt.TOUR_END&&(l===ge.NEXT&&(r(!1),t(0)),l===ge.SKIP&&r(!1))},[]),o=$.exports.useCallback(()=>{r(!0)},[]);return M(Ze,{children:[M(Mt,{onClick:o,title:"Take a guided tour of app",variant:"transparent",children:[b(rO,{id:"tour",size:"24px"}),"Tour App"]}),b(jE,{callback:i,steps:iM,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:lM})]})}const E0="#e07189",aM="#f6d5dc",lM={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:E0},beaconOuter:{backgroundColor:aM,border:`2px solid ${E0}`}},sM="_container_17s66_1",uM="_elementsPanel_17s66_28",cM="_propertiesPanel_17s66_37",fM="_editorHolder_17s66_52",dM="_titledPanel_17s66_65",pM="_panelTitleHeader_17s66_77",hM="_header_17s66_86",mM="_rightSide_17s66_94",gM="_divider_17s66_115",vM="_title_17s66_65",yM="_shinyLogo_17s66_126",Tt={container:sM,elementsPanel:uM,propertiesPanel:cM,editorHolder:fM,titledPanel:dM,panelTitleHeader:pM,header:hM,rightSide:mM,divider:gM,title:vM,shinyLogo:yM},wM="_container_1fh41_1",bM="_node_1fh41_12",C0={container:wM,node:bM};function SM({tree:e,path:t,onSelect:n}){const r=t.length;let i=[];for(let o=0;o<=r;o++){const a=Br(e,t.slice(0,o));if(a===void 0)return null;i.push(In[a.uiName].title)}return b("div",{className:C0.container,children:i.map((o,a)=>b("div",{className:C0.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:xM(o)},o+a))})}function xM(e){return e.replace(/[a-z]+::/,"")}const EM="_settingsPanel_zsgzt_1",CM="_currentElementAbout_zsgzt_10",AM="_settingsForm_zsgzt_17",kM="_settingsInputs_zsgzt_24",OM="_buttonsHolder_zsgzt_28",PM="_validationErrorMsg_zsgzt_45",ka={settingsPanel:EM,currentElementAbout:CM,settingsForm:AM,settingsInputs:kM,buttonsHolder:OM,validationErrorMsg:PM};function IM(e){const t=qr(),[n,r]=aS(),[i,o]=$.exports.useState(n!==null?Br(e,n):null),a=$.exports.useRef(!1),l=$.exports.useMemo(()=>Fm(u=>{!n||!a.current||t(Gx({path:n,node:u}))},250),[t,n]);return $.exports.useEffect(()=>{if(a.current=!1,n===null){o(null);return}Br(e,n)!==void 0&&o(Br(e,n))},[e,n]),$.exports.useEffect(()=>{!i||l(i)},[i,l]),{currentNode:i,updateArgumentsByName:({name:u,value:c})=>{o(f=>Q(U({},f),{uiArguments:Q(U({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function TM({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:i}=IM(e);if(r===null)return b("div",{children:"Select an element to edit properties"});if(t===null)return M("div",{children:["Error finding requested node at path ",r.join(".")]});const o=r.length===0,{uiName:a,uiArguments:l}=t,s=In[a].SettingsComponent;return M("div",{className:ka.settingsPanel+" properties-panel",children:[b("div",{className:ka.currentElementAbout,children:b(SM,{tree:e,path:r,onSelect:i})}),b("form",{className:ka.settingsForm,onSubmit:_M,children:b("div",{className:ka.settingsInputs,children:b(xP,{onChange:n,children:b(s,{settings:l})})})}),b("div",{className:ka.buttonsHolder,children:o?null:b(oS,{path:r})})]})}function _M(e){e.preventDefault()}function NM(e){return["INITIAL-DATA"].includes(e.path)}function DM(){const e=qr(),t=Gl(r=>r.uiTree),n=$.exports.useCallback(r=>{e(dF({initialState:r}))},[e]);return{tree:t,setTree:n}}function RM(){const{tree:e,setTree:t}=DM(),{status:n,ws:r}=Zx(),[i,o]=$.exports.useState("loading"),a=$.exports.useRef(null),l=Gl(s=>s.uiTree);return $.exports.useEffect(()=>{n==="connected"&&(eE(r,s=>{!NM(s)||(a.current=s.payload,t(s.payload),o("connected"))}),il(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(o("no-backend"),t(FM),console.log("Running in static mode"))},[t,n,r]),$.exports.useEffect(()=>{l===ag||l===a.current||n==="connected"&&il(r,{path:"STATE-UPDATE",payload:l})},[l,n,r]),{status:i,tree:e}}const FM={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},WE=236,LM={"--properties-panel-width":`${WE}px`};function MM(){const{status:e,tree:t}=RM();return e==="loading"?b(BM,{}):M(mO,{children:[M("div",{className:Tt.container,style:LM,children:[M("div",{className:Tt.header,children:[b(pL,{className:Tt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),b("h1",{className:Tt.title,children:"Shiny UI Editor"}),M("div",{className:Tt.rightSide,children:[b(oM,{}),b("div",{className:Tt.divider}),b(wL,{})]})]}),M("div",{className:`${Tt.elementsPanel} ${Tt.titledPanel} elements-panel`,children:[b("h3",{className:Tt.panelTitleHeader,children:"Elements"}),b(OL,{})]}),b("div",{className:Tt.editorHolder+" app-view",children:b(Pm,U({},t))}),M("div",{className:`${Tt.propertiesPanel}`,children:[M("div",{className:`${Tt.titledPanel} properties-panel`,children:[b("h3",{className:Tt.panelTitleHeader,children:"Properties"}),b(TM,{tree:t})]}),b("div",{className:`${Tt.titledPanel} app-preview`,children:b(sL,{})})]})]}),b(UM,{})]})}function BM(){return b("h3",{children:"Loading initial state from server"})}function UM(){return Gl(t=>t.connectedToServer)?null:b(Sx,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:b("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const zM=()=>b(vF,{children:b(xF,{children:b(MM,{})})}),jM="modulepreload",WM=function(e,t){return new URL(e,t).href},A0={},YM=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(i=>{if(i=WM(i,r),i in A0)return;A0[i]=!0;const o=i.endsWith(".css"),a=o?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${i}"]${a}`))return;const l=document.createElement("link");if(l.rel=o?"stylesheet":jM,o||(l.as="script",l.crossOrigin=""),l.href=i,document.head.appendChild(l),o)return new Promise((s,u)=>{l.addEventListener("load",s),l.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${i}`)))})})).then(()=>t())},$M=e=>{e&&e instanceof Function&&YM(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:i,getTTFB:o})=>{t(e),n(e),r(e),i(e),o(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function HM(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}Mr.render(b($.exports.StrictMode,{children:b(zM,{})}),document.getElementById("root"));HM();$M(); diff --git a/docs/articles/demo-app/assets/index.45f6f574.js b/docs/articles/demo-app/assets/index.45f6f574.js deleted file mode 100644 index 3f5990b26..000000000 --- a/docs/articles/demo-app/assets/index.45f6f574.js +++ /dev/null @@ -1,145 +0,0 @@ -var bS=Object.defineProperty,ES=Object.defineProperties;var CS=Object.getOwnPropertyDescriptors;var fs=Object.getOwnPropertySymbols;var Sh=Object.prototype.hasOwnProperty,bh=Object.prototype.propertyIsEnumerable;var wh=(e,t,n)=>t in e?bS(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,F=(e,t)=>{for(var n in t||(t={}))Sh.call(t,n)&&wh(e,n,t[n]);if(fs)for(var n of fs(t))bh.call(t,n)&&wh(e,n,t[n]);return e},$=(e,t)=>ES(e,CS(t));var $t=(e,t)=>{var n={};for(var r in e)Sh.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&fs)for(var r of fs(e))t.indexOf(r)<0&&bh.call(e,r)&&(n[r]=e[r]);return n};var Eh=(e,t,n)=>new Promise((r,o)=>{var i=l=>{try{s(n.next(l))}catch(u){o(u)}},a=l=>{try{s(n.throw(l))}catch(u){o(u)}},s=l=>l.done?r(l.value):Promise.resolve(l.value).then(i,a);s((n=n.apply(e,t)).next())});const AS=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const o of document.querySelectorAll('link[rel="modulepreload"]'))r(o);new MutationObserver(o=>{for(const i of o)if(i.type==="childList")for(const a of i.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(o){const i={};return o.integrity&&(i.integrity=o.integrity),o.referrerpolicy&&(i.referrerPolicy=o.referrerpolicy),o.crossorigin==="use-credentials"?i.credentials="include":o.crossorigin==="anonymous"?i.credentials="omit":i.credentials="same-origin",i}function r(o){if(o.ep)return;o.ep=!0;const i=n(o);fetch(o.href,i)}};AS();var Fg=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Ug(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function Bg(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var o=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,o.get?o:{enumerable:!0,get:function(){return e[r]}})}),n}var j={exports:{}},se={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var Ch=Object.getOwnPropertySymbols,xS=Object.prototype.hasOwnProperty,OS=Object.prototype.propertyIsEnumerable;function _S(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function PS(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(i){return t[i]});if(r.join("")!=="0123456789")return!1;var o={};return"abcdefghijklmnopqrst".split("").forEach(function(i){o[i]=i}),Object.keys(Object.assign({},o)).join("")==="abcdefghijklmnopqrst"}catch(i){return!1}}var jg=PS()?Object.assign:function(e,t){for(var n,r=_S(e),o,i=1;i=w},o=function(){},e.unstable_forceFrameRate=function(R){0>R||125>>1,ue=R[le];if(ue!==void 0&&0b(Fe,V))rt!==void 0&&0>b(rt,Fe)?(R[le]=rt,R[Ue]=V,le=Ue):(R[le]=Fe,R[ze]=V,le=ze);else if(rt!==void 0&&0>b(rt,V))R[le]=rt,R[Ue]=V,le=Ue;else break e}}return Y}return null}function b(R,Y){var V=R.sortIndex-Y.sortIndex;return V!==0?V:R.id-Y.id}var E=[],x=[],_=1,k=null,D=3,B=!1,q=!1,H=!1;function ce(R){for(var Y=C(x);Y!==null;){if(Y.callback===null)O(x);else if(Y.startTime<=R)O(x),Y.sortIndex=Y.expirationTime,T(E,Y);else break;Y=C(x)}}function he(R){if(H=!1,ce(R),!q)if(C(E)!==null)q=!0,t(ye);else{var Y=C(x);Y!==null&&n(he,Y.startTime-R)}}function ye(R,Y){q=!1,H&&(H=!1,r()),B=!0;var V=D;try{for(ce(Y),k=C(E);k!==null&&(!(k.expirationTime>Y)||R&&!e.unstable_shouldYield());){var le=k.callback;if(typeof le=="function"){k.callback=null,D=k.priorityLevel;var ue=le(k.expirationTime<=Y);Y=e.unstable_now(),typeof ue=="function"?k.callback=ue:k===C(E)&&O(E),ce(Y)}else O(E);k=C(E)}if(k!==null)var ze=!0;else{var Fe=C(x);Fe!==null&&n(he,Fe.startTime-Y),ze=!1}return ze}finally{k=null,D=V,B=!1}}var ne=o;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(R){R.callback=null},e.unstable_continueExecution=function(){q||B||(q=!0,t(ye))},e.unstable_getCurrentPriorityLevel=function(){return D},e.unstable_getFirstCallbackNode=function(){return C(E)},e.unstable_next=function(R){switch(D){case 1:case 2:case 3:var Y=3;break;default:Y=D}var V=D;D=Y;try{return R()}finally{D=V}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=ne,e.unstable_runWithPriority=function(R,Y){switch(R){case 1:case 2:case 3:case 4:case 5:break;default:R=3}var V=D;D=R;try{return Y()}finally{D=V}},e.unstable_scheduleCallback=function(R,Y,V){var le=e.unstable_now();switch(typeof V=="object"&&V!==null?(V=V.delay,V=typeof V=="number"&&0le?(R.sortIndex=V,T(x,R),C(E)===null&&R===C(x)&&(H?r():H=!0,n(he,V-le))):(R.sortIndex=ue,T(E,R),q||B||(q=!0,t(ye))),R},e.unstable_wrapCallback=function(R){var Y=D;return function(){var V=D;D=Y;try{return R.apply(this,arguments)}finally{D=V}}}})(ty);(function(e){e.exports=ty})(ey);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Xl=j.exports,xe=jg,je=ey.exports;function L(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function st(e,t,n,r,o,i,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=o,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=i,this.removeEmptyString=a}var Je={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){Je[e]=new st(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];Je[t]=new st(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){Je[e]=new st(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){Je[e]=new st(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){Je[e]=new st(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){Je[e]=new st(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){Je[e]=new st(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){Je[e]=new st(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){Je[e]=new st(e,5,!1,e.toLowerCase(),null,!1,!1)});var md=/[\-:]([a-z])/g;function vd(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!1,!1)});Je.xlinkHref=new st("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!0,!0)});function gd(e,t,n,r){var o=Je.hasOwnProperty(t)?Je[t]:null,i=o!==null?o.type===0:r?!1:!(!(2s||o[a]!==i[s])return` -`+o[a].replace(" at new "," at ");while(1<=a&&0<=s);break}}}finally{Vu=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Ii(e):""}function US(e){switch(e.tag){case 5:return Ii(e.type);case 16:return Ii("Lazy");case 13:return Ii("Suspense");case 19:return Ii("SuspenseList");case 0:case 2:case 15:return e=ps(e.type,!1),e;case 11:return e=ps(e.type.render,!1),e;case 22:return e=ps(e.type._render,!1),e;case 1:return e=ps(e.type,!0),e;default:return""}}function po(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case Bn:return"Fragment";case Or:return"Portal";case ji:return"Profiler";case yd:return"StrictMode";case Wi:return"Suspense";case tl:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case Sd:return(e.displayName||"Context")+".Consumer";case wd:return(e._context.displayName||"Context")+".Provider";case Kl:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case ql:return po(e.type);case Ed:return po(e._render);case bd:t=e._payload,e=e._init;try{return po(e(t))}catch(n){}}return null}function ir(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function oy(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function BS(e){var t=oy(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var o=n.get,i=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return o.call(this)},set:function(a){r=""+a,i.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function hs(e){e._valueTracker||(e._valueTracker=BS(e))}function iy(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=oy(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function nl(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function Gc(e,t){var n=t.checked;return xe({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function Th(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=ir(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function ay(e,t){t=t.checked,t!=null&&gd(e,"checked",t,!1)}function $c(e,t){ay(e,t);var n=ir(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Hc(e,t.type,n):t.hasOwnProperty("defaultValue")&&Hc(e,t.type,ir(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function Ih(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Hc(e,t,n){(t!=="number"||nl(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function jS(e){var t="";return Xl.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function Vc(e,t){return e=xe({children:void 0},t),(t=jS(t.children))&&(e.children=t),e}function ho(e,t,n,r){if(e=e.options,t){t={};for(var o=0;o=n.length))throw Error(L(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:ir(n)}}function sy(e,t){var n=ir(t.value),r=ir(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function Dh(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Qc={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function ly(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Xc(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?ly(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ms,uy=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,o){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,o)})}:e}(function(e,t){if(e.namespaceURI!==Qc.svg||"innerHTML"in e)e.innerHTML=t;else{for(ms=ms||document.createElement("div"),ms.innerHTML=""+t.valueOf().toString()+"",t=ms.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function la(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Yi={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},WS=["Webkit","ms","Moz","O"];Object.keys(Yi).forEach(function(e){WS.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Yi[t]=Yi[e]})});function cy(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Yi.hasOwnProperty(e)&&Yi[e]?(""+t).trim():t+"px"}function fy(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,o=cy(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,o):e[n]=o}}var YS=xe({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Kc(e,t){if(t){if(YS[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(L(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(L(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(L(61))}if(t.style!=null&&typeof t.style!="object")throw Error(L(62))}}function qc(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function xd(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Zc=null,mo=null,vo=null;function Rh(e){if(e=Ra(e)){if(typeof Zc!="function")throw Error(L(280));var t=e.stateNode;t&&(t=ou(t),Zc(e.stateNode,e.type,t))}}function dy(e){mo?vo?vo.push(e):vo=[e]:mo=e}function py(){if(mo){var e=mo,t=vo;if(vo=mo=null,Rh(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function eu(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-ar(t),e[t]=n}var ar=Math.clz32?Math.clz32:ob,nb=Math.log,rb=Math.LN2;function ob(e){return e===0?32:31-(nb(e)/rb|0)|0}var ib=je.unstable_UserBlockingPriority,ab=je.unstable_runWithPriority,Ls=!0;function sb(e,t,n,r){_r||_d();var o=Nd,i=_r;_r=!0;try{hy(o,e,t,n,r)}finally{(_r=i)||Pd()}}function lb(e,t,n,r){ab(ib,Nd.bind(null,e,t,n,r))}function Nd(e,t,n,r){if(Ls){var o;if((o=(t&4)===0)&&0=Gi),Gh=String.fromCharCode(32),$h=!1;function Iy(e,t){switch(e){case"keyup":return Ib.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function Ny(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var io=!1;function Db(e,t){switch(e){case"compositionend":return Ny(t);case"keypress":return t.which!==32?null:($h=!0,Gh);case"textInput":return e=t.data,e===Gh&&$h?null:e;default:return null}}function Rb(e,t){if(io)return e==="compositionend"||!Fd&&Iy(e,t)?(e=ky(),Ms=Rd=zn=null,io=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Qh(n)}}function My(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?My(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Kh(){for(var e=window,t=nl();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=nl(e.document)}return t}function of(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var Gb=In&&"documentMode"in document&&11>=document.documentMode,ao=null,af=null,Hi=null,sf=!1;function qh(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;sf||ao==null||ao!==nl(r)||(r=ao,"selectionStart"in r&&of(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),Hi&&ha(Hi,r)||(Hi=r,r=al(af,"onSelect"),0lo||(e.current=uf[lo],uf[lo]=null,lo--)}function Ne(e,t){lo++,uf[lo]=e.current,e.current=t}var sr={},nt=hr(sr),gt=hr(!1),Rr=sr;function ko(e,t){var n=e.type.contextTypes;if(!n)return sr;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var o={},i;for(i in n)o[i]=t[i];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=o),o}function yt(e){return e=e.childContextTypes,e!=null}function ul(){Se(gt),Se(nt)}function sm(e,t,n){if(nt.current!==sr)throw Error(L(168));Ne(nt,t),Ne(gt,n)}function Gy(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var o in r)if(!(o in e))throw Error(L(108,po(t)||"Unknown",o));return xe({},n,r)}function Us(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||sr,Rr=nt.current,Ne(nt,e),Ne(gt,gt.current),!0}function lm(e,t,n){var r=e.stateNode;if(!r)throw Error(L(169));n?(e=Gy(e,t,Rr),r.__reactInternalMemoizedMergedChildContext=e,Se(gt),Se(nt),Ne(nt,e)):Se(gt),Ne(gt,n)}var Bd=null,Ir=null,Vb=je.unstable_runWithPriority,jd=je.unstable_scheduleCallback,cf=je.unstable_cancelCallback,Jb=je.unstable_shouldYield,um=je.unstable_requestPaint,ff=je.unstable_now,Qb=je.unstable_getCurrentPriorityLevel,iu=je.unstable_ImmediatePriority,$y=je.unstable_UserBlockingPriority,Hy=je.unstable_NormalPriority,Vy=je.unstable_LowPriority,Jy=je.unstable_IdlePriority,ac={},Xb=um!==void 0?um:function(){},En=null,Bs=null,sc=!1,cm=ff(),et=1e4>cm?ff:function(){return ff()-cm};function To(){switch(Qb()){case iu:return 99;case $y:return 98;case Hy:return 97;case Vy:return 96;case Jy:return 95;default:throw Error(L(332))}}function Qy(e){switch(e){case 99:return iu;case 98:return $y;case 97:return Hy;case 96:return Vy;case 95:return Jy;default:throw Error(L(332))}}function Lr(e,t){return e=Qy(e),Vb(e,t)}function va(e,t,n){return e=Qy(e),jd(e,t,n)}function Sn(){if(Bs!==null){var e=Bs;Bs=null,cf(e)}Xy()}function Xy(){if(!sc&&En!==null){sc=!0;var e=0;try{var t=En;Lr(99,function(){for(;eO?(b=C,C=null):b=C.sibling;var E=d(h,C,w[O],S);if(E===null){C===null&&(C=b);break}e&&C&&E.alternate===null&&t(h,C),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E,C=b}if(O===w.length)return n(h,C),A;if(C===null){for(;OO?(b=C,C=null):b=C.sibling;var x=d(h,C,E.value,S);if(x===null){C===null&&(C=b);break}e&&C&&x.alternate===null&&t(h,C),v=i(x,v,O),T===null?A=x:T.sibling=x,T=x,C=b}if(E.done)return n(h,C),A;if(C===null){for(;!E.done;O++,E=w.next())E=f(h,E.value,S),E!==null&&(v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return A}for(C=r(h,C);!E.done;O++,E=w.next())E=p(C,h,O,E.value,S),E!==null&&(e&&E.alternate!==null&&C.delete(E.key===null?O:E.key),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return e&&C.forEach(function(_){return t(h,_)}),A}return function(h,v,w,S){var A=typeof w=="object"&&w!==null&&w.type===Bn&&w.key===null;A&&(w=w.props.children);var T=typeof w=="object"&&w!==null;if(T)switch(w.$$typeof){case Ti:e:{for(T=w.key,A=v;A!==null;){if(A.key===T){switch(A.tag){case 7:if(w.type===Bn){n(h,A.sibling),v=o(A,w.props.children),v.return=h,h=v;break e}break;default:if(A.elementType===w.type){n(h,A.sibling),v=o(A,w.props),v.ref=ci(h,A,w),v.return=h,h=v;break e}}n(h,A);break}else t(h,A);A=A.sibling}w.type===Bn?(v=Eo(w.props.children,h.mode,S,w.key),v.return=h,h=v):(S=zs(w.type,w.key,w.props,null,h.mode,S),S.ref=ci(h,v,w),S.return=h,h=S)}return a(h);case Or:e:{for(A=w.key;v!==null;){if(v.key===A)if(v.tag===4&&v.stateNode.containerInfo===w.containerInfo&&v.stateNode.implementation===w.implementation){n(h,v.sibling),v=o(v,w.children||[]),v.return=h,h=v;break e}else{n(h,v);break}else t(h,v);v=v.sibling}v=pc(w,h.mode,S),v.return=h,h=v}return a(h)}if(typeof w=="string"||typeof w=="number")return w=""+w,v!==null&&v.tag===6?(n(h,v.sibling),v=o(v,w),v.return=h,h=v):(n(h,v),v=dc(w,h.mode,S),v.return=h,h=v),a(h);if(ys(w))return m(h,v,w,S);if(oi(w))return y(h,v,w,S);if(T&&ws(h,w),typeof w=="undefined"&&!A)switch(h.tag){case 1:case 22:case 0:case 11:case 15:throw Error(L(152,po(h.type)||"Component"))}return n(h,v)}}var hl=t0(!0),n0=t0(!1),La={},fn=hr(La),ya=hr(La),wa=hr(La);function kr(e){if(e===La)throw Error(L(174));return e}function pf(e,t){switch(Ne(wa,t),Ne(ya,e),Ne(fn,La),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Xc(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Xc(t,e)}Se(fn),Ne(fn,t)}function Io(){Se(fn),Se(ya),Se(wa)}function mm(e){kr(wa.current);var t=kr(fn.current),n=Xc(t,e.type);t!==n&&(Ne(ya,e),Ne(fn,n))}function Gd(e){ya.current===e&&(Se(fn),Se(ya))}var Ie=hr(0);function ml(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var xn=null,$n=null,dn=!1;function r0(e,t){var n=Lt(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function vm(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function hf(e){if(dn){var t=$n;if(t){var n=t;if(!vm(e,t)){if(t=go(n.nextSibling),!t||!vm(e,t)){e.flags=e.flags&-1025|2,dn=!1,xn=e;return}r0(xn,n)}xn=e,$n=go(t.firstChild)}else e.flags=e.flags&-1025|2,dn=!1,xn=e}}function gm(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;xn=e}function Ss(e){if(e!==xn)return!1;if(!dn)return gm(e),dn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!lf(t,e.memoizedProps))for(t=$n;t;)r0(e,t),t=go(t.nextSibling);if(gm(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(L(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){$n=go(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}$n=null}}else $n=xn?go(e.stateNode.nextSibling):null;return!0}function lc(){$n=xn=null,dn=!1}var wo=[];function $d(){for(var e=0;ei))throw Error(L(301));i+=1,He=Ke=null,t.updateQueue=null,Vi.current=tE,e=n(r,o)}while(Ji)}if(Vi.current=Sl,t=Ke!==null&&Ke.next!==null,Sa=0,He=Ke=De=null,vl=!1,t)throw Error(L(300));return e}function Tr(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return He===null?De.memoizedState=He=e:He=He.next=e,He}function Gr(){if(Ke===null){var e=De.alternate;e=e!==null?e.memoizedState:null}else e=Ke.next;var t=He===null?De.memoizedState:He.next;if(t!==null)He=t,Ke=e;else{if(e===null)throw Error(L(310));Ke=e,e={memoizedState:Ke.memoizedState,baseState:Ke.baseState,baseQueue:Ke.baseQueue,queue:Ke.queue,next:null},He===null?De.memoizedState=He=e:He=He.next=e}return He}function ln(e,t){return typeof t=="function"?t(e):t}function fi(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=Ke,o=r.baseQueue,i=n.pending;if(i!==null){if(o!==null){var a=o.next;o.next=i.next,i.next=a}r.baseQueue=o=i,n.pending=null}if(o!==null){o=o.next,r=r.baseState;var s=a=i=null,l=o;do{var u=l.lane;if((Sa&u)===u)s!==null&&(s=s.next={lane:0,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null}),r=l.eagerReducer===e?l.eagerState:e(r,l.action);else{var c={lane:u,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null};s===null?(a=s=c,i=r):s=s.next=c,De.lanes|=u,Ma|=u}l=l.next}while(l!==null&&l!==o);s===null?i=r:s.next=a,Rt(r,t.memoizedState)||(Zt=!0),t.memoizedState=r,t.baseState=i,t.baseQueue=s,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function di(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=n.dispatch,o=n.pending,i=t.memoizedState;if(o!==null){n.pending=null;var a=o=o.next;do i=e(i,a.action),a=a.next;while(a!==o);Rt(i,t.memoizedState)||(Zt=!0),t.memoizedState=i,t.baseQueue===null&&(t.baseState=i),n.lastRenderedState=i}return[i,r]}function ym(e,t,n){var r=t._getVersion;r=r(t._source);var o=t._workInProgressVersionPrimary;if(o!==null?e=o===r:(e=e.mutableReadLanes,(e=(Sa&e)===e)&&(t._workInProgressVersionPrimary=r,wo.push(t))),e)return n(t._source);throw wo.push(t),Error(L(350))}function o0(e,t,n,r){var o=at;if(o===null)throw Error(L(349));var i=t._getVersion,a=i(t._source),s=Vi.current,l=s.useState(function(){return ym(o,t,n)}),u=l[1],c=l[0];l=He;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,m=f.source;f=f.subscribe;var y=De;return e.memoizedState={refs:d,source:t,subscribe:r},s.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var h=i(t._source);if(!Rt(a,h)){h=n(t._source),Rt(c,h)||(u(h),h=Zn(y),o.mutableReadLanes|=h&o.pendingLanes),h=o.mutableReadLanes,o.entangledLanes|=h;for(var v=o.entanglements,w=h;0n?98:n,function(){e(!0)}),Lr(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[Gn]=t,e[ll]=r,p0(e,t,!1,!1),t.stateNode=e,a=qc(n,r),n){case"dialog":we("cancel",e),we("close",e),o=r;break;case"iframe":case"object":case"embed":we("load",e),o=r;break;case"video":case"audio":for(o=0;oAf&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432)}else{if(!i)if(e=ml(a),e!==null){if(t.flags|=64,i=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),hi(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!dn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*et()-r.renderingStartTime>Af&&n!==1073741824&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=et(),n.sibling=null,t=Ie.current,Ne(Ie,i?t&1|2:t&1),n):null;case 23:case 24:return tp(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(L(156,t.tag))}function oE(e){switch(e.tag){case 1:yt(e.type)&&ul();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(Io(),Se(gt),Se(nt),$d(),t=e.flags,(t&64)!==0)throw Error(L(285));return e.flags=t&-4097|64,e;case 5:return Gd(e),null;case 13:return Se(Ie),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return Se(Ie),null;case 4:return Io(),null;case 10:return Yd(e),null;case 23:case 24:return tp(),null;default:return null}}function Kd(e,t){try{var n="",r=t;do n+=US(r),r=r.return;while(r);var o=n}catch(i){o=` -Error generating stack: `+i.message+` -`+i.stack}return{value:e,source:t,stack:o}}function wf(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var iE=typeof WeakMap=="function"?WeakMap:Map;function v0(e,t,n){n=Kn(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){El||(El=!0,xf=r),wf(e,t)},n}function g0(e,t,n){n=Kn(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var o=t.value;n.payload=function(){return wf(e,t),r(o)}}var i=e.stateNode;return i!==null&&typeof i.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(un===null?un=new Set([this]):un.add(this),wf(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var aE=typeof WeakSet=="function"?WeakSet:Set;function Im(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){tr(e,n)}else t.current=null}function sE(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Qt(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ud(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(L(163))}function lE(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var o=e;r=o.next,o=o.tag,(o&4)!==0&&(o&1)!==0&&(O0(n,e),vE(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Qt(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&dm(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}dm(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&Yy(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&by(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(L(163))}function Nm(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var o=n.memoizedProps.style;o=o!=null&&o.hasOwnProperty("display")?o.display:null,r.style.display=cy("display",o)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function Dm(e,t){if(Ir&&typeof Ir.onCommitFiberUnmount=="function")try{Ir.onCommitFiberUnmount(Bd,t)}catch(i){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,o=r.destroy;if(r=r.tag,o!==void 0)if((r&4)!==0)O0(t,n);else{r=t;try{o()}catch(i){tr(r,i)}}n=n.next}while(n!==e)}break;case 1:if(Im(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(i){tr(t,i)}break;case 5:Im(t);break;case 4:y0(e,t)}}function Rm(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function Lm(e){return e.tag===5||e.tag===3||e.tag===4}function Mm(e){e:{for(var t=e.return;t!==null;){if(Lm(t))break e;t=t.return}throw Error(L(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(L(161))}n.flags&16&&(la(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||Lm(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Sf(e,n,t):bf(e,n,t)}function Sf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=sl));else if(r!==4&&(e=e.child,e!==null))for(Sf(e,t,n),e=e.sibling;e!==null;)Sf(e,t,n),e=e.sibling}function bf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(bf(e,t,n),e=e.sibling;e!==null;)bf(e,t,n),e=e.sibling}function y0(e,t){for(var n=t,r=!1,o,i;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(L(160));switch(o=r.stateNode,r.tag){case 5:i=!1;break e;case 3:o=o.containerInfo,i=!0;break e;case 4:o=o.containerInfo,i=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,s=n,l=s;;)if(Dm(a,l),l.child!==null&&l.tag!==4)l.child.return=l,l=l.child;else{if(l===s)break e;for(;l.sibling===null;){if(l.return===null||l.return===s)break e;l=l.return}l.sibling.return=l.return,l=l.sibling}i?(a=o,s=n.stateNode,a.nodeType===8?a.parentNode.removeChild(s):a.removeChild(s)):o.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){o=n.stateNode.containerInfo,i=!0,n.child.return=n,n=n.child;continue}}else if(Dm(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function fc(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var o=e!==null?e.memoizedProps:r;e=t.type;var i=t.updateQueue;if(t.updateQueue=null,i!==null){for(n[ll]=r,e==="input"&&r.type==="radio"&&r.name!=null&&ay(n,r),qc(e,o),t=qc(e,r),o=0;oo&&(o=a),n&=~i}if(n=o,n=et()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*cE(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}Ve!==5&&(Ve=2),l=Kd(l,s),d=a;do{switch(d.tag){case 3:i=l,d.flags|=4096,t&=-t,d.lanes|=t;var T=v0(d,i,t);fm(d,T);break e;case 1:i=l;var C=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof C.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(un===null||!un.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var b=g0(d,i,t);fm(d,b);break e}}d=d.return}while(d!==null)}x0(n)}catch(E){t=E,Le===n&&n!==null&&(Le=n=n.return);continue}break}while(1)}function C0(){var e=bl.current;return bl.current=Sl,e===null?Sl:e}function Ri(e,t){var n=X;X|=16;var r=C0();at===e&&tt===t||bo(e,t);do try{dE();break}catch(o){E0(e,o)}while(1);if(Wd(),X=n,bl.current=r,Le!==null)throw Error(L(261));return at=null,tt=0,Ve}function dE(){for(;Le!==null;)A0(Le)}function pE(){for(;Le!==null&&!Jb();)A0(Le)}function A0(e){var t=_0(e.alternate,e,Mr);e.memoizedProps=e.pendingProps,t===null?x0(e):Le=t,qd.current=null}function x0(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=rE(n,t,Mr),n!==null){Le=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(Mr&1073741824)!==0||(n.mode&4)===0){for(var r=0,o=n.child;o!==null;)r|=o.lanes|o.childLanes,o=o.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(s=a,a=T,T=s),s=Xh(w,T),i=Xh(w,a),s&&i&&(A.rangeCount!==1||A.anchorNode!==s.node||A.anchorOffset!==s.offset||A.focusNode!==i.node||A.focusOffset!==i.offset)&&(S=S.createRange(),S.setStart(s.node,s.offset),A.removeAllRanges(),T>a?(A.addRange(S),A.extend(i.node,i.offset)):(S.setEnd(i.node,i.offset),A.addRange(S)))))),S=[],A=w;A=A.parentNode;)A.nodeType===1&&S.push({element:A,left:A.scrollLeft,top:A.scrollTop});for(typeof w.focus=="function"&&w.focus(),w=0;wet()-ep?bo(e,0):Zd|=n),jt(e,t)}function wE(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=To()===99?1:2:(An===0&&(An=Qo),t=eo(62914560&~An),t===0&&(t=4194304))),n=Ot(),e=lu(e,t),e!==null&&(eu(e,t,n),jt(e,n))}var _0;_0=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||gt.current)Zt=!0;else if((n&r)!==0)Zt=(e.flags&16384)!==0;else{switch(Zt=!1,t.tag){case 3:Am(t),lc();break;case 5:mm(t);break;case 1:yt(t.type)&&Us(t);break;case 4:pf(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var o=t.type._context;Ne(cl,o._currentValue),o._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?xm(e,t,n):(Ne(Ie,Ie.current&1),t=On(e,t,n),t!==null?t.sibling:null);Ne(Ie,Ie.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return Tm(e,t,n);t.flags|=64}if(o=t.memoizedState,o!==null&&(o.rendering=null,o.tail=null,o.lastEffect=null),Ne(Ie,Ie.current),r)break;return null;case 23:case 24:return t.lanes=0,uc(e,t,n)}return On(e,t,n)}else Zt=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=ko(t,nt.current),yo(t,n),o=Vd(null,t,r,e,o,n),t.flags|=1,typeof o=="object"&&o!==null&&typeof o.render=="function"&&o.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,yt(r)){var i=!0;Us(t)}else i=!1;t.memoizedState=o.state!==null&&o.state!==void 0?o.state:null,zd(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&pl(t,r,a,e),o.updater=au,t.stateNode=o,o._reactInternals=t,df(t,r,e,n),t=gf(null,t,r,!0,i,n)}else t.tag=0,ht(null,t,o,n),t=t.child;return t;case 16:o=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=o._init,o=i(o._payload),t.type=o,i=t.tag=bE(o),e=Qt(o,e),i){case 0:t=vf(null,t,o,e,n);break e;case 1:t=Cm(null,t,o,e,n);break e;case 11:t=bm(null,t,o,e,n);break e;case 14:t=Em(null,t,o,Qt(o.type,e),r,n);break e}throw Error(L(306,o,""))}return t;case 0:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),vf(e,t,r,o,n);case 1:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),Cm(e,t,r,o,n);case 3:if(Am(t),r=t.updateQueue,e===null||r===null)throw Error(L(282));if(r=t.pendingProps,o=t.memoizedState,o=o!==null?o.element:null,qy(e,t),ga(t,r,null,n),r=t.memoizedState.element,r===o)lc(),t=On(e,t,n);else{if(o=t.stateNode,(i=o.hydrate)&&($n=go(t.stateNode.containerInfo.firstChild),xn=t,i=dn=!0),i){if(e=o.mutableSourceEagerHydrationData,e!=null)for(o=0;o1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:cp(e)?2:fp(e)?3:0}function Co(e,t){return qo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function cC(e,t){return qo(e)===2?e.get(t):e[t]}function H0(e,t,n){var r=qo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function V0(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function cp(e){return vC&&e instanceof Map}function fp(e){return gC&&e instanceof Set}function Cr(e){return e.o||e.t}function dp(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Q0(e);delete t[Ce];for(var n=Ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=fC),Object.freeze(e),t&&Fr(e,function(n,r){return pp(r,!0)},!0)),e}function fC(){Kt(2)}function hp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function Pn(e){var t=Rf[e];return t||Kt(18,e),t}function dC(e,t){Rf[e]||(Rf[e]=t)}function If(){return ba}function mc(e,t){t&&(Pn("Patches"),e.u=[],e.s=[],e.v=t)}function Al(e){Nf(e),e.p.forEach(pC),e.p=null}function Nf(e){e===ba&&(ba=e.l)}function Ym(e){return ba={p:[],l:ba,h:e,m:!0,_:0}}function pC(e){var t=e[Ce];t.i===0||t.i===1?t.j():t.O=!0}function vc(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||Pn("ES5").S(t,e,r),r?(n[Ce].P&&(Al(t),Kt(4)),dr(e)&&(e=xl(t,e),t.l||Ol(t,e)),t.u&&Pn("Patches").M(n[Ce],e,t.u,t.s)):e=xl(t,n,[]),Al(t),t.u&&t.v(t.u,t.s),e!==J0?e:void 0}function xl(e,t,n){if(hp(t))return t;var r=t[Ce];if(!r)return Fr(t,function(i,a){return zm(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Ol(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=dp(r.k):r.o;Fr(r.i===3?new Set(o):o,function(i,a){return zm(e,r,o,i,a,n)}),Ol(e,o,!1),n&&e.u&&Pn("Patches").R(r,n,e.u,e.s)}return r.o}function zm(e,t,n,r,o,i){if(fr(o)){var a=xl(e,o,i&&t&&t.i!==3&&!Co(t.D,r)?i.concat(r):void 0);if(H0(n,r,a),!fr(a))return;e.m=!1}if(dr(o)&&!hp(o)){if(!e.h.F&&e._<1)return;xl(e,o),t&&t.A.l||Ol(e,o)}}function Ol(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&pp(t,n)}function gc(e,t){var n=e[Ce];return(n?Cr(n):e)[t]}function Gm(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function jn(e){e.P||(e.P=!0,e.l&&jn(e.l))}function yc(e){e.o||(e.o=dp(e.t))}function Df(e,t,n){var r=cp(t)?Pn("MapSet").N(t,n):fp(t)?Pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:If(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=xo;a&&(l=[s],u=Gs);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):Pn("ES5").J(t,n);return(n?n.A:If()).p.push(r),r}function hC(e){return fr(e)||Kt(22,e),function t(n){if(!dr(n))return n;var r,o=n[Ce],i=qo(n);if(o){if(!o.P&&(o.i<4||!Pn("ES5").K(o)))return o.t;o.I=!0,r=$m(n,i),o.I=!1}else r=$m(n,i);return Fr(r,function(a,s){o&&cC(o.t,a)===s||H0(r,a,t(s))}),i===3?new Set(r):r}(e)}function $m(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return dp(e)}function mC(){function e(i,a){var s=o[i];return s?s.enumerable=a:o[i]=s={configurable:!0,enumerable:a,get:function(){var l=this[Ce];return xo.get(l,i)},set:function(l){var u=this[Ce];xo.set(u,i,l)}},s}function t(i){for(var a=i.length-1;a>=0;a--){var s=i[a][Ce];if(!s.P)switch(s.i){case 5:r(s)&&jn(s);break;case 4:n(s)&&jn(s)}}}function n(i){for(var a=i.t,s=i.k,l=Ao(s),u=l.length-1;u>=0;u--){var c=l[u];if(c!==Ce){var f=a[c];if(f===void 0&&!Co(a,c))return!0;var d=s[c],p=d&&d[Ce];if(p?p.t!==f:!V0(d,f))return!0}}var m=!!a[Ce];return l.length!==Ao(a).length+(m?0:1)}function r(i){var a=i.k;if(a.length!==i.t.length)return!0;var s=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!s||s.get)}var o={};dC("ES5",{J:function(i,a){var s=Array.isArray(i),l=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?y-1:0),v=1;v1?u-1:0),f=1;f=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=Pn("Patches").$;return fr(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),_t=new wC,SC=_t.produce;_t.produceWithPatches.bind(_t);_t.setAutoFreeze.bind(_t);_t.setUseProxies.bind(_t);_t.applyPatches.bind(_t);_t.createDraft.bind(_t);_t.finishDraft.bind(_t);const $s=SC;function bC(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Qm(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Xm(e){for(var t=1;t0&&i[i.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!i||u[1]>i[0]&&u[1]0)for(var S=p.getState(),A=Array.from(n.values()),T=0,C=A;T!1}}),iA=()=>{const e=vr();return I.useCallback(()=>{e(aA())},[e])},{DISCONNECTED_FROM_SERVER:aA}=s1.actions,sA=s1.reducer;function Xa(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(i)),o=Object.keys(t).filter(i=>!n.includes(i));if(!Xa(r,o))return!1;for(let i of r)if(e[i]!==t[i])return!1;return!0}function l1(e,t,n){return n===0?!0:Xa(e.slice(0,n),t.slice(0,n))}function uA(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:l1(e,t,n)}const u1=vp({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:c1,RESET_SELECTION:a5,STEP_BACK_SELECTION:cA}=u1.actions,fA=u1.reducer,dA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function pA(e){const t=vr();return j.exports.useCallback(()=>{e!==null&&t(bw({path:e}))},[t,e])}const hA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",mA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",vA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",Mf="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",f1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",d1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",gA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",yA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",wA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",SA="_icon_1467k_1",bA={icon:SA},EA={undo:wA,redo:gA,tour:yA,alignTop:vA,alignBottom:mA,alignCenter:hA,alignSpread:Mf,alignTextCenter:Mf,alignTextLeft:f1,alignTextRight:d1};function CA({id:e,alt:t=e,size:n}){return g("img",{src:EA[e],alt:t,className:bA.icon,style:n?{height:n}:{}})}var p1={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},rv=j.exports.createContext&&j.exports.createContext(p1),Ur=globalThis&&globalThis.__assign||function(){return Ur=Object.assign||function(e){for(var t,n=1,r=arguments.length;ng("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),Sp=e=>N("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),PA=e=>g("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),kA="_button_1dliw_1",TA="_regular_1dliw_26",IA="_icon_1dliw_34",NA="_transparent_1dliw_42",Sc={button:kA,regular:TA,delete:"_delete_1dliw_30",icon:IA,transparent:NA},wt=o=>{var i=o,{children:e,variant:t="regular",className:n}=i,r=$t(i,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(s=>Sc[s]).join(" "):Sc[t]:"";return g("button",$(F({className:Sc.button+" "+a+(n?" "+n:"")},r),{children:e}))},DA="_deleteButton_1en02_1",RA={deleteButton:DA};function m1({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=pA(e);return N(wt,{className:RA.deleteButton,onClick:o=>{o.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[g(Sp,{}),t?null:"Delete Element"]})}function v1(){const e=vr(),t=Ja(r=>r.selectedPath),n=j.exports.useCallback(r=>{e(c1({path:r}))},[e]);return[t,n]}const bp=I.createContext([null,e=>{}]),LA=({children:e})=>{const t=I.useState(null);return g(bp.Provider,{value:t,children:e})};function MA(){return I.useContext(bp)}function g1({ref:e,nodeInfo:t,immovable:n=!1}){const r=I.useRef(!1),[,o]=I.useContext(bp),i=I.useCallback(()=>{r.current===!1||n||(o(null),r.current=!1,document.body.removeEventListener("dragover",ov),document.body.removeEventListener("drop",i))},[n,o]),a=I.useCallback(s=>{s.stopPropagation(),o(t),r.current=!0,document.body.addEventListener("dragover",ov),document.body.addEventListener("drop",i)},[i,t,o]);I.useEffect(()=>{var l;if(((l=t.currentPath)==null?void 0:l.length)===0||n)return;const s=e.current;if(!!s)return s.setAttribute("draggable","true"),s.addEventListener("dragstart",a),s.addEventListener("dragend",i),()=>{s.removeEventListener("dragstart",a),s.removeEventListener("dragend",i)}},[i,n,t.currentPath,a,e])}function ov(e){e.preventDefault()}const FA="_leaf_1yzht_1",UA="_selectedOverlay_1yzht_5",BA="_container_1yzht_15",iv={leaf:FA,selectedOverlay:UA,container:BA};function jA({ref:e,path:t}){I.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const Ep=r=>{var o=r,{path:e=[],canMove:t=!0}=o,n=$t(o,["path","canMove"]);const i=I.useRef(null),{uiName:a,uiArguments:s,uiChildren:l}=n,[u,c]=v1(),f=u?Xa(e,u):!1,d=en[a],p=y=>{y.stopPropagation(),c(e)};if(g1({ref:i,nodeInfo:{node:n,currentPath:e},immovable:!t}),jA({ref:i,path:e}),d.acceptsChildren===!0){const y=d.UiComponent;return g(y,{uiArguments:s,uiChildren:l!=null?l:[],compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})}const m=d.UiComponent;return g(m,{uiArguments:s,compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})},Cp=I.forwardRef((o,r)=>{var i=o,{className:e="",children:t}=i,n=$t(i,["className","children"]);const a=e+" card";return g("div",$(F({ref:r,className:a},n),{children:t}))}),WA=I.forwardRef((r,n)=>{var o=r,{className:e=""}=o,t=$t(o,["className"]);const i=e+" card-header";return g("div",F({ref:n,className:i},t))}),YA="_container_rm196_1",zA="_withTitle_rm196_13",GA="_panelTitle_rm196_22",$A="_contentHolder_rm196_27",HA="_dropWatcher_rm196_67",VA="_lastDropWatcher_rm196_75",JA="_firstDropWatcher_rm196_78",QA="_middleDropWatcher_rm196_89",XA="_onlyDropWatcher_rm196_93",KA="_hoveringOverSwap_rm196_98",qA="_availableToSwap_rm196_99",ZA="_pulse_rm196_1",ex="_emptyGridCard_rm196_143",tx="_emptyMessage_rm196_160",xt={container:YA,withTitle:zA,panelTitle:GA,contentHolder:$A,dropWatcher:HA,lastDropWatcher:VA,firstDropWatcher:JA,middleDropWatcher:QA,onlyDropWatcher:XA,hoveringOverSwap:KA,availableToSwap:qA,pulse:ZA,emptyGridCard:ex,emptyMessage:tx};function qt(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Ap(e)?2:xp(e)?3:0}function Ff(e,t){return Zo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function nx(e,t){return Zo(e)===2?e.get(t):e[t]}function y1(e,t,n){var r=Zo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function rx(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Ap(e){return sx&&e instanceof Map}function xp(e){return lx&&e instanceof Set}function Ar(e){return e.o||e.t}function Op(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=cx(e);delete t[Pt];for(var n=Tp(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=ox),Object.freeze(e),t&&Aa(e,function(n,r){return _p(r,!0)},!0)),e}function ox(){qt(2)}function Pp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function pn(e){var t=fx[e];return t||qt(18,e),t}function av(){return xa}function bc(e,t){t&&(pn("Patches"),e.u=[],e.s=[],e.v=t)}function Tl(e){Uf(e),e.p.forEach(ix),e.p=null}function Uf(e){e===xa&&(xa=e.l)}function sv(e){return xa={p:[],l:xa,h:e,m:!0,_:0}}function ix(e){var t=e[Pt];t.i===0||t.i===1?t.j():t.O=!0}function Ec(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||pn("ES5").S(t,e,r),r?(n[Pt].P&&(Tl(t),qt(4)),Br(e)&&(e=Il(t,e),t.l||Nl(t,e)),t.u&&pn("Patches").M(n[Pt].t,e,t.u,t.s)):e=Il(t,n,[]),Tl(t),t.u&&t.v(t.u,t.s),e!==w1?e:void 0}function Il(e,t,n){if(Pp(t))return t;var r=t[Pt];if(!r)return Aa(t,function(i,a){return lv(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Nl(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=Op(r.k):r.o;Aa(r.i===3?new Set(o):o,function(i,a){return lv(e,r,o,i,a,n)}),Nl(e,o,!1),n&&e.u&&pn("Patches").R(r,n,e.u,e.s)}return r.o}function lv(e,t,n,r,o,i){if(Do(o)){var a=Il(e,o,i&&t&&t.i!==3&&!Ff(t.D,r)?i.concat(r):void 0);if(y1(n,r,a),!Do(a))return;e.m=!1}if(Br(o)&&!Pp(o)){if(!e.h.F&&e._<1)return;Il(e,o),t&&t.A.l||Nl(e,o)}}function Nl(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&_p(t,n)}function Cc(e,t){var n=e[Pt];return(n?Ar(n):e)[t]}function uv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Bf(e){e.P||(e.P=!0,e.l&&Bf(e.l))}function Ac(e){e.o||(e.o=Op(e.t))}function jf(e,t,n){var r=Ap(t)?pn("MapSet").N(t,n):xp(t)?pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:av(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=Wf;a&&(l=[s],u=Li);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):pn("ES5").J(t,n);return(n?n.A:av()).p.push(r),r}function ax(e){return Do(e)||qt(22,e),function t(n){if(!Br(n))return n;var r,o=n[Pt],i=Zo(n);if(o){if(!o.P&&(o.i<4||!pn("ES5").K(o)))return o.t;o.I=!0,r=cv(n,i),o.I=!1}else r=cv(n,i);return Aa(r,function(a,s){o&&nx(o.t,a)===s||y1(r,a,t(s))}),i===3?new Set(r):r}(e)}function cv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Op(e)}var fv,xa,kp=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",sx=typeof Map!="undefined",lx=typeof Set!="undefined",dv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",w1=kp?Symbol.for("immer-nothing"):((fv={})["immer-nothing"]=!0,fv),pv=kp?Symbol.for("immer-draftable"):"__$immer_draftable",Pt=kp?Symbol.for("immer-state"):"__$immer_state",ux=""+Object.prototype.constructor,Tp=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,cx=Object.getOwnPropertyDescriptors||function(e){var t={};return Tp(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},fx={},Wf={get:function(e,t){if(t===Pt)return e;var n=Ar(e);if(!Ff(n,t))return function(o,i,a){var s,l=uv(i,a);return l?"value"in l?l.value:(s=l.get)===null||s===void 0?void 0:s.call(o.k):void 0}(e,n,t);var r=n[t];return e.I||!Br(r)?r:r===Cc(e.t,t)?(Ac(e),e.o[t]=jf(e.A.h,r,e)):r},has:function(e,t){return t in Ar(e)},ownKeys:function(e){return Reflect.ownKeys(Ar(e))},set:function(e,t,n){var r=uv(Ar(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var o=Cc(Ar(e),t),i=o==null?void 0:o[Pt];if(i&&i.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(rx(n,o)&&(n!==void 0||Ff(e.t,t)))return!0;Ac(e),Bf(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Cc(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,Ac(e),Bf(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=Ar(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){qt(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){qt(12)}},Li={};Aa(Wf,function(e,t){Li[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Li.deleteProperty=function(e,t){return Li.set.call(this,e,t,void 0)},Li.set=function(e,t,n){return Wf.set.call(this,e[0],t,n,e[0])};var dx=function(){function e(n){var r=this;this.g=dv,this.F=!0,this.produce=function(o,i,a){if(typeof o=="function"&&typeof i!="function"){var s=i;i=o;var l=r;return function(y){var h=this;y===void 0&&(y=s);for(var v=arguments.length,w=Array(v>1?v-1:0),S=1;S1?c-1:0),d=1;d=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=pn("Patches").$;return Do(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),kt=new dx,px=kt.produce;kt.produceWithPatches.bind(kt);kt.setAutoFreeze.bind(kt);kt.setUseProxies.bind(kt);kt.applyPatches.bind(kt);kt.createDraft.bind(kt);kt.finishDraft.bind(kt);const ei=px,Dl=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+i*r)};function hv(e){let t=1/0,n=-1/0;for(let i of e)in&&(n=i);const r=n-t,o=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===o-1}}function S1(e,t){return[...new Array(t)].fill(e)}function hx(e,t){return e.filter(n=>!t.includes(n))}function Yf(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function Oa(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function mx(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const o=r[t];return r[t]=void 0,r=Oa(r,n,o),r.filter(i=>typeof i!="undefined")}function vx(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const o=e[r-1];return[...e].splice(0,r-1).join(t)+n+o}function Ip(e){return e.uiChildren!==void 0}function rr(e,t){let n=e,r;for(r of t){if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function b1(e,t){return l1(e,t,Math.min(e.length,t.length))}function Np(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const o=n-1;return Xa(e.slice(0,o),t.slice(0,o))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function E1(e,{path:t}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=gx(e,t);if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function gx(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const o=n.length===0?e:rr(e,n);if(!Ip(o))throw new Error("Somehow trying to enter a leaf node");return{parentNode:o,indexToNode:r}}function yx(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:o}){const i=rr(e,t);if(!en[i.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(i.uiChildren)||(i.uiChildren=[]);const a=r==="last"?i.uiChildren.length:r;if(o!==void 0){const s=[...t,a];if(b1(o,s))throw new Error("Invalid move request");if(Np(o,s)){const l=o[o.length-1];i.uiChildren=mx(i.uiChildren,l,a);return}E1(e,{path:o})}i.uiChildren=Oa(i.uiChildren,a,n)}function wx({fromPath:e,toPath:t}){if(e==null)return!0;if(b1(e,t))return!1;if(Np(e,t)){const n=e.length,r=e[n-1],o=t[n-1];if(r===o||r===o-1)return!1}return!0}const Sx="_canAcceptDrop_1oxcd_1",bx="_pulse_1oxcd_1",Ex="_hoveringOver_1oxcd_32",zf={canAcceptDrop:Sx,pulse:bx,hoveringOver:Ex};function Dp({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:o=zf.canAcceptDrop,hoveringOverClass:i=zf.hoveringOver}){const[a,s]=MA(),{addCanAcceptDropHighlight:l,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=Cx({watcherRef:e,canAcceptDropClass:o,hoveringOverClass:i}),d=a?t(a):!1,p=I.useCallback(h=>{h.preventDefault(),h.stopPropagation(),u(),r==null||r()},[u,r]),m=I.useCallback(h=>{h.preventDefault(),c()},[c]),y=I.useCallback(h=>{if(h.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),s(null)},[d,a,n,c,s]);I.useEffect(()=>{const h=e.current;if(!!h)return d&&(l(),h.addEventListener("dragenter",p),h.addEventListener("dragleave",m),h.addEventListener("dragover",p),h.addEventListener("drop",y)),()=>{f(),h.removeEventListener("dragenter",p),h.removeEventListener("dragleave",m),h.removeEventListener("dragover",p),h.removeEventListener("drop",y)}},[l,d,m,p,y,f,e])}function Cx({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=I.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),o=I.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),i=I.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=I.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:o,removeHoveredOverHighlight:i,removeAllHighlights:a}}function Ax({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Ew(),o=I.useCallback(({node:a,currentPath:s})=>mv(a)!==null&&wx({fromPath:s,toPath:[...n,t]}),[t,n]),i=I.useCallback(({node:a,currentPath:s})=>{const l=mv(a);if(!l)throw new Error("No node to place...");r({node:l,currentPath:s,parentPath:n,positionInChildren:t})},[t,n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i})}function mv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function xx(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function vv(e){return Et({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function gv(e){return Et({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function C1(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}var Ou=A1;function A1(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],o={}.toString.call(r).slice(8,-1);o=="Array"||o=="Object"?t[n]=A1(r):o=="Date"?t[n]=new Date(r.getTime()):o=="RegExp"?t[n]=RegExp(r.source,Ox(r)):t[n]=r}return t}function Ox(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Ka(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function _x(e,t={}){const n=new Set;for(let r of e)for(let o of r)t.ignore&&t.ignore.includes(o)||n.add(o);return[...n]}function Px(e,{index:t,arr:n,dir:r}){const o=Ou(e);switch(r){case"rows":return Oa(o,t,n);case"cols":return o.map((i,a)=>Oa(i,t,n[a]))}}function kx(e,{index:t,dir:n}){const r=Ou(e);switch(n){case"rows":return Yf(r,t);case"cols":return r.map((o,i)=>Yf(o,t))}}const vn=".";function Rp(e){const t=new Map;return Tx(e).forEach(({itemRows:n,itemCols:r},o)=>{if(o===vn)return;const i=hv(n),a=hv(r);t.set(o,{colStart:a.minVal,rowStart:i.minVal,colSpan:a.span+1,rowSpan:i.span+1,isValid:i.isSequence&&a.isSequence})}),t}function Tx(e){var o;const t=new Map,{numRows:n,numCols:r}=Ka(e);for(let i=0;i1,c=r>1,f=[];return(yv({colRange:l,rowIndex:e-1,layoutAreas:o})||u)&&f.push("up"),(yv({colRange:l,rowIndex:i+1,layoutAreas:o})||u)&&f.push("down"),(wv({rowRange:s,colIndex:n-1,layoutAreas:o})||c)&&f.push("left"),(wv({rowRange:s,colIndex:a+1,layoutAreas:o})||c)&&f.push("right"),f}function yv({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===vn)}function wv({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===vn)}const Nx="_marker_rkm38_1",Dx="_dragger_rkm38_30",Rx="_move_rkm38_50",Sv={marker:Nx,dragger:Dx,move:Rx};function _a({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function Lx(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=_a(e)),"colSpan"in t&&(t=_a(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function Mx({row:e,col:t}){return`row${e}-col${t}`}function Fx({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:o,colStart:i,colEnd:a}=_a(t),s=n.length,l=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:o,growExtent:1};u=r-1,c=1,f=o;break;case"left":if(i===1)return{shrinkExtent:a,growExtent:1};u=i-1,c=1,f=a;break;case"down":if(o===s)return{shrinkExtent:r,growExtent:s};u=o+1,c=s,f=r;break;case"right":if(a===l)return{shrinkExtent:i,growExtent:l};u=a+1,c=l,f=i;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[m,y]=d?[i,a]:[r,o],h=(S,A)=>{const[T,C]=d?[S,A]:[A,S];return n[T-1][C-1]!==vn},v=Dl(m,y),w=Dl(u,c);for(let S of w)for(let A of v)if(h(S,A))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function x1(e,t,n){const r=t=r&&e<=o}function Ux({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=Gf(t.getPropertyValue("gap")),i=Gf(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],s=Bx(t,e),l=s.length,u=[];for(let c=0;cx1(i,l,u));if(a===void 0)return;const s=Wx[n];return o[s]=a.index,o}const Wx={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function Yx({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const o=_a(t),i=I.useRef(null),a=I.useCallback(u=>{const c=e.current,f=i.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=jx({mousePos:u,dragState:f});d&&Ev(c,d)},[e]),s=I.useCallback(()=>{const u=e.current,c=i.current;if(!u||!c)return;const f=c.gridItemExtent;Lx(f,o)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),bv("on")},[o,a,r,e]);return I.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),m=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:y,growExtent:h}=Fx({dragDirection:u,gridLocation:t,layoutAreas:n});i.current={dragHandle:u,gridItemExtent:_a(t),tractExtents:Ux({dir:m,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:v})=>x1(v,y,h))},Ev(e.current,i.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",s,{once:!0}),bv("off")},[s,t,n,a,e])}function bv(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function Ev(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:o}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(o+1))}function zx({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const o=I.useRef(null),i=Yx({overlayRef:o,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=I.useMemo(()=>Ix({gridLocation:t,layoutAreas:n}),[t,n]),s=I.useMemo(()=>{let l=[];for(let u of a)l.push(g("div",{className:Sv.dragger+" "+u,onMouseDown:c=>{Gx(c),i(u)},children:$x[u]},u));return l},[a,i]);return I.useEffect(()=>{var l;(l=o.current)==null||l.style.setProperty("--grid-area",e)},[e]),g("div",{ref:o,className:Sv.marker+" grid-area-overlay",children:s})}function Gx(e){e.preventDefault(),e.stopPropagation()}const $x={up:g(gv,{}),down:g(gv,{}),left:g(vv,{}),right:g(vv,{})};function Hx({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=I.useRef(null);return Dp({watcherRef:r,onDrop:o=>{n($(F({},o),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),g("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function Vx(e,t){const{numRows:n,numCols:r}=Ka(e),o=[];for(let i=0;i{const i=r==="rows"?"cols":"rows",a=O1(o);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const s=Rp(o.areas);let l=S1(vn,a[i].length);s.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=Hf(u,r);if(f<=t&&d>t){const m=Hf(u,i);for(let y=m.itemStart-1;y1}function Kx(e,{index:t,dir:n}){let r=[];return e.forEach((o,i)=>{const{itemStart:a,itemEnd:s}=Hf(o,n);a===t&&a===s&&r.push(i)}),r}const qx="_ResizableGrid_i4cq9_1",Zx={ResizableGrid:qx,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function T1(e){var o,i;const t=((o=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:o[0])||"px",n=(i=e.match(/^[\d|\.]*/g))==null?void 0:i[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function Wn(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const e2="_container_jk9tt_8",t2="_label_jk9tt_26",n2="_mainInput_jk9tt_59",kn={container:e2,label:t2,mainInput:n2},I1=I.createContext(null);function $r(e){const t=I.useContext(I1);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const r2=({onChange:e,children:t})=>g(I1.Provider,{value:e,children:t});function o2({name:e,isDisabled:t,defaultValue:n}){const r=$r(),o=`Click to ${t?"set":"unset"} ${e} property`;return g("input",{"aria-label":o,type:"checkbox",checked:!t,title:o,onChange:i=>{r({name:e,value:i.target.checked?n:void 0})}})}function Lp({name:e,label:t,optional:n,isDisabled:r,defaultValue:o,mainInput:i,width_setting:a="full"}){return N("label",{className:kn.container,"data-disabled":r,"data-width-setting":a,children:[N("div",{className:kn.label,children:[n?g(o2,{name:e,isDisabled:r,defaultValue:o}):null,t!=null?t:e,":"]}),g("div",{className:kn.mainInput,children:i})]})}const i2="_numericInput_n1lnu_1",a2={numericInput:i2};function Mp({value:e,ariaLabel:t,onChange:n,min:r,max:o,disabled:i=!1}){var s;const a=I.useCallback((l=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+l*c;r&&(f=Math.max(f,r)),o&&(f=Math.min(f,o)),n(f)},[o,r,n,e]);return g("input",{className:a2.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:i,value:(s=e==null?void 0:e.toString())!=null?s:"",onChange:l=>n(Number(l.target.value)),min:r,onKeyDown:l=>{(l.key==="ArrowUp"||l.key==="ArrowDown")&&(l.preventDefault(),a(l.key==="ArrowUp"?1:-1,l.shiftKey))}})}function Hn({name:e,label:t,value:n,min:r=0,max:o,onChange:i,optional:a=!1,defaultValue:s=1,disabled:l=n===void 0}){const u=$r(i);return g(Lp,{name:e,label:t,optional:a,isDisabled:l,defaultValue:s,width_setting:"fit",mainInput:g(Mp,{ariaLabel:t!=null?t:e,disabled:l,value:n,onChange:c=>u({name:e,value:c}),min:r,max:o})})}var Fp=s2;function s2(e,t,n){var r=null,o=null,i=function(){r&&(clearTimeout(r),o=null,r=null)},a=function(){var l=o;i(),l&&l()},s=function(){if(!t)return e.apply(this,arguments);var l=this,u=arguments,c=n&&!r;if(i(),o=function(){e.apply(l,u)},r=setTimeout(function(){if(r=null,!c){var f=o;return o=null,f()}},t),c)return o()};return s.cancel=i,s.flush=a,s}var Av=function(t){return t.reduce(function(n,r){var o=r[0],i=r[1];return n[o]=i,n},{})},xv=typeof window!="undefined"&&window.document&&window.document.createElement?j.exports.useLayoutEffect:j.exports.useEffect,St="top",Wt="bottom",Yt="right",bt="left",Up="auto",qa=[St,Wt,Yt,bt],Ro="start",Pa="end",l2="clippingParents",N1="viewport",vi="popper",u2="reference",Ov=qa.reduce(function(e,t){return e.concat([t+"-"+Ro,t+"-"+Pa])},[]),D1=[].concat(qa,[Up]).reduce(function(e,t){return e.concat([t,t+"-"+Ro,t+"-"+Pa])},[]),c2="beforeRead",f2="read",d2="afterRead",p2="beforeMain",h2="main",m2="afterMain",v2="beforeWrite",g2="write",y2="afterWrite",w2=[c2,f2,d2,p2,h2,m2,v2,g2,y2];function gn(e){return e?(e.nodeName||"").toLowerCase():null}function nn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function Lo(e){var t=nn(e).Element;return e instanceof t||e instanceof Element}function Ut(e){var t=nn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function R1(e){if(typeof ShadowRoot=="undefined")return!1;var t=nn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function S2(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},o=t.attributes[n]||{},i=t.elements[n];!Ut(i)||!gn(i)||(Object.assign(i.style,r),Object.keys(o).forEach(function(a){var s=o[a];s===!1?i.removeAttribute(a):i.setAttribute(a,s===!0?"":s)}))})}function b2(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var o=t.elements[r],i=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),s=a.reduce(function(l,u){return l[u]="",l},{});!Ut(o)||!gn(o)||(Object.assign(o.style,s),Object.keys(i).forEach(function(l){o.removeAttribute(l)}))})}}const E2={name:"applyStyles",enabled:!0,phase:"write",fn:S2,effect:b2,requires:["computeStyles"]};function hn(e){return e.split("-")[0]}var Nr=Math.max,Rl=Math.min,Mo=Math.round;function Fo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,o=1;if(Ut(e)&&t){var i=e.offsetHeight,a=e.offsetWidth;a>0&&(r=Mo(n.width)/a||1),i>0&&(o=Mo(n.height)/i||1)}return{width:n.width/r,height:n.height/o,top:n.top/o,right:n.right/r,bottom:n.bottom/o,left:n.left/r,x:n.left/r,y:n.top/o}}function Bp(e){var t=Fo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function L1(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&R1(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function Nn(e){return nn(e).getComputedStyle(e)}function C2(e){return["table","td","th"].indexOf(gn(e))>=0}function gr(e){return((Lo(e)?e.ownerDocument:e.document)||window.document).documentElement}function _u(e){return gn(e)==="html"?e:e.assignedSlot||e.parentNode||(R1(e)?e.host:null)||gr(e)}function _v(e){return!Ut(e)||Nn(e).position==="fixed"?null:e.offsetParent}function A2(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&Ut(e)){var r=Nn(e);if(r.position==="fixed")return null}for(var o=_u(e);Ut(o)&&["html","body"].indexOf(gn(o))<0;){var i=Nn(o);if(i.transform!=="none"||i.perspective!=="none"||i.contain==="paint"||["transform","perspective"].indexOf(i.willChange)!==-1||t&&i.willChange==="filter"||t&&i.filter&&i.filter!=="none")return o;o=o.parentNode}return null}function Za(e){for(var t=nn(e),n=_v(e);n&&C2(n)&&Nn(n).position==="static";)n=_v(n);return n&&(gn(n)==="html"||gn(n)==="body"&&Nn(n).position==="static")?t:n||A2(e)||t}function jp(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function qi(e,t,n){return Nr(e,Rl(t,n))}function x2(e,t,n){var r=qi(e,t,n);return r>n?n:r}function M1(){return{top:0,right:0,bottom:0,left:0}}function F1(e){return Object.assign({},M1(),e)}function U1(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var O2=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,F1(typeof t!="number"?t:U1(t,qa))};function _2(e){var t,n=e.state,r=e.name,o=e.options,i=n.elements.arrow,a=n.modifiersData.popperOffsets,s=hn(n.placement),l=jp(s),u=[bt,Yt].indexOf(s)>=0,c=u?"height":"width";if(!(!i||!a)){var f=O2(o.padding,n),d=Bp(i),p=l==="y"?St:bt,m=l==="y"?Wt:Yt,y=n.rects.reference[c]+n.rects.reference[l]-a[l]-n.rects.popper[c],h=a[l]-n.rects.reference[l],v=Za(i),w=v?l==="y"?v.clientHeight||0:v.clientWidth||0:0,S=y/2-h/2,A=f[p],T=w-d[c]-f[m],C=w/2-d[c]/2+S,O=qi(A,C,T),b=l;n.modifiersData[r]=(t={},t[b]=O,t.centerOffset=O-C,t)}}function P2(e){var t=e.state,n=e.options,r=n.element,o=r===void 0?"[data-popper-arrow]":r;o!=null&&(typeof o=="string"&&(o=t.elements.popper.querySelector(o),!o)||!L1(t.elements.popper,o)||(t.elements.arrow=o))}const k2={name:"arrow",enabled:!0,phase:"main",fn:_2,effect:P2,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Uo(e){return e.split("-")[1]}var T2={top:"auto",right:"auto",bottom:"auto",left:"auto"};function I2(e){var t=e.x,n=e.y,r=window,o=r.devicePixelRatio||1;return{x:Mo(t*o)/o||0,y:Mo(n*o)/o||0}}function Pv(e){var t,n=e.popper,r=e.popperRect,o=e.placement,i=e.variation,a=e.offsets,s=e.position,l=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,m=a.y,y=m===void 0?0:m,h=typeof c=="function"?c({x:p,y}):{x:p,y};p=h.x,y=h.y;var v=a.hasOwnProperty("x"),w=a.hasOwnProperty("y"),S=bt,A=St,T=window;if(u){var C=Za(n),O="clientHeight",b="clientWidth";if(C===nn(n)&&(C=gr(n),Nn(C).position!=="static"&&s==="absolute"&&(O="scrollHeight",b="scrollWidth")),C=C,o===St||(o===bt||o===Yt)&&i===Pa){A=Wt;var E=f&&T.visualViewport?T.visualViewport.height:C[O];y-=E-r.height,y*=l?1:-1}if(o===bt||(o===St||o===Wt)&&i===Pa){S=Yt;var x=f&&T.visualViewport?T.visualViewport.width:C[b];p-=x-r.width,p*=l?1:-1}}var _=Object.assign({position:s},u&&T2),k=c===!0?I2({x:p,y}):{x:p,y};if(p=k.x,y=k.y,l){var D;return Object.assign({},_,(D={},D[A]=w?"0":"",D[S]=v?"0":"",D.transform=(T.devicePixelRatio||1)<=1?"translate("+p+"px, "+y+"px)":"translate3d("+p+"px, "+y+"px, 0)",D))}return Object.assign({},_,(t={},t[A]=w?y+"px":"",t[S]=v?p+"px":"",t.transform="",t))}function N2(e){var t=e.state,n=e.options,r=n.gpuAcceleration,o=r===void 0?!0:r,i=n.adaptive,a=i===void 0?!0:i,s=n.roundOffsets,l=s===void 0?!0:s,u={placement:hn(t.placement),variation:Uo(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:o,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,Pv(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:l})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,Pv(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:l})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const D2={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:N2,data:{}};var As={passive:!0};function R2(e){var t=e.state,n=e.instance,r=e.options,o=r.scroll,i=o===void 0?!0:o,a=r.resize,s=a===void 0?!0:a,l=nn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return i&&u.forEach(function(c){c.addEventListener("scroll",n.update,As)}),s&&l.addEventListener("resize",n.update,As),function(){i&&u.forEach(function(c){c.removeEventListener("scroll",n.update,As)}),s&&l.removeEventListener("resize",n.update,As)}}const L2={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:R2,data:{}};var M2={left:"right",right:"left",bottom:"top",top:"bottom"};function Hs(e){return e.replace(/left|right|bottom|top/g,function(t){return M2[t]})}var F2={start:"end",end:"start"};function kv(e){return e.replace(/start|end/g,function(t){return F2[t]})}function Wp(e){var t=nn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Yp(e){return Fo(gr(e)).left+Wp(e).scrollLeft}function U2(e){var t=nn(e),n=gr(e),r=t.visualViewport,o=n.clientWidth,i=n.clientHeight,a=0,s=0;return r&&(o=r.width,i=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,s=r.offsetTop)),{width:o,height:i,x:a+Yp(e),y:s}}function B2(e){var t,n=gr(e),r=Wp(e),o=(t=e.ownerDocument)==null?void 0:t.body,i=Nr(n.scrollWidth,n.clientWidth,o?o.scrollWidth:0,o?o.clientWidth:0),a=Nr(n.scrollHeight,n.clientHeight,o?o.scrollHeight:0,o?o.clientHeight:0),s=-r.scrollLeft+Yp(e),l=-r.scrollTop;return Nn(o||n).direction==="rtl"&&(s+=Nr(n.clientWidth,o?o.clientWidth:0)-i),{width:i,height:a,x:s,y:l}}function zp(e){var t=Nn(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+o+r)}function B1(e){return["html","body","#document"].indexOf(gn(e))>=0?e.ownerDocument.body:Ut(e)&&zp(e)?e:B1(_u(e))}function Zi(e,t){var n;t===void 0&&(t=[]);var r=B1(e),o=r===((n=e.ownerDocument)==null?void 0:n.body),i=nn(r),a=o?[i].concat(i.visualViewport||[],zp(r)?r:[]):r,s=t.concat(a);return o?s:s.concat(Zi(_u(a)))}function Vf(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function j2(e){var t=Fo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function Tv(e,t){return t===N1?Vf(U2(e)):Lo(t)?j2(t):Vf(B2(gr(e)))}function W2(e){var t=Zi(_u(e)),n=["absolute","fixed"].indexOf(Nn(e).position)>=0,r=n&&Ut(e)?Za(e):e;return Lo(r)?t.filter(function(o){return Lo(o)&&L1(o,r)&&gn(o)!=="body"}):[]}function Y2(e,t,n){var r=t==="clippingParents"?W2(e):[].concat(t),o=[].concat(r,[n]),i=o[0],a=o.reduce(function(s,l){var u=Tv(e,l);return s.top=Nr(u.top,s.top),s.right=Rl(u.right,s.right),s.bottom=Rl(u.bottom,s.bottom),s.left=Nr(u.left,s.left),s},Tv(e,i));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function j1(e){var t=e.reference,n=e.element,r=e.placement,o=r?hn(r):null,i=r?Uo(r):null,a=t.x+t.width/2-n.width/2,s=t.y+t.height/2-n.height/2,l;switch(o){case St:l={x:a,y:t.y-n.height};break;case Wt:l={x:a,y:t.y+t.height};break;case Yt:l={x:t.x+t.width,y:s};break;case bt:l={x:t.x-n.width,y:s};break;default:l={x:t.x,y:t.y}}var u=o?jp(o):null;if(u!=null){var c=u==="y"?"height":"width";switch(i){case Ro:l[u]=l[u]-(t[c]/2-n[c]/2);break;case Pa:l[u]=l[u]+(t[c]/2-n[c]/2);break}}return l}function ka(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=r===void 0?e.placement:r,i=n.boundary,a=i===void 0?l2:i,s=n.rootBoundary,l=s===void 0?N1:s,u=n.elementContext,c=u===void 0?vi:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,m=p===void 0?0:p,y=F1(typeof m!="number"?m:U1(m,qa)),h=c===vi?u2:vi,v=e.rects.popper,w=e.elements[d?h:c],S=Y2(Lo(w)?w:w.contextElement||gr(e.elements.popper),a,l),A=Fo(e.elements.reference),T=j1({reference:A,element:v,strategy:"absolute",placement:o}),C=Vf(Object.assign({},v,T)),O=c===vi?C:A,b={top:S.top-O.top+y.top,bottom:O.bottom-S.bottom+y.bottom,left:S.left-O.left+y.left,right:O.right-S.right+y.right},E=e.modifiersData.offset;if(c===vi&&E){var x=E[o];Object.keys(b).forEach(function(_){var k=[Yt,Wt].indexOf(_)>=0?1:-1,D=[St,Wt].indexOf(_)>=0?"y":"x";b[_]+=x[D]*k})}return b}function z2(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=n.boundary,i=n.rootBoundary,a=n.padding,s=n.flipVariations,l=n.allowedAutoPlacements,u=l===void 0?D1:l,c=Uo(r),f=c?s?Ov:Ov.filter(function(m){return Uo(m)===c}):qa,d=f.filter(function(m){return u.indexOf(m)>=0});d.length===0&&(d=f);var p=d.reduce(function(m,y){return m[y]=ka(e,{placement:y,boundary:o,rootBoundary:i,padding:a})[hn(y)],m},{});return Object.keys(p).sort(function(m,y){return p[m]-p[y]})}function G2(e){if(hn(e)===Up)return[];var t=Hs(e);return[kv(e),t,kv(t)]}function $2(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!0:a,l=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,m=p===void 0?!0:p,y=n.allowedAutoPlacements,h=t.options.placement,v=hn(h),w=v===h,S=l||(w||!m?[Hs(h)]:G2(h)),A=[h].concat(S).reduce(function(le,ue){return le.concat(hn(ue)===Up?z2(t,{placement:ue,boundary:c,rootBoundary:f,padding:u,flipVariations:m,allowedAutoPlacements:y}):ue)},[]),T=t.rects.reference,C=t.rects.popper,O=new Map,b=!0,E=A[0],x=0;x=0,q=B?"width":"height",H=ka(t,{placement:_,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),ce=B?D?Yt:bt:D?Wt:St;T[q]>C[q]&&(ce=Hs(ce));var he=Hs(ce),ye=[];if(i&&ye.push(H[k]<=0),s&&ye.push(H[ce]<=0,H[he]<=0),ye.every(function(le){return le})){E=_,b=!1;break}O.set(_,ye)}if(b)for(var ne=m?3:1,R=function(ue){var ze=A.find(function(Fe){var Ue=O.get(Fe);if(Ue)return Ue.slice(0,ue).every(function(rt){return rt})});if(ze)return E=ze,"break"},Y=ne;Y>0;Y--){var V=R(Y);if(V==="break")break}t.placement!==E&&(t.modifiersData[r]._skip=!0,t.placement=E,t.reset=!0)}}const H2={name:"flip",enabled:!0,phase:"main",fn:$2,requiresIfExists:["offset"],data:{_skip:!1}};function Iv(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function Nv(e){return[St,Yt,Wt,bt].some(function(t){return e[t]>=0})}function V2(e){var t=e.state,n=e.name,r=t.rects.reference,o=t.rects.popper,i=t.modifiersData.preventOverflow,a=ka(t,{elementContext:"reference"}),s=ka(t,{altBoundary:!0}),l=Iv(a,r),u=Iv(s,o,i),c=Nv(l),f=Nv(u);t.modifiersData[n]={referenceClippingOffsets:l,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const J2={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:V2};function Q2(e,t,n){var r=hn(e),o=[bt,St].indexOf(r)>=0?-1:1,i=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=i[0],s=i[1];return a=a||0,s=(s||0)*o,[bt,Yt].indexOf(r)>=0?{x:s,y:a}:{x:a,y:s}}function X2(e){var t=e.state,n=e.options,r=e.name,o=n.offset,i=o===void 0?[0,0]:o,a=D1.reduce(function(c,f){return c[f]=Q2(f,t.rects,i),c},{}),s=a[t.placement],l=s.x,u=s.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=l,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const K2={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:X2};function q2(e){var t=e.state,n=e.name;t.modifiersData[n]=j1({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const Z2={name:"popperOffsets",enabled:!0,phase:"read",fn:q2,data:{}};function eO(e){return e==="x"?"y":"x"}function tO(e){var t=e.state,n=e.options,r=e.name,o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!1:a,l=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,m=n.tetherOffset,y=m===void 0?0:m,h=ka(t,{boundary:l,rootBoundary:u,padding:f,altBoundary:c}),v=hn(t.placement),w=Uo(t.placement),S=!w,A=jp(v),T=eO(A),C=t.modifiersData.popperOffsets,O=t.rects.reference,b=t.rects.popper,E=typeof y=="function"?y(Object.assign({},t.rects,{placement:t.placement})):y,x=typeof E=="number"?{mainAxis:E,altAxis:E}:Object.assign({mainAxis:0,altAxis:0},E),_=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,k={x:0,y:0};if(!!C){if(i){var D,B=A==="y"?St:bt,q=A==="y"?Wt:Yt,H=A==="y"?"height":"width",ce=C[A],he=ce+h[B],ye=ce-h[q],ne=p?-b[H]/2:0,R=w===Ro?O[H]:b[H],Y=w===Ro?-b[H]:-O[H],V=t.elements.arrow,le=p&&V?Bp(V):{width:0,height:0},ue=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:M1(),ze=ue[B],Fe=ue[q],Ue=qi(0,O[H],le[H]),rt=S?O[H]/2-ne-Ue-ze-x.mainAxis:R-Ue-ze-x.mainAxis,us=S?-O[H]/2+ne+Ue+Fe+x.mainAxis:Y+Ue+Fe+x.mainAxis,zu=t.elements.arrow&&Za(t.elements.arrow),vS=zu?A==="y"?zu.clientTop||0:zu.clientLeft||0:0,ch=(D=_==null?void 0:_[A])!=null?D:0,gS=ce+rt-ch-vS,yS=ce+us-ch,fh=qi(p?Rl(he,gS):he,ce,p?Nr(ye,yS):ye);C[A]=fh,k[A]=fh-ce}if(s){var dh,wS=A==="x"?St:bt,SS=A==="x"?Wt:Yt,yr=C[T],cs=T==="y"?"height":"width",ph=yr+h[wS],hh=yr-h[SS],Gu=[St,bt].indexOf(v)!==-1,mh=(dh=_==null?void 0:_[T])!=null?dh:0,vh=Gu?ph:yr-O[cs]-b[cs]-mh+x.altAxis,gh=Gu?yr+O[cs]+b[cs]-mh-x.altAxis:hh,yh=p&&Gu?x2(vh,yr,gh):qi(p?vh:ph,yr,p?gh:hh);C[T]=yh,k[T]=yh-yr}t.modifiersData[r]=k}}const nO={name:"preventOverflow",enabled:!0,phase:"main",fn:tO,requiresIfExists:["offset"]};function rO(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function oO(e){return e===nn(e)||!Ut(e)?Wp(e):rO(e)}function iO(e){var t=e.getBoundingClientRect(),n=Mo(t.width)/e.offsetWidth||1,r=Mo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function aO(e,t,n){n===void 0&&(n=!1);var r=Ut(t),o=Ut(t)&&iO(t),i=gr(t),a=Fo(e,o),s={scrollLeft:0,scrollTop:0},l={x:0,y:0};return(r||!r&&!n)&&((gn(t)!=="body"||zp(i))&&(s=oO(t)),Ut(t)?(l=Fo(t,!0),l.x+=t.clientLeft,l.y+=t.clientTop):i&&(l.x=Yp(i))),{x:a.left+s.scrollLeft-l.x,y:a.top+s.scrollTop-l.y,width:a.width,height:a.height}}function sO(e){var t=new Map,n=new Set,r=[];e.forEach(function(i){t.set(i.name,i)});function o(i){n.add(i.name);var a=[].concat(i.requires||[],i.requiresIfExists||[]);a.forEach(function(s){if(!n.has(s)){var l=t.get(s);l&&o(l)}}),r.push(i)}return e.forEach(function(i){n.has(i.name)||o(i)}),r}function lO(e){var t=sO(e);return w2.reduce(function(n,r){return n.concat(t.filter(function(o){return o.phase===r}))},[])}function uO(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function cO(e){var t=e.reduce(function(n,r){var o=n[r.name];return n[r.name]=o?Object.assign({},o,r,{options:Object.assign({},o.options,r.options),data:Object.assign({},o.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var Dv={placement:"bottom",modifiers:[],strategy:"absolute"};function Rv(){for(var e=arguments.length,t=new Array(e),n=0;n{var l=s,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:o,openDelayMs:i=0}=l,a=$t(l,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);const[u,c]=I.useState(null),[f,d]=I.useState(null),[p,m]=I.useState(null),{styles:y,attributes:h,update:v}=SO(u,f,{placement:t,modifiers:[{name:"arrow",options:{element:p}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),w=I.useMemo(()=>$(F({},y.popper),{backgroundColor:o}),[o,y.popper]),S=I.useMemo(()=>{let T;function C(){T=setTimeout(()=>{v==null||v(),f==null||f.setAttribute("data-show","")},i)}function O(){clearTimeout(T),f==null||f.removeAttribute("data-show")}return{[n==="hover"?"onMouseEnter":"onClick"]:()=>C(),onMouseLeave:()=>O()}},[i,f,n,v]),A=typeof r=="string";return N(Me,{children:[g("button",$(F(F({},a),S),{ref:c,children:e})),N("div",$(F({ref:d,className:xc.popover,style:w},h.popper),{children:[A?g("div",{className:xc.textContent,children:r}):r,g("div",{ref:m,className:xc.popperArrow,style:y.arrow})]}))]})},AO="_infoIcon_15ri6_1",xO="_container_15ri6_10",OO="_header_15ri6_15",_O="_info_15ri6_1",PO="_unit_15ri6_27",kO="_description_15ri6_31",to={infoIcon:AO,container:xO,header:OO,info:_O,unit:PO,description:kO},W1=({units:e})=>g(Gp,{className:to.infoIcon,popoverContent:g(TO,{units:e}),openDelayMs:500,placement:"auto",children:g(OA,{})});function TO({units:e}){return N("div",{className:to.container,children:[g("div",{className:to.header,children:"CSS size options"}),g("div",{className:to.info,children:e.map(t=>N(I.Fragment,{children:[g("div",{className:to.unit,children:t}),g("div",{className:to.description,children:IO[t]})]},t))})]})}const IO={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},NO="_wrapper_13r28_1",DO="_unitSelector_13r28_10",Ll={wrapper:NO,unitSelector:DO};function RO(e){const[t,n]=j.exports.useState(T1(e)),r=j.exports.useCallback(i=>{if(i===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:i})},[t.unit]),o=j.exports.useCallback(i=>{n(a=>{const s=a.unit;return i==="auto"?{unit:i,count:null}:s==="auto"?{unit:i,count:Y1[i]}:{unit:i,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:o}}const Y1={fr:1,px:10,rem:1,"%":100};function LO({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:o,updateCount:i,updateUnit:a}=RO(e!=null?e:"auto"),s=I.useMemo(()=>Fp(u=>{t(u)},500),[t]);if(I.useEffect(()=>{const u=Wn(o);if(e!==u)return s(Wn(o)),()=>s.cancel()},[o,s,e]),e===void 0&&!r)return null;const l=r||o.count===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(Wn(o))},children:[g(Mp,{ariaLabel:"value-count",value:l?void 0:o.count,disabled:l,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>g("option",{value:u,children:u},u))}),g(W1,{units:n})]})}function yn(s){var l=s,{name:e,label:t,onChange:n,optional:r,value:o,defaultValue:i="10px"}=l,a=$t(l,["name","label","onChange","optional","value","defaultValue"]);const u=$r(n),c=o===void 0;return g(Lp,{name:e,label:t,optional:r,isDisabled:c,defaultValue:i,width_setting:"fit",mainInput:g(LO,$(F({value:o!=null?o:i},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function MO({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:o}=T1(e),i=I.useCallback(l=>{if(l===void 0){if(o!=="auto")throw new Error("Undefined count with auto units");t(Wn({unit:o,count:null}));return}if(o==="auto"){console.error("How did you change the count of an auto unit?");return}t(Wn({unit:o,count:l}))},[t,o]),a=I.useCallback(l=>{if(l==="auto"){t(Wn({unit:l,count:null}));return}if(o==="auto"){t(Wn({unit:l,count:Y1[l]}));return}t(Wn({unit:l,count:r}))},[r,t,o]),s=r===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",children:[g(Mp,{ariaLabel:"value-count",value:s?void 0:r,disabled:s,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o,onChange:l=>a(l.target.value),children:n.map(l=>g("option",{value:l,children:l},l))}),g(W1,{units:n})]})}const FO="_tractInfoDisplay_9993b_1",UO="_sizeWidget_9993b_61",BO="_hoverListener_9993b_88",jO="_buttons_9993b_108",WO="_tractAddButton_9993b_121",YO="_deleteButton_9993b_122",co={tractInfoDisplay:FO,sizeWidget:UO,hoverListener:BO,buttons:jO,tractAddButton:WO,deleteButton:YO},zO=["fr","px"];function GO({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:o}){const i=j.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=j.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),s=j.exports.useCallback(()=>a(t),[a,t]),l=j.exports.useCallback(()=>a(t+1),[a,t]),u=j.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return N("div",{className:co.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[g("div",{className:co.hoverListener}),N("div",{className:co.sizeWidget,onClick:HO,children:[N("div",{className:co.buttons,children:[g(Lv,{dir:e,onClick:s}),g($O,{onClick:u,deletionConflicts:o}),g(Lv,{dir:e,onClick:l})]}),g(MO,{value:n,units:zO,onChange:i})]})]})}const z1=200;function $O({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return g(Gp,{className:co.deleteButton,onClick:G1(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:z1,children:g(Sp,{})})}function Lv({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return g(Gp,{className:co.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:G1(t),openDelayMs:z1,children:g(C1,{})})}function G1(e){return function(t){t.currentTarget.blur(),e==null||e()}}function Mv({dir:e,sizes:t,areas:n,onUpdate:r}){const o=j.exports.useCallback(({dir:i,index:a})=>k1(n,{dir:i,index:a+1}),[n]);return g(Me,{children:t.map((i,a)=>g(GO,{index:a,dir:e,size:i,onUpdate:r,deletionConflicts:o({dir:e,index:a})},e+a))})}function HO(e){e.stopPropagation()}const VO="_columnSizer_3i83d_1",JO="_rowSizer_3i83d_2",Fv={columnSizer:VO,rowSizer:JO};function Uv({dir:e,index:t,onStartDrag:n}){return g("div",{className:e==="rows"?Fv.rowSizer:Fv.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function QO(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const Ml=40,XO=.15,$1=e=>t=>Math.round(t/e)*e,KO=5,$p=$1(KO),qO=.01,ZO=$1(qO),Bv=e=>Number(e.toFixed(4));function e3(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const o=ZO(e*t),i=n.count+o,a=r.count-o;return(o<0?i/a:a/i)=i.length?null:i[u];if(c==="auto"||f==="auto"){const m=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=m[l],i[l]=c),f==="auto"&&(f=m[u],i[u]=f),r.style[o]=m.join(" ")}const d=o3(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=$(F({dir:t,mouseStart:V1(e,t),originalSizes:i,currentSizes:[...i],beforeIndex:l,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=i3({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function s3({mousePosition:e,drag:t,container:n}){const o=V1(e,t.dir)-t.mouseStart,i=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=n3(o,t);break;case"after-pixel":a=r3(o,t);break;case"both-pixel":a=t3(o,t);break;case"both-relative":a=e3(o,t);break}a!=="no-change"&&(a.beforeSize&&(i[t.beforeIndex]=a.beforeSize),a.afterSize&&(i[t.afterIndex]=a.afterSize),t.currentSizes=i,t.dir==="cols"?n.style.gridTemplateColumns=i.join(" "):n.style.gridTemplateRows=i.join(" "))}function l3(e){return e.match(/[0-9|.]+px/)!==null}function H1(e){return e.match(/[0-9|.]+fr/)!==null}function Fl(e){if(H1(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(l3(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function V1(e,t){return t==="rows"?e.clientY:e.clientX}function u3(e){return e.some(t=>H1(t))}function c3(e){return e.some(t=>t==="auto")}function jv(e,t){const n=Math.abs(t-e)+1,r=ee+i*r)}function f3({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(o=>`"${o.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function Wv(e){return e.split(" ")}function d3(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function p3(e){const t=Wv(e.style.gridTemplateRows),n=Wv(e.style.gridTemplateColumns),r=d3(e.style.gridTemplateAreas),o=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:o}}function h3({containerRef:e,onDragEnd:t}){return I.useCallback(({e:r,dir:o,index:i})=>{const a=QO(e,"How are you dragging on an element without a container?");r.preventDefault();const s=a3({mousePosition:r,dir:o,index:i,container:a}),{beforeIndex:l,afterIndex:u}=s,c=Yv(a,{dir:o,index:l,size:s.currentSizes[l]}),f=Yv(a,{dir:o,index:u,size:s.currentSizes[u]});m3(a,s.dir,{move:d=>{s3({mousePosition:d,drag:s,container:a}),c.update(s.currentSizes[l]),f.update(s.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(p3(a))}})},[e,t])}function Yv(e,{dir:t,index:n,size:r}){const o=document.createElement("div"),i=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(o.style,i,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,o.appendChild(a),e.appendChild(o),{remove:()=>o.remove(),update:s=>{a.innerHTML=s}}}function m3(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const o=()=>{i(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",o),r.addEventListener("mouseleave",o);function i(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",o),r.removeEventListener("mouseleave",o),r.remove()}}const v3="1fr";function g3(o){var i=o,{className:e,children:t,onNewLayout:n}=i,r=$t(i,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:s}=r,l=j.exports.useRef(null),u=f3(r),c=jv(2,s.length),f=jv(2,a.length),d=h3({containerRef:l,onDragEnd:n}),p=[Zx.ResizableGrid];e&&p.push(e);const m=j.exports.useCallback(h=>{switch(h.type){case"ADD":return _1(r,{afterIndex:h.index,dir:h.dir,size:v3});case"RESIZE":return y3(r,h);case"DELETE":return P1(r,h)}},[r]),y=j.exports.useCallback(h=>n(m(h)),[m,n]);return N("div",{className:p.join(" "),ref:l,style:u,children:[c.map(h=>g(Uv,{dir:"cols",index:h,onStartDrag:d},"cols"+h)),f.map(h=>g(Uv,{dir:"rows",index:h,onStartDrag:d},"rows"+h)),t,g(Mv,{dir:"cols",sizes:s,areas:r.areas,onUpdate:y}),g(Mv,{dir:"rows",sizes:a,areas:r.areas,onUpdate:y})]})}function y3(e,{dir:t,index:n,size:r}){return ei(e,o=>{o[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function w3(e,r){var o=r,{name:t}=o,n=$t(o,["name"]);const{rowStart:i,colStart:a}=n,s="rowEnd"in n?n.rowEnd:i+n.rowSpan-1,l="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Ou(e.areas);for(let c=0;c=i-1&&c=a-1&&d{for(let o of n)S3(r,o)})}function b3(e,t){return J1(e,t)}function E3(e,t,n){return ei(e,({areas:r})=>{const{numRows:o,numCols:i}=Ka(r);for(let a=0;a{const i=n==="rows"?"row_sizes":"col_sizes";o[i][t-1]=r})}function A3(e,{item_a:t,item_b:n}){return t===n?e:ei(e,r=>{const{n_rows:o,n_cols:i}=x3(r.areas);let a=!1,s=!1;for(let l=0;l{a.current&&r&&setTimeout(()=>{var s;return(s=a==null?void 0:a.current)==null?void 0:s.focus()},1)},[r]),g("input",{ref:a,className:k3.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:i,onChange:s=>n(s.target.value),disabled:o})}function pe({name:e,label:t,value:n,placeholder:r,onChange:o,autoFocus:i=!1,optional:a=!1,defaultValue:s="my-text"}){const l=$r(o),u=n===void 0,c=I.useRef(null);return I.useEffect(()=>{c.current&&i&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[i]),g(Lp,{name:e,label:t,optional:a,isDisabled:u,defaultValue:s,width_setting:"full",mainInput:g(T3,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>l({name:e,value:f}),autoFocus:i,disabled:u})})}const I3="_container_1ehu8_1",N3="_elementsPanel_1ehu8_28",D3="_propertiesPanel_1ehu8_33",R3="_editorHolder_1ehu8_47",L3="_titledPanel_1ehu8_59",M3="_panelTitleHeader_1ehu8_71",F3="_header_1ehu8_80",U3="_rightSide_1ehu8_88",B3="_divider_1ehu8_109",j3="_title_1ehu8_59",W3="_shinyLogo_1ehu8_120",Q1={container:I3,elementsPanel:N3,propertiesPanel:D3,editorHolder:R3,titledPanel:L3,panelTitleHeader:M3,header:F3,rightSide:U3,divider:B3,title:j3,shinyLogo:W3},Y3="_portalHolder_18ua3_1",z3="_portalModal_18ua3_11",G3="_title_18ua3_21",$3="_body_18ua3_25",H3="_portalForm_18ua3_30",V3="_portalFormInputs_18ua3_35",J3="_portalFormFooter_18ua3_42",Q3="_validationMsg_18ua3_48",X3="_infoText_18ua3_53",xs={portalHolder:Y3,portalModal:z3,title:G3,body:$3,portalForm:H3,portalFormInputs:V3,portalFormFooter:J3,validationMsg:Q3,infoText:X3},K3=({children:e,el:t="div"})=>{const[n]=j.exports.useState(document.createElement(t));return j.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Na.exports.createPortal(e,n)},X1=({children:e,title:t,label:n,onConfirm:r,onCancel:o})=>g(K3,{children:g("div",{className:xs.portalHolder,onClick:()=>o(),onKeyDown:i=>{i.key==="Escape"&&o()},children:N("div",{className:xs.portalModal,onClick:i=>i.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?g("div",{className:xs.title+" "+Q1.panelTitleHeader,children:t}):null,g("div",{className:xs.body,children:e})]})})}),q3="_portalHolder_18ua3_1",Z3="_portalModal_18ua3_11",e_="_title_18ua3_21",t_="_body_18ua3_25",n_="_portalForm_18ua3_30",r_="_portalFormInputs_18ua3_35",o_="_portalFormFooter_18ua3_42",i_="_validationMsg_18ua3_48",a_="_infoText_18ua3_53",gi={portalHolder:q3,portalModal:Z3,title:e_,body:t_,portalForm:n_,portalFormInputs:r_,portalFormFooter:o_,validationMsg:i_,infoText:a_};function s_({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[o,i]=I.useState(r),[a,s]=I.useState(null),l=I.useCallback(c=>{c&&c.preventDefault();const f=l_({name:o,existingAreaNames:n});if(f){s(f);return}t(o)},[n,o,t]),u=I.useCallback(({value:c})=>{s(null),i(c!=null?c:r)},[r]);return N(X1,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(o),onCancel:e,children:[g("form",{className:gi.portalForm,onSubmit:l,children:N("div",{className:gi.portalFormInputs,children:[g("span",{className:gi.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),g(pe,{label:"Name of new grid area",name:"New-Item-Name",value:o,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?g("div",{className:gi.validationMsg,children:a}):null]})}),N("div",{className:gi.portalFormFooter,children:[g(wt,{variant:"delete",onClick:e,children:"Cancel"}),g(wt,{onClick:()=>l(),children:"Done"})]})]})}function l_({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const u_="_container_1hvsg_1",c_={container:u_},K1=I.createContext(null),f_=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:o,compRef:i})=>{const a=vr(),s=Ew(),{onClick:l}=r,{uniqueAreas:u}=Qx(e),T=e,{areas:c}=T,f=$t(T,["areas"]),d=C=>{a(Sw({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:F(F({},f),C)}}))},p=I.useMemo(()=>Rp(c),[c]),[m,y]=I.useState(null),h=C=>{const{node:O,currentPath:b,pos:E}=C,x=b!==void 0,_=$f.includes(O.uiName);if(x&&_&&"area"in O.uiArguments&&O.uiArguments.area){const k=O.uiArguments.area;v({type:"MOVE_ITEM",name:k,pos:E});return}y(C)},v=C=>{d(Hp(e,C))},w=u.map(C=>g(zx,{area:C,areas:c,gridLocation:p.get(C),onNewPos:O=>v({type:"MOVE_ITEM",name:C,pos:O})},C)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},A=(C,{node:O,currentPath:b,pos:E})=>{if($f.includes(O.uiName)){const x=$(F({},O.uiArguments),{area:C});O.uiArguments=x}else O={uiName:"gridlayout::grid_card",uiArguments:{area:C},uiChildren:[O]};s({parentPath:[],node:O,currentPath:b}),v({type:"ADD_ITEM",name:C,pos:E}),y(null)};return N(K1.Provider,{value:v,children:[g("div",{ref:i,style:S,className:c_.container,onClick:l,draggable:!1,onDragStart:()=>{},children:N(g3,$(F({},e),{onNewLayout:d,children:[Jx(c).map(({row:C,col:O})=>g(Hx,{gridRow:C,gridColumn:O,onDroppedNode:h},Mx({row:C,col:O}))),t==null?void 0:t.map((C,O)=>g(Ep,F({path:[...o.path,O]},C),o.path.join(".")+O)),n,w]}))}),m?g(s_,{info:m,onCancel:()=>y(null),onDone:C=>A(C,m),existingAreaNames:u}):null]})};function d_(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function p_(){return I.useContext(K1)}function Vp({containerRef:e,path:t,area:n}){const r=p_(),o=I.useCallback(({node:a,currentPath:s})=>s===void 0||!$f.includes(a.uiName)?!1:Np(s,t),[t]),i=I.useCallback(a=>{var l;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const s=(l=a.node.uiArguments.area)!=null?l:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:s})},[n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i,canAcceptDropClass:xt.availableToSwap,hoveringOverClass:xt.hoveringOverSwap})}const h_=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:o},children:i,eventHandlers:a,compRef:s})=>{const l=r.length>0;return Vp({containerRef:s,area:e,path:o}),N(Cp,{className:xt.container+" "+(n?xt.withTitle:""),ref:s,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?g(WA,{className:xt.panelTitle,children:n}):null,N("div",{className:xt.contentHolder,"data-alignment":"top",children:[g(zv,{index:0,parentPath:o,numChildren:r.length}),l?r==null?void 0:r.map((u,c)=>N(I.Fragment,{children:[g(Ep,F({path:[...o,c]},u)),g(zv,{index:c+1,numChildren:r.length,parentPath:o})]},o.join(".")+c)):g(v_,{path:o})]}),i]})};function zv({index:e,numChildren:t,parentPath:n}){const r=I.useRef(null);Ax({watcherRef:r,positionInChildren:e,parentPath:n});const o=m_(e,t);return g("div",{ref:r,className:xt.dropWatcher+" "+o,"aria-label":"drop watcher"})}function m_(e,t){return e===0&&t===0?xt.onlyDropWatcher:e===0?xt.firstDropWatcher:e===t?xt.lastDropWatcher:xt.middleDropWatcher}function v_({path:e}){return N("div",{className:xt.emptyGridCard,children:[g("span",{className:xt.emptyMessage,children:"Empty grid card"}),g(m1,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const g_=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e.area}),g(pe,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),g(yn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},y_={area:"default-area",item_gap:"12px"},w_={title:"Grid Card",UiComponent:h_,SettingsComponent:g_,acceptsChildren:!0,defaultSettings:y_,iconSrc:dA,category:"gridlayout"},q1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function S_(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const Z1=({type:e,name:t,className:n})=>N("code",{className:n,children:[N("span",{style:{opacity:.55},children:[e,"$"]}),g("span",{children:t})]}),b_="_container_1rlbk_1",E_="_plotPlaceholder_1rlbk_5",C_="_label_1rlbk_19",Jf={container:b_,plotPlaceholder:E_,label:C_};function ew({outputId:e}){const t=j.exports.useRef(null),n=A_(t),r=n===null?100:Math.min(n.width,n.height);return N("div",{ref:t,className:Jf.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[g(Z1,{className:Jf.label,type:"output",name:e}),g(S_,{size:`calc(${r}px - 80px)`})]})}function A_(e){const[t,n]=j.exports.useState(null);return j.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(o=>{if(!e.current)return;const{offsetHeight:i,offsetWidth:a}=e.current;n({width:a,height:i})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const x_="_gridCardPlot_1a94v_1",O_={gridCardPlot:x_},__=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:o,compRef:i})=>(Vp({containerRef:i,area:t,path:r}),N(Cp,$(F({ref:i,style:{gridArea:t},className:O_.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},o),{children:[g(ew,{outputId:e!=null?e:t}),n]}))),P_=({settings:{area:e,outputId:t}})=>N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e}),g(pe,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),k_={title:"Grid Plot Card",UiComponent:__,SettingsComponent:P_,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:q1,category:"gridlayout"},T_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",I_="_textPanel_525i2_1",N_={textPanel:I_},D_=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:o},eventHandlers:i,compRef:a})=>(Vp({containerRef:a,area:t,path:o}),N(Cp,$(F({ref:a,className:N_.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},i),{children:[g("h1",{children:e}),r]}))),R_="_checkboxInput_12wa8_1",L_="_checkboxLabel_12wa8_10",Gv={checkboxInput:R_,checkboxLabel:L_};function tw({name:e,label:t,value:n,onChange:r,disabled:o,noLabel:i}){const a=$r(r),s=i?void 0:t!=null?t:e,l=`${e}-checkbox-input`,u=N(Me,{children:[g("input",{className:Gv.checkboxInput,id:l,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:o,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),g("label",{className:Gv.checkboxLabel,htmlFor:l,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return s!==void 0?N("div",{className:kn.container,children:[N("label",{className:kn.label,children:[s,":"]}),u]}):u}const M_="_radioContainer_1regb_1",F_="_option_1regb_15",U_="_radioInput_1regb_22",B_="_radioLabel_1regb_26",j_="_icon_1regb_41",yi={radioContainer:M_,option:F_,radioInput:U_,radioLabel:B_,icon:j_};function W_({name:e,label:t,options:n,currentSelection:r,onChange:o,optionsPerColumn:i}){const a=Object.keys(n),s=$r(o),l=j.exports.useMemo(()=>({gridTemplateColumns:i?`repeat(${i}, 1fr)`:void 0}),[i]);return N("div",{className:kn.container,"data-full-width":"true",children:[N("label",{htmlFor:e,className:kn.label,children:[t!=null?t:e,":"]}),g("fieldset",{className:yi.radioContainer,id:e,style:l,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return N("div",{className:yi.option,children:[g("input",{className:yi.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>s({name:e,value:u}),checked:u===r}),g("label",{className:yi.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?g("img",{src:c,alt:f,className:yi.icon}):c})]},u)})})]})}const Y_={start:{icon:f1,label:"left"},center:{icon:Mf,label:"center"},end:{icon:d1,label:"right"}},z_=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),g(pe,{name:"content",label:"Panel content",value:e.content}),g(W_,{name:"alignment",label:"Text Alignment",options:Y_,currentSelection:e.alignment,optionsPerColumn:3}),g(tw,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},G_={title:"Grid Text Card",UiComponent:D_,SettingsComponent:z_,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:T_,category:"gridlayout"},$_=({settings:e})=>g(Me,{children:g(yn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function H_(e,{path:t,node:n}){var s;const r=nw({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:o}=r,i=d_(o.uiChildren)[t[0]],a=(s=n.uiArguments.area)!=null?s:vn;i!==a&&(o.uiArguments=Hp(o.uiArguments,{type:"RENAME_ITEM",oldName:i,newName:a}))}function V_(e,{path:t}){const n=nw({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:o}=n,i=o.uiArguments.area;if(!i){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Hp(r.uiArguments,{type:"REMOVE_ITEM",name:i})}function nw({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=rr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const J_={title:"Grid Page",UiComponent:f_,SettingsComponent:$_,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:H_,DELETE_NODE:V_},category:"gridlayout"},Q_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",X_=({settings:e})=>{const{inputId:t,label:n}=e;return N(Me,{children:[g(pe,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),g(pe,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},K_="_container_tyghz_1",q_={container:K_},Z_=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:o="My Action Button",width:i}=e;return N("div",$(F({className:q_.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[g(wt,{style:i?{width:i}:void 0,children:o}),t]}))},e4={title:"Action Button",UiComponent:Z_,SettingsComponent:X_,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:Q_,category:"Inputs"},t4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",n4="_categoryDivider_8d7ls_1",r4={categoryDivider:n4};function ti({category:e}){return g("div",{className:r4.categoryDivider,children:g("span",{children:e?`${e}:`:null})})}function o4(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var rw={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function $v(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function wn(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function s4(e,t){if(e==null)return{};var n=a4(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function l4(e){return u4(e)||c4(e)||f4(e)||d4()}function u4(e){if(Array.isArray(e))return Qf(e)}function c4(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function f4(e,t){if(!!e){if(typeof e=="string")return Qf(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Qf(e,t)}}function Qf(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function h4(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function Xt(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Ul(e,t):Ul(e,t))||r&&e===n)return e;if(e===n)break}while(e=h4(e))}return null}var Vv=/\s+/g;function _e(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(Vv," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(Vv," ")}}function G(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function Dr(e,t){var n="";if(typeof e=="string")n=e;else do{var r=G(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var o=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return o&&new o(n)}function sw(e,t,n){if(e){var r=e.getElementsByTagName(t),o=0,i=r.length;if(n)for(;o=i:a=o<=i,!a)return r;if(r===mn())break;r=Vn(r,!1)}return!1}function Bo(e,t,n,r){for(var o=0,i=0,a=e.children;i2&&arguments[2]!==void 0?arguments[2]:{},o=r.evt,i=s4(r,b4);ts.pluginEvent.bind(Q)(t,n,wn({dragEl:U,parentEl:ke,ghostEl:Z,rootEl:be,nextEl:xr,lastDownEl:Qs,cloneEl:Oe,cloneHidden:Yn,dragStarted:Fi,putSortable:$e,activeSortable:Q.active,originalEvent:o,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un,hideGhostForTarget:pw,unhideGhostForTarget:hw,cloneNowHidden:function(){Yn=!0},cloneNowShown:function(){Yn=!1},dispatchSortableEvent:function(s){ot({sortable:n,name:s,originalEvent:o})}},i))};function ot(e){Mi(wn({putSortable:$e,cloneEl:Oe,targetEl:U,rootEl:be,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un},e))}var U,ke,Z,be,xr,Qs,Oe,Yn,fo,At,na,Un,Os,$e,no=!1,Bl=!1,jl=[],wr,Vt,kc,Tc,Kv,qv,Fi,Kr,ra,oa=!1,_s=!1,Xs,Qe,Ic=[],Xf=!1,Wl=[],Pu=typeof document!="undefined",Ps=ow,Zv=es||Rn?"cssFloat":"float",E4=Pu&&!iw&&!ow&&"draggable"in document.createElement("div"),cw=function(){if(!!Pu){if(Rn)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),fw=function(t,n){var r=G(t),o=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),i=Bo(t,0,n),a=Bo(t,1,n),s=i&&G(i),l=a&&G(a),u=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Ae(i).width,c=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Ae(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(i&&s.float&&s.float!=="none"){var f=s.float==="left"?"left":"right";return a&&(l.clear==="both"||l.clear===f)?"vertical":"horizontal"}return i&&(s.display==="block"||s.display==="flex"||s.display==="table"||s.display==="grid"||u>=o&&r[Zv]==="none"||a&&r[Zv]==="none"&&u+c>o)?"vertical":"horizontal"},C4=function(t,n,r){var o=r?t.left:t.top,i=r?t.right:t.bottom,a=r?t.width:t.height,s=r?n.left:n.top,l=r?n.right:n.bottom,u=r?n.width:n.height;return o===s||i===l||o+a/2===s+u/2},A4=function(t,n){var r;return jl.some(function(o){var i=o[Ze].options.emptyInsertThreshold;if(!(!i||Jp(o))){var a=Ae(o),s=t>=a.left-i&&t<=a.right+i,l=n>=a.top-i&&n<=a.bottom+i;if(s&&l)return r=o}}),r},dw=function(t){function n(i,a){return function(s,l,u,c){var f=s.options.group.name&&l.options.group.name&&s.options.group.name===l.options.group.name;if(i==null&&(a||f))return!0;if(i==null||i===!1)return!1;if(a&&i==="clone")return i;if(typeof i=="function")return n(i(s,l,u,c),a)(s,l,u,c);var d=(a?s:l).options.group.name;return i===!0||typeof i=="string"&&i===d||i.join&&i.indexOf(d)>-1}}var r={},o=t.group;(!o||Js(o)!="object")&&(o={name:o}),r.name=o.name,r.checkPull=n(o.pull,!0),r.checkPut=n(o.put),r.revertClone=o.revertClone,t.group=r},pw=function(){!cw&&Z&&G(Z,"display","none")},hw=function(){!cw&&Z&&G(Z,"display","")};Pu&&!iw&&document.addEventListener("click",function(e){if(Bl)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Bl=!1,!1},!0);var Sr=function(t){if(U){t=t.touches?t.touches[0]:t;var n=A4(t.clientX,t.clientY);if(n){var r={};for(var o in t)t.hasOwnProperty(o)&&(r[o]=t[o]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[Ze]._onDragOver(r)}}},x4=function(t){U&&U.parentNode[Ze]._isOutsideThisEl(t.target)};function Q(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=zt({},t),e[Ze]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return fw(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,s){a.setData("Text",s.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:Q.supportPointer!==!1&&"PointerEvent"in window&&!ea,emptyInsertThreshold:5};ts.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);dw(t);for(var o in this)o.charAt(0)==="_"&&typeof this[o]=="function"&&(this[o]=this[o].bind(this));this.nativeDraggable=t.forceFallback?!1:E4,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ie(e,"pointerdown",this._onTapStart):(ie(e,"mousedown",this._onTapStart),ie(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ie(e,"dragover",this),ie(e,"dragenter",this)),jl.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),zt(this,y4())}Q.prototype={constructor:Q,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Kr=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,U):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,o=this.options,i=o.preventOnFilter,a=t.type,s=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,l=(s||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||l,c=o.filter;if(D4(r),!U&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||o.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&ea&&l&&l.tagName.toUpperCase()==="SELECT")&&(l=Xt(l,o.draggable,r,!1),!(l&&l.animated)&&Qs!==l)){if(fo=Te(l),na=Te(l,o.draggable),typeof c=="function"){if(c.call(this,t,l,this)){ot({sortable:n,rootEl:u,name:"filter",targetEl:l,toEl:r,fromEl:r}),ut("filter",n,{evt:t}),i&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=Xt(u,f.trim(),r,!1),f)return ot({sortable:n,rootEl:f,name:"filter",targetEl:l,fromEl:r,toEl:r}),ut("filter",n,{evt:t}),!0}),c)){i&&t.cancelable&&t.preventDefault();return}o.handle&&!Xt(u,o.handle,r,!1)||this._prepareDragStart(t,s,l)}}},_prepareDragStart:function(t,n,r){var o=this,i=o.el,a=o.options,s=i.ownerDocument,l;if(r&&!U&&r.parentNode===i){var u=Ae(r);if(be=i,U=r,ke=U.parentNode,xr=U.nextSibling,Qs=r,Os=a.group,Q.dragged=U,wr={target:U,clientX:(n||t).clientX,clientY:(n||t).clientY},Kv=wr.clientX-u.left,qv=wr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,U.style["will-change"]="all",l=function(){if(ut("delayEnded",o,{evt:t}),Q.eventCanceled){o._onDrop();return}o._disableDelayedDragEvents(),!Hv&&o.nativeDraggable&&(U.draggable=!0),o._triggerDragStart(t,n),ot({sortable:o,name:"choose",originalEvent:t}),_e(U,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){sw(U,c.trim(),Nc)}),ie(s,"dragover",Sr),ie(s,"mousemove",Sr),ie(s,"touchmove",Sr),ie(s,"mouseup",o._onDrop),ie(s,"touchend",o._onDrop),ie(s,"touchcancel",o._onDrop),Hv&&this.nativeDraggable&&(this.options.touchStartThreshold=4,U.draggable=!0),ut("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(es||Rn))){if(Q.eventCanceled){this._onDrop();return}ie(s,"mouseup",o._disableDelayedDrag),ie(s,"touchend",o._disableDelayedDrag),ie(s,"touchcancel",o._disableDelayedDrag),ie(s,"mousemove",o._delayedDragTouchMoveHandler),ie(s,"touchmove",o._delayedDragTouchMoveHandler),a.supportPointer&&ie(s,"pointermove",o._delayedDragTouchMoveHandler),o._dragStartTimer=setTimeout(l,a.delay)}else l()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){U&&Nc(U),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;te(t,"mouseup",this._disableDelayedDrag),te(t,"touchend",this._disableDelayedDrag),te(t,"touchcancel",this._disableDelayedDrag),te(t,"mousemove",this._delayedDragTouchMoveHandler),te(t,"touchmove",this._delayedDragTouchMoveHandler),te(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ie(document,"pointermove",this._onTouchMove):n?ie(document,"touchmove",this._onTouchMove):ie(document,"mousemove",this._onTouchMove):(ie(U,"dragend",this),ie(be,"dragstart",this._onDragStart));try{document.selection?Ks(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(no=!1,be&&U){ut("dragStarted",this,{evt:n}),this.nativeDraggable&&ie(document,"dragover",x4);var r=this.options;!t&&_e(U,r.dragClass,!1),_e(U,r.ghostClass,!0),Q.active=this,t&&this._appendGhost(),ot({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(Vt){this._lastX=Vt.clientX,this._lastY=Vt.clientY,pw();for(var t=document.elementFromPoint(Vt.clientX,Vt.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(Vt.clientX,Vt.clientY),t!==n);)n=t;if(U.parentNode[Ze]._isOutsideThisEl(t),n)do{if(n[Ze]){var r=void 0;if(r=n[Ze]._onDragOver({clientX:Vt.clientX,clientY:Vt.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);hw()}},_onTouchMove:function(t){if(wr){var n=this.options,r=n.fallbackTolerance,o=n.fallbackOffset,i=t.touches?t.touches[0]:t,a=Z&&Dr(Z,!0),s=Z&&a&&a.a,l=Z&&a&&a.d,u=Ps&&Qe&&Qv(Qe),c=(i.clientX-wr.clientX+o.x)/(s||1)+(u?u[0]-Ic[0]:0)/(s||1),f=(i.clientY-wr.clientY+o.y)/(l||1)+(u?u[1]-Ic[1]:0)/(l||1);if(!Q.active&&!no){if(r&&Math.max(Math.abs(i.clientX-this._lastX),Math.abs(i.clientY-this._lastY))=0&&(ot({rootEl:ke,name:"add",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"remove",toEl:ke,originalEvent:t}),ot({rootEl:ke,name:"sort",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),$e&&$e.save()):At!==fo&&At>=0&&(ot({sortable:this,name:"update",toEl:ke,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),Q.active&&((At==null||At===-1)&&(At=fo,Un=na),ot({sortable:this,name:"end",toEl:ke,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){ut("nulling",this),be=U=ke=Z=xr=Oe=Qs=Yn=wr=Vt=Fi=At=Un=fo=na=Kr=ra=$e=Os=Q.dragged=Q.ghost=Q.clone=Q.active=null,Wl.forEach(function(t){t.checked=!0}),Wl.length=kc=Tc=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":U&&(this._onDragOver(t),O4(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,o=0,i=r.length,a=this.options;or.right+o||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+o}function T4(e,t,n,r,o,i,a,s){var l=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(s&&Xsc+u*i/2:lf-Xs)return-ra}else if(l>c+u*(1-o)/2&&lf-u*i/2)?l>c+u/2?1:-1:0}function I4(e){return Te(U)1&&(K.forEach(function(s){i.addAnimationState({target:s,rect:ct?Ae(s):a}),_c(s),s.fromRect=a,r.removeAnimationState(s)}),ct=!1,U4(!this.options.removeCloneOnHide,o))},dragOverCompleted:function(n){var r=n.sortable,o=n.isOwner,i=n.insertion,a=n.activeSortable,s=n.parentEl,l=n.putSortable,u=this.options;if(i){if(o&&a._hideClone(),Si=!1,u.animation&&K.length>1&&(ct||!o&&!a.options.sort&&!l)){var c=Ae(ve,!1,!0,!0);K.forEach(function(d){d!==ve&&(Xv(d,c),s.appendChild(d))}),ct=!0}if(!o)if(ct||Is(),K.length>1){var f=Ts;a._showClone(r),a.options.animation&&!Ts&&f&&Ct.forEach(function(d){a.addAnimationState({target:d,rect:bi}),d.fromRect=bi,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,o=n.isOwner,i=n.activeSortable;if(K.forEach(function(s){s.thisAnimationDuration=null}),i.options.animation&&!o&&i.multiDrag.isMultiDrag){bi=zt({},r);var a=Dr(ve,!0);bi.top-=a.f,bi.left-=a.e}},dragOverAnimationComplete:function(){ct&&(ct=!1,Is())},drop:function(n){var r=n.originalEvent,o=n.rootEl,i=n.parentEl,a=n.sortable,s=n.dispatchSortableEvent,l=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=i.children;if(!qr)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),_e(ve,f.selectedClass,!~K.indexOf(ve)),~K.indexOf(ve))K.splice(K.indexOf(ve),1),wi=null,Mi({sortable:a,rootEl:o,name:"deselect",targetEl:ve,originalEvent:r});else{if(K.push(ve),Mi({sortable:a,rootEl:o,name:"select",targetEl:ve,originalEvent:r}),r.shiftKey&&wi&&a.el.contains(wi)){var p=Te(wi),m=Te(ve);if(~p&&~m&&p!==m){var y,h;for(m>p?(h=p,y=m):(h=m,y=p+1);h1){var v=Ae(ve),w=Te(ve,":not(."+this.options.selectedClass+")");if(!Si&&f.animation&&(ve.thisAnimationDuration=null),c.captureAnimationState(),!Si&&(f.animation&&(ve.fromRect=v,K.forEach(function(A){if(A.thisAnimationDuration=null,A!==ve){var T=ct?Ae(A):v;A.fromRect=T,c.addAnimationState({target:A,rect:T})}})),Is(),K.forEach(function(A){d[w]?i.insertBefore(A,d[w]):i.appendChild(A),w++}),l===Te(ve))){var S=!1;K.forEach(function(A){if(A.sortableIndex!==Te(A)){S=!0;return}}),S&&s("update")}K.forEach(function(A){_c(A)}),c.animateAll()}Jt=c}(o===i||u&&u.lastPutMode!=="clone")&&Ct.forEach(function(A){A.parentNode&&A.parentNode.removeChild(A)})}},nullingGlobal:function(){this.isMultiDrag=qr=!1,Ct.length=0},destroyGlobal:function(){this._deselectMultiDrag(),te(document,"pointerup",this._deselectMultiDrag),te(document,"mouseup",this._deselectMultiDrag),te(document,"touchend",this._deselectMultiDrag),te(document,"keydown",this._checkKeyDown),te(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof qr!="undefined"&&qr)&&Jt===this.sortable&&!(n&&Xt(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;K.length;){var r=K[0];_e(r,this.options.selectedClass,!1),K.shift(),Mi({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},zt(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[Ze];!r||!r.options.multiDrag||~K.indexOf(n)||(Jt&&Jt!==r&&(Jt.multiDrag._deselectMultiDrag(),Jt=r),_e(n,r.options.selectedClass,!0),K.push(n))},deselect:function(n){var r=n.parentNode[Ze],o=K.indexOf(n);!r||!r.options.multiDrag||!~o||(_e(n,r.options.selectedClass,!1),K.splice(o,1))}},eventProperties:function(){var n=this,r=[],o=[];return K.forEach(function(i){r.push({multiDragElement:i,index:i.sortableIndex});var a;ct&&i!==ve?a=-1:ct?a=Te(i,":not(."+n.options.selectedClass+")"):a=Te(i),o.push({multiDragElement:i,index:a})}),{items:l4(K),clones:[].concat(Ct),oldIndicies:r,newIndicies:o}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function U4(e,t){K.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function tg(e,t){Ct.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function Is(){K.forEach(function(e){e!==ve&&e.parentNode&&e.parentNode.removeChild(e)})}Q.mount(new R4);Q.mount(Kp,Xp);const B4=Object.freeze(Object.defineProperty({__proto__:null,default:Q,MultiDrag:F4,Sortable:Q,Swap:L4},Symbol.toStringTag,{value:"Module"})),j4=Bg(B4);var vw={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],o=0;o$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>A);function l(C){C.parentElement!==null&&C.parentElement.removeChild(C)}function u(C,O,b){const E=C.children[b]||null;C.insertBefore(O,E)}function c(C){C.forEach(O=>l(O.element))}function f(C){C.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(C,O){const b=h(C),E={parentElement:C.from};let x=[];switch(b){case"normal":x=[{element:C.item,newIndex:C.newIndex,oldIndex:C.oldIndex,parentElement:C.from}];break;case"swap":const D=F({element:C.item,oldIndex:C.oldIndex,newIndex:C.newIndex},E),B=F({element:C.swapItem,oldIndex:C.newIndex,newIndex:C.oldIndex},E);x=[D,B];break;case"multidrag":x=C.oldIndicies.map((q,H)=>F({element:q.multiDragElement,oldIndex:q.index,newIndex:C.newIndicies[H].index},E));break}return v(x,O)}function p(C,O){const b=m(C,O);return y(C,b)}function m(C,O){const b=[...O];return C.concat().reverse().forEach(E=>b.splice(E.oldIndex,1)),b}function y(C,O,b,E){const x=[...O];return C.forEach(_=>{const k=E&&b&&E(_.item,b);x.splice(_.newIndex,0,k||_.item)}),x}function h(C){return C.oldIndicies&&C.oldIndicies.length>0?"multidrag":C.swapItem?"swap":"normal"}function v(C,O){return C.map(E=>$(F({},E),{item:O[E.oldIndex]})).sort((E,x)=>E.oldIndex-x.oldIndex)}function w(C){const us=C,{list:O,setList:b,children:E,tag:x,style:_,className:k,clone:D,onAdd:B,onChange:q,onChoose:H,onClone:ce,onEnd:he,onFilter:ye,onRemove:ne,onSort:R,onStart:Y,onUnchoose:V,onUpdate:le,onMove:ue,onSpill:ze,onSelect:Fe,onDeselect:Ue}=us;return $t(us,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class A extends r.Component{constructor(O){super(O),this.ref=r.createRef();const b=[...O.list].map(E=>Object.assign(E,{chosen:!1,selected:!1}));O.setList(b,this.sortable,S),i(o)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();i(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:b,className:E,id:x}=this.props,_={style:b,className:E,id:x},k=!O||O===null?"div":O;return r.createElement(k,F({ref:this.ref},_),this.getChildren())}getChildren(){const{children:O,dataIdAttr:b,selectedClass:E="sortable-selected",chosenClass:x="sortable-chosen",dragClass:_="sortable-drag",fallbackClass:k="sortable-falback",ghostClass:D="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:q="sortable-filter",list:H}=this.props;if(!O||O==null)return null;const ce=b||"data-id";return r.Children.map(O,(he,ye)=>{if(he===void 0)return;const ne=H[ye]||{},{className:R}=he.props,Y=typeof q=="string"&&{[q.replace(".","")]:!!ne.filtered},V=i(n)(R,F({[E]:ne.selected,[x]:ne.chosen},Y));return r.cloneElement(he,{[ce]:he.key,className:V})})}get sortable(){const O=this.ref.current;if(O===null)return null;const b=Object.keys(O).find(E=>E.includes("Sortable"));return b?O[b]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],b=["onChange","onClone","onFilter","onSort"],E=w(this.props);O.forEach(_=>E[_]=this.prepareOnHandlerPropAndDOM(_)),b.forEach(_=>E[_]=this.prepareOnHandlerProp(_));const x=(_,k)=>{const{onMove:D}=this.props,B=_.willInsertAfter||-1;if(!D)return B;const q=D(_,k,this.sortable,S);return typeof q=="undefined"?!1:q};return $(F({},E),{onMove:x})}prepareOnHandlerPropAndDOM(O){return b=>{this.callOnHandlerProp(b,O),this[O](b)}}prepareOnHandlerProp(O){return b=>{this.callOnHandlerProp(b,O)}}callOnHandlerProp(O,b){const E=this.props[b];E&&E(O,this.sortable,S)}onAdd(O){const{list:b,setList:E,clone:x}=this.props,_=[...S.dragging.props.list],k=d(O,_);c(k);const D=y(k,b,O,x).map(B=>Object.assign(B,{selected:!1}));E(D,this.sortable,S)}onRemove(O){const{list:b,setList:E}=this.props,x=h(O),_=d(O,b);f(_);let k=[...b];if(O.pullMode!=="clone")k=m(_,k);else{let D=_;switch(x){case"multidrag":D=_.map((B,q)=>$(F({},B),{element:O.clones[q]}));break;case"normal":D=_.map(B=>$(F({},B),{element:O.clone}));break;case"swap":default:i(o)(!0,`mode "${x}" cannot clone. Please remove "props.clone" from when using the "${x}" plugin`)}c(D),_.forEach(B=>{const q=B.oldIndex,H=this.props.clone(B.item,O);k.splice(q,1,H)})}k=k.map(D=>Object.assign(D,{selected:!1})),E(k,this.sortable,S)}onUpdate(O){const{list:b,setList:E}=this.props,x=d(O,b);c(x),f(x);const _=p(x,b);return E(_,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(_,{chosen:!0})),D});E(x,this.sortable,S)}onUnchoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(D,{chosen:!1})),D});E(x,this.sortable,S)}onSpill(O){const{removeOnSpill:b,revertOnSpill:E}=this.props;b&&!E&&l(O.item)}onSelect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;if(k===-1){console.log(`"${O.type}" had indice of "${_.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}x[k].selected=!0}),E(x,this.sortable,S)}onDeselect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;k!==-1&&(x[k].selected=!0)}),E(x,this.sortable,S)}}A.defaultProps={clone:C=>C};var T={};s(e.exports,T)})(rw);const $4="_container_xt7ji_1",H4="_list_xt7ji_6",V4="_item_xt7ji_15",J4="_keyField_xt7ji_29",Q4="_valueField_xt7ji_34",X4="_header_xt7ji_39",K4="_dragHandle_xt7ji_45",q4="_deleteButton_xt7ji_55",Z4="_addItemButton_xt7ji_65",eP="_separator_xt7ji_72",ft={container:$4,list:H4,item:V4,keyField:J4,valueField:Q4,header:X4,dragHandle:K4,deleteButton:q4,addItemButton:Z4,separator:eP};function qp({name:e,label:t,value:n,onChange:r,optional:o=!1,newItemValue:i={key:"myKey",value:"myValue"}}){const[a,s]=I.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),l=$r(r);I.useEffect(()=>{const f=tP(a);lA(f,n!=null?n:{})||l({name:e,value:f})},[e,l,a,n]);const u=I.useCallback(f=>{s(d=>d.filter(({id:p})=>p!==f))},[]),c=I.useCallback(()=>{s(f=>[...f,F({id:-1},i)].map((d,p)=>$(F({},d),{id:p})))},[i]);return N("div",{className:ft.container,children:[g(ti,{category:e!=null?e:t}),N("div",{className:ft.list,children:[N("div",{className:ft.item+" "+ft.header,children:[g("span",{className:ft.keyField,children:"Key"}),g("span",{className:ft.valueField,children:"Value"})]}),g(rw.exports.ReactSortable,{list:a,setList:s,handle:`.${ft.dragHandle}`,children:a.map((f,d)=>N("div",{className:ft.item,children:[g("div",{className:ft.dragHandle,title:"Reorder list",children:g(o4,{})}),g("input",{className:ft.keyField,type:"text",value:f.key,onChange:p=>{const m=[...a];m[d]=$(F({},f),{key:p.target.value}),s(m)}}),g("span",{className:ft.separator,children:":"}),g("input",{className:ft.valueField,type:"text",value:f.value,onChange:p=>{const m=[...a];m[d]=$(F({},f),{value:p.target.value}),s(m)}}),g(wt,{className:ft.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:g(Sp,{})})]},f.id))}),g(wt,{className:ft.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:g(C1,{})})]})]})}function tP(e){return e.reduce((n,{key:r,value:o})=>(n[r]=o,n),{})}const nP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),rP="_container_162lp_1",oP="_checkbox_162lp_14",Mc={container:rP,checkbox:oP},iP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices;return N("div",$(F({ref:r,className:Mc.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:Object.keys(o).map((i,a)=>g("div",{className:Mc.radio,children:N("label",{className:Mc.checkbox,children:[g("input",{type:"checkbox",name:o[i],value:o[i],defaultChecked:a===0}),g("span",{children:i})]})},i))}),e]}))},aP={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},sP={title:"Checkbox Group",UiComponent:iP,SettingsComponent:nP,acceptsChildren:!1,defaultSettings:aP,iconSrc:t4,category:"Inputs"},lP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",uP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(tw,{label:"Starting value",name:"value",value:e.value}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),cP="_container_1x0tz_1",fP="_label_1x0tz_10",ng={container:cP,label:fP},dP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=(l=t.width)!=null?l:"auto",i=F({},t),[a,s]=j.exports.useState(i.value);return j.exports.useEffect(()=>{s(i.value)},[i.value]),N("div",$(F({className:ng.container+" shiny::checkbox",style:{width:o},"aria-label":"shiny::checkbox",ref:r},n),{children:[N("label",{htmlFor:i.inputId,children:[g("input",{id:i.inputId,type:"checkbox",checked:a,onChange:u=>s(u.target.checked)}),g("span",{className:ng.label,children:i.label})]}),e]}))},pP={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},hP={title:"Checkbox Input",UiComponent:dP,SettingsComponent:uP,acceptsChildren:!1,defaultSettings:pP,iconSrc:lP,category:"Inputs"},mP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",vP="_wrappedSection_1dn9g_1",gP="_sectionContainer_1dn9g_9",zl={wrappedSection:vP,sectionContainer:gP},gw=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.wrappedSection,children:t})]}),yP=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.inputSection,children:t})]}),wP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(gw,{name:"Values",children:[g(Hn,{name:"value",value:e.value}),g(Hn,{name:"min",value:e.min,optional:!0,defaultValue:0}),g(Hn,{name:"max",value:e.max,optional:!0,defaultValue:10}),g(Hn,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),SP="_container_yicbr_1",bP={container:SP},EP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=F({},t),i=(l=o.width)!=null?l:"200px",[a,s]=j.exports.useState(o.value);return j.exports.useEffect(()=>{s(o.value)},[o.value]),N("div",$(F({className:bP.container+" shiny::numericInput",style:{width:i},"aria-label":"shiny::numericInput",ref:r},n),{children:[g("span",{children:o.label}),g("input",{type:"number",value:a,onChange:u=>s(Number(u.target.value)),min:o.min,max:o.max,step:o.step}),e]}))},CP={inputId:"myNumericInput",label:"Numeric Input",value:10},AP={title:"Numeric Input",UiComponent:EP,SettingsComponent:wP,acceptsChildren:!1,defaultSettings:CP,iconSrc:mP,category:"Inputs"},xP=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>N(Me,{children:[g(pe,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),g(yn,{name:"width",units:["px","%"],value:t}),g(yn,{name:"height",units:["px","%"],value:n})]}),OP=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:o,compRef:i})=>N("div",$(F({className:Jf.container,ref:i,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},o),{children:[g(ew,{outputId:e}),r]})),_P={title:"Plot Output",UiComponent:OP,SettingsComponent:xP,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:q1,category:"Outputs"},PP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",kP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),TP="_container_sgn7c_1",rg={container:TP},IP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=Object.keys(o),a=Object.values(o),[s,l]=I.useState(a[0]);return I.useEffect(()=>{a.includes(s)||l(a[0])},[s,a]),N("div",$(F({ref:r,className:rg.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:a.map((u,c)=>g("div",{className:rg.radio,children:N("label",{children:[g("input",{type:"radio",name:t.inputId,value:u,onChange:f=>l(f.target.value),checked:u===s}),g("span",{children:i[c]})]})},u))}),e]}))},NP={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},DP={title:"Radio Buttons",UiComponent:IP,SettingsComponent:kP,acceptsChildren:!1,defaultSettings:NP,iconSrc:PP,category:"Inputs"},RP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",LP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),MP="_container_1e5dd_1",FP={container:MP},UP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=t.inputId;return N("div",$(F({ref:r,className:FP.container},n),{children:[g("label",{htmlFor:i,children:t.label}),g("select",{id:i,children:Object.keys(o).map((a,s)=>g("option",{value:o[a],children:a},a))}),e]}))},BP={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},jP={title:"Select Input",UiComponent:UP,SettingsComponent:LP,acceptsChildren:!1,defaultSettings:BP,iconSrc:RP,category:"Inputs"},WP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",YP=({settings:e})=>{const t=F({},e);return N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:t.inputId}),g(pe,{name:"label",value:t.label}),N(gw,{name:"Values",children:[g(Hn,{name:"min",value:t.min}),g(Hn,{name:"max",value:t.max}),g(Hn,{name:"value",label:"start",value:t.value}),g(Hn,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},zP="_container_1f2js_1",GP="_sliderWrapper_1f2js_11",$P="_sliderInput_1f2js_16",Fc={container:zP,sliderWrapper:GP,sliderInput:$P},HP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=F({},t),{width:i="200px"}=o,[a,s]=j.exports.useState(o.value);return N("div",$(F({className:Fc.container+" shiny::sliderInput",style:{width:i},"aria-label":"shiny::sliderInput",ref:r},n),{children:[g("div",{children:o.label}),g("div",{className:Fc.sliderWrapper,children:g("input",{type:"range",min:o.min,max:o.max,value:a,onChange:l=>s(Number(l.target.value)),className:"slider "+Fc.sliderInput,"aria-label":"slider input","data-min":o.min,"data-max":o.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),N("div",{children:[g(Z1,{type:"input",name:o.inputId})," = ",a]}),e]}))},VP={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},JP={title:"Slider Input",UiComponent:HP,SettingsComponent:YP,acceptsChildren:!1,defaultSettings:VP,iconSrc:WP,category:"Inputs"},QP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",XP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(yP,{name:"Values",children:[g(pe,{name:"value",value:e.value}),g(pe,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),KP="_container_yicbr_1",qP={container:KP},ZP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o="200px",i="auto",a=F({},t),[s,l]=j.exports.useState(a.value);return j.exports.useEffect(()=>{l(a.value)},[a.value]),N("div",$(F({className:qP.container+" shiny::textInput",style:{height:i,width:o},"aria-label":"shiny::textInput",ref:r},n),{children:[g("label",{htmlFor:a.inputId,children:a.label}),g("input",{id:a.inputId,type:"text",value:s,onChange:u=>l(u.target.value),placeholder:a.placeholder}),e]}))},ek={inputId:"myTextInput",label:"Text Input",value:""},tk={title:"Text Input",UiComponent:ZP,SettingsComponent:XP,acceptsChildren:!1,defaultSettings:ek,iconSrc:QP,category:"Inputs"},nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",rk=({settings:e})=>g(pe,{label:"Output ID",name:"outputId",value:e.outputId}),ok="_container_1i6yi_1",ik={container:ok},ak=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>N("div",$(F({className:ik.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",N("code",{children:["output$",e.outputId]}),t]})),sk={title:"Text Output",UiComponent:ak,SettingsComponent:rk,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:nk,category:"Outputs"},lk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",uk=({settings:e})=>{var t;return g(pe,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},ck="_container_1xnzo_1",fk={container:ck},dk=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:o="shiny-ui-output"}=e;return N("div",$(F({className:fk.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",o,"!"]}),t]}))},pk={title:"Dynamic UI Output",UiComponent:dk,SettingsComponent:uk,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:lk,category:"Outputs"};function hk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function mk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function vk(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const gk="_container_p6wnj_1",yk="_infoMsg_p6wnj_14",wk="_codeHolder_p6wnj_19",ed={container:gk,infoMsg:yk,codeHolder:wk},Sk=({settings:e})=>N("div",{children:[g("div",{className:kn.container,children:N("span",{className:ed.infoMsg,children:[g(hk,{}),"Unknown function call. Can't modify with visual editor."]})}),g(ti,{category:"Code"}),g("div",{className:kn.container,children:g("pre",{className:ed.codeHolder,children:vk(e.text)})})]}),bk=20,Ek=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const o=e.text.slice(0,bk).replaceAll(/\s$/g,"")+"...";return N("div",$(F({className:ed.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{children:["unknown ui output: ",g("code",{children:o})]}),t]}))},Ck={title:"Unknown UI Function",UiComponent:Ek,SettingsComponent:Sk,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},en={"shiny::actionButton":e4,"shiny::numericInput":AP,"shiny::sliderInput":JP,"shiny::textInput":tk,"shiny::checkboxInput":hP,"shiny::checkboxGroupInput":sP,"shiny::selectInput":jP,"shiny::radioButtons":DP,"shiny::plotOutput":_P,"shiny::textOutput":sk,"shiny::uiOutput":pk,"gridlayout::grid_page":J_,"gridlayout::grid_card":w_,"gridlayout::grid_card_text":G_,"gridlayout::grid_card_plot":k_,unknownUiFunction:Ck};function Ak(e,{path:t,node:n}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=rr(e,t);Object.assign(r,n)}const Zp={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},yw=vp({name:"uiTree",initialState:Zp,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>ww(t.payload.initialState),UPDATE_NODE:(e,t)=>{Ak(e,t.payload)},PLACE_NODE:(e,t)=>{yx(e,t.payload)},DELETE_NODE:(e,t)=>{E1(e,t.payload)}}});function ww(e){const t=en[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return hx(r,n).length>0&&(e.uiArguments=F(F({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(i=>ww(i)),e}const{UPDATE_NODE:Sw,PLACE_NODE:xk,DELETE_NODE:bw,INIT_STATE:Ok,SET_FULL_STATE:_k}=yw.actions;function Ew(){const e=vr();return I.useCallback(n=>{e(xk(n))},[e])}const Pk=yw.reducer,Cw=oA();Cw.startListening({actionCreator:bw,effect:(e,t)=>Eh(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Xa(n,r)&&t.dispatch(cA()),r.lengthi)return;const a=[...r];a[n.length-1]=i-1,t.dispatch(c1({path:a}))})});const kk=Cw.middleware,Tk=FC({reducer:{uiTree:Pk,selectedPath:fA,connectedToServer:sA},middleware:e=>e().concat(kk)}),Ik=({children:e})=>g(jE,{store:Tk,children:e}),Nk=!1,Dk=!1;console.log("Env Vars",{VITE_PREBUILT_TREE:"True",VITE_SHOW_FAKE_PREVIEW:"TRUE",BASE_URL:"./",MODE:"production",DEV:!1,PROD:!0});const Zs={ws:null,msg:null},Aw=$(F({},Zs),{status:"connecting"});function Rk(e,t){switch(t.type){case"CONNECTED":return $(F({},Zs),{status:"connected",ws:t.ws});case"FAILED":return $(F({},Zs),{status:"failed-to-open"});case"CLOSED":return $(F({},Zs),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function Lk(){const[e,t]=I.useReducer(Rk,Aw),n=I.useRef(!1);return I.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=Nk?"localhost:8888":window.location.host,o=new WebSocket(`ws://${r}`);return o.onerror=i=>{console.error("Error with httpuv websocket connection",i)},o.onopen=i=>{n.current=!0,t({type:"CONNECTED",ws:o})},o.onclose=i=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>o.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const xw=I.createContext(Aw),Mk=({children:e})=>{const t=Lk();return g(xw.Provider,{value:t,children:e})};function Ow(){return I.useContext(xw)}function Fk(e){return JSON.parse(e.data)}function _w(e,t){e.addEventListener("message",n=>{t(Fk(n))})}function td(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const Uk="_appViewerHolder_wu0cb_1",Bk="_title_wu0cb_55",jk="_appContainer_wu0cb_89",Wk="_previewFrame_wu0cb_109",Yk="_expandButton_wu0cb_134",zk="_reloadButton_wu0cb_135",Gk="_spin_wu0cb_160",$k="_restartButton_wu0cb_198",Hk="_loadingMessage_wu0cb_225",Vk="_error_wu0cb_236",mt={appViewerHolder:Uk,title:Bk,appContainer:jk,previewFrame:Wk,expandButton:Yk,reloadButton:zk,spin:Gk,restartButton:$k,loadingMessage:Hk,error:Vk},Jk="_fakeApp_t3dh1_1",Qk="_fakeDashboard_t3dh1_7",Xk="_header_t3dh1_22",Kk="_sidebar_t3dh1_31",qk="_top_t3dh1_35",Zk="_bottom_t3dh1_39",Ei={fakeApp:Jk,fakeDashboard:Qk,header:Xk,sidebar:Kk,top:qk,bottom:Zk},eT=()=>g("div",{className:mt.appContainer,children:N("div",{className:Ei.fakeDashboard+" "+mt.previewFrame,children:[g("div",{className:Ei.header,children:g("h1",{children:"App preview not available"})}),g("div",{className:Ei.sidebar}),g("div",{className:Ei.top}),g("div",{className:Ei.bottom})]})});function tT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function nT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function rT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function oT(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const iT="_logs_xjp5l_2",aT="_logsContents_xjp5l_25",sT="_expandTab_xjp5l_29",lT="_clearLogsButton_xjp5l_69",uT="_logLine_xjp5l_75",cT="_noLogsMsg_xjp5l_81",fT="_expandedLogs_xjp5l_93",dT="_expandLogsButton_xjp5l_101",pT="_unseenLogsNotification_xjp5l_108",hT="_slidein_xjp5l_1",br={logs:iT,logsContents:aT,expandTab:sT,clearLogsButton:lT,logLine:uT,noLogsMsg:cT,expandedLogs:fT,expandLogsButton:dT,unseenLogsNotification:pT,slidein:hT};function mT({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:o}=vT(e),i=e.length===0;return N("div",{className:br.logs,"data-expanded":n,children:[N("button",{className:br.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[g(rT,{className:br.unseenLogsNotification,"data-show":o}),"App Logs",n?g(tT,{}):g(nT,{})]}),N("div",{className:br.logsContents,children:[i?g("p",{className:br.noLogsMsg,children:"No recent logs"}):e.map((a,s)=>g("p",{className:br.logLine,children:a},s)),i?null:g(wt,{variant:"icon",title:"clear logs",className:br.clearLogsButton,onClick:t,children:g(oT,{})})]})]})}function vT(e){const[t,n]=I.useState(!1),[r,o]=I.useState(!1),[i,a]=I.useState(null),[s,l]=I.useState(new Date),u=I.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),o(!1)},[t]);return I.useEffect(()=>{l(new Date)},[e]),I.useEffect(()=>{if(t||e.length===0){o(!1);return}if(i===null||i{u==="connected"&&(ia(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>ia(c,{path:"APP-PREVIEW-RESTART"})),m(()=>()=>ia(c,{path:"APP-PREVIEW-STOP"})),_w(c,w=>{if(!gT(w))return;const{path:S,payload:A}=w;switch(S){case"SHINY_READY":l(!1),a(!1),n(A);break;case"SHINY_LOGS":o(wT(A));break;case"SHINY_CRASH":l(A);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:w})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=I.useState(()=>()=>console.log("No app running to reset")),[p,m]=I.useState(()=>()=>console.log("No app running to stop")),y=I.useCallback(()=>{o([])},[]),h={appLogs:r,clearLogs:y,restartApp:f,stopApp:p};return i?Object.assign(h,{status:"no-preview",appLoc:null}):s?Object.assign(h,{status:"crashed",error:s,appLoc:null}):t?Object.assign(h,{status:"finished",appLoc:t,error:null}):Object.assign(h,{status:"loading",appLoc:null,error:null})}function wT(e){return Array.isArray(e)?e:[e]}function ST(){const[e,t]=I.useState(.2),n=xT();return I.useEffect(()=>{!n||t(bT(n.width))},[n]),e}function bT(e){const t=mS-Pw*2,n=e-kw*2;return t/n}const Pw=16,kw=55;function ET(){const e=I.useRef(null),[t,n]=I.useState(!1),r=I.useCallback(()=>{n(f=>!f)},[]),{status:o,appLoc:i,appLogs:a,clearLogs:s,restartApp:l}=yT(),u=ST(),c=I.useCallback(f=>{!e.current||!i||(e.current.src=i,OT(f.currentTarget))},[i]);return o==="no-preview"&&!Dk?null:N(Me,{children:[N("h3",{className:mt.title+" "+Q1.panelTitleHeader,children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),"App Preview"]}),g("div",{className:mt.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Pw}px`,"--expanded-inset-horizontal":`${kw}px`},children:o==="loading"?g(AT,{}):o==="crashed"?g(CT,{onClick:l}):N(Me,{children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),N("div",{className:mt.appContainer,children:[o==="no-preview"?g(eT,{}):g("iframe",{className:mt.previewFrame,src:i,title:"Application Preview",ref:e}),g(wt,{variant:"icon",className:mt.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?g(mk,{}):g(xx,{})})]}),g(mT,{appLogs:a,clearLogs:s})]})})]})}function CT({onClick:e}){return N("div",{className:mt.appContainer,children:[N("p",{children:["App preview crashed.",g("br",{})," Try and restart?"]}),N(wt,{className:mt.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",g(td,{})]})]})}function AT(){return g("div",{className:mt.loadingMessage,children:g("h2",{children:"Loading app preview..."})})}function xT(){const[e,t]=I.useState(null),n=I.useMemo(()=>Fp(()=>{const{innerWidth:r,innerHeight:o}=window;t({width:r,height:o})},500),[]);return I.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function OT(e){e.classList.add(mt.spin),e.addEventListener("animationend",()=>e.classList.remove(mt.spin),!1)}const _T=e=>g("svg",$(F({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:g("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class PT{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function kT(){const e=Ja(c=>c.uiTree),t=vr(),[n,r]=I.useState(!1),[o,i]=I.useState(!1),a=I.useRef(new PT({comparisonFn:TT}));I.useEffect(()=>{if(!e||e===Zp)return;const c=a.current;c.addEntry(e),i(c.canGoBackwards()),r(c.canGoForwards())},[e]);const s=I.useCallback(c=>{t(_k({state:c}))},[t]),l=I.useCallback(()=>{console.log("Navigating backwards"),s(a.current.goBackwards())},[s]),u=I.useCallback(()=>{console.log("Navigating forwards"),s(a.current.goForwards())},[s]);return{goBackward:l,goForward:u,canGoBackward:o,canGoForward:n}}function TT(e,t){return typeof t=="undefined"?!1:e===t}const IT="_container_1d7pe_1",NT={container:IT};function DT(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=kT();return N("div",{className:NT.container+" undo-redo-buttons",children:[g(wt,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:g(PA,{height:"100%"})}),g(wt,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:g(_A,{height:"100%"})})]})}const RT="_elementsPalette_zecez_1",LT="_OptionItem_zecez_18",MT="_OptionIcon_zecez_27",FT="_OptionLabel_zecez_35",el={elementsPalette:RT,OptionItem:LT,OptionIcon:MT,OptionLabel:FT},og=["Inputs","Outputs","gridlayout","uncategorized"];function UT(e,t){var o,i;const n=og.indexOf(((o=en[e])==null?void 0:o.category)||"uncategorized"),r=og.indexOf(((i=en[t])==null?void 0:i.category)||"uncategorized");return nr?1:0}function BT({availableUi:e=en}){const t=j.exports.useMemo(()=>Object.keys(e).sort(UT),[e]);return g("div",{className:el.elementsPalette,children:t.map(n=>g(jT,{uiName:n},n))})}function jT({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r}=en[e],o={uiName:e,uiArguments:r},i=j.exports.useRef(null);return g1({ref:i,nodeInfo:{node:o}}),t===void 0?null:N("div",{ref:i,className:el.OptionItem,"data-ui-name":e,children:[g("img",{src:t,alt:n,className:el.OptionIcon}),g("label",{className:el.OptionLabel,children:n})]})}function Tw(e){return function(t){return typeof t===e}}var WT=Tw("function"),YT=function(e){return e===null},ig=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},ag=function(e){return!zT(e)&&!YT(e)&&(WT(e)||typeof e=="object")},zT=Tw("undefined"),nd=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function GT(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!vt(e[r],t[r]))return!1;return!0}function $T(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),o=e.byteLength;o--;)if(n.getUint8(o)!==r.getUint8(o))return!1;return!0}function HT(e,t){var n,r,o,i;if(e.size!==t.size)return!1;try{for(var a=nd(e.entries()),s=a.next();!s.done;s=a.next()){var l=s.value;if(!t.has(l[0]))return!1}}catch(f){n={error:f}}finally{try{s&&!s.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=nd(e.entries()),c=u.next();!c.done;c=u.next()){var l=c.value;if(!vt(l[1],t.get(l[0])))return!1}}catch(f){o={error:f}}finally{try{c&&!c.done&&(i=u.return)&&i.call(u)}finally{if(o)throw o.error}}return!0}function VT(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var o=nd(e.entries()),i=o.next();!i.done;i=o.next()){var a=i.value;if(!t.has(a[0]))return!1}}catch(s){n={error:s}}finally{try{i&&!i.done&&(r=o.return)&&r.call(o)}finally{if(n)throw n.error}}return!0}function vt(e,t){if(e===t)return!0;if(e&&ag(e)&&t&&ag(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return GT(e,t);if(e instanceof Map&&t instanceof Map)return HT(e,t);if(e instanceof Set&&t instanceof Set)return VT(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return $T(e,t);if(ig(e)&&ig(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var o=n.length;o--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[o]))return!1;for(var o=n.length;o--!==0;){var i=n[o];if(!(i==="_owner"&&e.$$typeof)&&!vt(e[i],t[i]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var JT=["innerHTML","ownerDocument","style","attributes","nodeValue"],QT=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],XT=["bigint","boolean","null","number","string","symbol","undefined"];function ku(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(KT(t))return t}function rn(e){return function(t){return ku(t)===e}}function KT(e){return QT.includes(e)}function ni(e){return function(t){return typeof t===e}}function qT(e){return XT.includes(e)}function P(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(P.array(e))return"Array";if(P.plainFunction(e))return"Function";var t=ku(e);return t||"Object"}P.array=Array.isArray;P.arrayOf=function(e,t){return!P.array(e)&&!P.function(t)?!1:e.every(function(n){return t(n)})};P.asyncGeneratorFunction=function(e){return ku(e)==="AsyncGeneratorFunction"};P.asyncFunction=rn("AsyncFunction");P.bigint=ni("bigint");P.boolean=function(e){return e===!0||e===!1};P.date=rn("Date");P.defined=function(e){return!P.undefined(e)};P.domElement=function(e){return P.object(e)&&!P.plainObject(e)&&e.nodeType===1&&P.string(e.nodeName)&&JT.every(function(t){return t in e})};P.empty=function(e){return P.string(e)&&e.length===0||P.array(e)&&e.length===0||P.object(e)&&!P.map(e)&&!P.set(e)&&Object.keys(e).length===0||P.set(e)&&e.size===0||P.map(e)&&e.size===0};P.error=rn("Error");P.function=ni("function");P.generator=function(e){return P.iterable(e)&&P.function(e.next)&&P.function(e.throw)};P.generatorFunction=rn("GeneratorFunction");P.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};P.iterable=function(e){return!P.nullOrUndefined(e)&&P.function(e[Symbol.iterator])};P.map=rn("Map");P.nan=function(e){return Number.isNaN(e)};P.null=function(e){return e===null};P.nullOrUndefined=function(e){return P.null(e)||P.undefined(e)};P.number=function(e){return ni("number")(e)&&!P.nan(e)};P.numericString=function(e){return P.string(e)&&e.length>0&&!Number.isNaN(Number(e))};P.object=function(e){return!P.nullOrUndefined(e)&&(P.function(e)||typeof e=="object")};P.oneOf=function(e,t){return P.array(e)?e.indexOf(t)>-1:!1};P.plainFunction=rn("Function");P.plainObject=function(e){if(ku(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};P.primitive=function(e){return P.null(e)||qT(typeof e)};P.promise=rn("Promise");P.propertyOf=function(e,t,n){if(!P.object(e)||!t)return!1;var r=e[t];return P.function(n)?n(r):P.defined(r)};P.regexp=rn("RegExp");P.set=rn("Set");P.string=ni("string");P.symbol=ni("symbol");P.undefined=ni("undefined");P.weakMap=rn("WeakMap");P.weakSet=rn("WeakSet");function ZT(){for(var e=[],t=0;tl);return P.undefined(r)||(u=u&&l===r),P.undefined(i)||(u=u&&s===i),u}function lg(e,t,n){var r=n.key,o=n.type,i=n.value,a=cn(e,r),s=cn(t,r),l=o==="added"?a:s,u=o==="added"?s:a;if(!P.nullOrUndefined(i)){if(P.defined(l)){if(P.array(l)||P.plainObject(l))return e6(l,u,i)}else return vt(u,i);return!1}return[a,s].every(P.array)?!u.every(eh(l)):[a,s].every(P.plainObject)?t6(Object.keys(l),Object.keys(u)):![a,s].every(function(c){return P.primitive(c)&&P.defined(c)})&&(o==="added"?!P.defined(a)&&P.defined(s):P.defined(a)&&!P.defined(s))}function ug(e,t,n){var r=n===void 0?{}:n,o=r.key,i=cn(e,o),a=cn(t,o);if(!Iw(i,a))throw new TypeError("Inputs have different types");if(!ZT(i,a))throw new TypeError("Inputs don't have length");return[i,a].every(P.plainObject)&&(i=Object.keys(i),a=Object.keys(a)),[i,a]}function cg(e){return function(t){var n=t[0],r=t[1];return P.array(e)?vt(e,r)||e.some(function(o){return vt(o,r)||P.array(r)&&eh(r)(o)}):P.plainObject(e)&&e[n]?!!e[n]&&vt(e[n],r):vt(e,r)}}function t6(e,t){return t.some(function(n){return!e.includes(n)})}function fg(e){return function(t){return P.array(e)?e.some(function(n){return vt(n,t)||P.array(t)&&eh(t)(n)}):vt(e,t)}}function Ci(e,t){return P.array(e)?e.some(function(n){return vt(n,t)}):vt(e,t)}function eh(e){return function(t){return e.some(function(n){return vt(n,t)})}}function Iw(){for(var e=[],t=0;t=0)return 1;return 0}();function R6(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function L6(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},D6))}}var M6=ns&&window.Promise,F6=M6?R6:L6;function Bw(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Hr(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function oh(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function rs(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Hr(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/(auto|scroll|overlay)/.test(n+o+r)?e:rs(oh(e))}function jw(e){return e&&e.referenceNode?e.referenceNode:e}var vg=ns&&!!(window.MSInputMethodContext&&document.documentMode),gg=ns&&/MSIE 10/.test(navigator.userAgent);function ri(e){return e===11?vg:e===10?gg:vg||gg}function Wo(e){if(!e)return document.documentElement;for(var t=ri(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Hr(n,"position")==="static"?Wo(n):n}function U6(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Wo(e.firstElementChild)===e}function rd(e){return e.parentNode!==null?rd(e.parentNode):e}function $l(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,o=n?t:e,i=document.createRange();i.setStart(r,0),i.setEnd(o,0);var a=i.commonAncestorContainer;if(e!==a&&t!==a||r.contains(o))return U6(a)?a:Wo(a);var s=rd(e);return s.host?$l(s.host,t):$l(e,rd(t).host)}function Yo(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var o=e.ownerDocument.documentElement,i=e.ownerDocument.scrollingElement||o;return i[n]}return e[n]}function B6(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Yo(t,"top"),o=Yo(t,"left"),i=n?-1:1;return e.top+=r*i,e.bottom+=r*i,e.left+=o*i,e.right+=o*i,e}function yg(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function wg(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],ri(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function Ww(e){var t=e.body,n=e.documentElement,r=ri(10)&&getComputedStyle(n);return{height:wg("Height",t,n,r),width:wg("Width",t,n,r)}}var j6=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},W6=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=ri(10),o=t.nodeName==="HTML",i=od(e),a=od(t),s=rs(e),l=Hr(t),u=parseFloat(l.borderTopWidth),c=parseFloat(l.borderLeftWidth);n&&o&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=pr({top:i.top-a.top-u,left:i.left-a.left-c,width:i.width,height:i.height});if(f.marginTop=0,f.marginLeft=0,!r&&o){var d=parseFloat(l.marginTop),p=parseFloat(l.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(s):t===s&&s.nodeName!=="BODY")&&(f=B6(f,t)),f}function Y6(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=ih(e,n),o=Math.max(n.clientWidth,window.innerWidth||0),i=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Yo(n),s=t?0:Yo(n,"left"),l={top:a-r.top+r.marginTop,left:s-r.left+r.marginLeft,width:o,height:i};return pr(l)}function Yw(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Hr(e,"position")==="fixed")return!0;var n=oh(e);return n?Yw(n):!1}function zw(e){if(!e||!e.parentElement||ri())return document.documentElement;for(var t=e.parentElement;t&&Hr(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function ah(e,t,n,r){var o=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,i={top:0,left:0},a=o?zw(e):$l(e,jw(t));if(r==="viewport")i=Y6(a,o);else{var s=void 0;r==="scrollParent"?(s=rs(oh(t)),s.nodeName==="BODY"&&(s=e.ownerDocument.documentElement)):r==="window"?s=e.ownerDocument.documentElement:s=r;var l=ih(s,a,o);if(s.nodeName==="HTML"&&!Yw(a)){var u=Ww(e.ownerDocument),c=u.height,f=u.width;i.top+=l.top-l.marginTop,i.bottom=c+l.top,i.left+=l.left-l.marginLeft,i.right=f+l.left}else i=l}n=n||0;var d=typeof n=="number";return i.left+=d?n:n.left||0,i.top+=d?n:n.top||0,i.right-=d?n:n.right||0,i.bottom-=d?n:n.bottom||0,i}function z6(e){var t=e.width,n=e.height;return t*n}function Gw(e,t,n,r,o){var i=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=ah(n,r,i,o),s={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},l=Object.keys(s).map(function(d){return Mt({key:d},s[d],{area:z6(s[d])})}).sort(function(d,p){return p.area-d.area}),u=l.filter(function(d){var p=d.width,m=d.height;return p>=n.clientWidth&&m>=n.clientHeight}),c=u.length>0?u[0].key:l[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function $w(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,o=r?zw(t):$l(t,jw(n));return ih(n,o,r)}function Hw(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),o=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),i={width:e.offsetWidth+o,height:e.offsetHeight+r};return i}function Hl(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function Vw(e,t,n){n=n.split("-")[0];var r=Hw(e),o={width:r.width,height:r.height},i=["right","left"].indexOf(n)!==-1,a=i?"top":"left",s=i?"left":"top",l=i?"height":"width",u=i?"width":"height";return o[a]=t[a]+t[l]/2-r[l]/2,n===s?o[s]=t[s]-r[u]:o[s]=t[Hl(s)],o}function os(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function G6(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(o){return o[t]===n});var r=os(e,function(o){return o[t]===n});return e.indexOf(r)}function Jw(e,t,n){var r=n===void 0?e:e.slice(0,G6(e,"name",n));return r.forEach(function(o){o.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var i=o.function||o.fn;o.enabled&&Bw(i)&&(t.offsets.popper=pr(t.offsets.popper),t.offsets.reference=pr(t.offsets.reference),t=i(t,o))}),t}function $6(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=$w(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=Gw(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=Vw(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=Jw(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function Qw(e,t){return e.some(function(n){var r=n.name,o=n.enabled;return o&&r===t})}function sh(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=s[f]+m-a[p]),e.offsets.popper=pr(e.offsets.popper);var y=s[f]+s[u]/2-m/2,h=Hr(e.instance.popper),v=parseFloat(h["margin"+c]),w=parseFloat(h["border"+c+"Width"]),S=y-e.offsets.popper[f]-v-w;return S=Math.max(Math.min(a[u]-m,S),0),e.arrowElement=r,e.offsets.arrow=(n={},zo(n,f,Math.round(S)),zo(n,d,""),n),e}function oI(e){return e==="end"?"start":e==="start"?"end":e}var Zw=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],Uc=Zw.slice(3);function Sg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=Uc.indexOf(e),r=Uc.slice(n+1).concat(Uc.slice(0,n));return t?r.reverse():r}var Bc={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function iI(e,t){if(Qw(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=ah(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],o=Hl(r),i=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case Bc.FLIP:a=[r,o];break;case Bc.CLOCKWISE:a=Sg(r);break;case Bc.COUNTERCLOCKWISE:a=Sg(r,!0);break;default:a=t.behavior}return a.forEach(function(s,l){if(r!==s||a.length===l+1)return e;r=e.placement.split("-")[0],o=Hl(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),y=f(u.top)f(n.bottom),v=r==="left"&&p||r==="right"&&m||r==="top"&&y||r==="bottom"&&h,w=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(w&&i==="start"&&p||w&&i==="end"&&m||!w&&i==="start"&&y||!w&&i==="end"&&h),A=!!t.flipVariationsByContent&&(w&&i==="start"&&m||w&&i==="end"&&p||!w&&i==="start"&&h||!w&&i==="end"&&y),T=S||A;(d||v||T)&&(e.flipped=!0,(d||v)&&(r=a[l+1]),T&&(i=oI(i)),e.placement=r+(i?"-"+i:""),e.offsets.popper=Mt({},e.offsets.popper,Vw(e.instance.popper,e.offsets.reference,e.placement)),e=Jw(e.instance.modifiers,e,"flip"))}),e}function aI(e){var t=e.offsets,n=t.popper,r=t.reference,o=e.placement.split("-")[0],i=Math.floor,a=["top","bottom"].indexOf(o)!==-1,s=a?"right":"bottom",l=a?"left":"top",u=a?"width":"height";return n[s]i(r[s])&&(e.offsets.popper[l]=i(r[s])),e}function sI(e,t,n,r){var o=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),i=+o[1],a=o[2];if(!i)return e;if(a.indexOf("%")===0){var s=void 0;switch(a){case"%p":s=n;break;case"%":case"%r":default:s=r}var l=pr(s);return l[t]/100*i}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*i}else return i}function lI(e,t,n,r){var o=[0,0],i=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),s=a.indexOf(os(a,function(c){return c.search(/,|\s/)!==-1}));a[s]&&a[s].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var l=/\s*,\s*|\s+/,u=s!==-1?[a.slice(0,s).concat([a[s].split(l)[0]]),[a[s].split(l)[1]].concat(a.slice(s+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!i:i)?"height":"width",p=!1;return c.reduce(function(m,y){return m[m.length-1]===""&&["+","-"].indexOf(y)!==-1?(m[m.length-1]=y,p=!0,m):p?(m[m.length-1]+=y,p=!1,m):m.concat(y)},[]).map(function(m){return sI(m,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){lh(d)&&(o[f]+=d*(c[p-1]==="-"?-1:1))})}),o}function uI(e,t){var n=t.offset,r=e.placement,o=e.offsets,i=o.popper,a=o.reference,s=r.split("-")[0],l=void 0;return lh(+n)?l=[+n,0]:l=lI(n,i,a,s),s==="left"?(i.top+=l[0],i.left-=l[1]):s==="right"?(i.top+=l[0],i.left+=l[1]):s==="top"?(i.left+=l[0],i.top-=l[1]):s==="bottom"&&(i.left+=l[0],i.top+=l[1]),e.popper=i,e}function cI(e,t){var n=t.boundariesElement||Wo(e.instance.popper);e.instance.reference===n&&(n=Wo(n));var r=sh("transform"),o=e.instance.popper.style,i=o.top,a=o.left,s=o[r];o.top="",o.left="",o[r]="";var l=ah(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);o.top=i,o.left=a,o[r]=s,t.boundaries=l;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var m=c[p];return c[p]l[p]&&!t.escapeWithReference&&(y=Math.min(c[m],l[p]-(p==="right"?c.width:c.height))),zo({},m,y)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=Mt({},c,f[p](d))}),e.offsets.popper=c,e}function fI(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var o=e.offsets,i=o.reference,a=o.popper,s=["bottom","top"].indexOf(n)!==-1,l=s?"left":"top",u=s?"width":"height",c={start:zo({},l,i[l]),end:zo({},l,i[l]+i[u]-a[u])};e.offsets.popper=Mt({},a,c[r])}return e}function dI(e){if(!qw(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=os(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};j6(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=F6(this.update.bind(this)),this.options=Mt({},e.Defaults,o),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(Mt({},e.Defaults.modifiers,o.modifiers)).forEach(function(a){r.options.modifiers[a]=Mt({},e.Defaults.modifiers[a]||{},o.modifiers?o.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return Mt({name:a},r.options.modifiers[a])}).sort(function(a,s){return a.order-s.order}),this.modifiers.forEach(function(a){a.enabled&&Bw(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var i=this.options.eventsEnabled;i&&this.enableEventListeners(),this.state.eventsEnabled=i}return W6(e,[{key:"update",value:function(){return $6.call(this)}},{key:"destroy",value:function(){return H6.call(this)}},{key:"enableEventListeners",value:function(){return J6.call(this)}},{key:"disableEventListeners",value:function(){return X6.call(this)}}]),e}();ju.Utils=(typeof window!="undefined"?window:global).PopperUtils;ju.placements=Zw;ju.Defaults=mI;const bg=ju;var eS={},tS={exports:{}};(function(e,t){(function(n,r){var o=r(n);e.exports=o})(Fg,function(n){var r=["N","E","A","D"];function o(b,E){b.super_=E,b.prototype=Object.create(E.prototype,{constructor:{value:b,enumerable:!1,writable:!0,configurable:!0}})}function i(b,E){Object.defineProperty(this,"kind",{value:b,enumerable:!0}),E&&E.length&&Object.defineProperty(this,"path",{value:E,enumerable:!0})}function a(b,E,x){a.super_.call(this,"E",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0}),Object.defineProperty(this,"rhs",{value:x,enumerable:!0})}o(a,i);function s(b,E){s.super_.call(this,"N",b),Object.defineProperty(this,"rhs",{value:E,enumerable:!0})}o(s,i);function l(b,E){l.super_.call(this,"D",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0})}o(l,i);function u(b,E,x){u.super_.call(this,"A",b),Object.defineProperty(this,"index",{value:E,enumerable:!0}),Object.defineProperty(this,"item",{value:x,enumerable:!0})}o(u,i);function c(b,E,x){var _=b.slice((x||E)+1||b.length);return b.length=E<0?b.length+E:E,b.push.apply(b,_),b}function f(b){var E=typeof b;return E!=="object"?E:b===Math?"math":b===null?"null":Array.isArray(b)?"array":Object.prototype.toString.call(b)==="[object Date]"?"date":typeof b.toString=="function"&&/^\/.*\//.test(b.toString())?"regexp":"object"}function d(b){var E=0;if(b.length===0)return E;for(var x=0;x0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,D),ue=ye!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,D);if(!le&&ue)x.push(new s(H,E));else if(!ue&&le)x.push(new l(H,b));else if(f(b)!==f(E))x.push(new a(H,b,E));else if(f(b)==="date"&&b-E!==0)x.push(new a(H,b,E));else if(he==="object"&&b!==null&&E!==null){for(ne=B.length-1;ne>-1;--ne)if(B[ne].lhs===b){V=!0;break}if(V)b!==E&&x.push(new a(H,b,E));else{if(B.push({lhs:b,rhs:E}),Array.isArray(b)){for(q&&(b.sort(function(Ue,rt){return p(Ue)-p(rt)}),E.sort(function(Ue,rt){return p(Ue)-p(rt)})),ne=E.length-1,R=b.length-1;ne>R;)x.push(new u(H,ne,new s(void 0,E[ne--])));for(;R>ne;)x.push(new u(H,R,new l(void 0,b[R--])));for(;ne>=0;--ne)m(b[ne],E[ne],x,_,H,ne,B,q)}else{var ze=Object.keys(b),Fe=Object.keys(E);for(ne=0;ne=0?(m(b[Y],E[Y],x,_,H,Y,B,q),Fe[V]=null):m(b[Y],void 0,x,_,H,Y,B,q);for(ne=0;ne -*/var vI={set:wI,get:gI,has:yI,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:SI};function gI(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,o){return r&&r[o]},e)}else return typeof t=="number"?e[t]:e;else return e}function yI(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a,s){return a==s.length-1?n.own?!!(o&&o.hasOwnProperty(i)):o!==null&&typeof o=="object"&&i in o:o&&o[i]},e)}else return typeof t=="number"?t in e:!1;else return!1}function wI(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a){const s=Number.isInteger(Number(r[a+1]));return o[i]=o[i]||(s?[]:{}),r.length==a+1&&(o[i]=n),o[i]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function SI(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var o=t.split("."),i=!1,a;return a=!!o.reduce(function(s,l){return i=i||s===n||!!s&&s[l]===n,s&&s[l]},e),r.validPath?i&&a:i}else return!1;else return!1}Object.defineProperty(eS,"__esModule",{value:!0});var bI=tS.exports,dt=vI;function EI(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(o)?o.indexOf(s)>=0:s===o;return l&&(i?u:!i)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var o=dt.get(e,n),i=dt.get(t,n),a=Array.isArray(r)?r.indexOf(o)<0:o!==r,s=Array.isArray(r)?r.indexOf(i)>=0:i===r;return a&&s},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return Eg(dt.get(e,n),dt.get(t,n))&&dt.get(e,n)dt.get(t,n)}}}var xI=eS.default=AI;function Cg(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Ee(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function nS(e,t){if(e==null)return{};var n=_I(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function bn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function rS(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:bn(e)}function ls(e){var t=OI();return function(){var r=Vl(e),o;if(t){var i=Vl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return rS(this,o)}}var PI={flip:{padding:20},preventOverflow:{padding:10}},ae={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},an=Dw.canUseDOM,Ai=nr.createPortal!==void 0;function jc(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ns(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd())}function kI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function TI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function II(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,o;o=function(a){n(a),TI(e,t,o)},kI(e,t,o,r)}function xg(){}var oS=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),an?(o.node=document.createElement("div"),r.id&&(o.node.id=r.id),r.zIndex&&(o.node.style.zIndex=r.zIndex),document.body.appendChild(o.node),o):rS(o)}return as(n,[{key:"componentDidMount",value:function(){!an||Ai||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!an||Ai||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!an||!this.node||(Ai||nr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!an)return null;var o=this.props,i=o.children,a=o.setRef;if(Ai)return nr.createPortal(i,this.node);var s=nr.unstable_renderSubtreeIntoContainer(this,i.length>1?g("div",{children:i}):i[0],this.node);return a(s),null}},{key:"renderReact16",value:function(){var o=this.props,i=o.hasChildren,a=o.placement,s=o.target;return i?this.renderPortal():s||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return Ai?this.renderReact16():null}}]),n}(I.Component);qe(oS,"propTypes",{children:M.exports.oneOfType([M.exports.element,M.exports.array]),hasChildren:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),placement:M.exports.string,setRef:M.exports.func.isRequired,target:M.exports.oneOfType([M.exports.object,M.exports.string]),zIndex:M.exports.number});var iS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"parentStyle",get:function(){var o=this.props,i=o.placement,a=o.styles,s=a.arrow.length,l={pointerEvents:"none",position:"absolute",width:"100%"};return i.startsWith("top")?(l.bottom=0,l.left=0,l.right=0,l.height=s):i.startsWith("bottom")?(l.left=0,l.right=0,l.top=0,l.height=s):i.startsWith("left")?(l.right=0,l.top=0,l.bottom=0):i.startsWith("right")&&(l.left=0,l.top=0),l}},{key:"render",value:function(){var o=this.props,i=o.placement,a=o.setArrowRef,s=o.styles,l=s.arrow,u=l.color,c=l.display,f=l.length,d=l.margin,p=l.position,m=l.spread,y={display:c,position:p},h,v=m,w=f;return i.startsWith("top")?(h="0,0 ".concat(v/2,",").concat(w," ").concat(v,",0"),y.bottom=0,y.marginLeft=d,y.marginRight=d):i.startsWith("bottom")?(h="".concat(v,",").concat(w," ").concat(v/2,",0 0,").concat(w),y.top=0,y.marginLeft=d,y.marginRight=d):i.startsWith("left")?(w=m,v=f,h="0,0 ".concat(v,",").concat(w/2," 0,").concat(w),y.right=0,y.marginTop=d,y.marginBottom=d):i.startsWith("right")&&(w=m,v=f,h="".concat(v,",").concat(w," ").concat(v,",0 0,").concat(w/2),y.left=0,y.marginTop=d,y.marginBottom=d),g("div",{className:"__floater__arrow",style:this.parentStyle,children:g("span",{ref:a,style:y,children:g("svg",{width:v,height:w,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:g("polygon",{points:h,fill:u})})})})}}]),n}(I.Component);qe(iS,"propTypes",{placement:M.exports.string.isRequired,setArrowRef:M.exports.func.isRequired,styles:M.exports.object.isRequired});var NI=["color","height","width"],aS=function(t){var n=t.handleClick,r=t.styles,o=r.color,i=r.height,a=r.width,s=nS(r,NI);return g("button",{"aria-label":"close",onClick:n,style:s,type:"button",children:g("svg",{width:"".concat(a,"px"),height:"".concat(i,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})})};aS.propTypes={handleClick:M.exports.func.isRequired,styles:M.exports.object.isRequired};var sS=function(t){var n=t.content,r=t.footer,o=t.handleClick,i=t.open,a=t.positionWrapper,s=t.showCloseButton,l=t.title,u=t.styles,c={content:I.isValidElement(n)?n:g("div",{className:"__floater__content",style:u.content,children:n})};return l&&(c.title=I.isValidElement(l)?l:g("div",{className:"__floater__title",style:u.title,children:l})),r&&(c.footer=I.isValidElement(r)?r:g("div",{className:"__floater__footer",style:u.footer,children:r})),(s||a)&&!P.boolean(i)&&(c.close=g(aS,{styles:u.close,handleClick:o})),N("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};sS.propTypes={content:M.exports.node.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,open:M.exports.bool,positionWrapper:M.exports.bool.isRequired,showCloseButton:M.exports.bool.isRequired,styles:M.exports.object.isRequired,title:M.exports.node};var lS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"style",get:function(){var o=this.props,i=o.disableAnimation,a=o.component,s=o.placement,l=o.hideArrow,u=o.status,c=o.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,m=c.floaterClosing,y=c.floaterOpening,h=c.floaterWithAnimation,v=c.floaterWithComponent,w={};return l||(s.startsWith("top")?w.padding="0 0 ".concat(f,"px"):s.startsWith("bottom")?w.padding="".concat(f,"px 0 0"):s.startsWith("left")?w.padding="0 ".concat(f,"px 0 0"):s.startsWith("right")&&(w.padding="0 0 0 ".concat(f,"px"))),[ae.OPENING,ae.OPEN].indexOf(u)!==-1&&(w=Ee(Ee({},w),y)),u===ae.CLOSING&&(w=Ee(Ee({},w),m)),u===ae.OPEN&&!i&&(w=Ee(Ee({},w),h)),s==="center"&&(w=Ee(Ee({},w),p)),a&&(w=Ee(Ee({},w),v)),Ee(Ee({},d),w)}},{key:"render",value:function(){var o=this.props,i=o.component,a=o.handleClick,s=o.hideArrow,l=o.setFloaterRef,u=o.status,c={},f=["__floater"];return i?I.isValidElement(i)?c.content=I.cloneElement(i,{closeFn:a}):c.content=i({closeFn:a}):c.content=g(sS,F({},this.props)),u===ae.OPEN&&f.push("__floater__open"),s||(c.arrow=g(iS,F({},this.props))),g("div",{ref:l,className:f.join(" "),style:this.style,children:N("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(I.Component);qe(lS,"propTypes",{component:M.exports.oneOfType([M.exports.func,M.exports.element]),content:M.exports.node,disableAnimation:M.exports.bool.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,hideArrow:M.exports.bool.isRequired,open:M.exports.bool,placement:M.exports.string.isRequired,positionWrapper:M.exports.bool.isRequired,setArrowRef:M.exports.func.isRequired,setFloaterRef:M.exports.func.isRequired,showCloseButton:M.exports.bool,status:M.exports.string.isRequired,styles:M.exports.object.isRequired,title:M.exports.node});var uS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"render",value:function(){var o=this.props,i=o.children,a=o.handleClick,s=o.handleMouseEnter,l=o.handleMouseLeave,u=o.setChildRef,c=o.setWrapperRef,f=o.style,d=o.styles,p;if(i)if(I.Children.count(i)===1)if(!I.isValidElement(i))p=g("span",{children:i});else{var m=P.function(i.type)?"innerRef":"ref";p=I.cloneElement(I.Children.only(i),qe({},m,u))}else p=i;return p?g("span",{ref:c,style:Ee(Ee({},d),f),onClick:a,onMouseEnter:s,onMouseLeave:l,children:p}):null}}]),n}(I.Component);qe(uS,"propTypes",{children:M.exports.node,handleClick:M.exports.func.isRequired,handleMouseEnter:M.exports.func.isRequired,handleMouseLeave:M.exports.func.isRequired,setChildRef:M.exports.func.isRequired,setWrapperRef:M.exports.func.isRequired,style:M.exports.object,styles:M.exports.object.isRequired});var DI={zIndex:100};function RI(e){var t=on(DI,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var LI=["arrow","flip","offset"],MI=["position","top","right","bottom","left"],uh=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),qe(bn(o),"setArrowRef",function(i){o.arrowRef=i}),qe(bn(o),"setChildRef",function(i){o.childRef=i}),qe(bn(o),"setFloaterRef",function(i){o.floaterRef||(o.floaterRef=i)}),qe(bn(o),"setWrapperRef",function(i){o.wrapperRef=i}),qe(bn(o),"handleTransitionEnd",function(){var i=o.state.status,a=o.props.callback;o.wrapperPopper&&o.wrapperPopper.instance.update(),o.setState({status:i===ae.OPENING?ae.OPEN:ae.IDLE},function(){var s=o.state.status;a(s===ae.OPEN?"open":"close",o.props)})}),qe(bn(o),"handleClick",function(){var i=o.props,a=i.event,s=i.open;if(!P.boolean(s)){var l=o.state,u=l.positionWrapper,c=l.status;(o.event==="click"||o.event==="hover"&&u)&&(Ns({title:"click",data:[{event:a,status:c===ae.OPEN?"closing":"opening"}],debug:o.debug}),o.toggle())}}),qe(bn(o),"handleMouseEnter",function(){var i=o.props,a=i.event,s=i.open;if(!(P.boolean(s)||jc())){var l=o.state.status;o.event==="hover"&&l===ae.IDLE&&(Ns({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:o.debug}),clearTimeout(o.eventDelayTimeout),o.toggle())}}),qe(bn(o),"handleMouseLeave",function(){var i=o.props,a=i.event,s=i.eventDelay,l=i.open;if(!(P.boolean(l)||jc())){var u=o.state,c=u.status,f=u.positionWrapper;o.event==="hover"&&(Ns({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:o.debug}),s?[ae.OPENING,ae.OPEN].indexOf(c)!==-1&&!f&&!o.eventDelayTimeout&&(o.eventDelayTimeout=setTimeout(function(){delete o.eventDelayTimeout,o.toggle()},s*1e3)):o.toggle(ae.IDLE))}}),o.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ae.INIT,statusWrapper:ae.INIT},o._isMounted=!1,an&&window.addEventListener("load",function(){o.popper&&o.popper.instance.update(),o.wrapperPopper&&o.wrapperPopper.instance.update()}),o}return as(n,[{key:"componentDidMount",value:function(){if(!!an){var o=this.state.positionWrapper,i=this.props,a=i.children,s=i.open,l=i.target;this._isMounted=!0,Ns({title:"init",data:{hasChildren:!!a,hasTarget:!!l,isControlled:P.boolean(s),positionWrapper:o,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&l&&P.boolean(s)}}},{key:"componentDidUpdate",value:function(o,i){if(!!an){var a=this.props,s=a.autoOpen,l=a.open,u=a.target,c=a.wrapperOptions,f=xI(i,this.state),d=f.changedFrom,p=f.changedTo;if(o.open!==l){var m;P.boolean(l)&&(m=l?ae.OPENING:ae.CLOSING),this.toggle(m)}(o.wrapperOptions.position!==c.position||o.target!==u)&&this.changeWrapperPosition(this.props),p("status",ae.IDLE)&&l?this.toggle(ae.OPEN):d("status",ae.INIT,ae.IDLE)&&s&&this.toggle(ae.OPEN),this.popper&&p("status",ae.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ae.OPENING)||p("status",ae.CLOSING))&&II(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!an||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var o=this,i=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,s=this.props,l=s.disableFlip,u=s.getPopper,c=s.hideArrow,f=s.offset,d=s.placement,p=s.wrapperOptions,m=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ae.IDLE});else if(i&&this.floaterRef){var y=this.options,h=y.arrow,v=y.flip,w=y.offset,S=nS(y,LI);new bg(i,this.floaterRef,{placement:d,modifiers:Ee({arrow:Ee({enabled:!c,element:this.arrowRef},h),flip:Ee({enabled:!l,behavior:m},v),offset:Ee({offset:"0, ".concat(f,"px")},w)},S),onCreate:function(C){o.popper=C,u(C,"floater"),o._isMounted&&o.setState({currentPlacement:C.placement,status:ae.IDLE}),d!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){o.popper=C;var O=o.state.currentPlacement;o._isMounted&&C.placement!==O&&o.setState({currentPlacement:C.placement})}})}if(a){var A=P.undefined(p.offset)?0:p.offset;new bg(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(A,"px")},flip:{enabled:!1}},onCreate:function(C){o.wrapperPopper=C,o._isMounted&&o.setState({statusWrapper:ae.IDLE}),u(C,"wrapper"),d!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(o){var i=o.target,a=o.wrapperOptions;this.setState({positionWrapper:a.position&&!!i})}},{key:"toggle",value:function(o){var i=this.state.status,a=i===ae.OPEN?ae.CLOSING:ae.OPENING;P.undefined(o)||(a=o),this.setState({status:a})}},{key:"debug",get:function(){var o=this.props.debug;return o||!!global.ReactFloaterDebug}},{key:"event",get:function(){var o=this.props,i=o.disableHoverToClick,a=o.event;return a==="hover"&&jc()&&!i?"click":a}},{key:"options",get:function(){var o=this.props.options;return on(PI,o||{})}},{key:"styles",get:function(){var o=this,i=this.state,a=i.status,s=i.positionWrapper,l=i.statusWrapper,u=this.props.styles,c=on(RI(u),u);if(s){var f;[ae.IDLE].indexOf(a)===-1||[ae.IDLE].indexOf(l)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Ee(Ee({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},s||(MI.forEach(function(p){o.wrapperStyles[p]=d[p]}),c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!an)return null;var o=this.props.target;return o?P.domElement(o)?o:document.querySelector(o):this.childRef||this.wrapperRef}},{key:"render",value:function(){var o=this.state,i=o.currentPlacement,a=o.positionWrapper,s=o.status,l=this.props,u=l.children,c=l.component,f=l.content,d=l.disableAnimation,p=l.footer,m=l.hideArrow,y=l.id,h=l.open,v=l.showCloseButton,w=l.style,S=l.target,A=l.title,T=g(uS,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:w,styles:this.styles.wrapper,children:u}),C={};return a?C.wrapperInPortal=T:C.wrapperAsChildren=T,N("span",{children:[N(oS,{hasChildren:!!u,id:y,placement:i,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[g(lS,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:m||i==="center",open:h,placement:i,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:v,status:s,styles:this.styles,title:A}),C.wrapperInPortal]}),C.wrapperAsChildren]})}}]),n}(I.Component);qe(uh,"propTypes",{autoOpen:M.exports.bool,callback:M.exports.func,children:M.exports.node,component:mg(M.exports.oneOfType([M.exports.func,M.exports.element]),function(e){return!e.content}),content:mg(M.exports.node,function(e){return!e.component}),debug:M.exports.bool,disableAnimation:M.exports.bool,disableFlip:M.exports.bool,disableHoverToClick:M.exports.bool,event:M.exports.oneOf(["hover","click"]),eventDelay:M.exports.number,footer:M.exports.node,getPopper:M.exports.func,hideArrow:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),offset:M.exports.number,open:M.exports.bool,options:M.exports.object,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:M.exports.bool,style:M.exports.object,styles:M.exports.object,target:M.exports.oneOfType([M.exports.object,M.exports.string]),title:M.exports.node,wrapperOptions:M.exports.shape({offset:M.exports.number,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:M.exports.bool})});qe(uh,"defaultProps",{autoOpen:!1,callback:xg,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:xg,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function Og(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function W(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function Ql(e,t){if(e==null)return{};var n=UI(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Pe(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function cS(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return Pe(e)}function Jr(e){var t=FI();return function(){var r=Jl(e),o;if(t){var i=Jl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return cS(this,o)}}var oe={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},it={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ee={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},re={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},Cn=Dw.canUseDOM,xi=Na.exports.createPortal!==void 0;function fS(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function Wc(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function Oi(e){var t=[],n=function r(o){if(typeof o=="string"||typeof o=="number")t.push(o);else if(Array.isArray(o))o.forEach(function(a){return r(a)});else if(o&&o.props){var i=o.props.children;Array.isArray(i)?i.forEach(function(a){return r(a)}):r(i)}};return n(e),t.join(" ").trim()}function Pg(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function BI(e,t){return!P.plainObject(e)||!P.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function jI(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(o,i,a,s){return i+i+a+a+s+s}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function kg(e){return e.disableBeacon||e.placement==="center"}function ld(e,t){var n,r=j.exports.isValidElement(e)||j.exports.isValidElement(t),o=P.undefined(e)||P.undefined(t);if(Wc(e)!==Wc(t)||r||o)return!1;if(P.domElement(e))return e.isSameNode(t);if(P.number(e))return e===t;if(P.function(e))return e.toString()===t.toString();for(var i in e)if(Pg(e,i)){if(typeof e[i]=="undefined"||typeof t[i]=="undefined")return!1;if(n=Wc(e[i]),["object","array"].indexOf(n)!==-1&&ld(e[i],t[i])||n==="function"&&ld(e[i],t[i]))continue;if(e[i]!==t[i])return!1}for(var a in t)if(Pg(t,a)&&typeof e[a]=="undefined")return!1;return!0}function Tg(){return["chrome","safari","firefox","opera"].indexOf(fS())===-1}function jr(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var WI={action:"",controlled:!1,index:0,lifecycle:ee.INIT,size:0,status:re.IDLE},Ig=["action","index","lifecycle","status"];function YI(e){var t=new Map,n=new Map,r=function(){function o(){var i=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},s=a.continuous,l=s===void 0?!1:s,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;Ln(this,o),J(this,"listener",void 0),J(this,"setSteps",function(d){var p=i.getState(),m=p.size,y=p.status,h={size:d.length,status:y};n.set("steps",d),y===re.WAITING&&!m&&d.length&&(h.status=re.RUNNING),i.setState(h)}),J(this,"addListener",function(d){i.listener=d}),J(this,"update",function(d){if(!BI(d,Ig))throw new Error("State is not valid. Valid keys: ".concat(Ig.join(", ")));i.setState(W({},i.getNextState(W(W(W({},i.getState()),d),{},{action:d.action||oe.UPDATE}),!0)))}),J(this,"start",function(d){var p=i.getState(),m=p.index,y=p.size;i.setState(W(W({},i.getNextState({action:oe.START,index:P.number(d)?d:m},!0)),{},{status:y?re.RUNNING:re.WAITING}))}),J(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.index,y=p.status;[re.FINISHED,re.SKIPPED].indexOf(y)===-1&&i.setState(W(W({},i.getNextState({action:oe.STOP,index:m+(d?1:0)})),{},{status:re.PAUSED}))}),J(this,"close",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.CLOSE,index:p+1})))}),J(this,"go",function(d){var p=i.getState(),m=p.controlled,y=p.status;if(!(m||y!==re.RUNNING)){var h=i.getSteps()[d];i.setState(W(W({},i.getNextState({action:oe.GO,index:d})),{},{status:h?y:re.FINISHED}))}}),J(this,"info",function(){return i.getState()}),J(this,"next",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(i.getNextState({action:oe.NEXT,index:p+1}))}),J(this,"open",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.UPDATE,lifecycle:ee.TOOLTIP})))}),J(this,"prev",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.PREV,index:p-1})))}),J(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.controlled;m||i.setState(W(W({},i.getNextState({action:oe.RESET,index:0})),{},{status:d?re.RUNNING:re.READY}))}),J(this,"skip",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState({action:oe.SKIP,lifecycle:ee.INIT,status:re.SKIPPED})}),this.setState({action:oe.INIT,controlled:P.number(u),continuous:l,index:P.number(u)?u:0,lifecycle:ee.INIT,status:f.length?re.READY:re.IDLE},!0),this.setSteps(f)}return Mn(o,[{key:"setState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=W(W({},l),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,m=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",m),s&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(l)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:W({},WI)}},{key:"getNextState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=l.action,c=l.controlled,f=l.index,d=l.size,p=l.status,m=P.number(a.index)?a.index:f,y=c&&!s?f:Math.min(Math.max(m,0),d);return{action:a.action||u,controlled:c,index:y,lifecycle:a.lifecycle||ee.INIT,size:a.size||d,status:y===d?re.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var s=JSON.stringify(a),l=JSON.stringify(this.getState());return s!==l}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),o}();return new r(e)}function aa(){return document.scrollingElement||document.createElement("body")}function dS(e){return e?e.getBoundingClientRect():{}}function zI(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function or(e){return typeof e=="string"?document.querySelector(e):e}function GI(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function Wu(e,t,n){var r=Lw(e);if(r.isSameNode(aa()))return n?document:aa();var o=r.scrollHeight>r.offsetHeight;return!o&&!t?(r.style.overflow="initial",aa()):r}function Yu(e,t){if(!e)return!1;var n=Wu(e,t);return!n.isSameNode(aa())}function $I(e){return e.offsetParent!==document.body}function Go(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:GI(e).position===t?!0:Go(e.parentNode,t)}function HI(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,o=n.visibility;if(r==="none"||o==="hidden")return!1}t=t.parentNode}return!0}function VI(e,t,n){var r=dS(e),o=Wu(e,n),i=Yu(e,n),a=0;o instanceof HTMLElement&&(a=o.scrollTop);var s=r.top+(!i&&!Go(e)?a:0);return Math.floor(s-t)}function ud(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?ud(e.offsetParent)+e.offsetTop:e.offsetTop:0}function JI(e,t,n){if(!e)return 0;var r=Lw(e),o=ud(e);return Yu(e,n)&&!$I(e)&&(o-=ud(r)),Math.floor(o-t)}function QI(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:aa(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,o){var i=t.scrollTop,a=e>i?e-i:i-e;i6.top(t,e,{duration:a<100?50:n},function(s){return s&&s.message!=="Element already at target scroll position"?o(s):r()})})}function XI(e){function t(r,o,i,a,s,l){var u=a||"<>",c=l||i;if(o[i]==null)return r?new Error("Required ".concat(s," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=on(KI,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return P.plainObject(e)?e.target?!0:(jr({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(jr({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function Dg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return P.array(e)?e.every(function(n){return pS(n,t)}):(jr({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var eN=Mn(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(Ln(this,e),J(this,"element",void 0),J(this,"options",void 0),J(this,"canBeTabbed",function(o){var i=o.tabIndex;(i===null||i<0)&&(i=void 0);var a=isNaN(i);return!a&&n.canHaveFocus(o)}),J(this,"canHaveFocus",function(o){var i=/input|select|textarea|button|object/,a=o.nodeName.toLowerCase(),s=i.test(a)&&!o.getAttribute("disabled")||a==="a"&&!!o.getAttribute("href");return s&&n.isVisible(o)}),J(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),J(this,"handleKeyDown",function(o){var i=n.options.keyCode,a=i===void 0?9:i;o.keyCode===a&&n.interceptTab(o)}),J(this,"interceptTab",function(o){var i=n.findValidTabElements();if(!!i.length){o.preventDefault();var a=o.shiftKey,s=i.indexOf(document.activeElement);s===-1||!a&&s+1===i.length?s=0:a&&s===0?s=i.length-1:s+=a?-1:1,i[s].focus()}}),J(this,"isHidden",function(o){var i=o.offsetWidth<=0&&o.offsetHeight<=0,a=window.getComputedStyle(o);return i&&!o.innerHTML?!0:i&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),J(this,"isVisible",function(o){for(var i=o;i;)if(i instanceof HTMLElement){if(i===document.body)break;if(n.isHidden(i))return!1;i=i.parentNode}return!0}),J(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),J(this,"checkFocus",function(o){document.activeElement!==o&&(o.focus(),window.requestAnimationFrame(function(){return n.checkFocus(o)}))}),J(this,"setFocus",function(){var o=n.options.selector;if(!!o){var i=n.element.querySelector(o);i&&window.requestAnimationFrame(function(){return n.checkFocus(i)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),tN=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;if(Ln(this,n),o=t.call(this,r),J(Pe(o),"setBeaconRef",function(l){o.beacon=l}),!r.beaconComponent){var i=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),s=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(s)),i.appendChild(a)}return o}return Mn(n,[{key:"componentDidMount",value:function(){var o=this,i=this.props.shouldFocus;setTimeout(function(){P.domElement(o.beacon)&&i&&o.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var o=document.getElementById("joyride-beacon-animation");o&&o.parentNode.removeChild(o)}},{key:"render",value:function(){var o=this.props,i=o.beaconComponent,a=o.locale,s=o.onClickOrHover,l=o.styles,u={"aria-label":a.open,onClick:s,onMouseEnter:s,ref:this.setBeaconRef,title:a.open},c;if(i){var f=i;c=g(f,F({},u))}else c=N("button",$(F({className:"react-joyride__beacon",style:l.beacon,type:"button"},u),{children:[g("span",{style:l.beaconInner}),g("span",{style:l.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(I.Component),nN=function(t){var n=t.styles;return g("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},rN=["mixBlendMode","zIndex"],oN=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a=p&&y<=p+c,w=h>=f&&h<=f+m,S=w&&v;S!==l&&r.updateState({mouseOverSpotlight:S})}),J(Pe(r),"handleScroll",function(){var s=r.props.target,l=or(s);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Go(l,"sticky")&&r.updateState({})}),J(Pe(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return Mn(n,[{key:"componentDidMount",value:function(){var o=this.props;o.debug,o.disableScrolling;var i=o.disableScrollParentFix,a=o.target,s=or(a);this.scrollParent=Wu(s,i,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(o){var i=this,a=this.props,s=a.lifecycle,l=a.spotlightClicks,u=Gl(o,this.props),c=u.changed;c("lifecycle",ee.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=i.state.isScrolling;f||i.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(l&&s===ee.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):s!==ee.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var o=this.state.showSpotlight,i=this.props,a=i.disableScrollParentFix,s=i.spotlightClicks,l=i.spotlightPadding,u=i.styles,c=i.target,f=or(c),d=dS(f),p=Go(f),m=VI(f,l,a);return W(W({},Tg()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+l*2),left:Math.round(d.left-l),opacity:o?1:0,pointerEvents:s?"none":"auto",position:p?"fixed":"absolute",top:m,transition:"opacity 0.2s",width:Math.round(d.width+l*2)})}},{key:"updateState",value:function(o){!this._isMounted||this.setState(o)}},{key:"render",value:function(){var o=this.state,i=o.mouseOverSpotlight,a=o.showSpotlight,s=this.props,l=s.disableOverlay,u=s.disableOverlayClose,c=s.lifecycle,f=s.onClickOverlay,d=s.placement,p=s.styles;if(l||c!==ee.TOOLTIP)return null;var m=p.overlay;Tg()&&(m=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var y=W({cursor:u?"default":"pointer",height:zI(),pointerEvents:i?"none":"auto"},m),h=d!=="center"&&a&&g(nN,{styles:this.spotlightStyles});if(fS()==="safari"){y.mixBlendMode,y.zIndex;var v=Ql(y,rN);h=g("div",{style:W({},v),children:h}),delete y.backgroundColor}return g("div",{className:"react-joyride__overlay",style:y,onClick:f,children:h})}}]),n}(I.Component),iN=["styles"],aN=["color","height","width"],sN=function(t){var n=t.styles,r=Ql(t,iN),o=n.color,i=n.height,a=n.width,s=Ql(n,aN);return g("button",$(F({style:s,type:"button"},r),{children:g("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof i=="number"?"".concat(i,"px"):i,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})}))},lN=function(e){Vr(n,e);var t=Jr(n);function n(){return Ln(this,n),t.apply(this,arguments)}return Mn(n,[{key:"render",value:function(){var o=this.props,i=o.backProps,a=o.closeProps,s=o.continuous,l=o.index,u=o.isLastStep,c=o.primaryProps,f=o.size,d=o.skipProps,p=o.step,m=o.tooltipProps,y=p.content,h=p.hideBackButton,v=p.hideCloseButton,w=p.hideFooter,S=p.showProgress,A=p.showSkipButton,T=p.title,C=p.styles,O=p.locale,b=O.back,E=O.close,x=O.last,_=O.next,k=O.skip,D={primary:E};return s&&(D.primary=u?x:_,S&&(D.primary=N("span",{children:[D.primary," (",l+1,"/",f,")"]}))),A&&!u&&(D.skip=g("button",$(F({style:C.buttonSkip,type:"button","aria-live":"off"},d),{children:k}))),!h&&l>0&&(D.back=g("button",$(F({style:C.buttonBack,type:"button"},i),{children:b}))),D.close=!v&&g(sN,F({styles:C.buttonClose},a)),N("div",$(F({className:"react-joyride__tooltip",style:C.tooltip},m),{children:[N("div",{style:C.tooltipContainer,children:[T&&g("h4",{style:C.tooltipTitle,"aria-label":T,children:T}),g("div",{style:C.tooltipContent,children:y})]}),!w&&N("div",{style:C.tooltipFooter,children:[g("div",{style:C.tooltipFooterSpacer,children:D.skip}),D.back,g("button",$(F({style:C.buttonNext,type:"button"},c),{children:D.primary}))]}),D.close]}),"JoyrideTooltip")}}]),n}(I.Component),uN=["beaconComponent","tooltipComponent"],cN=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a0||a===oe.PREV),C=w("action")||w("index")||w("lifecycle")||w("status"),O=S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT),b=w("action",[oe.NEXT,oe.PREV,oe.SKIP,oe.CLOSE]);if(b&&(O||u)&&s(W(W({},A),{},{index:o.index,lifecycle:ee.COMPLETE,step:o.step,type:it.STEP_AFTER})),w("index")&&f>0&&d===ee.INIT&&m===re.RUNNING&&y.placement==="center"&&h({lifecycle:ee.READY}),C&&y){var E=or(y.target),x=!!E,_=x&&HI(E);_?(S("status",re.READY,re.RUNNING)||S("lifecycle",ee.INIT,ee.READY))&&s(W(W({},A),{},{step:y,type:it.STEP_BEFORE})):(console.warn(x?"Target not visible":"Target not mounted",y),s(W(W({},A),{},{type:it.TARGET_NOT_FOUND,step:y})),u||h({index:f+([oe.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ee.INIT,ee.READY)&&h({lifecycle:kg(y)||T?ee.TOOLTIP:ee.BEACON}),w("index")&&jr({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),w("lifecycle",ee.BEACON)&&s(W(W({},A),{},{step:y,type:it.BEACON})),w("lifecycle",ee.TOOLTIP)&&(s(W(W({},A),{},{step:y,type:it.TOOLTIP})),this.scope=new eN(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var o=this.props,i=o.step,a=o.lifecycle;return!!(kg(i)||a===ee.TOOLTIP)}},{key:"render",value:function(){var o=this.props,i=o.continuous,a=o.debug,s=o.helpers,l=o.index,u=o.lifecycle,c=o.nonce,f=o.shouldScroll,d=o.size,p=o.step,m=or(p.target);return!pS(p)||!P.domElement(m)?null:N("div",{className:"react-joyride__step",children:[g(fN,{id:"react-joyride-portal",children:g(oN,$(F({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),g(uh,$(F({component:g(cN,{continuous:i,helpers:s,index:l,isLastStep:l+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(l),isPositioned:p.isFixed||Go(m),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:g(tN,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(l))}}]),n}(I.Component),hS=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;return Ln(this,n),o=t.call(this,r),J(Pe(o),"initStore",function(){var i=o.props,a=i.debug,s=i.getHelpers,l=i.run,u=i.stepIndex;o.store=new YI(W(W({},o.props),{},{controlled:l&&P.number(u)})),o.helpers=o.store.getHelpers();var c=o.store.addListener;return jr({title:"init",data:[{key:"props",value:o.props},{key:"state",value:o.state}],debug:a}),c(o.syncState),s(o.helpers),o.store.getState()}),J(Pe(o),"callback",function(i){var a=o.props.callback;P.function(a)&&a(i)}),J(Pe(o),"handleKeyboard",function(i){var a=o.state,s=a.index,l=a.lifecycle,u=o.props.steps,c=u[s],f=window.Event?i.which:i.keyCode;l===ee.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&o.store.close()}),J(Pe(o),"syncState",function(i){o.setState(i)}),J(Pe(o),"setPopper",function(i,a){a==="wrapper"?o.beaconPopper=i:o.tooltipPopper=i}),J(Pe(o),"shouldScroll",function(i,a,s,l,u,c,f){return!i&&(a!==0||s||l===ee.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!Go(c))&&f.lifecycle!==l&&[ee.BEACON,ee.TOOLTIP].indexOf(l)!==-1}),o.state=o.initStore(),o}return Mn(n,[{key:"componentDidMount",value:function(){if(!!Cn){var o=this.props,i=o.disableCloseOnEsc,a=o.debug,s=o.run,l=o.steps,u=this.store.start;Dg(l,a)&&s&&u(),i||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(o,i){if(!!Cn){var a=this.state,s=a.action,l=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,m=d.run,y=d.stepIndex,h=d.steps,v=o.steps,w=o.stepIndex,S=this.store,A=S.reset,T=S.setSteps,C=S.start,O=S.stop,b=S.update,E=Gl(o,this.props),x=E.changed,_=Gl(i,this.state),k=_.changed,D=_.changedFrom,B=Pi(h[u],this.props),q=!ld(v,h),H=P.number(y)&&x("stepIndex"),ce=or(B==null?void 0:B.target);if(q&&(Dg(h,p)?T(h):console.warn("Steps are not valid",h)),x("run")&&(m?C(y):O()),H){var he=w=0?C:0,l===re.RUNNING&&QI(C,T,y)}}}},{key:"render",value:function(){if(!Cn)return null;var o=this.state,i=o.index,a=o.status,s=this.props,l=s.continuous,u=s.debug,c=s.nonce,f=s.scrollToFirstStep,d=s.steps,p=Pi(d[i],this.props),m;return a===re.RUNNING&&p&&(m=g(dN,$(F({},this.state),{callback:this.callback,continuous:l,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(i!==0||f),step:p,update:this.store.update}))),g("div",{className:"react-joyride",children:m})}}]),n}(I.Component);J(hS,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const pN=N("div",{children:[g("p",{children:"You can see how the changes impact your app with the app preview."}),g("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),g("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),hN=N("div",{children:[g("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),g("p",{children:"You can click on elements to select them or drag them around to move them."}),g("p",{children:"Cards can be resized by dragging resize handles on the sides."}),g("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),g("p",{children:g("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),mN=N("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",g("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",g("span",{className:zf.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),vN=N("div",{children:[g("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),g("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),gN=[{target:".app-view",content:hN,disableBeacon:!0},{target:".elements-panel",content:mN,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:vN,placement:"left-start"},{target:".app-preview",content:pN,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function yN(){const[e,t]=j.exports.useState(0),[n,r]=j.exports.useState(!1),o=j.exports.useCallback(a=>{const{action:s,index:l,status:u,type:c}=a;console.log({action:s,index:l,status:u,type:c}),(c===it.STEP_AFTER||c===it.TARGET_NOT_FOUND)&&(s===oe.NEXT?t(l+1):s===oe.PREV?t(l-1):s===oe.CLOSE&&r(!1)),c===it.TOUR_END&&(s===oe.NEXT&&(r(!1),t(0)),s===oe.SKIP&&r(!1))},[]),i=j.exports.useCallback(()=>{r(!0)},[]);return N(Me,{children:[N(wt,{onClick:i,title:"Take a guided tour of app",variant:"transparent",children:[g(CA,{id:"tour",size:"24px"}),"Tour App"]}),g(hS,{callback:o,steps:gN,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:SN})]})}const Rg="#e07189",wN="#f6d5dc",SN={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:Rg},beaconOuter:{backgroundColor:wN,border:`2px solid ${Rg}`}},bN="_container_1ehu8_1",EN="_elementsPanel_1ehu8_28",CN="_propertiesPanel_1ehu8_33",AN="_editorHolder_1ehu8_47",xN="_titledPanel_1ehu8_59",ON="_panelTitleHeader_1ehu8_71",_N="_header_1ehu8_80",PN="_rightSide_1ehu8_88",kN="_divider_1ehu8_109",TN="_title_1ehu8_59",IN="_shinyLogo_1ehu8_120",pt={container:bN,elementsPanel:EN,propertiesPanel:CN,editorHolder:AN,titledPanel:xN,panelTitleHeader:ON,header:_N,rightSide:PN,divider:kN,title:TN,shinyLogo:IN},NN="_container_1fh41_1",DN="_node_1fh41_12",Lg={container:NN,node:DN};function RN({tree:e,path:t,onSelect:n}){const r=t.length;let o=[];for(let i=0;i<=r;i++){const a=rr(e,t.slice(0,i));if(a===void 0)return null;o.push(en[a.uiName].title)}return g("div",{className:Lg.container,children:o.map((i,a)=>g("div",{className:Lg.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:LN(i)},i+a))})}function LN(e){return e.replace(/[a-z]+::/,"")}const MN="_settingsPanel_zsgzt_1",FN="_currentElementAbout_zsgzt_10",UN="_settingsForm_zsgzt_17",BN="_settingsInputs_zsgzt_24",jN="_buttonsHolder_zsgzt_28",WN="_validationErrorMsg_zsgzt_45",ki={settingsPanel:MN,currentElementAbout:FN,settingsForm:UN,settingsInputs:BN,buttonsHolder:jN,validationErrorMsg:WN};function YN(e){const t=vr(),[n,r]=v1(),[o,i]=j.exports.useState(n!==null?rr(e,n):null),a=j.exports.useRef(!1),s=j.exports.useMemo(()=>Fp(u=>{!n||!a.current||t(Sw({path:n,node:u}))},250),[t,n]);return j.exports.useEffect(()=>{if(a.current=!1,n===null){i(null);return}rr(e,n)!==void 0&&i(rr(e,n))},[e,n]),j.exports.useEffect(()=>{!o||s(o)},[o,s]),{currentNode:o,updateArgumentsByName:({name:u,value:c})=>{i(f=>$(F({},f),{uiArguments:$(F({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function zN({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:o}=YN(e);if(r===null)return g("div",{children:"Select an element to edit properties"});if(t===null)return N("div",{children:["Error finding requested node at path ",r.join(".")]});const i=r.length===0,{uiName:a,uiArguments:s}=t,l=en[a].SettingsComponent;return N("div",{className:ki.settingsPanel+" properties-panel",children:[g("div",{className:ki.currentElementAbout,children:g(RN,{tree:e,path:r,onSelect:o})}),g("form",{className:ki.settingsForm,onSubmit:GN,children:g("div",{className:ki.settingsInputs,children:g(r2,{onChange:n,children:g(l,{settings:s})})})}),g("div",{className:ki.buttonsHolder,children:i?null:g(m1,{path:r})})]})}function GN(e){e.preventDefault()}function $N(e){return["INITIAL-DATA"].includes(e.path)}function HN(){const e=vr(),t=Ja(r=>r.uiTree),n=j.exports.useCallback(r=>{e(Ok({initialState:r}))},[e]);return{tree:t,setTree:n}}function VN(){const{tree:e,setTree:t}=HN(),{status:n,ws:r}=Ow(),[o,i]=j.exports.useState("loading"),a=j.exports.useRef(null),s=Ja(l=>l.uiTree);return j.exports.useEffect(()=>{n==="connected"&&(_w(r,l=>{!$N(l)||(a.current=l.payload,t(l.payload),i("connected"))}),ia(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(i("no-backend"),t(JN),console.log("Running in static mode"))},[t,n,r]),j.exports.useEffect(()=>{s===Zp||s===a.current||n==="connected"&&ia(r,{path:"STATE-UPDATE",payload:s})},[s,n,r]),{status:o,tree:e}}const JN={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},mS=236,QN={"--properties-panel-width":`${mS}px`};function XN(){const{status:e,tree:t}=VN();return e==="loading"?g(KN,{}):N(LA,{children:[N("div",{className:pt.container,style:QN,children:[N("div",{className:pt.header,children:[g(_T,{className:pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),g("h1",{className:pt.title,children:"Shiny UI Editor"}),N("div",{className:pt.rightSide,children:[g(yN,{}),g("div",{className:pt.divider}),g(DT,{})]})]}),N("div",{className:`${pt.elementsPanel} ${pt.titledPanel} elements-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Elements"}),g(BT,{})]}),g("div",{className:pt.editorHolder+" app-view",children:g(Ep,F({},t))}),N("div",{className:`${pt.propertiesPanel}`,children:[N("div",{className:`${pt.titledPanel} properties-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Properties"}),g(zN,{tree:t})]}),g("div",{className:`${pt.titledPanel} app-preview`,children:g(ET,{})})]})]}),g(qN,{})]})}function KN(){return g("h3",{children:"Loading initial state from server"})}function qN(){return Ja(t=>t.connectedToServer)?null:g(X1,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:g("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const ZN=()=>g(Ik,{children:g(Mk,{children:g(XN,{})})}),e5="modulepreload",t5=function(e,t){return new URL(e,t).href},Mg={},n5=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(o=>{if(o=t5(o,r),o in Mg)return;Mg[o]=!0;const i=o.endsWith(".css"),a=i?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${o}"]${a}`))return;const s=document.createElement("link");if(s.rel=i?"stylesheet":e5,i||(s.as="script",s.crossOrigin=""),s.href=o,document.head.appendChild(s),i)return new Promise((l,u)=>{s.addEventListener("load",l),s.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${o}`)))})})).then(()=>t())},r5=e=>{e&&e instanceof Function&&n5(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:o,getTTFB:i})=>{t(e),n(e),r(e),o(e),i(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function o5(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}nr.render(g(j.exports.StrictMode,{children:g(ZN,{})}),document.getElementById("root"));o5();r5(); diff --git a/docs/articles/demo-app/assets/index.48893153.js b/docs/articles/demo-app/assets/index.48893153.js deleted file mode 100644 index d07c2e336..000000000 --- a/docs/articles/demo-app/assets/index.48893153.js +++ /dev/null @@ -1,145 +0,0 @@ -var bS=Object.defineProperty,ES=Object.defineProperties;var CS=Object.getOwnPropertyDescriptors;var fs=Object.getOwnPropertySymbols;var Sh=Object.prototype.hasOwnProperty,bh=Object.prototype.propertyIsEnumerable;var wh=(e,t,n)=>t in e?bS(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,F=(e,t)=>{for(var n in t||(t={}))Sh.call(t,n)&&wh(e,n,t[n]);if(fs)for(var n of fs(t))bh.call(t,n)&&wh(e,n,t[n]);return e},$=(e,t)=>ES(e,CS(t));var $t=(e,t)=>{var n={};for(var r in e)Sh.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&fs)for(var r of fs(e))t.indexOf(r)<0&&bh.call(e,r)&&(n[r]=e[r]);return n};var Eh=(e,t,n)=>new Promise((r,o)=>{var i=l=>{try{s(n.next(l))}catch(u){o(u)}},a=l=>{try{s(n.throw(l))}catch(u){o(u)}},s=l=>l.done?r(l.value):Promise.resolve(l.value).then(i,a);s((n=n.apply(e,t)).next())});const AS=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const o of document.querySelectorAll('link[rel="modulepreload"]'))r(o);new MutationObserver(o=>{for(const i of o)if(i.type==="childList")for(const a of i.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(o){const i={};return o.integrity&&(i.integrity=o.integrity),o.referrerpolicy&&(i.referrerPolicy=o.referrerpolicy),o.crossorigin==="use-credentials"?i.credentials="include":o.crossorigin==="anonymous"?i.credentials="omit":i.credentials="same-origin",i}function r(o){if(o.ep)return;o.ep=!0;const i=n(o);fetch(o.href,i)}};AS();var Fg=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Ug(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function Bg(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var o=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,o.get?o:{enumerable:!0,get:function(){return e[r]}})}),n}var j={exports:{}},se={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var Ch=Object.getOwnPropertySymbols,xS=Object.prototype.hasOwnProperty,OS=Object.prototype.propertyIsEnumerable;function _S(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function PS(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(i){return t[i]});if(r.join("")!=="0123456789")return!1;var o={};return"abcdefghijklmnopqrst".split("").forEach(function(i){o[i]=i}),Object.keys(Object.assign({},o)).join("")==="abcdefghijklmnopqrst"}catch(i){return!1}}var jg=PS()?Object.assign:function(e,t){for(var n,r=_S(e),o,i=1;i=w},o=function(){},e.unstable_forceFrameRate=function(R){0>R||125>>1,ue=R[le];if(ue!==void 0&&0b(Fe,J))rt!==void 0&&0>b(rt,Fe)?(R[le]=rt,R[Ue]=J,le=Ue):(R[le]=Fe,R[ze]=J,le=ze);else if(rt!==void 0&&0>b(rt,J))R[le]=rt,R[Ue]=J,le=Ue;else break e}}return Y}return null}function b(R,Y){var J=R.sortIndex-Y.sortIndex;return J!==0?J:R.id-Y.id}var E=[],x=[],_=1,k=null,D=3,B=!1,q=!1,H=!1;function ce(R){for(var Y=C(x);Y!==null;){if(Y.callback===null)O(x);else if(Y.startTime<=R)O(x),Y.sortIndex=Y.expirationTime,T(E,Y);else break;Y=C(x)}}function he(R){if(H=!1,ce(R),!q)if(C(E)!==null)q=!0,t(ye);else{var Y=C(x);Y!==null&&n(he,Y.startTime-R)}}function ye(R,Y){q=!1,H&&(H=!1,r()),B=!0;var J=D;try{for(ce(Y),k=C(E);k!==null&&(!(k.expirationTime>Y)||R&&!e.unstable_shouldYield());){var le=k.callback;if(typeof le=="function"){k.callback=null,D=k.priorityLevel;var ue=le(k.expirationTime<=Y);Y=e.unstable_now(),typeof ue=="function"?k.callback=ue:k===C(E)&&O(E),ce(Y)}else O(E);k=C(E)}if(k!==null)var ze=!0;else{var Fe=C(x);Fe!==null&&n(he,Fe.startTime-Y),ze=!1}return ze}finally{k=null,D=J,B=!1}}var ne=o;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(R){R.callback=null},e.unstable_continueExecution=function(){q||B||(q=!0,t(ye))},e.unstable_getCurrentPriorityLevel=function(){return D},e.unstable_getFirstCallbackNode=function(){return C(E)},e.unstable_next=function(R){switch(D){case 1:case 2:case 3:var Y=3;break;default:Y=D}var J=D;D=Y;try{return R()}finally{D=J}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=ne,e.unstable_runWithPriority=function(R,Y){switch(R){case 1:case 2:case 3:case 4:case 5:break;default:R=3}var J=D;D=R;try{return Y()}finally{D=J}},e.unstable_scheduleCallback=function(R,Y,J){var le=e.unstable_now();switch(typeof J=="object"&&J!==null?(J=J.delay,J=typeof J=="number"&&0le?(R.sortIndex=J,T(x,R),C(E)===null&&R===C(x)&&(H?r():H=!0,n(he,J-le))):(R.sortIndex=ue,T(E,R),q||B||(q=!0,t(ye))),R},e.unstable_wrapCallback=function(R){var Y=D;return function(){var J=D;D=Y;try{return R.apply(this,arguments)}finally{D=J}}}})(ty);(function(e){e.exports=ty})(ey);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Xl=j.exports,xe=jg,je=ey.exports;function M(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function st(e,t,n,r,o,i,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=o,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=i,this.removeEmptyString=a}var Ve={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){Ve[e]=new st(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];Ve[t]=new st(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){Ve[e]=new st(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){Ve[e]=new st(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){Ve[e]=new st(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){Ve[e]=new st(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){Ve[e]=new st(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){Ve[e]=new st(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){Ve[e]=new st(e,5,!1,e.toLowerCase(),null,!1,!1)});var md=/[\-:]([a-z])/g;function vd(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(md,vd);Ve[t]=new st(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(md,vd);Ve[t]=new st(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(md,vd);Ve[t]=new st(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){Ve[e]=new st(e,1,!1,e.toLowerCase(),null,!1,!1)});Ve.xlinkHref=new st("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){Ve[e]=new st(e,1,!1,e.toLowerCase(),null,!0,!0)});function gd(e,t,n,r){var o=Ve.hasOwnProperty(t)?Ve[t]:null,i=o!==null?o.type===0:r?!1:!(!(2s||o[a]!==i[s])return` -`+o[a].replace(" at new "," at ");while(1<=a&&0<=s);break}}}finally{Ju=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Ii(e):""}function US(e){switch(e.tag){case 5:return Ii(e.type);case 16:return Ii("Lazy");case 13:return Ii("Suspense");case 19:return Ii("SuspenseList");case 0:case 2:case 15:return e=ps(e.type,!1),e;case 11:return e=ps(e.type.render,!1),e;case 22:return e=ps(e.type._render,!1),e;case 1:return e=ps(e.type,!0),e;default:return""}}function po(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case Bn:return"Fragment";case Or:return"Portal";case ji:return"Profiler";case yd:return"StrictMode";case Wi:return"Suspense";case tl:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case Sd:return(e.displayName||"Context")+".Consumer";case wd:return(e._context.displayName||"Context")+".Provider";case Kl:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case ql:return po(e.type);case Ed:return po(e._render);case bd:t=e._payload,e=e._init;try{return po(e(t))}catch(n){}}return null}function ir(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function oy(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function BS(e){var t=oy(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var o=n.get,i=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return o.call(this)},set:function(a){r=""+a,i.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function hs(e){e._valueTracker||(e._valueTracker=BS(e))}function iy(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=oy(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function nl(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function Gc(e,t){var n=t.checked;return xe({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function Th(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=ir(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function ay(e,t){t=t.checked,t!=null&&gd(e,"checked",t,!1)}function $c(e,t){ay(e,t);var n=ir(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Hc(e,t.type,n):t.hasOwnProperty("defaultValue")&&Hc(e,t.type,ir(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function Ih(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Hc(e,t,n){(t!=="number"||nl(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function jS(e){var t="";return Xl.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function Jc(e,t){return e=xe({children:void 0},t),(t=jS(t.children))&&(e.children=t),e}function ho(e,t,n,r){if(e=e.options,t){t={};for(var o=0;o=n.length))throw Error(M(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:ir(n)}}function sy(e,t){var n=ir(t.value),r=ir(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function Dh(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Qc={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function ly(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Xc(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?ly(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ms,uy=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,o){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,o)})}:e}(function(e,t){if(e.namespaceURI!==Qc.svg||"innerHTML"in e)e.innerHTML=t;else{for(ms=ms||document.createElement("div"),ms.innerHTML=""+t.valueOf().toString()+"",t=ms.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function la(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Yi={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},WS=["Webkit","ms","Moz","O"];Object.keys(Yi).forEach(function(e){WS.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Yi[t]=Yi[e]})});function cy(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Yi.hasOwnProperty(e)&&Yi[e]?(""+t).trim():t+"px"}function fy(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,o=cy(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,o):e[n]=o}}var YS=xe({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Kc(e,t){if(t){if(YS[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(M(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(M(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(M(61))}if(t.style!=null&&typeof t.style!="object")throw Error(M(62))}}function qc(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function xd(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Zc=null,mo=null,vo=null;function Rh(e){if(e=Ra(e)){if(typeof Zc!="function")throw Error(M(280));var t=e.stateNode;t&&(t=ou(t),Zc(e.stateNode,e.type,t))}}function dy(e){mo?vo?vo.push(e):vo=[e]:mo=e}function py(){if(mo){var e=mo,t=vo;if(vo=mo=null,Rh(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function eu(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-ar(t),e[t]=n}var ar=Math.clz32?Math.clz32:ob,nb=Math.log,rb=Math.LN2;function ob(e){return e===0?32:31-(nb(e)/rb|0)|0}var ib=je.unstable_UserBlockingPriority,ab=je.unstable_runWithPriority,Ms=!0;function sb(e,t,n,r){_r||_d();var o=Nd,i=_r;_r=!0;try{hy(o,e,t,n,r)}finally{(_r=i)||Pd()}}function lb(e,t,n,r){ab(ib,Nd.bind(null,e,t,n,r))}function Nd(e,t,n,r){if(Ms){var o;if((o=(t&4)===0)&&0=Gi),Gh=String.fromCharCode(32),$h=!1;function Iy(e,t){switch(e){case"keyup":return Ib.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function Ny(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var io=!1;function Db(e,t){switch(e){case"compositionend":return Ny(t);case"keypress":return t.which!==32?null:($h=!0,Gh);case"textInput":return e=t.data,e===Gh&&$h?null:e;default:return null}}function Rb(e,t){if(io)return e==="compositionend"||!Fd&&Iy(e,t)?(e=ky(),Ls=Rd=zn=null,io=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Qh(n)}}function Ly(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?Ly(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Kh(){for(var e=window,t=nl();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=nl(e.document)}return t}function of(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var Gb=In&&"documentMode"in document&&11>=document.documentMode,ao=null,af=null,Hi=null,sf=!1;function qh(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;sf||ao==null||ao!==nl(r)||(r=ao,"selectionStart"in r&&of(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),Hi&&ha(Hi,r)||(Hi=r,r=al(af,"onSelect"),0lo||(e.current=uf[lo],uf[lo]=null,lo--)}function Ne(e,t){lo++,uf[lo]=e.current,e.current=t}var sr={},nt=hr(sr),gt=hr(!1),Rr=sr;function ko(e,t){var n=e.type.contextTypes;if(!n)return sr;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var o={},i;for(i in n)o[i]=t[i];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=o),o}function yt(e){return e=e.childContextTypes,e!=null}function ul(){Se(gt),Se(nt)}function sm(e,t,n){if(nt.current!==sr)throw Error(M(168));Ne(nt,t),Ne(gt,n)}function Gy(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var o in r)if(!(o in e))throw Error(M(108,po(t)||"Unknown",o));return xe({},n,r)}function Us(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||sr,Rr=nt.current,Ne(nt,e),Ne(gt,gt.current),!0}function lm(e,t,n){var r=e.stateNode;if(!r)throw Error(M(169));n?(e=Gy(e,t,Rr),r.__reactInternalMemoizedMergedChildContext=e,Se(gt),Se(nt),Ne(nt,e)):Se(gt),Ne(gt,n)}var Bd=null,Ir=null,Jb=je.unstable_runWithPriority,jd=je.unstable_scheduleCallback,cf=je.unstable_cancelCallback,Vb=je.unstable_shouldYield,um=je.unstable_requestPaint,ff=je.unstable_now,Qb=je.unstable_getCurrentPriorityLevel,iu=je.unstable_ImmediatePriority,$y=je.unstable_UserBlockingPriority,Hy=je.unstable_NormalPriority,Jy=je.unstable_LowPriority,Vy=je.unstable_IdlePriority,ac={},Xb=um!==void 0?um:function(){},En=null,Bs=null,sc=!1,cm=ff(),et=1e4>cm?ff:function(){return ff()-cm};function To(){switch(Qb()){case iu:return 99;case $y:return 98;case Hy:return 97;case Jy:return 96;case Vy:return 95;default:throw Error(M(332))}}function Qy(e){switch(e){case 99:return iu;case 98:return $y;case 97:return Hy;case 96:return Jy;case 95:return Vy;default:throw Error(M(332))}}function Mr(e,t){return e=Qy(e),Jb(e,t)}function va(e,t,n){return e=Qy(e),jd(e,t,n)}function Sn(){if(Bs!==null){var e=Bs;Bs=null,cf(e)}Xy()}function Xy(){if(!sc&&En!==null){sc=!0;var e=0;try{var t=En;Mr(99,function(){for(;eO?(b=C,C=null):b=C.sibling;var E=d(h,C,w[O],S);if(E===null){C===null&&(C=b);break}e&&C&&E.alternate===null&&t(h,C),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E,C=b}if(O===w.length)return n(h,C),A;if(C===null){for(;OO?(b=C,C=null):b=C.sibling;var x=d(h,C,E.value,S);if(x===null){C===null&&(C=b);break}e&&C&&x.alternate===null&&t(h,C),v=i(x,v,O),T===null?A=x:T.sibling=x,T=x,C=b}if(E.done)return n(h,C),A;if(C===null){for(;!E.done;O++,E=w.next())E=f(h,E.value,S),E!==null&&(v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return A}for(C=r(h,C);!E.done;O++,E=w.next())E=p(C,h,O,E.value,S),E!==null&&(e&&E.alternate!==null&&C.delete(E.key===null?O:E.key),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return e&&C.forEach(function(_){return t(h,_)}),A}return function(h,v,w,S){var A=typeof w=="object"&&w!==null&&w.type===Bn&&w.key===null;A&&(w=w.props.children);var T=typeof w=="object"&&w!==null;if(T)switch(w.$$typeof){case Ti:e:{for(T=w.key,A=v;A!==null;){if(A.key===T){switch(A.tag){case 7:if(w.type===Bn){n(h,A.sibling),v=o(A,w.props.children),v.return=h,h=v;break e}break;default:if(A.elementType===w.type){n(h,A.sibling),v=o(A,w.props),v.ref=ci(h,A,w),v.return=h,h=v;break e}}n(h,A);break}else t(h,A);A=A.sibling}w.type===Bn?(v=Eo(w.props.children,h.mode,S,w.key),v.return=h,h=v):(S=zs(w.type,w.key,w.props,null,h.mode,S),S.ref=ci(h,v,w),S.return=h,h=S)}return a(h);case Or:e:{for(A=w.key;v!==null;){if(v.key===A)if(v.tag===4&&v.stateNode.containerInfo===w.containerInfo&&v.stateNode.implementation===w.implementation){n(h,v.sibling),v=o(v,w.children||[]),v.return=h,h=v;break e}else{n(h,v);break}else t(h,v);v=v.sibling}v=pc(w,h.mode,S),v.return=h,h=v}return a(h)}if(typeof w=="string"||typeof w=="number")return w=""+w,v!==null&&v.tag===6?(n(h,v.sibling),v=o(v,w),v.return=h,h=v):(n(h,v),v=dc(w,h.mode,S),v.return=h,h=v),a(h);if(ys(w))return m(h,v,w,S);if(oi(w))return y(h,v,w,S);if(T&&ws(h,w),typeof w=="undefined"&&!A)switch(h.tag){case 1:case 22:case 0:case 11:case 15:throw Error(M(152,po(h.type)||"Component"))}return n(h,v)}}var hl=t0(!0),n0=t0(!1),Ma={},fn=hr(Ma),ya=hr(Ma),wa=hr(Ma);function kr(e){if(e===Ma)throw Error(M(174));return e}function pf(e,t){switch(Ne(wa,t),Ne(ya,e),Ne(fn,Ma),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Xc(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Xc(t,e)}Se(fn),Ne(fn,t)}function Io(){Se(fn),Se(ya),Se(wa)}function mm(e){kr(wa.current);var t=kr(fn.current),n=Xc(t,e.type);t!==n&&(Ne(ya,e),Ne(fn,n))}function Gd(e){ya.current===e&&(Se(fn),Se(ya))}var Ie=hr(0);function ml(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var xn=null,$n=null,dn=!1;function r0(e,t){var n=Mt(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function vm(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function hf(e){if(dn){var t=$n;if(t){var n=t;if(!vm(e,t)){if(t=go(n.nextSibling),!t||!vm(e,t)){e.flags=e.flags&-1025|2,dn=!1,xn=e;return}r0(xn,n)}xn=e,$n=go(t.firstChild)}else e.flags=e.flags&-1025|2,dn=!1,xn=e}}function gm(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;xn=e}function Ss(e){if(e!==xn)return!1;if(!dn)return gm(e),dn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!lf(t,e.memoizedProps))for(t=$n;t;)r0(e,t),t=go(t.nextSibling);if(gm(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(M(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){$n=go(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}$n=null}}else $n=xn?go(e.stateNode.nextSibling):null;return!0}function lc(){$n=xn=null,dn=!1}var wo=[];function $d(){for(var e=0;ei))throw Error(M(301));i+=1,He=Ke=null,t.updateQueue=null,Ji.current=tE,e=n(r,o)}while(Vi)}if(Ji.current=Sl,t=Ke!==null&&Ke.next!==null,Sa=0,He=Ke=De=null,vl=!1,t)throw Error(M(300));return e}function Tr(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return He===null?De.memoizedState=He=e:He=He.next=e,He}function Gr(){if(Ke===null){var e=De.alternate;e=e!==null?e.memoizedState:null}else e=Ke.next;var t=He===null?De.memoizedState:He.next;if(t!==null)He=t,Ke=e;else{if(e===null)throw Error(M(310));Ke=e,e={memoizedState:Ke.memoizedState,baseState:Ke.baseState,baseQueue:Ke.baseQueue,queue:Ke.queue,next:null},He===null?De.memoizedState=He=e:He=He.next=e}return He}function ln(e,t){return typeof t=="function"?t(e):t}function fi(e){var t=Gr(),n=t.queue;if(n===null)throw Error(M(311));n.lastRenderedReducer=e;var r=Ke,o=r.baseQueue,i=n.pending;if(i!==null){if(o!==null){var a=o.next;o.next=i.next,i.next=a}r.baseQueue=o=i,n.pending=null}if(o!==null){o=o.next,r=r.baseState;var s=a=i=null,l=o;do{var u=l.lane;if((Sa&u)===u)s!==null&&(s=s.next={lane:0,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null}),r=l.eagerReducer===e?l.eagerState:e(r,l.action);else{var c={lane:u,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null};s===null?(a=s=c,i=r):s=s.next=c,De.lanes|=u,La|=u}l=l.next}while(l!==null&&l!==o);s===null?i=r:s.next=a,Rt(r,t.memoizedState)||(Zt=!0),t.memoizedState=r,t.baseState=i,t.baseQueue=s,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function di(e){var t=Gr(),n=t.queue;if(n===null)throw Error(M(311));n.lastRenderedReducer=e;var r=n.dispatch,o=n.pending,i=t.memoizedState;if(o!==null){n.pending=null;var a=o=o.next;do i=e(i,a.action),a=a.next;while(a!==o);Rt(i,t.memoizedState)||(Zt=!0),t.memoizedState=i,t.baseQueue===null&&(t.baseState=i),n.lastRenderedState=i}return[i,r]}function ym(e,t,n){var r=t._getVersion;r=r(t._source);var o=t._workInProgressVersionPrimary;if(o!==null?e=o===r:(e=e.mutableReadLanes,(e=(Sa&e)===e)&&(t._workInProgressVersionPrimary=r,wo.push(t))),e)return n(t._source);throw wo.push(t),Error(M(350))}function o0(e,t,n,r){var o=at;if(o===null)throw Error(M(349));var i=t._getVersion,a=i(t._source),s=Ji.current,l=s.useState(function(){return ym(o,t,n)}),u=l[1],c=l[0];l=He;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,m=f.source;f=f.subscribe;var y=De;return e.memoizedState={refs:d,source:t,subscribe:r},s.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var h=i(t._source);if(!Rt(a,h)){h=n(t._source),Rt(c,h)||(u(h),h=Zn(y),o.mutableReadLanes|=h&o.pendingLanes),h=o.mutableReadLanes,o.entangledLanes|=h;for(var v=o.entanglements,w=h;0n?98:n,function(){e(!0)}),Mr(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[Gn]=t,e[ll]=r,p0(e,t,!1,!1),t.stateNode=e,a=qc(n,r),n){case"dialog":we("cancel",e),we("close",e),o=r;break;case"iframe":case"object":case"embed":we("load",e),o=r;break;case"video":case"audio":for(o=0;oAf&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432)}else{if(!i)if(e=ml(a),e!==null){if(t.flags|=64,i=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),hi(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!dn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*et()-r.renderingStartTime>Af&&n!==1073741824&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=et(),n.sibling=null,t=Ie.current,Ne(Ie,i?t&1|2:t&1),n):null;case 23:case 24:return tp(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(M(156,t.tag))}function oE(e){switch(e.tag){case 1:yt(e.type)&&ul();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(Io(),Se(gt),Se(nt),$d(),t=e.flags,(t&64)!==0)throw Error(M(285));return e.flags=t&-4097|64,e;case 5:return Gd(e),null;case 13:return Se(Ie),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return Se(Ie),null;case 4:return Io(),null;case 10:return Yd(e),null;case 23:case 24:return tp(),null;default:return null}}function Kd(e,t){try{var n="",r=t;do n+=US(r),r=r.return;while(r);var o=n}catch(i){o=` -Error generating stack: `+i.message+` -`+i.stack}return{value:e,source:t,stack:o}}function wf(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var iE=typeof WeakMap=="function"?WeakMap:Map;function v0(e,t,n){n=Kn(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){El||(El=!0,xf=r),wf(e,t)},n}function g0(e,t,n){n=Kn(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var o=t.value;n.payload=function(){return wf(e,t),r(o)}}var i=e.stateNode;return i!==null&&typeof i.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(un===null?un=new Set([this]):un.add(this),wf(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var aE=typeof WeakSet=="function"?WeakSet:Set;function Im(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){tr(e,n)}else t.current=null}function sE(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Qt(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ud(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(M(163))}function lE(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var o=e;r=o.next,o=o.tag,(o&4)!==0&&(o&1)!==0&&(O0(n,e),vE(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Qt(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&dm(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}dm(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&Yy(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&by(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(M(163))}function Nm(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var o=n.memoizedProps.style;o=o!=null&&o.hasOwnProperty("display")?o.display:null,r.style.display=cy("display",o)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function Dm(e,t){if(Ir&&typeof Ir.onCommitFiberUnmount=="function")try{Ir.onCommitFiberUnmount(Bd,t)}catch(i){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,o=r.destroy;if(r=r.tag,o!==void 0)if((r&4)!==0)O0(t,n);else{r=t;try{o()}catch(i){tr(r,i)}}n=n.next}while(n!==e)}break;case 1:if(Im(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(i){tr(t,i)}break;case 5:Im(t);break;case 4:y0(e,t)}}function Rm(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function Mm(e){return e.tag===5||e.tag===3||e.tag===4}function Lm(e){e:{for(var t=e.return;t!==null;){if(Mm(t))break e;t=t.return}throw Error(M(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(M(161))}n.flags&16&&(la(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||Mm(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Sf(e,n,t):bf(e,n,t)}function Sf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=sl));else if(r!==4&&(e=e.child,e!==null))for(Sf(e,t,n),e=e.sibling;e!==null;)Sf(e,t,n),e=e.sibling}function bf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(bf(e,t,n),e=e.sibling;e!==null;)bf(e,t,n),e=e.sibling}function y0(e,t){for(var n=t,r=!1,o,i;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(M(160));switch(o=r.stateNode,r.tag){case 5:i=!1;break e;case 3:o=o.containerInfo,i=!0;break e;case 4:o=o.containerInfo,i=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,s=n,l=s;;)if(Dm(a,l),l.child!==null&&l.tag!==4)l.child.return=l,l=l.child;else{if(l===s)break e;for(;l.sibling===null;){if(l.return===null||l.return===s)break e;l=l.return}l.sibling.return=l.return,l=l.sibling}i?(a=o,s=n.stateNode,a.nodeType===8?a.parentNode.removeChild(s):a.removeChild(s)):o.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){o=n.stateNode.containerInfo,i=!0,n.child.return=n,n=n.child;continue}}else if(Dm(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function fc(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var o=e!==null?e.memoizedProps:r;e=t.type;var i=t.updateQueue;if(t.updateQueue=null,i!==null){for(n[ll]=r,e==="input"&&r.type==="radio"&&r.name!=null&&ay(n,r),qc(e,o),t=qc(e,r),o=0;oo&&(o=a),n&=~i}if(n=o,n=et()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*cE(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}Je!==5&&(Je=2),l=Kd(l,s),d=a;do{switch(d.tag){case 3:i=l,d.flags|=4096,t&=-t,d.lanes|=t;var T=v0(d,i,t);fm(d,T);break e;case 1:i=l;var C=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof C.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(un===null||!un.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var b=g0(d,i,t);fm(d,b);break e}}d=d.return}while(d!==null)}x0(n)}catch(E){t=E,Me===n&&n!==null&&(Me=n=n.return);continue}break}while(1)}function C0(){var e=bl.current;return bl.current=Sl,e===null?Sl:e}function Ri(e,t){var n=X;X|=16;var r=C0();at===e&&tt===t||bo(e,t);do try{dE();break}catch(o){E0(e,o)}while(1);if(Wd(),X=n,bl.current=r,Me!==null)throw Error(M(261));return at=null,tt=0,Je}function dE(){for(;Me!==null;)A0(Me)}function pE(){for(;Me!==null&&!Vb();)A0(Me)}function A0(e){var t=_0(e.alternate,e,Lr);e.memoizedProps=e.pendingProps,t===null?x0(e):Me=t,qd.current=null}function x0(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=rE(n,t,Lr),n!==null){Me=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(Lr&1073741824)!==0||(n.mode&4)===0){for(var r=0,o=n.child;o!==null;)r|=o.lanes|o.childLanes,o=o.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(s=a,a=T,T=s),s=Xh(w,T),i=Xh(w,a),s&&i&&(A.rangeCount!==1||A.anchorNode!==s.node||A.anchorOffset!==s.offset||A.focusNode!==i.node||A.focusOffset!==i.offset)&&(S=S.createRange(),S.setStart(s.node,s.offset),A.removeAllRanges(),T>a?(A.addRange(S),A.extend(i.node,i.offset)):(S.setEnd(i.node,i.offset),A.addRange(S)))))),S=[],A=w;A=A.parentNode;)A.nodeType===1&&S.push({element:A,left:A.scrollLeft,top:A.scrollTop});for(typeof w.focus=="function"&&w.focus(),w=0;wet()-ep?bo(e,0):Zd|=n),jt(e,t)}function wE(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=To()===99?1:2:(An===0&&(An=Qo),t=eo(62914560&~An),t===0&&(t=4194304))),n=Ot(),e=lu(e,t),e!==null&&(eu(e,t,n),jt(e,n))}var _0;_0=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||gt.current)Zt=!0;else if((n&r)!==0)Zt=(e.flags&16384)!==0;else{switch(Zt=!1,t.tag){case 3:Am(t),lc();break;case 5:mm(t);break;case 1:yt(t.type)&&Us(t);break;case 4:pf(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var o=t.type._context;Ne(cl,o._currentValue),o._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?xm(e,t,n):(Ne(Ie,Ie.current&1),t=On(e,t,n),t!==null?t.sibling:null);Ne(Ie,Ie.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return Tm(e,t,n);t.flags|=64}if(o=t.memoizedState,o!==null&&(o.rendering=null,o.tail=null,o.lastEffect=null),Ne(Ie,Ie.current),r)break;return null;case 23:case 24:return t.lanes=0,uc(e,t,n)}return On(e,t,n)}else Zt=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=ko(t,nt.current),yo(t,n),o=Jd(null,t,r,e,o,n),t.flags|=1,typeof o=="object"&&o!==null&&typeof o.render=="function"&&o.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,yt(r)){var i=!0;Us(t)}else i=!1;t.memoizedState=o.state!==null&&o.state!==void 0?o.state:null,zd(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&pl(t,r,a,e),o.updater=au,t.stateNode=o,o._reactInternals=t,df(t,r,e,n),t=gf(null,t,r,!0,i,n)}else t.tag=0,ht(null,t,o,n),t=t.child;return t;case 16:o=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=o._init,o=i(o._payload),t.type=o,i=t.tag=bE(o),e=Qt(o,e),i){case 0:t=vf(null,t,o,e,n);break e;case 1:t=Cm(null,t,o,e,n);break e;case 11:t=bm(null,t,o,e,n);break e;case 14:t=Em(null,t,o,Qt(o.type,e),r,n);break e}throw Error(M(306,o,""))}return t;case 0:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),vf(e,t,r,o,n);case 1:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),Cm(e,t,r,o,n);case 3:if(Am(t),r=t.updateQueue,e===null||r===null)throw Error(M(282));if(r=t.pendingProps,o=t.memoizedState,o=o!==null?o.element:null,qy(e,t),ga(t,r,null,n),r=t.memoizedState.element,r===o)lc(),t=On(e,t,n);else{if(o=t.stateNode,(i=o.hydrate)&&($n=go(t.stateNode.containerInfo.firstChild),xn=t,i=dn=!0),i){if(e=o.mutableSourceEagerHydrationData,e!=null)for(o=0;o1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:cp(e)?2:fp(e)?3:0}function Co(e,t){return qo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function cC(e,t){return qo(e)===2?e.get(t):e[t]}function H0(e,t,n){var r=qo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function J0(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function cp(e){return vC&&e instanceof Map}function fp(e){return gC&&e instanceof Set}function Cr(e){return e.o||e.t}function dp(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Q0(e);delete t[Ce];for(var n=Ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=fC),Object.freeze(e),t&&Fr(e,function(n,r){return pp(r,!0)},!0)),e}function fC(){Kt(2)}function hp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function Pn(e){var t=Rf[e];return t||Kt(18,e),t}function dC(e,t){Rf[e]||(Rf[e]=t)}function If(){return ba}function mc(e,t){t&&(Pn("Patches"),e.u=[],e.s=[],e.v=t)}function Al(e){Nf(e),e.p.forEach(pC),e.p=null}function Nf(e){e===ba&&(ba=e.l)}function Ym(e){return ba={p:[],l:ba,h:e,m:!0,_:0}}function pC(e){var t=e[Ce];t.i===0||t.i===1?t.j():t.O=!0}function vc(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||Pn("ES5").S(t,e,r),r?(n[Ce].P&&(Al(t),Kt(4)),dr(e)&&(e=xl(t,e),t.l||Ol(t,e)),t.u&&Pn("Patches").M(n[Ce],e,t.u,t.s)):e=xl(t,n,[]),Al(t),t.u&&t.v(t.u,t.s),e!==V0?e:void 0}function xl(e,t,n){if(hp(t))return t;var r=t[Ce];if(!r)return Fr(t,function(i,a){return zm(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Ol(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=dp(r.k):r.o;Fr(r.i===3?new Set(o):o,function(i,a){return zm(e,r,o,i,a,n)}),Ol(e,o,!1),n&&e.u&&Pn("Patches").R(r,n,e.u,e.s)}return r.o}function zm(e,t,n,r,o,i){if(fr(o)){var a=xl(e,o,i&&t&&t.i!==3&&!Co(t.D,r)?i.concat(r):void 0);if(H0(n,r,a),!fr(a))return;e.m=!1}if(dr(o)&&!hp(o)){if(!e.h.F&&e._<1)return;xl(e,o),t&&t.A.l||Ol(e,o)}}function Ol(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&pp(t,n)}function gc(e,t){var n=e[Ce];return(n?Cr(n):e)[t]}function Gm(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function jn(e){e.P||(e.P=!0,e.l&&jn(e.l))}function yc(e){e.o||(e.o=dp(e.t))}function Df(e,t,n){var r=cp(t)?Pn("MapSet").N(t,n):fp(t)?Pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:If(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=xo;a&&(l=[s],u=Gs);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):Pn("ES5").J(t,n);return(n?n.A:If()).p.push(r),r}function hC(e){return fr(e)||Kt(22,e),function t(n){if(!dr(n))return n;var r,o=n[Ce],i=qo(n);if(o){if(!o.P&&(o.i<4||!Pn("ES5").K(o)))return o.t;o.I=!0,r=$m(n,i),o.I=!1}else r=$m(n,i);return Fr(r,function(a,s){o&&cC(o.t,a)===s||H0(r,a,t(s))}),i===3?new Set(r):r}(e)}function $m(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return dp(e)}function mC(){function e(i,a){var s=o[i];return s?s.enumerable=a:o[i]=s={configurable:!0,enumerable:a,get:function(){var l=this[Ce];return xo.get(l,i)},set:function(l){var u=this[Ce];xo.set(u,i,l)}},s}function t(i){for(var a=i.length-1;a>=0;a--){var s=i[a][Ce];if(!s.P)switch(s.i){case 5:r(s)&&jn(s);break;case 4:n(s)&&jn(s)}}}function n(i){for(var a=i.t,s=i.k,l=Ao(s),u=l.length-1;u>=0;u--){var c=l[u];if(c!==Ce){var f=a[c];if(f===void 0&&!Co(a,c))return!0;var d=s[c],p=d&&d[Ce];if(p?p.t!==f:!J0(d,f))return!0}}var m=!!a[Ce];return l.length!==Ao(a).length+(m?0:1)}function r(i){var a=i.k;if(a.length!==i.t.length)return!0;var s=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!s||s.get)}var o={};dC("ES5",{J:function(i,a){var s=Array.isArray(i),l=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?y-1:0),v=1;v1?u-1:0),f=1;f=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=Pn("Patches").$;return fr(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),_t=new wC,SC=_t.produce;_t.produceWithPatches.bind(_t);_t.setAutoFreeze.bind(_t);_t.setUseProxies.bind(_t);_t.applyPatches.bind(_t);_t.createDraft.bind(_t);_t.finishDraft.bind(_t);const $s=SC;function bC(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Qm(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Xm(e){for(var t=1;t0&&i[i.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!i||u[1]>i[0]&&u[1]0)for(var S=p.getState(),A=Array.from(n.values()),T=0,C=A;T!1}}),iA=()=>{const e=vr();return I.useCallback(()=>{e(aA())},[e])},{DISCONNECTED_FROM_SERVER:aA}=s1.actions,sA=s1.reducer;function Xa(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(i)),o=Object.keys(t).filter(i=>!n.includes(i));if(!Xa(r,o))return!1;for(let i of r)if(e[i]!==t[i])return!1;return!0}function l1(e,t,n){return n===0?!0:Xa(e.slice(0,n),t.slice(0,n))}function uA(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:l1(e,t,n)}const u1=vp({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:c1,RESET_SELECTION:a5,STEP_BACK_SELECTION:cA}=u1.actions,fA=u1.reducer,dA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function pA(e){const t=vr();return j.exports.useCallback(()=>{e!==null&&t(bw({path:e}))},[t,e])}const hA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",mA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",vA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",Lf="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",f1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",d1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",gA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",yA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",wA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",SA="_icon_1467k_1",bA={icon:SA},EA={undo:wA,redo:gA,tour:yA,alignTop:vA,alignBottom:mA,alignCenter:hA,alignSpread:Lf,alignTextCenter:Lf,alignTextLeft:f1,alignTextRight:d1};function CA({id:e,alt:t=e,size:n}){return g("img",{src:EA[e],alt:t,className:bA.icon,style:n?{height:n}:{}})}var p1={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},rv=j.exports.createContext&&j.exports.createContext(p1),Ur=globalThis&&globalThis.__assign||function(){return Ur=Object.assign||function(e){for(var t,n=1,r=arguments.length;ng("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),Sp=e=>N("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),PA=e=>g("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),kA="_button_1dliw_1",TA="_regular_1dliw_26",IA="_icon_1dliw_34",NA="_transparent_1dliw_42",Sc={button:kA,regular:TA,delete:"_delete_1dliw_30",icon:IA,transparent:NA},wt=o=>{var i=o,{children:e,variant:t="regular",className:n}=i,r=$t(i,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(s=>Sc[s]).join(" "):Sc[t]:"";return g("button",$(F({className:Sc.button+" "+a+(n?" "+n:"")},r),{children:e}))},DA="_deleteButton_1en02_1",RA={deleteButton:DA};function m1({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=pA(e);return N(wt,{className:RA.deleteButton,onClick:o=>{o.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[g(Sp,{}),t?null:"Delete Element"]})}function v1(){const e=vr(),t=Va(r=>r.selectedPath),n=j.exports.useCallback(r=>{e(c1({path:r}))},[e]);return[t,n]}const bp=I.createContext([null,e=>{}]),MA=({children:e})=>{const t=I.useState(null);return g(bp.Provider,{value:t,children:e})};function LA(){return I.useContext(bp)}function g1({ref:e,nodeInfo:t,immovable:n=!1}){const r=I.useRef(!1),[,o]=I.useContext(bp),i=I.useCallback(()=>{r.current===!1||n||(o(null),r.current=!1,document.body.removeEventListener("dragover",ov),document.body.removeEventListener("drop",i))},[n,o]),a=I.useCallback(s=>{s.stopPropagation(),o(t),r.current=!0,document.body.addEventListener("dragover",ov),document.body.addEventListener("drop",i)},[i,t,o]);I.useEffect(()=>{var l;if(((l=t.currentPath)==null?void 0:l.length)===0||n)return;const s=e.current;if(!!s)return s.setAttribute("draggable","true"),s.addEventListener("dragstart",a),s.addEventListener("dragend",i),()=>{s.removeEventListener("dragstart",a),s.removeEventListener("dragend",i)}},[i,n,t.currentPath,a,e])}function ov(e){e.preventDefault()}const FA="_leaf_1yzht_1",UA="_selectedOverlay_1yzht_5",BA="_container_1yzht_15",iv={leaf:FA,selectedOverlay:UA,container:BA};function jA({ref:e,path:t}){I.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const Ep=r=>{var o=r,{path:e=[],canMove:t=!0}=o,n=$t(o,["path","canMove"]);const i=I.useRef(null),{uiName:a,uiArguments:s,uiChildren:l}=n,[u,c]=v1(),f=u?Xa(e,u):!1,d=en[a],p=y=>{y.stopPropagation(),c(e)};if(g1({ref:i,nodeInfo:{node:n,currentPath:e},immovable:!t}),jA({ref:i,path:e}),d.acceptsChildren===!0){const y=d.UiComponent;return g(y,{uiArguments:s,uiChildren:l!=null?l:[],compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})}const m=d.UiComponent;return g(m,{uiArguments:s,compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})},Cp=I.forwardRef((o,r)=>{var i=o,{className:e="",children:t}=i,n=$t(i,["className","children"]);const a=e+" card";return g("div",$(F({ref:r,className:a},n),{children:t}))}),WA=I.forwardRef((r,n)=>{var o=r,{className:e=""}=o,t=$t(o,["className"]);const i=e+" card-header";return g("div",F({ref:n,className:i},t))}),YA="_container_rm196_1",zA="_withTitle_rm196_13",GA="_panelTitle_rm196_22",$A="_contentHolder_rm196_27",HA="_dropWatcher_rm196_67",JA="_lastDropWatcher_rm196_75",VA="_firstDropWatcher_rm196_78",QA="_middleDropWatcher_rm196_89",XA="_onlyDropWatcher_rm196_93",KA="_hoveringOverSwap_rm196_98",qA="_availableToSwap_rm196_99",ZA="_pulse_rm196_1",ex="_emptyGridCard_rm196_143",tx="_emptyMessage_rm196_160",xt={container:YA,withTitle:zA,panelTitle:GA,contentHolder:$A,dropWatcher:HA,lastDropWatcher:JA,firstDropWatcher:VA,middleDropWatcher:QA,onlyDropWatcher:XA,hoveringOverSwap:KA,availableToSwap:qA,pulse:ZA,emptyGridCard:ex,emptyMessage:tx};function qt(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Ap(e)?2:xp(e)?3:0}function Ff(e,t){return Zo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function nx(e,t){return Zo(e)===2?e.get(t):e[t]}function y1(e,t,n){var r=Zo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function rx(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Ap(e){return sx&&e instanceof Map}function xp(e){return lx&&e instanceof Set}function Ar(e){return e.o||e.t}function Op(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=cx(e);delete t[Pt];for(var n=Tp(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=ox),Object.freeze(e),t&&Aa(e,function(n,r){return _p(r,!0)},!0)),e}function ox(){qt(2)}function Pp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function pn(e){var t=fx[e];return t||qt(18,e),t}function av(){return xa}function bc(e,t){t&&(pn("Patches"),e.u=[],e.s=[],e.v=t)}function Tl(e){Uf(e),e.p.forEach(ix),e.p=null}function Uf(e){e===xa&&(xa=e.l)}function sv(e){return xa={p:[],l:xa,h:e,m:!0,_:0}}function ix(e){var t=e[Pt];t.i===0||t.i===1?t.j():t.O=!0}function Ec(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||pn("ES5").S(t,e,r),r?(n[Pt].P&&(Tl(t),qt(4)),Br(e)&&(e=Il(t,e),t.l||Nl(t,e)),t.u&&pn("Patches").M(n[Pt].t,e,t.u,t.s)):e=Il(t,n,[]),Tl(t),t.u&&t.v(t.u,t.s),e!==w1?e:void 0}function Il(e,t,n){if(Pp(t))return t;var r=t[Pt];if(!r)return Aa(t,function(i,a){return lv(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Nl(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=Op(r.k):r.o;Aa(r.i===3?new Set(o):o,function(i,a){return lv(e,r,o,i,a,n)}),Nl(e,o,!1),n&&e.u&&pn("Patches").R(r,n,e.u,e.s)}return r.o}function lv(e,t,n,r,o,i){if(Do(o)){var a=Il(e,o,i&&t&&t.i!==3&&!Ff(t.D,r)?i.concat(r):void 0);if(y1(n,r,a),!Do(a))return;e.m=!1}if(Br(o)&&!Pp(o)){if(!e.h.F&&e._<1)return;Il(e,o),t&&t.A.l||Nl(e,o)}}function Nl(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&_p(t,n)}function Cc(e,t){var n=e[Pt];return(n?Ar(n):e)[t]}function uv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Bf(e){e.P||(e.P=!0,e.l&&Bf(e.l))}function Ac(e){e.o||(e.o=Op(e.t))}function jf(e,t,n){var r=Ap(t)?pn("MapSet").N(t,n):xp(t)?pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:av(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=Wf;a&&(l=[s],u=Mi);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):pn("ES5").J(t,n);return(n?n.A:av()).p.push(r),r}function ax(e){return Do(e)||qt(22,e),function t(n){if(!Br(n))return n;var r,o=n[Pt],i=Zo(n);if(o){if(!o.P&&(o.i<4||!pn("ES5").K(o)))return o.t;o.I=!0,r=cv(n,i),o.I=!1}else r=cv(n,i);return Aa(r,function(a,s){o&&nx(o.t,a)===s||y1(r,a,t(s))}),i===3?new Set(r):r}(e)}function cv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Op(e)}var fv,xa,kp=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",sx=typeof Map!="undefined",lx=typeof Set!="undefined",dv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",w1=kp?Symbol.for("immer-nothing"):((fv={})["immer-nothing"]=!0,fv),pv=kp?Symbol.for("immer-draftable"):"__$immer_draftable",Pt=kp?Symbol.for("immer-state"):"__$immer_state",ux=""+Object.prototype.constructor,Tp=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,cx=Object.getOwnPropertyDescriptors||function(e){var t={};return Tp(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},fx={},Wf={get:function(e,t){if(t===Pt)return e;var n=Ar(e);if(!Ff(n,t))return function(o,i,a){var s,l=uv(i,a);return l?"value"in l?l.value:(s=l.get)===null||s===void 0?void 0:s.call(o.k):void 0}(e,n,t);var r=n[t];return e.I||!Br(r)?r:r===Cc(e.t,t)?(Ac(e),e.o[t]=jf(e.A.h,r,e)):r},has:function(e,t){return t in Ar(e)},ownKeys:function(e){return Reflect.ownKeys(Ar(e))},set:function(e,t,n){var r=uv(Ar(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var o=Cc(Ar(e),t),i=o==null?void 0:o[Pt];if(i&&i.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(rx(n,o)&&(n!==void 0||Ff(e.t,t)))return!0;Ac(e),Bf(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Cc(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,Ac(e),Bf(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=Ar(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){qt(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){qt(12)}},Mi={};Aa(Wf,function(e,t){Mi[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Mi.deleteProperty=function(e,t){return Mi.set.call(this,e,t,void 0)},Mi.set=function(e,t,n){return Wf.set.call(this,e[0],t,n,e[0])};var dx=function(){function e(n){var r=this;this.g=dv,this.F=!0,this.produce=function(o,i,a){if(typeof o=="function"&&typeof i!="function"){var s=i;i=o;var l=r;return function(y){var h=this;y===void 0&&(y=s);for(var v=arguments.length,w=Array(v>1?v-1:0),S=1;S1?c-1:0),d=1;d=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=pn("Patches").$;return Do(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),kt=new dx,px=kt.produce;kt.produceWithPatches.bind(kt);kt.setAutoFreeze.bind(kt);kt.setUseProxies.bind(kt);kt.applyPatches.bind(kt);kt.createDraft.bind(kt);kt.finishDraft.bind(kt);const ei=px,Dl=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+i*r)};function hv(e){let t=1/0,n=-1/0;for(let i of e)in&&(n=i);const r=n-t,o=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===o-1}}function S1(e,t){return[...new Array(t)].fill(e)}function hx(e,t){return e.filter(n=>!t.includes(n))}function Yf(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function Oa(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function mx(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const o=r[t];return r[t]=void 0,r=Oa(r,n,o),r.filter(i=>typeof i!="undefined")}function vx(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const o=e[r-1];return[...e].splice(0,r-1).join(t)+n+o}function Ip(e){return e.uiChildren!==void 0}function rr(e,t){let n=e,r;for(r of t){if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function b1(e,t){return l1(e,t,Math.min(e.length,t.length))}function Np(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const o=n-1;return Xa(e.slice(0,o),t.slice(0,o))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function E1(e,{path:t}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=gx(e,t);if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function gx(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const o=n.length===0?e:rr(e,n);if(!Ip(o))throw new Error("Somehow trying to enter a leaf node");return{parentNode:o,indexToNode:r}}function yx(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:o}){const i=rr(e,t);if(!en[i.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(i.uiChildren)||(i.uiChildren=[]);const a=r==="last"?i.uiChildren.length:r;if(o!==void 0){const s=[...t,a];if(b1(o,s))throw new Error("Invalid move request");if(Np(o,s)){const l=o[o.length-1];i.uiChildren=mx(i.uiChildren,l,a);return}E1(e,{path:o})}i.uiChildren=Oa(i.uiChildren,a,n)}function wx({fromPath:e,toPath:t}){if(e==null)return!0;if(b1(e,t))return!1;if(Np(e,t)){const n=e.length,r=e[n-1],o=t[n-1];if(r===o||r===o-1)return!1}return!0}const Sx="_canAcceptDrop_1oxcd_1",bx="_pulse_1oxcd_1",Ex="_hoveringOver_1oxcd_32",zf={canAcceptDrop:Sx,pulse:bx,hoveringOver:Ex};function Dp({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:o=zf.canAcceptDrop,hoveringOverClass:i=zf.hoveringOver}){const[a,s]=LA(),{addCanAcceptDropHighlight:l,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=Cx({watcherRef:e,canAcceptDropClass:o,hoveringOverClass:i}),d=a?t(a):!1,p=I.useCallback(h=>{h.preventDefault(),h.stopPropagation(),u(),r==null||r()},[u,r]),m=I.useCallback(h=>{h.preventDefault(),c()},[c]),y=I.useCallback(h=>{if(h.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),s(null)},[d,a,n,c,s]);I.useEffect(()=>{const h=e.current;if(!!h)return d&&(l(),h.addEventListener("dragenter",p),h.addEventListener("dragleave",m),h.addEventListener("dragover",p),h.addEventListener("drop",y)),()=>{f(),h.removeEventListener("dragenter",p),h.removeEventListener("dragleave",m),h.removeEventListener("dragover",p),h.removeEventListener("drop",y)}},[l,d,m,p,y,f,e])}function Cx({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=I.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),o=I.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),i=I.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=I.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:o,removeHoveredOverHighlight:i,removeAllHighlights:a}}function Ax({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Ew(),o=I.useCallback(({node:a,currentPath:s})=>mv(a)!==null&&wx({fromPath:s,toPath:[...n,t]}),[t,n]),i=I.useCallback(({node:a,currentPath:s})=>{const l=mv(a);if(!l)throw new Error("No node to place...");r({node:l,currentPath:s,parentPath:n,positionInChildren:t})},[t,n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i})}function mv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function xx(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function vv(e){return Et({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function gv(e){return Et({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function C1(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}var Ou=A1;function A1(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],o={}.toString.call(r).slice(8,-1);o=="Array"||o=="Object"?t[n]=A1(r):o=="Date"?t[n]=new Date(r.getTime()):o=="RegExp"?t[n]=RegExp(r.source,Ox(r)):t[n]=r}return t}function Ox(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Ka(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function _x(e,t={}){const n=new Set;for(let r of e)for(let o of r)t.ignore&&t.ignore.includes(o)||n.add(o);return[...n]}function Px(e,{index:t,arr:n,dir:r}){const o=Ou(e);switch(r){case"rows":return Oa(o,t,n);case"cols":return o.map((i,a)=>Oa(i,t,n[a]))}}function kx(e,{index:t,dir:n}){const r=Ou(e);switch(n){case"rows":return Yf(r,t);case"cols":return r.map((o,i)=>Yf(o,t))}}const vn=".";function Rp(e){const t=new Map;return Tx(e).forEach(({itemRows:n,itemCols:r},o)=>{if(o===vn)return;const i=hv(n),a=hv(r);t.set(o,{colStart:a.minVal,rowStart:i.minVal,colSpan:a.span+1,rowSpan:i.span+1,isValid:i.isSequence&&a.isSequence})}),t}function Tx(e){var o;const t=new Map,{numRows:n,numCols:r}=Ka(e);for(let i=0;i1,c=r>1,f=[];return(yv({colRange:l,rowIndex:e-1,layoutAreas:o})||u)&&f.push("up"),(yv({colRange:l,rowIndex:i+1,layoutAreas:o})||u)&&f.push("down"),(wv({rowRange:s,colIndex:n-1,layoutAreas:o})||c)&&f.push("left"),(wv({rowRange:s,colIndex:a+1,layoutAreas:o})||c)&&f.push("right"),f}function yv({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===vn)}function wv({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===vn)}const Nx="_marker_rkm38_1",Dx="_dragger_rkm38_30",Rx="_move_rkm38_50",Sv={marker:Nx,dragger:Dx,move:Rx};function _a({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function Mx(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=_a(e)),"colSpan"in t&&(t=_a(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function Lx({row:e,col:t}){return`row${e}-col${t}`}function Fx({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:o,colStart:i,colEnd:a}=_a(t),s=n.length,l=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:o,growExtent:1};u=r-1,c=1,f=o;break;case"left":if(i===1)return{shrinkExtent:a,growExtent:1};u=i-1,c=1,f=a;break;case"down":if(o===s)return{shrinkExtent:r,growExtent:s};u=o+1,c=s,f=r;break;case"right":if(a===l)return{shrinkExtent:i,growExtent:l};u=a+1,c=l,f=i;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[m,y]=d?[i,a]:[r,o],h=(S,A)=>{const[T,C]=d?[S,A]:[A,S];return n[T-1][C-1]!==vn},v=Dl(m,y),w=Dl(u,c);for(let S of w)for(let A of v)if(h(S,A))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function x1(e,t,n){const r=t=r&&e<=o}function Ux({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=Gf(t.getPropertyValue("gap")),i=Gf(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],s=Bx(t,e),l=s.length,u=[];for(let c=0;cx1(i,l,u));if(a===void 0)return;const s=Wx[n];return o[s]=a.index,o}const Wx={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function Yx({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const o=_a(t),i=I.useRef(null),a=I.useCallback(u=>{const c=e.current,f=i.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=jx({mousePos:u,dragState:f});d&&Ev(c,d)},[e]),s=I.useCallback(()=>{const u=e.current,c=i.current;if(!u||!c)return;const f=c.gridItemExtent;Mx(f,o)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),bv("on")},[o,a,r,e]);return I.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),m=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:y,growExtent:h}=Fx({dragDirection:u,gridLocation:t,layoutAreas:n});i.current={dragHandle:u,gridItemExtent:_a(t),tractExtents:Ux({dir:m,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:v})=>x1(v,y,h))},Ev(e.current,i.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",s,{once:!0}),bv("off")},[s,t,n,a,e])}function bv(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function Ev(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:o}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(o+1))}function zx({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const o=I.useRef(null),i=Yx({overlayRef:o,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=I.useMemo(()=>Ix({gridLocation:t,layoutAreas:n}),[t,n]),s=I.useMemo(()=>{let l=[];for(let u of a)l.push(g("div",{className:Sv.dragger+" "+u,onMouseDown:c=>{Gx(c),i(u)},children:$x[u]},u));return l},[a,i]);return I.useEffect(()=>{var l;(l=o.current)==null||l.style.setProperty("--grid-area",e)},[e]),g("div",{ref:o,className:Sv.marker+" grid-area-overlay",children:s})}function Gx(e){e.preventDefault(),e.stopPropagation()}const $x={up:g(gv,{}),down:g(gv,{}),left:g(vv,{}),right:g(vv,{})};function Hx({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=I.useRef(null);return Dp({watcherRef:r,onDrop:o=>{n($(F({},o),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),g("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function Jx(e,t){const{numRows:n,numCols:r}=Ka(e),o=[];for(let i=0;i{const i=r==="rows"?"cols":"rows",a=O1(o);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const s=Rp(o.areas);let l=S1(vn,a[i].length);s.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=Hf(u,r);if(f<=t&&d>t){const m=Hf(u,i);for(let y=m.itemStart-1;y1}function Kx(e,{index:t,dir:n}){let r=[];return e.forEach((o,i)=>{const{itemStart:a,itemEnd:s}=Hf(o,n);a===t&&a===s&&r.push(i)}),r}const qx="_ResizableGrid_i4cq9_1",Zx={ResizableGrid:qx,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function T1(e){var o,i;const t=((o=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:o[0])||"px",n=(i=e.match(/^[\d|\.]*/g))==null?void 0:i[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function Wn(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const e2="_container_jk9tt_8",t2="_label_jk9tt_26",n2="_mainInput_jk9tt_59",kn={container:e2,label:t2,mainInput:n2},I1=I.createContext(null);function $r(e){const t=I.useContext(I1);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const r2=({onChange:e,children:t})=>g(I1.Provider,{value:e,children:t});function o2({name:e,isDisabled:t,defaultValue:n}){const r=$r(),o=`Click to ${t?"set":"unset"} ${e} property`;return g("input",{"aria-label":o,type:"checkbox",checked:!t,title:o,onChange:i=>{r({name:e,value:i.target.checked?n:void 0})}})}function Mp({name:e,label:t,optional:n,isDisabled:r,defaultValue:o,mainInput:i,width_setting:a="full"}){return N("label",{className:kn.container,"data-disabled":r,"data-width-setting":a,children:[N("div",{className:kn.label,children:[n?g(o2,{name:e,isDisabled:r,defaultValue:o}):null,t!=null?t:e,":"]}),g("div",{className:kn.mainInput,children:i})]})}const i2="_numericInput_n1lnu_1",a2={numericInput:i2};function Lp({value:e,ariaLabel:t,onChange:n,min:r,max:o,disabled:i=!1}){var s;const a=I.useCallback((l=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+l*c;r&&(f=Math.max(f,r)),o&&(f=Math.min(f,o)),n(f)},[o,r,n,e]);return g("input",{className:a2.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:i,value:(s=e==null?void 0:e.toString())!=null?s:"",onChange:l=>n(Number(l.target.value)),min:r,onKeyDown:l=>{(l.key==="ArrowUp"||l.key==="ArrowDown")&&(l.preventDefault(),a(l.key==="ArrowUp"?1:-1,l.shiftKey))}})}function Hn({name:e,label:t,value:n,min:r=0,max:o,onChange:i,optional:a=!1,defaultValue:s=1,disabled:l=n===void 0}){const u=$r(i);return g(Mp,{name:e,label:t,optional:a,isDisabled:l,defaultValue:s,width_setting:"fit",mainInput:g(Lp,{ariaLabel:t!=null?t:e,disabled:l,value:n,onChange:c=>u({name:e,value:c}),min:r,max:o})})}var Fp=s2;function s2(e,t,n){var r=null,o=null,i=function(){r&&(clearTimeout(r),o=null,r=null)},a=function(){var l=o;i(),l&&l()},s=function(){if(!t)return e.apply(this,arguments);var l=this,u=arguments,c=n&&!r;if(i(),o=function(){e.apply(l,u)},r=setTimeout(function(){if(r=null,!c){var f=o;return o=null,f()}},t),c)return o()};return s.cancel=i,s.flush=a,s}var Av=function(t){return t.reduce(function(n,r){var o=r[0],i=r[1];return n[o]=i,n},{})},xv=typeof window!="undefined"&&window.document&&window.document.createElement?j.exports.useLayoutEffect:j.exports.useEffect,St="top",Wt="bottom",Yt="right",bt="left",Up="auto",qa=[St,Wt,Yt,bt],Ro="start",Pa="end",l2="clippingParents",N1="viewport",vi="popper",u2="reference",Ov=qa.reduce(function(e,t){return e.concat([t+"-"+Ro,t+"-"+Pa])},[]),D1=[].concat(qa,[Up]).reduce(function(e,t){return e.concat([t,t+"-"+Ro,t+"-"+Pa])},[]),c2="beforeRead",f2="read",d2="afterRead",p2="beforeMain",h2="main",m2="afterMain",v2="beforeWrite",g2="write",y2="afterWrite",w2=[c2,f2,d2,p2,h2,m2,v2,g2,y2];function gn(e){return e?(e.nodeName||"").toLowerCase():null}function nn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function Mo(e){var t=nn(e).Element;return e instanceof t||e instanceof Element}function Ut(e){var t=nn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function R1(e){if(typeof ShadowRoot=="undefined")return!1;var t=nn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function S2(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},o=t.attributes[n]||{},i=t.elements[n];!Ut(i)||!gn(i)||(Object.assign(i.style,r),Object.keys(o).forEach(function(a){var s=o[a];s===!1?i.removeAttribute(a):i.setAttribute(a,s===!0?"":s)}))})}function b2(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var o=t.elements[r],i=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),s=a.reduce(function(l,u){return l[u]="",l},{});!Ut(o)||!gn(o)||(Object.assign(o.style,s),Object.keys(i).forEach(function(l){o.removeAttribute(l)}))})}}const E2={name:"applyStyles",enabled:!0,phase:"write",fn:S2,effect:b2,requires:["computeStyles"]};function hn(e){return e.split("-")[0]}var Nr=Math.max,Rl=Math.min,Lo=Math.round;function Fo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,o=1;if(Ut(e)&&t){var i=e.offsetHeight,a=e.offsetWidth;a>0&&(r=Lo(n.width)/a||1),i>0&&(o=Lo(n.height)/i||1)}return{width:n.width/r,height:n.height/o,top:n.top/o,right:n.right/r,bottom:n.bottom/o,left:n.left/r,x:n.left/r,y:n.top/o}}function Bp(e){var t=Fo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function M1(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&R1(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function Nn(e){return nn(e).getComputedStyle(e)}function C2(e){return["table","td","th"].indexOf(gn(e))>=0}function gr(e){return((Mo(e)?e.ownerDocument:e.document)||window.document).documentElement}function _u(e){return gn(e)==="html"?e:e.assignedSlot||e.parentNode||(R1(e)?e.host:null)||gr(e)}function _v(e){return!Ut(e)||Nn(e).position==="fixed"?null:e.offsetParent}function A2(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&Ut(e)){var r=Nn(e);if(r.position==="fixed")return null}for(var o=_u(e);Ut(o)&&["html","body"].indexOf(gn(o))<0;){var i=Nn(o);if(i.transform!=="none"||i.perspective!=="none"||i.contain==="paint"||["transform","perspective"].indexOf(i.willChange)!==-1||t&&i.willChange==="filter"||t&&i.filter&&i.filter!=="none")return o;o=o.parentNode}return null}function Za(e){for(var t=nn(e),n=_v(e);n&&C2(n)&&Nn(n).position==="static";)n=_v(n);return n&&(gn(n)==="html"||gn(n)==="body"&&Nn(n).position==="static")?t:n||A2(e)||t}function jp(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function qi(e,t,n){return Nr(e,Rl(t,n))}function x2(e,t,n){var r=qi(e,t,n);return r>n?n:r}function L1(){return{top:0,right:0,bottom:0,left:0}}function F1(e){return Object.assign({},L1(),e)}function U1(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var O2=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,F1(typeof t!="number"?t:U1(t,qa))};function _2(e){var t,n=e.state,r=e.name,o=e.options,i=n.elements.arrow,a=n.modifiersData.popperOffsets,s=hn(n.placement),l=jp(s),u=[bt,Yt].indexOf(s)>=0,c=u?"height":"width";if(!(!i||!a)){var f=O2(o.padding,n),d=Bp(i),p=l==="y"?St:bt,m=l==="y"?Wt:Yt,y=n.rects.reference[c]+n.rects.reference[l]-a[l]-n.rects.popper[c],h=a[l]-n.rects.reference[l],v=Za(i),w=v?l==="y"?v.clientHeight||0:v.clientWidth||0:0,S=y/2-h/2,A=f[p],T=w-d[c]-f[m],C=w/2-d[c]/2+S,O=qi(A,C,T),b=l;n.modifiersData[r]=(t={},t[b]=O,t.centerOffset=O-C,t)}}function P2(e){var t=e.state,n=e.options,r=n.element,o=r===void 0?"[data-popper-arrow]":r;o!=null&&(typeof o=="string"&&(o=t.elements.popper.querySelector(o),!o)||!M1(t.elements.popper,o)||(t.elements.arrow=o))}const k2={name:"arrow",enabled:!0,phase:"main",fn:_2,effect:P2,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Uo(e){return e.split("-")[1]}var T2={top:"auto",right:"auto",bottom:"auto",left:"auto"};function I2(e){var t=e.x,n=e.y,r=window,o=r.devicePixelRatio||1;return{x:Lo(t*o)/o||0,y:Lo(n*o)/o||0}}function Pv(e){var t,n=e.popper,r=e.popperRect,o=e.placement,i=e.variation,a=e.offsets,s=e.position,l=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,m=a.y,y=m===void 0?0:m,h=typeof c=="function"?c({x:p,y}):{x:p,y};p=h.x,y=h.y;var v=a.hasOwnProperty("x"),w=a.hasOwnProperty("y"),S=bt,A=St,T=window;if(u){var C=Za(n),O="clientHeight",b="clientWidth";if(C===nn(n)&&(C=gr(n),Nn(C).position!=="static"&&s==="absolute"&&(O="scrollHeight",b="scrollWidth")),C=C,o===St||(o===bt||o===Yt)&&i===Pa){A=Wt;var E=f&&T.visualViewport?T.visualViewport.height:C[O];y-=E-r.height,y*=l?1:-1}if(o===bt||(o===St||o===Wt)&&i===Pa){S=Yt;var x=f&&T.visualViewport?T.visualViewport.width:C[b];p-=x-r.width,p*=l?1:-1}}var _=Object.assign({position:s},u&&T2),k=c===!0?I2({x:p,y}):{x:p,y};if(p=k.x,y=k.y,l){var D;return Object.assign({},_,(D={},D[A]=w?"0":"",D[S]=v?"0":"",D.transform=(T.devicePixelRatio||1)<=1?"translate("+p+"px, "+y+"px)":"translate3d("+p+"px, "+y+"px, 0)",D))}return Object.assign({},_,(t={},t[A]=w?y+"px":"",t[S]=v?p+"px":"",t.transform="",t))}function N2(e){var t=e.state,n=e.options,r=n.gpuAcceleration,o=r===void 0?!0:r,i=n.adaptive,a=i===void 0?!0:i,s=n.roundOffsets,l=s===void 0?!0:s,u={placement:hn(t.placement),variation:Uo(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:o,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,Pv(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:l})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,Pv(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:l})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const D2={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:N2,data:{}};var As={passive:!0};function R2(e){var t=e.state,n=e.instance,r=e.options,o=r.scroll,i=o===void 0?!0:o,a=r.resize,s=a===void 0?!0:a,l=nn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return i&&u.forEach(function(c){c.addEventListener("scroll",n.update,As)}),s&&l.addEventListener("resize",n.update,As),function(){i&&u.forEach(function(c){c.removeEventListener("scroll",n.update,As)}),s&&l.removeEventListener("resize",n.update,As)}}const M2={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:R2,data:{}};var L2={left:"right",right:"left",bottom:"top",top:"bottom"};function Hs(e){return e.replace(/left|right|bottom|top/g,function(t){return L2[t]})}var F2={start:"end",end:"start"};function kv(e){return e.replace(/start|end/g,function(t){return F2[t]})}function Wp(e){var t=nn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Yp(e){return Fo(gr(e)).left+Wp(e).scrollLeft}function U2(e){var t=nn(e),n=gr(e),r=t.visualViewport,o=n.clientWidth,i=n.clientHeight,a=0,s=0;return r&&(o=r.width,i=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,s=r.offsetTop)),{width:o,height:i,x:a+Yp(e),y:s}}function B2(e){var t,n=gr(e),r=Wp(e),o=(t=e.ownerDocument)==null?void 0:t.body,i=Nr(n.scrollWidth,n.clientWidth,o?o.scrollWidth:0,o?o.clientWidth:0),a=Nr(n.scrollHeight,n.clientHeight,o?o.scrollHeight:0,o?o.clientHeight:0),s=-r.scrollLeft+Yp(e),l=-r.scrollTop;return Nn(o||n).direction==="rtl"&&(s+=Nr(n.clientWidth,o?o.clientWidth:0)-i),{width:i,height:a,x:s,y:l}}function zp(e){var t=Nn(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+o+r)}function B1(e){return["html","body","#document"].indexOf(gn(e))>=0?e.ownerDocument.body:Ut(e)&&zp(e)?e:B1(_u(e))}function Zi(e,t){var n;t===void 0&&(t=[]);var r=B1(e),o=r===((n=e.ownerDocument)==null?void 0:n.body),i=nn(r),a=o?[i].concat(i.visualViewport||[],zp(r)?r:[]):r,s=t.concat(a);return o?s:s.concat(Zi(_u(a)))}function Jf(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function j2(e){var t=Fo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function Tv(e,t){return t===N1?Jf(U2(e)):Mo(t)?j2(t):Jf(B2(gr(e)))}function W2(e){var t=Zi(_u(e)),n=["absolute","fixed"].indexOf(Nn(e).position)>=0,r=n&&Ut(e)?Za(e):e;return Mo(r)?t.filter(function(o){return Mo(o)&&M1(o,r)&&gn(o)!=="body"}):[]}function Y2(e,t,n){var r=t==="clippingParents"?W2(e):[].concat(t),o=[].concat(r,[n]),i=o[0],a=o.reduce(function(s,l){var u=Tv(e,l);return s.top=Nr(u.top,s.top),s.right=Rl(u.right,s.right),s.bottom=Rl(u.bottom,s.bottom),s.left=Nr(u.left,s.left),s},Tv(e,i));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function j1(e){var t=e.reference,n=e.element,r=e.placement,o=r?hn(r):null,i=r?Uo(r):null,a=t.x+t.width/2-n.width/2,s=t.y+t.height/2-n.height/2,l;switch(o){case St:l={x:a,y:t.y-n.height};break;case Wt:l={x:a,y:t.y+t.height};break;case Yt:l={x:t.x+t.width,y:s};break;case bt:l={x:t.x-n.width,y:s};break;default:l={x:t.x,y:t.y}}var u=o?jp(o):null;if(u!=null){var c=u==="y"?"height":"width";switch(i){case Ro:l[u]=l[u]-(t[c]/2-n[c]/2);break;case Pa:l[u]=l[u]+(t[c]/2-n[c]/2);break}}return l}function ka(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=r===void 0?e.placement:r,i=n.boundary,a=i===void 0?l2:i,s=n.rootBoundary,l=s===void 0?N1:s,u=n.elementContext,c=u===void 0?vi:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,m=p===void 0?0:p,y=F1(typeof m!="number"?m:U1(m,qa)),h=c===vi?u2:vi,v=e.rects.popper,w=e.elements[d?h:c],S=Y2(Mo(w)?w:w.contextElement||gr(e.elements.popper),a,l),A=Fo(e.elements.reference),T=j1({reference:A,element:v,strategy:"absolute",placement:o}),C=Jf(Object.assign({},v,T)),O=c===vi?C:A,b={top:S.top-O.top+y.top,bottom:O.bottom-S.bottom+y.bottom,left:S.left-O.left+y.left,right:O.right-S.right+y.right},E=e.modifiersData.offset;if(c===vi&&E){var x=E[o];Object.keys(b).forEach(function(_){var k=[Yt,Wt].indexOf(_)>=0?1:-1,D=[St,Wt].indexOf(_)>=0?"y":"x";b[_]+=x[D]*k})}return b}function z2(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=n.boundary,i=n.rootBoundary,a=n.padding,s=n.flipVariations,l=n.allowedAutoPlacements,u=l===void 0?D1:l,c=Uo(r),f=c?s?Ov:Ov.filter(function(m){return Uo(m)===c}):qa,d=f.filter(function(m){return u.indexOf(m)>=0});d.length===0&&(d=f);var p=d.reduce(function(m,y){return m[y]=ka(e,{placement:y,boundary:o,rootBoundary:i,padding:a})[hn(y)],m},{});return Object.keys(p).sort(function(m,y){return p[m]-p[y]})}function G2(e){if(hn(e)===Up)return[];var t=Hs(e);return[kv(e),t,kv(t)]}function $2(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!0:a,l=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,m=p===void 0?!0:p,y=n.allowedAutoPlacements,h=t.options.placement,v=hn(h),w=v===h,S=l||(w||!m?[Hs(h)]:G2(h)),A=[h].concat(S).reduce(function(le,ue){return le.concat(hn(ue)===Up?z2(t,{placement:ue,boundary:c,rootBoundary:f,padding:u,flipVariations:m,allowedAutoPlacements:y}):ue)},[]),T=t.rects.reference,C=t.rects.popper,O=new Map,b=!0,E=A[0],x=0;x=0,q=B?"width":"height",H=ka(t,{placement:_,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),ce=B?D?Yt:bt:D?Wt:St;T[q]>C[q]&&(ce=Hs(ce));var he=Hs(ce),ye=[];if(i&&ye.push(H[k]<=0),s&&ye.push(H[ce]<=0,H[he]<=0),ye.every(function(le){return le})){E=_,b=!1;break}O.set(_,ye)}if(b)for(var ne=m?3:1,R=function(ue){var ze=A.find(function(Fe){var Ue=O.get(Fe);if(Ue)return Ue.slice(0,ue).every(function(rt){return rt})});if(ze)return E=ze,"break"},Y=ne;Y>0;Y--){var J=R(Y);if(J==="break")break}t.placement!==E&&(t.modifiersData[r]._skip=!0,t.placement=E,t.reset=!0)}}const H2={name:"flip",enabled:!0,phase:"main",fn:$2,requiresIfExists:["offset"],data:{_skip:!1}};function Iv(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function Nv(e){return[St,Yt,Wt,bt].some(function(t){return e[t]>=0})}function J2(e){var t=e.state,n=e.name,r=t.rects.reference,o=t.rects.popper,i=t.modifiersData.preventOverflow,a=ka(t,{elementContext:"reference"}),s=ka(t,{altBoundary:!0}),l=Iv(a,r),u=Iv(s,o,i),c=Nv(l),f=Nv(u);t.modifiersData[n]={referenceClippingOffsets:l,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const V2={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:J2};function Q2(e,t,n){var r=hn(e),o=[bt,St].indexOf(r)>=0?-1:1,i=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=i[0],s=i[1];return a=a||0,s=(s||0)*o,[bt,Yt].indexOf(r)>=0?{x:s,y:a}:{x:a,y:s}}function X2(e){var t=e.state,n=e.options,r=e.name,o=n.offset,i=o===void 0?[0,0]:o,a=D1.reduce(function(c,f){return c[f]=Q2(f,t.rects,i),c},{}),s=a[t.placement],l=s.x,u=s.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=l,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const K2={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:X2};function q2(e){var t=e.state,n=e.name;t.modifiersData[n]=j1({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const Z2={name:"popperOffsets",enabled:!0,phase:"read",fn:q2,data:{}};function eO(e){return e==="x"?"y":"x"}function tO(e){var t=e.state,n=e.options,r=e.name,o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!1:a,l=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,m=n.tetherOffset,y=m===void 0?0:m,h=ka(t,{boundary:l,rootBoundary:u,padding:f,altBoundary:c}),v=hn(t.placement),w=Uo(t.placement),S=!w,A=jp(v),T=eO(A),C=t.modifiersData.popperOffsets,O=t.rects.reference,b=t.rects.popper,E=typeof y=="function"?y(Object.assign({},t.rects,{placement:t.placement})):y,x=typeof E=="number"?{mainAxis:E,altAxis:E}:Object.assign({mainAxis:0,altAxis:0},E),_=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,k={x:0,y:0};if(!!C){if(i){var D,B=A==="y"?St:bt,q=A==="y"?Wt:Yt,H=A==="y"?"height":"width",ce=C[A],he=ce+h[B],ye=ce-h[q],ne=p?-b[H]/2:0,R=w===Ro?O[H]:b[H],Y=w===Ro?-b[H]:-O[H],J=t.elements.arrow,le=p&&J?Bp(J):{width:0,height:0},ue=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:L1(),ze=ue[B],Fe=ue[q],Ue=qi(0,O[H],le[H]),rt=S?O[H]/2-ne-Ue-ze-x.mainAxis:R-Ue-ze-x.mainAxis,us=S?-O[H]/2+ne+Ue+Fe+x.mainAxis:Y+Ue+Fe+x.mainAxis,zu=t.elements.arrow&&Za(t.elements.arrow),vS=zu?A==="y"?zu.clientTop||0:zu.clientLeft||0:0,ch=(D=_==null?void 0:_[A])!=null?D:0,gS=ce+rt-ch-vS,yS=ce+us-ch,fh=qi(p?Rl(he,gS):he,ce,p?Nr(ye,yS):ye);C[A]=fh,k[A]=fh-ce}if(s){var dh,wS=A==="x"?St:bt,SS=A==="x"?Wt:Yt,yr=C[T],cs=T==="y"?"height":"width",ph=yr+h[wS],hh=yr-h[SS],Gu=[St,bt].indexOf(v)!==-1,mh=(dh=_==null?void 0:_[T])!=null?dh:0,vh=Gu?ph:yr-O[cs]-b[cs]-mh+x.altAxis,gh=Gu?yr+O[cs]+b[cs]-mh-x.altAxis:hh,yh=p&&Gu?x2(vh,yr,gh):qi(p?vh:ph,yr,p?gh:hh);C[T]=yh,k[T]=yh-yr}t.modifiersData[r]=k}}const nO={name:"preventOverflow",enabled:!0,phase:"main",fn:tO,requiresIfExists:["offset"]};function rO(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function oO(e){return e===nn(e)||!Ut(e)?Wp(e):rO(e)}function iO(e){var t=e.getBoundingClientRect(),n=Lo(t.width)/e.offsetWidth||1,r=Lo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function aO(e,t,n){n===void 0&&(n=!1);var r=Ut(t),o=Ut(t)&&iO(t),i=gr(t),a=Fo(e,o),s={scrollLeft:0,scrollTop:0},l={x:0,y:0};return(r||!r&&!n)&&((gn(t)!=="body"||zp(i))&&(s=oO(t)),Ut(t)?(l=Fo(t,!0),l.x+=t.clientLeft,l.y+=t.clientTop):i&&(l.x=Yp(i))),{x:a.left+s.scrollLeft-l.x,y:a.top+s.scrollTop-l.y,width:a.width,height:a.height}}function sO(e){var t=new Map,n=new Set,r=[];e.forEach(function(i){t.set(i.name,i)});function o(i){n.add(i.name);var a=[].concat(i.requires||[],i.requiresIfExists||[]);a.forEach(function(s){if(!n.has(s)){var l=t.get(s);l&&o(l)}}),r.push(i)}return e.forEach(function(i){n.has(i.name)||o(i)}),r}function lO(e){var t=sO(e);return w2.reduce(function(n,r){return n.concat(t.filter(function(o){return o.phase===r}))},[])}function uO(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function cO(e){var t=e.reduce(function(n,r){var o=n[r.name];return n[r.name]=o?Object.assign({},o,r,{options:Object.assign({},o.options,r.options),data:Object.assign({},o.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var Dv={placement:"bottom",modifiers:[],strategy:"absolute"};function Rv(){for(var e=arguments.length,t=new Array(e),n=0;n{var l=s,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:o,openDelayMs:i=0}=l,a=$t(l,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);const[u,c]=I.useState(null),[f,d]=I.useState(null),[p,m]=I.useState(null),{styles:y,attributes:h,update:v}=SO(u,f,{placement:t,modifiers:[{name:"arrow",options:{element:p}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),w=I.useMemo(()=>$(F({},y.popper),{backgroundColor:o}),[o,y.popper]),S=I.useMemo(()=>{let T;function C(){T=setTimeout(()=>{v==null||v(),f==null||f.setAttribute("data-show","")},i)}function O(){clearTimeout(T),f==null||f.removeAttribute("data-show")}return{[n==="hover"?"onMouseEnter":"onClick"]:()=>C(),onMouseLeave:()=>O()}},[i,f,n,v]),A=typeof r=="string";return N(Le,{children:[g("button",$(F(F({},a),S),{ref:c,children:e})),N("div",$(F({ref:d,className:xc.popover,style:w},h.popper),{children:[A?g("div",{className:xc.textContent,children:r}):r,g("div",{ref:m,className:xc.popperArrow,style:y.arrow})]}))]})},AO="_infoIcon_15ri6_1",xO="_container_15ri6_10",OO="_header_15ri6_15",_O="_info_15ri6_1",PO="_unit_15ri6_27",kO="_description_15ri6_31",to={infoIcon:AO,container:xO,header:OO,info:_O,unit:PO,description:kO},W1=({units:e})=>g(Gp,{className:to.infoIcon,popoverContent:g(TO,{units:e}),openDelayMs:500,placement:"auto",children:g(OA,{})});function TO({units:e}){return N("div",{className:to.container,children:[g("div",{className:to.header,children:"CSS size options"}),g("div",{className:to.info,children:e.map(t=>N(I.Fragment,{children:[g("div",{className:to.unit,children:t}),g("div",{className:to.description,children:IO[t]})]},t))})]})}const IO={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},NO="_wrapper_13r28_1",DO="_unitSelector_13r28_10",Ml={wrapper:NO,unitSelector:DO};function RO(e){const[t,n]=j.exports.useState(T1(e)),r=j.exports.useCallback(i=>{if(i===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:i})},[t.unit]),o=j.exports.useCallback(i=>{n(a=>{const s=a.unit;return i==="auto"?{unit:i,count:null}:s==="auto"?{unit:i,count:Y1[i]}:{unit:i,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:o}}const Y1={fr:1,px:10,rem:1,"%":100};function MO({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:o,updateCount:i,updateUnit:a}=RO(e!=null?e:"auto"),s=I.useMemo(()=>Fp(u=>{t(u)},500),[t]);if(I.useEffect(()=>{const u=Wn(o);if(e!==u)return s(Wn(o)),()=>s.cancel()},[o,s,e]),e===void 0&&!r)return null;const l=r||o.count===null;return N("div",{className:Ml.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(Wn(o))},children:[g(Lp,{ariaLabel:"value-count",value:l?void 0:o.count,disabled:l,onChange:i,min:0}),g("select",{className:Ml.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>g("option",{value:u,children:u},u))}),g(W1,{units:n})]})}function yn(s){var l=s,{name:e,label:t,onChange:n,optional:r,value:o,defaultValue:i="10px"}=l,a=$t(l,["name","label","onChange","optional","value","defaultValue"]);const u=$r(n),c=o===void 0;return g(Mp,{name:e,label:t,optional:r,isDisabled:c,defaultValue:i,width_setting:"fit",mainInput:g(MO,$(F({value:o!=null?o:i},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function LO({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:o}=T1(e),i=I.useCallback(l=>{if(l===void 0){if(o!=="auto")throw new Error("Undefined count with auto units");t(Wn({unit:o,count:null}));return}if(o==="auto"){console.error("How did you change the count of an auto unit?");return}t(Wn({unit:o,count:l}))},[t,o]),a=I.useCallback(l=>{if(l==="auto"){t(Wn({unit:l,count:null}));return}if(o==="auto"){t(Wn({unit:l,count:Y1[l]}));return}t(Wn({unit:l,count:r}))},[r,t,o]),s=r===null;return N("div",{className:Ml.wrapper,"aria-label":"Css Unit Input",children:[g(Lp,{ariaLabel:"value-count",value:s?void 0:r,disabled:s,onChange:i,min:0}),g("select",{className:Ml.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o,onChange:l=>a(l.target.value),children:n.map(l=>g("option",{value:l,children:l},l))}),g(W1,{units:n})]})}const FO="_tractInfoDisplay_9993b_1",UO="_sizeWidget_9993b_61",BO="_hoverListener_9993b_88",jO="_buttons_9993b_108",WO="_tractAddButton_9993b_121",YO="_deleteButton_9993b_122",co={tractInfoDisplay:FO,sizeWidget:UO,hoverListener:BO,buttons:jO,tractAddButton:WO,deleteButton:YO},zO=["fr","px"];function GO({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:o}){const i=j.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=j.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),s=j.exports.useCallback(()=>a(t),[a,t]),l=j.exports.useCallback(()=>a(t+1),[a,t]),u=j.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return N("div",{className:co.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[g("div",{className:co.hoverListener}),N("div",{className:co.sizeWidget,onClick:HO,children:[N("div",{className:co.buttons,children:[g(Mv,{dir:e,onClick:s}),g($O,{onClick:u,deletionConflicts:o}),g(Mv,{dir:e,onClick:l})]}),g(LO,{value:n,units:zO,onChange:i})]})]})}const z1=200;function $O({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return g(Gp,{className:co.deleteButton,onClick:G1(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:z1,children:g(Sp,{})})}function Mv({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return g(Gp,{className:co.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:G1(t),openDelayMs:z1,children:g(C1,{})})}function G1(e){return function(t){t.currentTarget.blur(),e==null||e()}}function Lv({dir:e,sizes:t,areas:n,onUpdate:r}){const o=j.exports.useCallback(({dir:i,index:a})=>k1(n,{dir:i,index:a+1}),[n]);return g(Le,{children:t.map((i,a)=>g(GO,{index:a,dir:e,size:i,onUpdate:r,deletionConflicts:o({dir:e,index:a})},e+a))})}function HO(e){e.stopPropagation()}const JO="_columnSizer_3i83d_1",VO="_rowSizer_3i83d_2",Fv={columnSizer:JO,rowSizer:VO};function Uv({dir:e,index:t,onStartDrag:n}){return g("div",{className:e==="rows"?Fv.rowSizer:Fv.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function QO(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const Ll=40,XO=.15,$1=e=>t=>Math.round(t/e)*e,KO=5,$p=$1(KO),qO=.01,ZO=$1(qO),Bv=e=>Number(e.toFixed(4));function e3(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const o=ZO(e*t),i=n.count+o,a=r.count-o;return(o<0?i/a:a/i)=i.length?null:i[u];if(c==="auto"||f==="auto"){const m=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=m[l],i[l]=c),f==="auto"&&(f=m[u],i[u]=f),r.style[o]=m.join(" ")}const d=o3(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=$(F({dir:t,mouseStart:J1(e,t),originalSizes:i,currentSizes:[...i],beforeIndex:l,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=i3({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function s3({mousePosition:e,drag:t,container:n}){const o=J1(e,t.dir)-t.mouseStart,i=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=n3(o,t);break;case"after-pixel":a=r3(o,t);break;case"both-pixel":a=t3(o,t);break;case"both-relative":a=e3(o,t);break}a!=="no-change"&&(a.beforeSize&&(i[t.beforeIndex]=a.beforeSize),a.afterSize&&(i[t.afterIndex]=a.afterSize),t.currentSizes=i,t.dir==="cols"?n.style.gridTemplateColumns=i.join(" "):n.style.gridTemplateRows=i.join(" "))}function l3(e){return e.match(/[0-9|.]+px/)!==null}function H1(e){return e.match(/[0-9|.]+fr/)!==null}function Fl(e){if(H1(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(l3(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function J1(e,t){return t==="rows"?e.clientY:e.clientX}function u3(e){return e.some(t=>H1(t))}function c3(e){return e.some(t=>t==="auto")}function jv(e,t){const n=Math.abs(t-e)+1,r=ee+i*r)}function f3({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(o=>`"${o.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function Wv(e){return e.split(" ")}function d3(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function p3(e){const t=Wv(e.style.gridTemplateRows),n=Wv(e.style.gridTemplateColumns),r=d3(e.style.gridTemplateAreas),o=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:o}}function h3({containerRef:e,onDragEnd:t}){return I.useCallback(({e:r,dir:o,index:i})=>{const a=QO(e,"How are you dragging on an element without a container?");r.preventDefault();const s=a3({mousePosition:r,dir:o,index:i,container:a}),{beforeIndex:l,afterIndex:u}=s,c=Yv(a,{dir:o,index:l,size:s.currentSizes[l]}),f=Yv(a,{dir:o,index:u,size:s.currentSizes[u]});m3(a,s.dir,{move:d=>{s3({mousePosition:d,drag:s,container:a}),c.update(s.currentSizes[l]),f.update(s.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(p3(a))}})},[e,t])}function Yv(e,{dir:t,index:n,size:r}){const o=document.createElement("div"),i=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(o.style,i,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,o.appendChild(a),e.appendChild(o),{remove:()=>o.remove(),update:s=>{a.innerHTML=s}}}function m3(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const o=()=>{i(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",o),r.addEventListener("mouseleave",o);function i(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",o),r.removeEventListener("mouseleave",o),r.remove()}}const v3="1fr";function g3(o){var i=o,{className:e,children:t,onNewLayout:n}=i,r=$t(i,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:s}=r,l=j.exports.useRef(null),u=f3(r),c=jv(2,s.length),f=jv(2,a.length),d=h3({containerRef:l,onDragEnd:n}),p=[Zx.ResizableGrid];e&&p.push(e);const m=j.exports.useCallback(h=>{switch(h.type){case"ADD":return _1(r,{afterIndex:h.index,dir:h.dir,size:v3});case"RESIZE":return y3(r,h);case"DELETE":return P1(r,h)}},[r]),y=j.exports.useCallback(h=>n(m(h)),[m,n]);return N("div",{className:p.join(" "),ref:l,style:u,children:[c.map(h=>g(Uv,{dir:"cols",index:h,onStartDrag:d},"cols"+h)),f.map(h=>g(Uv,{dir:"rows",index:h,onStartDrag:d},"rows"+h)),t,g(Lv,{dir:"cols",sizes:s,areas:r.areas,onUpdate:y}),g(Lv,{dir:"rows",sizes:a,areas:r.areas,onUpdate:y})]})}function y3(e,{dir:t,index:n,size:r}){return ei(e,o=>{o[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function w3(e,r){var o=r,{name:t}=o,n=$t(o,["name"]);const{rowStart:i,colStart:a}=n,s="rowEnd"in n?n.rowEnd:i+n.rowSpan-1,l="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Ou(e.areas);for(let c=0;c=i-1&&c=a-1&&d{for(let o of n)S3(r,o)})}function b3(e,t){return V1(e,t)}function E3(e,t,n){return ei(e,({areas:r})=>{const{numRows:o,numCols:i}=Ka(r);for(let a=0;a{const i=n==="rows"?"row_sizes":"col_sizes";o[i][t-1]=r})}function A3(e,{item_a:t,item_b:n}){return t===n?e:ei(e,r=>{const{n_rows:o,n_cols:i}=x3(r.areas);let a=!1,s=!1;for(let l=0;l{a.current&&r&&setTimeout(()=>{var s;return(s=a==null?void 0:a.current)==null?void 0:s.focus()},1)},[r]),g("input",{ref:a,className:k3.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:i,onChange:s=>n(s.target.value),disabled:o})}function pe({name:e,label:t,value:n,placeholder:r,onChange:o,autoFocus:i=!1,optional:a=!1,defaultValue:s="my-text"}){const l=$r(o),u=n===void 0,c=I.useRef(null);return I.useEffect(()=>{c.current&&i&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[i]),g(Mp,{name:e,label:t,optional:a,isDisabled:u,defaultValue:s,width_setting:"full",mainInput:g(T3,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>l({name:e,value:f}),autoFocus:i,disabled:u})})}const I3="_container_1ehu8_1",N3="_elementsPanel_1ehu8_28",D3="_propertiesPanel_1ehu8_33",R3="_editorHolder_1ehu8_47",M3="_titledPanel_1ehu8_59",L3="_panelTitleHeader_1ehu8_71",F3="_header_1ehu8_80",U3="_rightSide_1ehu8_88",B3="_divider_1ehu8_109",j3="_title_1ehu8_59",W3="_shinyLogo_1ehu8_120",Q1={container:I3,elementsPanel:N3,propertiesPanel:D3,editorHolder:R3,titledPanel:M3,panelTitleHeader:L3,header:F3,rightSide:U3,divider:B3,title:j3,shinyLogo:W3},Y3="_portalHolder_18ua3_1",z3="_portalModal_18ua3_11",G3="_title_18ua3_21",$3="_body_18ua3_25",H3="_portalForm_18ua3_30",J3="_portalFormInputs_18ua3_35",V3="_portalFormFooter_18ua3_42",Q3="_validationMsg_18ua3_48",X3="_infoText_18ua3_53",xs={portalHolder:Y3,portalModal:z3,title:G3,body:$3,portalForm:H3,portalFormInputs:J3,portalFormFooter:V3,validationMsg:Q3,infoText:X3},K3=({children:e,el:t="div"})=>{const[n]=j.exports.useState(document.createElement(t));return j.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Na.exports.createPortal(e,n)},X1=({children:e,title:t,label:n,onConfirm:r,onCancel:o})=>g(K3,{children:g("div",{className:xs.portalHolder,onClick:()=>o(),onKeyDown:i=>{i.key==="Escape"&&o()},children:N("div",{className:xs.portalModal,onClick:i=>i.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?g("div",{className:xs.title+" "+Q1.panelTitleHeader,children:t}):null,g("div",{className:xs.body,children:e})]})})}),q3="_portalHolder_18ua3_1",Z3="_portalModal_18ua3_11",e4="_title_18ua3_21",t4="_body_18ua3_25",n4="_portalForm_18ua3_30",r4="_portalFormInputs_18ua3_35",o4="_portalFormFooter_18ua3_42",i4="_validationMsg_18ua3_48",a4="_infoText_18ua3_53",gi={portalHolder:q3,portalModal:Z3,title:e4,body:t4,portalForm:n4,portalFormInputs:r4,portalFormFooter:o4,validationMsg:i4,infoText:a4};function s4({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[o,i]=I.useState(r),[a,s]=I.useState(null),l=I.useCallback(c=>{c&&c.preventDefault();const f=l4({name:o,existingAreaNames:n});if(f){s(f);return}t(o)},[n,o,t]),u=I.useCallback(({value:c})=>{s(null),i(c!=null?c:r)},[r]);return N(X1,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(o),onCancel:e,children:[g("form",{className:gi.portalForm,onSubmit:l,children:N("div",{className:gi.portalFormInputs,children:[g("span",{className:gi.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),g(pe,{label:"Name of new grid area",name:"New-Item-Name",value:o,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?g("div",{className:gi.validationMsg,children:a}):null]})}),N("div",{className:gi.portalFormFooter,children:[g(wt,{variant:"delete",onClick:e,children:"Cancel"}),g(wt,{onClick:()=>l(),children:"Done"})]})]})}function l4({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const u4="_container_1hvsg_1",c4={container:u4},K1=I.createContext(null),f4=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:o,compRef:i})=>{const a=vr(),s=Ew(),{onClick:l}=r,{uniqueAreas:u}=Qx(e),T=e,{areas:c}=T,f=$t(T,["areas"]),d=C=>{a(Sw({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:F(F({},f),C)}}))},p=I.useMemo(()=>Rp(c),[c]),[m,y]=I.useState(null),h=C=>{const{node:O,currentPath:b,pos:E}=C,x=b!==void 0,_=$f.includes(O.uiName);if(x&&_&&"area"in O.uiArguments&&O.uiArguments.area){const k=O.uiArguments.area;v({type:"MOVE_ITEM",name:k,pos:E});return}y(C)},v=C=>{d(Hp(e,C))},w=u.map(C=>g(zx,{area:C,areas:c,gridLocation:p.get(C),onNewPos:O=>v({type:"MOVE_ITEM",name:C,pos:O})},C)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},A=(C,{node:O,currentPath:b,pos:E})=>{if($f.includes(O.uiName)){const x=$(F({},O.uiArguments),{area:C});O.uiArguments=x}else O={uiName:"gridlayout::grid_card",uiArguments:{area:C},uiChildren:[O]};s({parentPath:[],node:O,currentPath:b}),v({type:"ADD_ITEM",name:C,pos:E}),y(null)};return N(K1.Provider,{value:v,children:[g("div",{ref:i,style:S,className:c4.container,onClick:l,draggable:!1,onDragStart:()=>{},children:N(g3,$(F({},e),{onNewLayout:d,children:[Vx(c).map(({row:C,col:O})=>g(Hx,{gridRow:C,gridColumn:O,onDroppedNode:h},Lx({row:C,col:O}))),t==null?void 0:t.map((C,O)=>g(Ep,F({path:[...o.path,O]},C),o.path.join(".")+O)),n,w]}))}),m?g(s4,{info:m,onCancel:()=>y(null),onDone:C=>A(C,m),existingAreaNames:u}):null]})};function d4(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function p4(){return I.useContext(K1)}function Jp({containerRef:e,path:t,area:n}){const r=p4(),o=I.useCallback(({node:a,currentPath:s})=>s===void 0||!$f.includes(a.uiName)?!1:Np(s,t),[t]),i=I.useCallback(a=>{var l;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const s=(l=a.node.uiArguments.area)!=null?l:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:s})},[n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i,canAcceptDropClass:xt.availableToSwap,hoveringOverClass:xt.hoveringOverSwap})}const h4=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:o},children:i,eventHandlers:a,compRef:s})=>{const l=r.length>0;return Jp({containerRef:s,area:e,path:o}),N(Cp,{className:xt.container+" "+(n?xt.withTitle:""),ref:s,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?g(WA,{className:xt.panelTitle,children:n}):null,N("div",{className:xt.contentHolder,"data-alignment":"top",children:[g(zv,{index:0,parentPath:o,numChildren:r.length}),l?r==null?void 0:r.map((u,c)=>N(I.Fragment,{children:[g(Ep,F({path:[...o,c]},u)),g(zv,{index:c+1,numChildren:r.length,parentPath:o})]},o.join(".")+c)):g(v4,{path:o})]}),i]})};function zv({index:e,numChildren:t,parentPath:n}){const r=I.useRef(null);Ax({watcherRef:r,positionInChildren:e,parentPath:n});const o=m4(e,t);return g("div",{ref:r,className:xt.dropWatcher+" "+o,"aria-label":"drop watcher"})}function m4(e,t){return e===0&&t===0?xt.onlyDropWatcher:e===0?xt.firstDropWatcher:e===t?xt.lastDropWatcher:xt.middleDropWatcher}function v4({path:e}){return N("div",{className:xt.emptyGridCard,children:[g("span",{className:xt.emptyMessage,children:"Empty grid card"}),g(m1,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const g4=({settings:e})=>{var t;return N(Le,{children:[g(pe,{name:"area",label:"Name of grid area",value:e.area}),g(pe,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),g(yn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},y4={area:"default-area",item_gap:"12px"},w4={title:"Grid Card",UiComponent:h4,SettingsComponent:g4,acceptsChildren:!0,defaultSettings:y4,iconSrc:dA,category:"gridlayout"},q1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function S4(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const Z1=({type:e,name:t,className:n})=>N("code",{className:n,children:[N("span",{style:{opacity:.55},children:[e,"$"]}),g("span",{children:t})]}),b4="_container_1rlbk_1",E4="_plotPlaceholder_1rlbk_5",C4="_label_1rlbk_19",Vf={container:b4,plotPlaceholder:E4,label:C4};function ew({outputId:e}){const t=j.exports.useRef(null),n=A4(t),r=n===null?100:Math.min(n.width,n.height);return N("div",{ref:t,className:Vf.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[g(Z1,{className:Vf.label,type:"output",name:e}),g(S4,{size:`calc(${r}px - 80px)`})]})}function A4(e){const[t,n]=j.exports.useState(null);return j.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(o=>{if(!e.current)return;const{offsetHeight:i,offsetWidth:a}=e.current;n({width:a,height:i})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const x4="_gridCardPlot_1a94v_1",O4={gridCardPlot:x4},_4=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:o,compRef:i})=>(Jp({containerRef:i,area:t,path:r}),N(Cp,$(F({ref:i,style:{gridArea:t},className:O4.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},o),{children:[g(ew,{outputId:e!=null?e:t}),n]}))),P4=({settings:{area:e,outputId:t}})=>N(Le,{children:[g(pe,{name:"area",label:"Name of grid area",value:e}),g(pe,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),k4={title:"Grid Plot Card",UiComponent:_4,SettingsComponent:P4,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:q1,category:"gridlayout"},T4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",I4="_textPanel_525i2_1",N4={textPanel:I4},D4=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:o},eventHandlers:i,compRef:a})=>(Jp({containerRef:a,area:t,path:o}),N(Cp,$(F({ref:a,className:N4.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},i),{children:[g("h1",{children:e}),r]}))),R4="_checkboxInput_12wa8_1",M4="_checkboxLabel_12wa8_10",Gv={checkboxInput:R4,checkboxLabel:M4};function tw({name:e,label:t,value:n,onChange:r,disabled:o,noLabel:i}){const a=$r(r),s=i?void 0:t!=null?t:e,l=`${e}-checkbox-input`,u=N(Le,{children:[g("input",{className:Gv.checkboxInput,id:l,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:o,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),g("label",{className:Gv.checkboxLabel,htmlFor:l,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return s!==void 0?N("div",{className:kn.container,children:[N("label",{className:kn.label,children:[s,":"]}),u]}):u}const L4="_radioContainer_1regb_1",F4="_option_1regb_15",U4="_radioInput_1regb_22",B4="_radioLabel_1regb_26",j4="_icon_1regb_41",yi={radioContainer:L4,option:F4,radioInput:U4,radioLabel:B4,icon:j4};function W4({name:e,label:t,options:n,currentSelection:r,onChange:o,optionsPerColumn:i}){const a=Object.keys(n),s=$r(o),l=j.exports.useMemo(()=>({gridTemplateColumns:i?`repeat(${i}, 1fr)`:void 0}),[i]);return N("div",{className:kn.container,"data-full-width":"true",children:[N("label",{htmlFor:e,className:kn.label,children:[t!=null?t:e,":"]}),g("fieldset",{className:yi.radioContainer,id:e,style:l,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return N("div",{className:yi.option,children:[g("input",{className:yi.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>s({name:e,value:u}),checked:u===r}),g("label",{className:yi.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?g("img",{src:c,alt:f,className:yi.icon}):c})]},u)})})]})}const Y4={start:{icon:f1,label:"left"},center:{icon:Lf,label:"center"},end:{icon:d1,label:"right"}},z4=({settings:e})=>{var t;return N(Le,{children:[g(pe,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),g(pe,{name:"content",label:"Panel content",value:e.content}),g(W4,{name:"alignment",label:"Text Alignment",options:Y4,currentSelection:e.alignment,optionsPerColumn:3}),g(tw,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},G4={title:"Grid Text Card",UiComponent:D4,SettingsComponent:z4,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:T4,category:"gridlayout"},$4=({settings:e})=>g(Le,{children:g(yn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function H4(e,{path:t,node:n}){var s;const r=nw({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:o}=r,i=d4(o.uiChildren)[t[0]],a=(s=n.uiArguments.area)!=null?s:vn;i!==a&&(o.uiArguments=Hp(o.uiArguments,{type:"RENAME_ITEM",oldName:i,newName:a}))}function J4(e,{path:t}){const n=nw({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:o}=n,i=o.uiArguments.area;if(!i){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Hp(r.uiArguments,{type:"REMOVE_ITEM",name:i})}function nw({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=rr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const V4={title:"Grid Page",UiComponent:f4,SettingsComponent:$4,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:H4,DELETE_NODE:J4},category:"gridlayout"},Q4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",X4=({settings:e})=>{const{inputId:t,label:n}=e;return N(Le,{children:[g(pe,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),g(pe,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},K4="_container_tyghz_1",q4={container:K4},Z4=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:o="My Action Button",width:i}=e;return N("div",$(F({className:q4.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[g(wt,{style:i?{width:i}:void 0,children:o}),t]}))},e_={title:"Action Button",UiComponent:Z4,SettingsComponent:X4,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:Q4,category:"Inputs"},t_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",n_="_categoryDivider_8d7ls_1",r_={categoryDivider:n_};function ti({category:e}){return g("div",{className:r_.categoryDivider,children:g("span",{children:e?`${e}:`:null})})}function o_(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var rw={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function $v(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function wn(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function s_(e,t){if(e==null)return{};var n=a_(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function l_(e){return u_(e)||c_(e)||f_(e)||d_()}function u_(e){if(Array.isArray(e))return Qf(e)}function c_(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function f_(e,t){if(!!e){if(typeof e=="string")return Qf(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Qf(e,t)}}function Qf(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function h_(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function Xt(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Ul(e,t):Ul(e,t))||r&&e===n)return e;if(e===n)break}while(e=h_(e))}return null}var Jv=/\s+/g;function _e(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(Jv," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(Jv," ")}}function G(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function Dr(e,t){var n="";if(typeof e=="string")n=e;else do{var r=G(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var o=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return o&&new o(n)}function sw(e,t,n){if(e){var r=e.getElementsByTagName(t),o=0,i=r.length;if(n)for(;o=i:a=o<=i,!a)return r;if(r===mn())break;r=Jn(r,!1)}return!1}function Bo(e,t,n,r){for(var o=0,i=0,a=e.children;i2&&arguments[2]!==void 0?arguments[2]:{},o=r.evt,i=s_(r,b_);ts.pluginEvent.bind(Q)(t,n,wn({dragEl:U,parentEl:ke,ghostEl:Z,rootEl:be,nextEl:xr,lastDownEl:Qs,cloneEl:Oe,cloneHidden:Yn,dragStarted:Fi,putSortable:$e,activeSortable:Q.active,originalEvent:o,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un,hideGhostForTarget:pw,unhideGhostForTarget:hw,cloneNowHidden:function(){Yn=!0},cloneNowShown:function(){Yn=!1},dispatchSortableEvent:function(s){ot({sortable:n,name:s,originalEvent:o})}},i))};function ot(e){Li(wn({putSortable:$e,cloneEl:Oe,targetEl:U,rootEl:be,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un},e))}var U,ke,Z,be,xr,Qs,Oe,Yn,fo,At,na,Un,Os,$e,no=!1,Bl=!1,jl=[],wr,Jt,kc,Tc,Kv,qv,Fi,Kr,ra,oa=!1,_s=!1,Xs,Qe,Ic=[],Xf=!1,Wl=[],Pu=typeof document!="undefined",Ps=ow,Zv=es||Rn?"cssFloat":"float",E_=Pu&&!iw&&!ow&&"draggable"in document.createElement("div"),cw=function(){if(!!Pu){if(Rn)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),fw=function(t,n){var r=G(t),o=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),i=Bo(t,0,n),a=Bo(t,1,n),s=i&&G(i),l=a&&G(a),u=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Ae(i).width,c=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Ae(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(i&&s.float&&s.float!=="none"){var f=s.float==="left"?"left":"right";return a&&(l.clear==="both"||l.clear===f)?"vertical":"horizontal"}return i&&(s.display==="block"||s.display==="flex"||s.display==="table"||s.display==="grid"||u>=o&&r[Zv]==="none"||a&&r[Zv]==="none"&&u+c>o)?"vertical":"horizontal"},C_=function(t,n,r){var o=r?t.left:t.top,i=r?t.right:t.bottom,a=r?t.width:t.height,s=r?n.left:n.top,l=r?n.right:n.bottom,u=r?n.width:n.height;return o===s||i===l||o+a/2===s+u/2},A_=function(t,n){var r;return jl.some(function(o){var i=o[Ze].options.emptyInsertThreshold;if(!(!i||Vp(o))){var a=Ae(o),s=t>=a.left-i&&t<=a.right+i,l=n>=a.top-i&&n<=a.bottom+i;if(s&&l)return r=o}}),r},dw=function(t){function n(i,a){return function(s,l,u,c){var f=s.options.group.name&&l.options.group.name&&s.options.group.name===l.options.group.name;if(i==null&&(a||f))return!0;if(i==null||i===!1)return!1;if(a&&i==="clone")return i;if(typeof i=="function")return n(i(s,l,u,c),a)(s,l,u,c);var d=(a?s:l).options.group.name;return i===!0||typeof i=="string"&&i===d||i.join&&i.indexOf(d)>-1}}var r={},o=t.group;(!o||Vs(o)!="object")&&(o={name:o}),r.name=o.name,r.checkPull=n(o.pull,!0),r.checkPut=n(o.put),r.revertClone=o.revertClone,t.group=r},pw=function(){!cw&&Z&&G(Z,"display","none")},hw=function(){!cw&&Z&&G(Z,"display","")};Pu&&!iw&&document.addEventListener("click",function(e){if(Bl)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Bl=!1,!1},!0);var Sr=function(t){if(U){t=t.touches?t.touches[0]:t;var n=A_(t.clientX,t.clientY);if(n){var r={};for(var o in t)t.hasOwnProperty(o)&&(r[o]=t[o]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[Ze]._onDragOver(r)}}},x_=function(t){U&&U.parentNode[Ze]._isOutsideThisEl(t.target)};function Q(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=zt({},t),e[Ze]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return fw(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,s){a.setData("Text",s.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:Q.supportPointer!==!1&&"PointerEvent"in window&&!ea,emptyInsertThreshold:5};ts.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);dw(t);for(var o in this)o.charAt(0)==="_"&&typeof this[o]=="function"&&(this[o]=this[o].bind(this));this.nativeDraggable=t.forceFallback?!1:E_,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ie(e,"pointerdown",this._onTapStart):(ie(e,"mousedown",this._onTapStart),ie(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ie(e,"dragover",this),ie(e,"dragenter",this)),jl.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),zt(this,y_())}Q.prototype={constructor:Q,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Kr=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,U):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,o=this.options,i=o.preventOnFilter,a=t.type,s=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,l=(s||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||l,c=o.filter;if(D_(r),!U&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||o.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&ea&&l&&l.tagName.toUpperCase()==="SELECT")&&(l=Xt(l,o.draggable,r,!1),!(l&&l.animated)&&Qs!==l)){if(fo=Te(l),na=Te(l,o.draggable),typeof c=="function"){if(c.call(this,t,l,this)){ot({sortable:n,rootEl:u,name:"filter",targetEl:l,toEl:r,fromEl:r}),ut("filter",n,{evt:t}),i&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=Xt(u,f.trim(),r,!1),f)return ot({sortable:n,rootEl:f,name:"filter",targetEl:l,fromEl:r,toEl:r}),ut("filter",n,{evt:t}),!0}),c)){i&&t.cancelable&&t.preventDefault();return}o.handle&&!Xt(u,o.handle,r,!1)||this._prepareDragStart(t,s,l)}}},_prepareDragStart:function(t,n,r){var o=this,i=o.el,a=o.options,s=i.ownerDocument,l;if(r&&!U&&r.parentNode===i){var u=Ae(r);if(be=i,U=r,ke=U.parentNode,xr=U.nextSibling,Qs=r,Os=a.group,Q.dragged=U,wr={target:U,clientX:(n||t).clientX,clientY:(n||t).clientY},Kv=wr.clientX-u.left,qv=wr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,U.style["will-change"]="all",l=function(){if(ut("delayEnded",o,{evt:t}),Q.eventCanceled){o._onDrop();return}o._disableDelayedDragEvents(),!Hv&&o.nativeDraggable&&(U.draggable=!0),o._triggerDragStart(t,n),ot({sortable:o,name:"choose",originalEvent:t}),_e(U,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){sw(U,c.trim(),Nc)}),ie(s,"dragover",Sr),ie(s,"mousemove",Sr),ie(s,"touchmove",Sr),ie(s,"mouseup",o._onDrop),ie(s,"touchend",o._onDrop),ie(s,"touchcancel",o._onDrop),Hv&&this.nativeDraggable&&(this.options.touchStartThreshold=4,U.draggable=!0),ut("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(es||Rn))){if(Q.eventCanceled){this._onDrop();return}ie(s,"mouseup",o._disableDelayedDrag),ie(s,"touchend",o._disableDelayedDrag),ie(s,"touchcancel",o._disableDelayedDrag),ie(s,"mousemove",o._delayedDragTouchMoveHandler),ie(s,"touchmove",o._delayedDragTouchMoveHandler),a.supportPointer&&ie(s,"pointermove",o._delayedDragTouchMoveHandler),o._dragStartTimer=setTimeout(l,a.delay)}else l()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){U&&Nc(U),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;te(t,"mouseup",this._disableDelayedDrag),te(t,"touchend",this._disableDelayedDrag),te(t,"touchcancel",this._disableDelayedDrag),te(t,"mousemove",this._delayedDragTouchMoveHandler),te(t,"touchmove",this._delayedDragTouchMoveHandler),te(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ie(document,"pointermove",this._onTouchMove):n?ie(document,"touchmove",this._onTouchMove):ie(document,"mousemove",this._onTouchMove):(ie(U,"dragend",this),ie(be,"dragstart",this._onDragStart));try{document.selection?Ks(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(no=!1,be&&U){ut("dragStarted",this,{evt:n}),this.nativeDraggable&&ie(document,"dragover",x_);var r=this.options;!t&&_e(U,r.dragClass,!1),_e(U,r.ghostClass,!0),Q.active=this,t&&this._appendGhost(),ot({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(Jt){this._lastX=Jt.clientX,this._lastY=Jt.clientY,pw();for(var t=document.elementFromPoint(Jt.clientX,Jt.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(Jt.clientX,Jt.clientY),t!==n);)n=t;if(U.parentNode[Ze]._isOutsideThisEl(t),n)do{if(n[Ze]){var r=void 0;if(r=n[Ze]._onDragOver({clientX:Jt.clientX,clientY:Jt.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);hw()}},_onTouchMove:function(t){if(wr){var n=this.options,r=n.fallbackTolerance,o=n.fallbackOffset,i=t.touches?t.touches[0]:t,a=Z&&Dr(Z,!0),s=Z&&a&&a.a,l=Z&&a&&a.d,u=Ps&&Qe&&Qv(Qe),c=(i.clientX-wr.clientX+o.x)/(s||1)+(u?u[0]-Ic[0]:0)/(s||1),f=(i.clientY-wr.clientY+o.y)/(l||1)+(u?u[1]-Ic[1]:0)/(l||1);if(!Q.active&&!no){if(r&&Math.max(Math.abs(i.clientX-this._lastX),Math.abs(i.clientY-this._lastY))=0&&(ot({rootEl:ke,name:"add",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"remove",toEl:ke,originalEvent:t}),ot({rootEl:ke,name:"sort",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),$e&&$e.save()):At!==fo&&At>=0&&(ot({sortable:this,name:"update",toEl:ke,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),Q.active&&((At==null||At===-1)&&(At=fo,Un=na),ot({sortable:this,name:"end",toEl:ke,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){ut("nulling",this),be=U=ke=Z=xr=Oe=Qs=Yn=wr=Jt=Fi=At=Un=fo=na=Kr=ra=$e=Os=Q.dragged=Q.ghost=Q.clone=Q.active=null,Wl.forEach(function(t){t.checked=!0}),Wl.length=kc=Tc=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":U&&(this._onDragOver(t),O_(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,o=0,i=r.length,a=this.options;or.right+o||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+o}function T_(e,t,n,r,o,i,a,s){var l=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(s&&Xsc+u*i/2:lf-Xs)return-ra}else if(l>c+u*(1-o)/2&&lf-u*i/2)?l>c+u/2?1:-1:0}function I_(e){return Te(U)1&&(K.forEach(function(s){i.addAnimationState({target:s,rect:ct?Ae(s):a}),_c(s),s.fromRect=a,r.removeAnimationState(s)}),ct=!1,U_(!this.options.removeCloneOnHide,o))},dragOverCompleted:function(n){var r=n.sortable,o=n.isOwner,i=n.insertion,a=n.activeSortable,s=n.parentEl,l=n.putSortable,u=this.options;if(i){if(o&&a._hideClone(),Si=!1,u.animation&&K.length>1&&(ct||!o&&!a.options.sort&&!l)){var c=Ae(ve,!1,!0,!0);K.forEach(function(d){d!==ve&&(Xv(d,c),s.appendChild(d))}),ct=!0}if(!o)if(ct||Is(),K.length>1){var f=Ts;a._showClone(r),a.options.animation&&!Ts&&f&&Ct.forEach(function(d){a.addAnimationState({target:d,rect:bi}),d.fromRect=bi,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,o=n.isOwner,i=n.activeSortable;if(K.forEach(function(s){s.thisAnimationDuration=null}),i.options.animation&&!o&&i.multiDrag.isMultiDrag){bi=zt({},r);var a=Dr(ve,!0);bi.top-=a.f,bi.left-=a.e}},dragOverAnimationComplete:function(){ct&&(ct=!1,Is())},drop:function(n){var r=n.originalEvent,o=n.rootEl,i=n.parentEl,a=n.sortable,s=n.dispatchSortableEvent,l=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=i.children;if(!qr)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),_e(ve,f.selectedClass,!~K.indexOf(ve)),~K.indexOf(ve))K.splice(K.indexOf(ve),1),wi=null,Li({sortable:a,rootEl:o,name:"deselect",targetEl:ve,originalEvent:r});else{if(K.push(ve),Li({sortable:a,rootEl:o,name:"select",targetEl:ve,originalEvent:r}),r.shiftKey&&wi&&a.el.contains(wi)){var p=Te(wi),m=Te(ve);if(~p&&~m&&p!==m){var y,h;for(m>p?(h=p,y=m):(h=m,y=p+1);h1){var v=Ae(ve),w=Te(ve,":not(."+this.options.selectedClass+")");if(!Si&&f.animation&&(ve.thisAnimationDuration=null),c.captureAnimationState(),!Si&&(f.animation&&(ve.fromRect=v,K.forEach(function(A){if(A.thisAnimationDuration=null,A!==ve){var T=ct?Ae(A):v;A.fromRect=T,c.addAnimationState({target:A,rect:T})}})),Is(),K.forEach(function(A){d[w]?i.insertBefore(A,d[w]):i.appendChild(A),w++}),l===Te(ve))){var S=!1;K.forEach(function(A){if(A.sortableIndex!==Te(A)){S=!0;return}}),S&&s("update")}K.forEach(function(A){_c(A)}),c.animateAll()}Vt=c}(o===i||u&&u.lastPutMode!=="clone")&&Ct.forEach(function(A){A.parentNode&&A.parentNode.removeChild(A)})}},nullingGlobal:function(){this.isMultiDrag=qr=!1,Ct.length=0},destroyGlobal:function(){this._deselectMultiDrag(),te(document,"pointerup",this._deselectMultiDrag),te(document,"mouseup",this._deselectMultiDrag),te(document,"touchend",this._deselectMultiDrag),te(document,"keydown",this._checkKeyDown),te(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof qr!="undefined"&&qr)&&Vt===this.sortable&&!(n&&Xt(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;K.length;){var r=K[0];_e(r,this.options.selectedClass,!1),K.shift(),Li({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},zt(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[Ze];!r||!r.options.multiDrag||~K.indexOf(n)||(Vt&&Vt!==r&&(Vt.multiDrag._deselectMultiDrag(),Vt=r),_e(n,r.options.selectedClass,!0),K.push(n))},deselect:function(n){var r=n.parentNode[Ze],o=K.indexOf(n);!r||!r.options.multiDrag||!~o||(_e(n,r.options.selectedClass,!1),K.splice(o,1))}},eventProperties:function(){var n=this,r=[],o=[];return K.forEach(function(i){r.push({multiDragElement:i,index:i.sortableIndex});var a;ct&&i!==ve?a=-1:ct?a=Te(i,":not(."+n.options.selectedClass+")"):a=Te(i),o.push({multiDragElement:i,index:a})}),{items:l_(K),clones:[].concat(Ct),oldIndicies:r,newIndicies:o}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function U_(e,t){K.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function tg(e,t){Ct.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function Is(){K.forEach(function(e){e!==ve&&e.parentNode&&e.parentNode.removeChild(e)})}Q.mount(new R_);Q.mount(Kp,Xp);const B_=Object.freeze(Object.defineProperty({__proto__:null,default:Q,MultiDrag:F_,Sortable:Q,Swap:M_},Symbol.toStringTag,{value:"Module"})),j_=Bg(B_);var vw={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],o=0;o$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>A);function l(C){C.parentElement!==null&&C.parentElement.removeChild(C)}function u(C,O,b){const E=C.children[b]||null;C.insertBefore(O,E)}function c(C){C.forEach(O=>l(O.element))}function f(C){C.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(C,O){const b=h(C),E={parentElement:C.from};let x=[];switch(b){case"normal":x=[{element:C.item,newIndex:C.newIndex,oldIndex:C.oldIndex,parentElement:C.from}];break;case"swap":const D=F({element:C.item,oldIndex:C.oldIndex,newIndex:C.newIndex},E),B=F({element:C.swapItem,oldIndex:C.newIndex,newIndex:C.oldIndex},E);x=[D,B];break;case"multidrag":x=C.oldIndicies.map((q,H)=>F({element:q.multiDragElement,oldIndex:q.index,newIndex:C.newIndicies[H].index},E));break}return v(x,O)}function p(C,O){const b=m(C,O);return y(C,b)}function m(C,O){const b=[...O];return C.concat().reverse().forEach(E=>b.splice(E.oldIndex,1)),b}function y(C,O,b,E){const x=[...O];return C.forEach(_=>{const k=E&&b&&E(_.item,b);x.splice(_.newIndex,0,k||_.item)}),x}function h(C){return C.oldIndicies&&C.oldIndicies.length>0?"multidrag":C.swapItem?"swap":"normal"}function v(C,O){return C.map(E=>$(F({},E),{item:O[E.oldIndex]})).sort((E,x)=>E.oldIndex-x.oldIndex)}function w(C){const us=C,{list:O,setList:b,children:E,tag:x,style:_,className:k,clone:D,onAdd:B,onChange:q,onChoose:H,onClone:ce,onEnd:he,onFilter:ye,onRemove:ne,onSort:R,onStart:Y,onUnchoose:J,onUpdate:le,onMove:ue,onSpill:ze,onSelect:Fe,onDeselect:Ue}=us;return $t(us,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class A extends r.Component{constructor(O){super(O),this.ref=r.createRef();const b=[...O.list].map(E=>Object.assign(E,{chosen:!1,selected:!1}));O.setList(b,this.sortable,S),i(o)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();i(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:b,className:E,id:x}=this.props,_={style:b,className:E,id:x},k=!O||O===null?"div":O;return r.createElement(k,F({ref:this.ref},_),this.getChildren())}getChildren(){const{children:O,dataIdAttr:b,selectedClass:E="sortable-selected",chosenClass:x="sortable-chosen",dragClass:_="sortable-drag",fallbackClass:k="sortable-falback",ghostClass:D="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:q="sortable-filter",list:H}=this.props;if(!O||O==null)return null;const ce=b||"data-id";return r.Children.map(O,(he,ye)=>{if(he===void 0)return;const ne=H[ye]||{},{className:R}=he.props,Y=typeof q=="string"&&{[q.replace(".","")]:!!ne.filtered},J=i(n)(R,F({[E]:ne.selected,[x]:ne.chosen},Y));return r.cloneElement(he,{[ce]:he.key,className:J})})}get sortable(){const O=this.ref.current;if(O===null)return null;const b=Object.keys(O).find(E=>E.includes("Sortable"));return b?O[b]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],b=["onChange","onClone","onFilter","onSort"],E=w(this.props);O.forEach(_=>E[_]=this.prepareOnHandlerPropAndDOM(_)),b.forEach(_=>E[_]=this.prepareOnHandlerProp(_));const x=(_,k)=>{const{onMove:D}=this.props,B=_.willInsertAfter||-1;if(!D)return B;const q=D(_,k,this.sortable,S);return typeof q=="undefined"?!1:q};return $(F({},E),{onMove:x})}prepareOnHandlerPropAndDOM(O){return b=>{this.callOnHandlerProp(b,O),this[O](b)}}prepareOnHandlerProp(O){return b=>{this.callOnHandlerProp(b,O)}}callOnHandlerProp(O,b){const E=this.props[b];E&&E(O,this.sortable,S)}onAdd(O){const{list:b,setList:E,clone:x}=this.props,_=[...S.dragging.props.list],k=d(O,_);c(k);const D=y(k,b,O,x).map(B=>Object.assign(B,{selected:!1}));E(D,this.sortable,S)}onRemove(O){const{list:b,setList:E}=this.props,x=h(O),_=d(O,b);f(_);let k=[...b];if(O.pullMode!=="clone")k=m(_,k);else{let D=_;switch(x){case"multidrag":D=_.map((B,q)=>$(F({},B),{element:O.clones[q]}));break;case"normal":D=_.map(B=>$(F({},B),{element:O.clone}));break;case"swap":default:i(o)(!0,`mode "${x}" cannot clone. Please remove "props.clone" from when using the "${x}" plugin`)}c(D),_.forEach(B=>{const q=B.oldIndex,H=this.props.clone(B.item,O);k.splice(q,1,H)})}k=k.map(D=>Object.assign(D,{selected:!1})),E(k,this.sortable,S)}onUpdate(O){const{list:b,setList:E}=this.props,x=d(O,b);c(x),f(x);const _=p(x,b);return E(_,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(_,{chosen:!0})),D});E(x,this.sortable,S)}onUnchoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(D,{chosen:!1})),D});E(x,this.sortable,S)}onSpill(O){const{removeOnSpill:b,revertOnSpill:E}=this.props;b&&!E&&l(O.item)}onSelect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;if(k===-1){console.log(`"${O.type}" had indice of "${_.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}x[k].selected=!0}),E(x,this.sortable,S)}onDeselect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;k!==-1&&(x[k].selected=!0)}),E(x,this.sortable,S)}}A.defaultProps={clone:C=>C};var T={};s(e.exports,T)})(rw);const $_="_container_xt7ji_1",H_="_list_xt7ji_6",J_="_item_xt7ji_15",V_="_keyField_xt7ji_29",Q_="_valueField_xt7ji_34",X_="_header_xt7ji_39",K_="_dragHandle_xt7ji_45",q_="_deleteButton_xt7ji_55",Z_="_addItemButton_xt7ji_65",eP="_separator_xt7ji_72",ft={container:$_,list:H_,item:J_,keyField:V_,valueField:Q_,header:X_,dragHandle:K_,deleteButton:q_,addItemButton:Z_,separator:eP};function qp({name:e,label:t,value:n,onChange:r,optional:o=!1,newItemValue:i={key:"myKey",value:"myValue"}}){const[a,s]=I.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),l=$r(r);I.useEffect(()=>{const f=tP(a);lA(f,n!=null?n:{})||l({name:e,value:f})},[e,l,a,n]);const u=I.useCallback(f=>{s(d=>d.filter(({id:p})=>p!==f))},[]),c=I.useCallback(()=>{s(f=>[...f,F({id:-1},i)].map((d,p)=>$(F({},d),{id:p})))},[i]);return N("div",{className:ft.container,children:[g(ti,{category:e!=null?e:t}),N("div",{className:ft.list,children:[N("div",{className:ft.item+" "+ft.header,children:[g("span",{className:ft.keyField,children:"Key"}),g("span",{className:ft.valueField,children:"Value"})]}),g(rw.exports.ReactSortable,{list:a,setList:s,handle:`.${ft.dragHandle}`,children:a.map((f,d)=>N("div",{className:ft.item,children:[g("div",{className:ft.dragHandle,title:"Reorder list",children:g(o_,{})}),g("input",{className:ft.keyField,type:"text",value:f.key,onChange:p=>{const m=[...a];m[d]=$(F({},f),{key:p.target.value}),s(m)}}),g("span",{className:ft.separator,children:":"}),g("input",{className:ft.valueField,type:"text",value:f.value,onChange:p=>{const m=[...a];m[d]=$(F({},f),{value:p.target.value}),s(m)}}),g(wt,{className:ft.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:g(Sp,{})})]},f.id))}),g(wt,{className:ft.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:g(C1,{})})]})]})}function tP(e){return e.reduce((n,{key:r,value:o})=>(n[r]=o,n),{})}const nP=({settings:e})=>N(Le,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),rP="_container_162lp_1",oP="_checkbox_162lp_14",Lc={container:rP,checkbox:oP},iP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices;return N("div",$(F({ref:r,className:Lc.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:Object.keys(o).map((i,a)=>g("div",{className:Lc.radio,children:N("label",{className:Lc.checkbox,children:[g("input",{type:"checkbox",name:o[i],value:o[i],defaultChecked:a===0}),g("span",{children:i})]})},i))}),e]}))},aP={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},sP={title:"Checkbox Group",UiComponent:iP,SettingsComponent:nP,acceptsChildren:!1,defaultSettings:aP,iconSrc:t_,category:"Inputs"},lP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",uP=({settings:e})=>N(Le,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(tw,{label:"Starting value",name:"value",value:e.value}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),cP="_container_1x0tz_1",fP="_label_1x0tz_10",ng={container:cP,label:fP},dP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=(l=t.width)!=null?l:"auto",i=F({},t),[a,s]=j.exports.useState(i.value);return j.exports.useEffect(()=>{s(i.value)},[i.value]),N("div",$(F({className:ng.container+" shiny::checkbox",style:{width:o},"aria-label":"shiny::checkbox",ref:r},n),{children:[N("label",{htmlFor:i.inputId,children:[g("input",{id:i.inputId,type:"checkbox",checked:a,onChange:u=>s(u.target.checked)}),g("span",{className:ng.label,children:i.label})]}),e]}))},pP={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},hP={title:"Checkbox Input",UiComponent:dP,SettingsComponent:uP,acceptsChildren:!1,defaultSettings:pP,iconSrc:lP,category:"Inputs"},mP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",vP="_wrappedSection_1dn9g_1",gP="_sectionContainer_1dn9g_9",zl={wrappedSection:vP,sectionContainer:gP},gw=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.wrappedSection,children:t})]}),yP=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.inputSection,children:t})]}),wP=({settings:e})=>N(Le,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(gw,{name:"Values",children:[g(Hn,{name:"value",value:e.value}),g(Hn,{name:"min",value:e.min,optional:!0,defaultValue:0}),g(Hn,{name:"max",value:e.max,optional:!0,defaultValue:10}),g(Hn,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),SP="_container_yicbr_1",bP={container:SP},EP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=F({},t),i=(l=o.width)!=null?l:"200px",[a,s]=j.exports.useState(o.value);return j.exports.useEffect(()=>{s(o.value)},[o.value]),N("div",$(F({className:bP.container+" shiny::numericInput",style:{width:i},"aria-label":"shiny::numericInput",ref:r},n),{children:[g("span",{children:o.label}),g("input",{type:"number",value:a,onChange:u=>s(Number(u.target.value)),min:o.min,max:o.max,step:o.step}),e]}))},CP={inputId:"myNumericInput",label:"Numeric Input",value:10},AP={title:"Numeric Input",UiComponent:EP,SettingsComponent:wP,acceptsChildren:!1,defaultSettings:CP,iconSrc:mP,category:"Inputs"},xP=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>N(Le,{children:[g(pe,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),g(yn,{name:"width",units:["px","%"],value:t}),g(yn,{name:"height",units:["px","%"],value:n})]}),OP=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:o,compRef:i})=>N("div",$(F({className:Vf.container,ref:i,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},o),{children:[g(ew,{outputId:e}),r]})),_P={title:"Plot Output",UiComponent:OP,SettingsComponent:xP,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:q1,category:"Outputs"},PP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",kP=({settings:e})=>N(Le,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),TP="_container_sgn7c_1",rg={container:TP},IP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=Object.keys(o),a=Object.values(o),[s,l]=I.useState(a[0]);return I.useEffect(()=>{a.includes(s)||l(a[0])},[s,a]),N("div",$(F({ref:r,className:rg.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:a.map((u,c)=>g("div",{className:rg.radio,children:N("label",{children:[g("input",{type:"radio",name:t.inputId,value:u,onChange:f=>l(f.target.value),checked:u===s}),g("span",{children:i[c]})]})},u))}),e]}))},NP={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},DP={title:"Radio Buttons",UiComponent:IP,SettingsComponent:kP,acceptsChildren:!1,defaultSettings:NP,iconSrc:PP,category:"Inputs"},RP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",MP=({settings:e})=>N(Le,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),LP="_container_1e5dd_1",FP={container:LP},UP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=t.inputId;return N("div",$(F({ref:r,className:FP.container},n),{children:[g("label",{htmlFor:i,children:t.label}),g("select",{id:i,children:Object.keys(o).map((a,s)=>g("option",{value:o[a],children:a},a))}),e]}))},BP={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},jP={title:"Select Input",UiComponent:UP,SettingsComponent:MP,acceptsChildren:!1,defaultSettings:BP,iconSrc:RP,category:"Inputs"},WP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",YP=({settings:e})=>{const t=F({},e);return N(Le,{children:[g(pe,{name:"inputId",label:"Input ID",value:t.inputId}),g(pe,{name:"label",value:t.label}),N(gw,{name:"Values",children:[g(Hn,{name:"min",value:t.min}),g(Hn,{name:"max",value:t.max}),g(Hn,{name:"value",label:"start",value:t.value}),g(Hn,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},zP="_container_1f2js_1",GP="_sliderWrapper_1f2js_11",$P="_sliderInput_1f2js_16",Fc={container:zP,sliderWrapper:GP,sliderInput:$P},HP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=F({},t),{width:i="200px"}=o,[a,s]=j.exports.useState(o.value);return N("div",$(F({className:Fc.container+" shiny::sliderInput",style:{width:i},"aria-label":"shiny::sliderInput",ref:r},n),{children:[g("div",{children:o.label}),g("div",{className:Fc.sliderWrapper,children:g("input",{type:"range",min:o.min,max:o.max,value:a,onChange:l=>s(Number(l.target.value)),className:"slider "+Fc.sliderInput,"aria-label":"slider input","data-min":o.min,"data-max":o.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),N("div",{children:[g(Z1,{type:"input",name:o.inputId})," = ",a]}),e]}))},JP={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},VP={title:"Slider Input",UiComponent:HP,SettingsComponent:YP,acceptsChildren:!1,defaultSettings:JP,iconSrc:WP,category:"Inputs"},QP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",XP=({settings:e})=>N(Le,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(yP,{name:"Values",children:[g(pe,{name:"value",value:e.value}),g(pe,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),KP="_container_yicbr_1",qP={container:KP},ZP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o="200px",i="auto",a=F({},t),[s,l]=j.exports.useState(a.value);return j.exports.useEffect(()=>{l(a.value)},[a.value]),N("div",$(F({className:qP.container+" shiny::textInput",style:{height:i,width:o},"aria-label":"shiny::textInput",ref:r},n),{children:[g("label",{htmlFor:a.inputId,children:a.label}),g("input",{id:a.inputId,type:"text",value:s,onChange:u=>l(u.target.value),placeholder:a.placeholder}),e]}))},ek={inputId:"myTextInput",label:"Text Input",value:""},tk={title:"Text Input",UiComponent:ZP,SettingsComponent:XP,acceptsChildren:!1,defaultSettings:ek,iconSrc:QP,category:"Inputs"},nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",rk=({settings:e})=>g(pe,{label:"Output ID",name:"outputId",value:e.outputId}),ok="_container_1i6yi_1",ik={container:ok},ak=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>N("div",$(F({className:ik.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",N("code",{children:["output$",e.outputId]}),t]})),sk={title:"Text Output",UiComponent:ak,SettingsComponent:rk,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:nk,category:"Outputs"},lk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",uk=({settings:e})=>{var t;return g(pe,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},ck="_container_1xnzo_1",fk={container:ck},dk=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:o="shiny-ui-output"}=e;return N("div",$(F({className:fk.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",o,"!"]}),t]}))},pk={title:"Dynamic UI Output",UiComponent:dk,SettingsComponent:uk,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:lk,category:"Outputs"};function hk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function mk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function vk(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const gk="_container_p6wnj_1",yk="_infoMsg_p6wnj_14",wk="_codeHolder_p6wnj_19",ed={container:gk,infoMsg:yk,codeHolder:wk},Sk=({settings:e})=>N("div",{children:[g("div",{className:kn.container,children:N("span",{className:ed.infoMsg,children:[g(hk,{}),"Unknown function call. Can't modify with visual editor."]})}),g(ti,{category:"Code"}),g("div",{className:kn.container,children:g("pre",{className:ed.codeHolder,children:vk(e.text)})})]}),bk=20,Ek=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const o=e.text.slice(0,bk).replaceAll(/\s$/g,"")+"...";return N("div",$(F({className:ed.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{children:["unknown ui output: ",g("code",{children:o})]}),t]}))},Ck={title:"Unknown UI Function",UiComponent:Ek,SettingsComponent:Sk,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},en={"shiny::actionButton":e_,"shiny::numericInput":AP,"shiny::sliderInput":VP,"shiny::textInput":tk,"shiny::checkboxInput":hP,"shiny::checkboxGroupInput":sP,"shiny::selectInput":jP,"shiny::radioButtons":DP,"shiny::plotOutput":_P,"shiny::textOutput":sk,"shiny::uiOutput":pk,"gridlayout::grid_page":V4,"gridlayout::grid_card":w4,"gridlayout::grid_card_text":G4,"gridlayout::grid_card_plot":k4,unknownUiFunction:Ck};function Ak(e,{path:t,node:n}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=rr(e,t);Object.assign(r,n)}const Zp={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},yw=vp({name:"uiTree",initialState:Zp,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>ww(t.payload.initialState),UPDATE_NODE:(e,t)=>{Ak(e,t.payload)},PLACE_NODE:(e,t)=>{yx(e,t.payload)},DELETE_NODE:(e,t)=>{E1(e,t.payload)}}});function ww(e){const t=en[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return hx(r,n).length>0&&(e.uiArguments=F(F({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(i=>ww(i)),e}const{UPDATE_NODE:Sw,PLACE_NODE:xk,DELETE_NODE:bw,INIT_STATE:Ok,SET_FULL_STATE:_k}=yw.actions;function Ew(){const e=vr();return I.useCallback(n=>{e(xk(n))},[e])}const Pk=yw.reducer,Cw=oA();Cw.startListening({actionCreator:bw,effect:(e,t)=>Eh(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Xa(n,r)&&t.dispatch(cA()),r.lengthi)return;const a=[...r];a[n.length-1]=i-1,t.dispatch(c1({path:a}))})});const kk=Cw.middleware,Tk=FC({reducer:{uiTree:Pk,selectedPath:fA,connectedToServer:sA},middleware:e=>e().concat(kk)}),Ik=({children:e})=>g(jE,{store:Tk,children:e}),Nk=!1,Dk=!1,Zs={ws:null,msg:null},Aw=$(F({},Zs),{status:"connecting"});function Rk(e,t){switch(t.type){case"CONNECTED":return $(F({},Zs),{status:"connected",ws:t.ws});case"FAILED":return $(F({},Zs),{status:"failed-to-open"});case"CLOSED":return $(F({},Zs),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function Mk(){const[e,t]=I.useReducer(Rk,Aw),n=I.useRef(!1);return I.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=Nk?"localhost:8888":window.location.host,o=new WebSocket(`ws://${r}`);return o.onerror=i=>{console.error("Error with httpuv websocket connection",i)},o.onopen=i=>{n.current=!0,t({type:"CONNECTED",ws:o})},o.onclose=i=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>o.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const xw=I.createContext(Aw),Lk=({children:e})=>{const t=Mk();return g(xw.Provider,{value:t,children:e})};function Ow(){return I.useContext(xw)}function Fk(e){return JSON.parse(e.data)}function _w(e,t){e.addEventListener("message",n=>{t(Fk(n))})}function td(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const Uk="_appViewerHolder_wu0cb_1",Bk="_title_wu0cb_55",jk="_appContainer_wu0cb_89",Wk="_previewFrame_wu0cb_109",Yk="_expandButton_wu0cb_134",zk="_reloadButton_wu0cb_135",Gk="_spin_wu0cb_160",$k="_restartButton_wu0cb_198",Hk="_loadingMessage_wu0cb_225",Jk="_error_wu0cb_236",mt={appViewerHolder:Uk,title:Bk,appContainer:jk,previewFrame:Wk,expandButton:Yk,reloadButton:zk,spin:Gk,restartButton:$k,loadingMessage:Hk,error:Jk},Vk="_fakeApp_t3dh1_1",Qk="_fakeDashboard_t3dh1_7",Xk="_header_t3dh1_22",Kk="_sidebar_t3dh1_31",qk="_top_t3dh1_35",Zk="_bottom_t3dh1_39",Ei={fakeApp:Vk,fakeDashboard:Qk,header:Xk,sidebar:Kk,top:qk,bottom:Zk},eT=()=>g("div",{className:mt.appContainer,children:N("div",{className:Ei.fakeDashboard+" "+mt.previewFrame,children:[g("div",{className:Ei.header,children:g("h1",{children:"App preview not available"})}),g("div",{className:Ei.sidebar}),g("div",{className:Ei.top}),g("div",{className:Ei.bottom})]})});function tT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function nT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function rT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function oT(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const iT="_logs_xjp5l_2",aT="_logsContents_xjp5l_25",sT="_expandTab_xjp5l_29",lT="_clearLogsButton_xjp5l_69",uT="_logLine_xjp5l_75",cT="_noLogsMsg_xjp5l_81",fT="_expandedLogs_xjp5l_93",dT="_expandLogsButton_xjp5l_101",pT="_unseenLogsNotification_xjp5l_108",hT="_slidein_xjp5l_1",br={logs:iT,logsContents:aT,expandTab:sT,clearLogsButton:lT,logLine:uT,noLogsMsg:cT,expandedLogs:fT,expandLogsButton:dT,unseenLogsNotification:pT,slidein:hT};function mT({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:o}=vT(e),i=e.length===0;return N("div",{className:br.logs,"data-expanded":n,children:[N("button",{className:br.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[g(rT,{className:br.unseenLogsNotification,"data-show":o}),"App Logs",n?g(tT,{}):g(nT,{})]}),N("div",{className:br.logsContents,children:[i?g("p",{className:br.noLogsMsg,children:"No recent logs"}):e.map((a,s)=>g("p",{className:br.logLine,children:a},s)),i?null:g(wt,{variant:"icon",title:"clear logs",className:br.clearLogsButton,onClick:t,children:g(oT,{})})]})]})}function vT(e){const[t,n]=I.useState(!1),[r,o]=I.useState(!1),[i,a]=I.useState(null),[s,l]=I.useState(new Date),u=I.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),o(!1)},[t]);return I.useEffect(()=>{l(new Date)},[e]),I.useEffect(()=>{if(t||e.length===0){o(!1);return}if(i===null||i{u==="connected"&&(ia(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>ia(c,{path:"APP-PREVIEW-RESTART"})),m(()=>()=>ia(c,{path:"APP-PREVIEW-STOP"})),_w(c,w=>{if(!gT(w))return;const{path:S,payload:A}=w;switch(S){case"SHINY_READY":l(!1),a(!1),n(A);break;case"SHINY_LOGS":o(wT(A));break;case"SHINY_CRASH":l(A);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:w})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=I.useState(()=>()=>console.log("No app running to reset")),[p,m]=I.useState(()=>()=>console.log("No app running to stop")),y=I.useCallback(()=>{o([])},[]),h={appLogs:r,clearLogs:y,restartApp:f,stopApp:p};return i?Object.assign(h,{status:"no-preview",appLoc:null}):s?Object.assign(h,{status:"crashed",error:s,appLoc:null}):t?Object.assign(h,{status:"finished",appLoc:t,error:null}):Object.assign(h,{status:"loading",appLoc:null,error:null})}function wT(e){return Array.isArray(e)?e:[e]}function ST(){const[e,t]=I.useState(.2),n=xT();return I.useEffect(()=>{!n||t(bT(n.width))},[n]),e}function bT(e){const t=mS-Pw*2,n=e-kw*2;return t/n}const Pw=16,kw=55;function ET(){const e=I.useRef(null),[t,n]=I.useState(!1),r=I.useCallback(()=>{n(f=>!f)},[]),{status:o,appLoc:i,appLogs:a,clearLogs:s,restartApp:l}=yT(),u=ST(),c=I.useCallback(f=>{!e.current||!i||(e.current.src=i,OT(f.currentTarget))},[i]);return o==="no-preview"&&!Dk?null:N(Le,{children:[N("h3",{className:mt.title+" "+Q1.panelTitleHeader,children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),"App Preview"]}),g("div",{className:mt.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Pw}px`,"--expanded-inset-horizontal":`${kw}px`},children:o==="loading"?g(AT,{}):o==="crashed"?g(CT,{onClick:l}):N(Le,{children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),N("div",{className:mt.appContainer,children:[o==="no-preview"?g(eT,{}):g("iframe",{className:mt.previewFrame,src:i,title:"Application Preview",ref:e}),g(wt,{variant:"icon",className:mt.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?g(mk,{}):g(xx,{})})]}),g(mT,{appLogs:a,clearLogs:s})]})})]})}function CT({onClick:e}){return N("div",{className:mt.appContainer,children:[N("p",{children:["App preview crashed.",g("br",{})," Try and restart?"]}),N(wt,{className:mt.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",g(td,{})]})]})}function AT(){return g("div",{className:mt.loadingMessage,children:g("h2",{children:"Loading app preview..."})})}function xT(){const[e,t]=I.useState(null),n=I.useMemo(()=>Fp(()=>{const{innerWidth:r,innerHeight:o}=window;t({width:r,height:o})},500),[]);return I.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function OT(e){e.classList.add(mt.spin),e.addEventListener("animationend",()=>e.classList.remove(mt.spin),!1)}const _T=e=>g("svg",$(F({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:g("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class PT{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function kT(){const e=Va(c=>c.uiTree),t=vr(),[n,r]=I.useState(!1),[o,i]=I.useState(!1),a=I.useRef(new PT({comparisonFn:TT}));I.useEffect(()=>{if(!e||e===Zp)return;const c=a.current;c.addEntry(e),i(c.canGoBackwards()),r(c.canGoForwards())},[e]);const s=I.useCallback(c=>{t(_k({state:c}))},[t]),l=I.useCallback(()=>{console.log("Navigating backwards"),s(a.current.goBackwards())},[s]),u=I.useCallback(()=>{console.log("Navigating forwards"),s(a.current.goForwards())},[s]);return{goBackward:l,goForward:u,canGoBackward:o,canGoForward:n}}function TT(e,t){return typeof t=="undefined"?!1:e===t}const IT="_container_1d7pe_1",NT={container:IT};function DT(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=kT();return N("div",{className:NT.container+" undo-redo-buttons",children:[g(wt,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:g(PA,{height:"100%"})}),g(wt,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:g(_A,{height:"100%"})})]})}const RT="_elementsPalette_zecez_1",MT="_OptionItem_zecez_18",LT="_OptionIcon_zecez_27",FT="_OptionLabel_zecez_35",el={elementsPalette:RT,OptionItem:MT,OptionIcon:LT,OptionLabel:FT},og=["Inputs","Outputs","gridlayout","uncategorized"];function UT(e,t){var o,i;const n=og.indexOf(((o=en[e])==null?void 0:o.category)||"uncategorized"),r=og.indexOf(((i=en[t])==null?void 0:i.category)||"uncategorized");return nr?1:0}function BT({availableUi:e=en}){const t=j.exports.useMemo(()=>Object.keys(e).sort(UT),[e]);return g("div",{className:el.elementsPalette,children:t.map(n=>g(jT,{uiName:n},n))})}function jT({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r}=en[e],o={uiName:e,uiArguments:r},i=j.exports.useRef(null);return g1({ref:i,nodeInfo:{node:o}}),t===void 0?null:N("div",{ref:i,className:el.OptionItem,"data-ui-name":e,children:[g("img",{src:t,alt:n,className:el.OptionIcon}),g("label",{className:el.OptionLabel,children:n})]})}function Tw(e){return function(t){return typeof t===e}}var WT=Tw("function"),YT=function(e){return e===null},ig=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},ag=function(e){return!zT(e)&&!YT(e)&&(WT(e)||typeof e=="object")},zT=Tw("undefined"),nd=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function GT(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!vt(e[r],t[r]))return!1;return!0}function $T(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),o=e.byteLength;o--;)if(n.getUint8(o)!==r.getUint8(o))return!1;return!0}function HT(e,t){var n,r,o,i;if(e.size!==t.size)return!1;try{for(var a=nd(e.entries()),s=a.next();!s.done;s=a.next()){var l=s.value;if(!t.has(l[0]))return!1}}catch(f){n={error:f}}finally{try{s&&!s.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=nd(e.entries()),c=u.next();!c.done;c=u.next()){var l=c.value;if(!vt(l[1],t.get(l[0])))return!1}}catch(f){o={error:f}}finally{try{c&&!c.done&&(i=u.return)&&i.call(u)}finally{if(o)throw o.error}}return!0}function JT(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var o=nd(e.entries()),i=o.next();!i.done;i=o.next()){var a=i.value;if(!t.has(a[0]))return!1}}catch(s){n={error:s}}finally{try{i&&!i.done&&(r=o.return)&&r.call(o)}finally{if(n)throw n.error}}return!0}function vt(e,t){if(e===t)return!0;if(e&&ag(e)&&t&&ag(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return GT(e,t);if(e instanceof Map&&t instanceof Map)return HT(e,t);if(e instanceof Set&&t instanceof Set)return JT(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return $T(e,t);if(ig(e)&&ig(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var o=n.length;o--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[o]))return!1;for(var o=n.length;o--!==0;){var i=n[o];if(!(i==="_owner"&&e.$$typeof)&&!vt(e[i],t[i]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var VT=["innerHTML","ownerDocument","style","attributes","nodeValue"],QT=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],XT=["bigint","boolean","null","number","string","symbol","undefined"];function ku(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(KT(t))return t}function rn(e){return function(t){return ku(t)===e}}function KT(e){return QT.includes(e)}function ni(e){return function(t){return typeof t===e}}function qT(e){return XT.includes(e)}function P(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(P.array(e))return"Array";if(P.plainFunction(e))return"Function";var t=ku(e);return t||"Object"}P.array=Array.isArray;P.arrayOf=function(e,t){return!P.array(e)&&!P.function(t)?!1:e.every(function(n){return t(n)})};P.asyncGeneratorFunction=function(e){return ku(e)==="AsyncGeneratorFunction"};P.asyncFunction=rn("AsyncFunction");P.bigint=ni("bigint");P.boolean=function(e){return e===!0||e===!1};P.date=rn("Date");P.defined=function(e){return!P.undefined(e)};P.domElement=function(e){return P.object(e)&&!P.plainObject(e)&&e.nodeType===1&&P.string(e.nodeName)&&VT.every(function(t){return t in e})};P.empty=function(e){return P.string(e)&&e.length===0||P.array(e)&&e.length===0||P.object(e)&&!P.map(e)&&!P.set(e)&&Object.keys(e).length===0||P.set(e)&&e.size===0||P.map(e)&&e.size===0};P.error=rn("Error");P.function=ni("function");P.generator=function(e){return P.iterable(e)&&P.function(e.next)&&P.function(e.throw)};P.generatorFunction=rn("GeneratorFunction");P.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};P.iterable=function(e){return!P.nullOrUndefined(e)&&P.function(e[Symbol.iterator])};P.map=rn("Map");P.nan=function(e){return Number.isNaN(e)};P.null=function(e){return e===null};P.nullOrUndefined=function(e){return P.null(e)||P.undefined(e)};P.number=function(e){return ni("number")(e)&&!P.nan(e)};P.numericString=function(e){return P.string(e)&&e.length>0&&!Number.isNaN(Number(e))};P.object=function(e){return!P.nullOrUndefined(e)&&(P.function(e)||typeof e=="object")};P.oneOf=function(e,t){return P.array(e)?e.indexOf(t)>-1:!1};P.plainFunction=rn("Function");P.plainObject=function(e){if(ku(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};P.primitive=function(e){return P.null(e)||qT(typeof e)};P.promise=rn("Promise");P.propertyOf=function(e,t,n){if(!P.object(e)||!t)return!1;var r=e[t];return P.function(n)?n(r):P.defined(r)};P.regexp=rn("RegExp");P.set=rn("Set");P.string=ni("string");P.symbol=ni("symbol");P.undefined=ni("undefined");P.weakMap=rn("WeakMap");P.weakSet=rn("WeakSet");function ZT(){for(var e=[],t=0;tl);return P.undefined(r)||(u=u&&l===r),P.undefined(i)||(u=u&&s===i),u}function lg(e,t,n){var r=n.key,o=n.type,i=n.value,a=cn(e,r),s=cn(t,r),l=o==="added"?a:s,u=o==="added"?s:a;if(!P.nullOrUndefined(i)){if(P.defined(l)){if(P.array(l)||P.plainObject(l))return e6(l,u,i)}else return vt(u,i);return!1}return[a,s].every(P.array)?!u.every(eh(l)):[a,s].every(P.plainObject)?t6(Object.keys(l),Object.keys(u)):![a,s].every(function(c){return P.primitive(c)&&P.defined(c)})&&(o==="added"?!P.defined(a)&&P.defined(s):P.defined(a)&&!P.defined(s))}function ug(e,t,n){var r=n===void 0?{}:n,o=r.key,i=cn(e,o),a=cn(t,o);if(!Iw(i,a))throw new TypeError("Inputs have different types");if(!ZT(i,a))throw new TypeError("Inputs don't have length");return[i,a].every(P.plainObject)&&(i=Object.keys(i),a=Object.keys(a)),[i,a]}function cg(e){return function(t){var n=t[0],r=t[1];return P.array(e)?vt(e,r)||e.some(function(o){return vt(o,r)||P.array(r)&&eh(r)(o)}):P.plainObject(e)&&e[n]?!!e[n]&&vt(e[n],r):vt(e,r)}}function t6(e,t){return t.some(function(n){return!e.includes(n)})}function fg(e){return function(t){return P.array(e)?e.some(function(n){return vt(n,t)||P.array(t)&&eh(t)(n)}):vt(e,t)}}function Ci(e,t){return P.array(e)?e.some(function(n){return vt(n,t)}):vt(e,t)}function eh(e){return function(t){return e.some(function(n){return vt(n,t)})}}function Iw(){for(var e=[],t=0;t=0)return 1;return 0}();function R6(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function M6(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},D6))}}var L6=ns&&window.Promise,F6=L6?R6:M6;function Bw(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Hr(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function oh(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function rs(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Hr(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/(auto|scroll|overlay)/.test(n+o+r)?e:rs(oh(e))}function jw(e){return e&&e.referenceNode?e.referenceNode:e}var vg=ns&&!!(window.MSInputMethodContext&&document.documentMode),gg=ns&&/MSIE 10/.test(navigator.userAgent);function ri(e){return e===11?vg:e===10?gg:vg||gg}function Wo(e){if(!e)return document.documentElement;for(var t=ri(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Hr(n,"position")==="static"?Wo(n):n}function U6(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Wo(e.firstElementChild)===e}function rd(e){return e.parentNode!==null?rd(e.parentNode):e}function $l(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,o=n?t:e,i=document.createRange();i.setStart(r,0),i.setEnd(o,0);var a=i.commonAncestorContainer;if(e!==a&&t!==a||r.contains(o))return U6(a)?a:Wo(a);var s=rd(e);return s.host?$l(s.host,t):$l(e,rd(t).host)}function Yo(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var o=e.ownerDocument.documentElement,i=e.ownerDocument.scrollingElement||o;return i[n]}return e[n]}function B6(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Yo(t,"top"),o=Yo(t,"left"),i=n?-1:1;return e.top+=r*i,e.bottom+=r*i,e.left+=o*i,e.right+=o*i,e}function yg(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function wg(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],ri(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function Ww(e){var t=e.body,n=e.documentElement,r=ri(10)&&getComputedStyle(n);return{height:wg("Height",t,n,r),width:wg("Width",t,n,r)}}var j6=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},W6=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=ri(10),o=t.nodeName==="HTML",i=od(e),a=od(t),s=rs(e),l=Hr(t),u=parseFloat(l.borderTopWidth),c=parseFloat(l.borderLeftWidth);n&&o&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=pr({top:i.top-a.top-u,left:i.left-a.left-c,width:i.width,height:i.height});if(f.marginTop=0,f.marginLeft=0,!r&&o){var d=parseFloat(l.marginTop),p=parseFloat(l.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(s):t===s&&s.nodeName!=="BODY")&&(f=B6(f,t)),f}function Y6(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=ih(e,n),o=Math.max(n.clientWidth,window.innerWidth||0),i=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Yo(n),s=t?0:Yo(n,"left"),l={top:a-r.top+r.marginTop,left:s-r.left+r.marginLeft,width:o,height:i};return pr(l)}function Yw(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Hr(e,"position")==="fixed")return!0;var n=oh(e);return n?Yw(n):!1}function zw(e){if(!e||!e.parentElement||ri())return document.documentElement;for(var t=e.parentElement;t&&Hr(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function ah(e,t,n,r){var o=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,i={top:0,left:0},a=o?zw(e):$l(e,jw(t));if(r==="viewport")i=Y6(a,o);else{var s=void 0;r==="scrollParent"?(s=rs(oh(t)),s.nodeName==="BODY"&&(s=e.ownerDocument.documentElement)):r==="window"?s=e.ownerDocument.documentElement:s=r;var l=ih(s,a,o);if(s.nodeName==="HTML"&&!Yw(a)){var u=Ww(e.ownerDocument),c=u.height,f=u.width;i.top+=l.top-l.marginTop,i.bottom=c+l.top,i.left+=l.left-l.marginLeft,i.right=f+l.left}else i=l}n=n||0;var d=typeof n=="number";return i.left+=d?n:n.left||0,i.top+=d?n:n.top||0,i.right-=d?n:n.right||0,i.bottom-=d?n:n.bottom||0,i}function z6(e){var t=e.width,n=e.height;return t*n}function Gw(e,t,n,r,o){var i=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=ah(n,r,i,o),s={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},l=Object.keys(s).map(function(d){return Lt({key:d},s[d],{area:z6(s[d])})}).sort(function(d,p){return p.area-d.area}),u=l.filter(function(d){var p=d.width,m=d.height;return p>=n.clientWidth&&m>=n.clientHeight}),c=u.length>0?u[0].key:l[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function $w(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,o=r?zw(t):$l(t,jw(n));return ih(n,o,r)}function Hw(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),o=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),i={width:e.offsetWidth+o,height:e.offsetHeight+r};return i}function Hl(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function Jw(e,t,n){n=n.split("-")[0];var r=Hw(e),o={width:r.width,height:r.height},i=["right","left"].indexOf(n)!==-1,a=i?"top":"left",s=i?"left":"top",l=i?"height":"width",u=i?"width":"height";return o[a]=t[a]+t[l]/2-r[l]/2,n===s?o[s]=t[s]-r[u]:o[s]=t[Hl(s)],o}function os(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function G6(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(o){return o[t]===n});var r=os(e,function(o){return o[t]===n});return e.indexOf(r)}function Vw(e,t,n){var r=n===void 0?e:e.slice(0,G6(e,"name",n));return r.forEach(function(o){o.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var i=o.function||o.fn;o.enabled&&Bw(i)&&(t.offsets.popper=pr(t.offsets.popper),t.offsets.reference=pr(t.offsets.reference),t=i(t,o))}),t}function $6(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=$w(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=Gw(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=Jw(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=Vw(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function Qw(e,t){return e.some(function(n){var r=n.name,o=n.enabled;return o&&r===t})}function sh(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=s[f]+m-a[p]),e.offsets.popper=pr(e.offsets.popper);var y=s[f]+s[u]/2-m/2,h=Hr(e.instance.popper),v=parseFloat(h["margin"+c]),w=parseFloat(h["border"+c+"Width"]),S=y-e.offsets.popper[f]-v-w;return S=Math.max(Math.min(a[u]-m,S),0),e.arrowElement=r,e.offsets.arrow=(n={},zo(n,f,Math.round(S)),zo(n,d,""),n),e}function oI(e){return e==="end"?"start":e==="start"?"end":e}var Zw=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],Uc=Zw.slice(3);function Sg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=Uc.indexOf(e),r=Uc.slice(n+1).concat(Uc.slice(0,n));return t?r.reverse():r}var Bc={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function iI(e,t){if(Qw(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=ah(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],o=Hl(r),i=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case Bc.FLIP:a=[r,o];break;case Bc.CLOCKWISE:a=Sg(r);break;case Bc.COUNTERCLOCKWISE:a=Sg(r,!0);break;default:a=t.behavior}return a.forEach(function(s,l){if(r!==s||a.length===l+1)return e;r=e.placement.split("-")[0],o=Hl(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),y=f(u.top)f(n.bottom),v=r==="left"&&p||r==="right"&&m||r==="top"&&y||r==="bottom"&&h,w=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(w&&i==="start"&&p||w&&i==="end"&&m||!w&&i==="start"&&y||!w&&i==="end"&&h),A=!!t.flipVariationsByContent&&(w&&i==="start"&&m||w&&i==="end"&&p||!w&&i==="start"&&h||!w&&i==="end"&&y),T=S||A;(d||v||T)&&(e.flipped=!0,(d||v)&&(r=a[l+1]),T&&(i=oI(i)),e.placement=r+(i?"-"+i:""),e.offsets.popper=Lt({},e.offsets.popper,Jw(e.instance.popper,e.offsets.reference,e.placement)),e=Vw(e.instance.modifiers,e,"flip"))}),e}function aI(e){var t=e.offsets,n=t.popper,r=t.reference,o=e.placement.split("-")[0],i=Math.floor,a=["top","bottom"].indexOf(o)!==-1,s=a?"right":"bottom",l=a?"left":"top",u=a?"width":"height";return n[s]i(r[s])&&(e.offsets.popper[l]=i(r[s])),e}function sI(e,t,n,r){var o=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),i=+o[1],a=o[2];if(!i)return e;if(a.indexOf("%")===0){var s=void 0;switch(a){case"%p":s=n;break;case"%":case"%r":default:s=r}var l=pr(s);return l[t]/100*i}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*i}else return i}function lI(e,t,n,r){var o=[0,0],i=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),s=a.indexOf(os(a,function(c){return c.search(/,|\s/)!==-1}));a[s]&&a[s].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var l=/\s*,\s*|\s+/,u=s!==-1?[a.slice(0,s).concat([a[s].split(l)[0]]),[a[s].split(l)[1]].concat(a.slice(s+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!i:i)?"height":"width",p=!1;return c.reduce(function(m,y){return m[m.length-1]===""&&["+","-"].indexOf(y)!==-1?(m[m.length-1]=y,p=!0,m):p?(m[m.length-1]+=y,p=!1,m):m.concat(y)},[]).map(function(m){return sI(m,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){lh(d)&&(o[f]+=d*(c[p-1]==="-"?-1:1))})}),o}function uI(e,t){var n=t.offset,r=e.placement,o=e.offsets,i=o.popper,a=o.reference,s=r.split("-")[0],l=void 0;return lh(+n)?l=[+n,0]:l=lI(n,i,a,s),s==="left"?(i.top+=l[0],i.left-=l[1]):s==="right"?(i.top+=l[0],i.left+=l[1]):s==="top"?(i.left+=l[0],i.top-=l[1]):s==="bottom"&&(i.left+=l[0],i.top+=l[1]),e.popper=i,e}function cI(e,t){var n=t.boundariesElement||Wo(e.instance.popper);e.instance.reference===n&&(n=Wo(n));var r=sh("transform"),o=e.instance.popper.style,i=o.top,a=o.left,s=o[r];o.top="",o.left="",o[r]="";var l=ah(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);o.top=i,o.left=a,o[r]=s,t.boundaries=l;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var m=c[p];return c[p]l[p]&&!t.escapeWithReference&&(y=Math.min(c[m],l[p]-(p==="right"?c.width:c.height))),zo({},m,y)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=Lt({},c,f[p](d))}),e.offsets.popper=c,e}function fI(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var o=e.offsets,i=o.reference,a=o.popper,s=["bottom","top"].indexOf(n)!==-1,l=s?"left":"top",u=s?"width":"height",c={start:zo({},l,i[l]),end:zo({},l,i[l]+i[u]-a[u])};e.offsets.popper=Lt({},a,c[r])}return e}function dI(e){if(!qw(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=os(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};j6(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=F6(this.update.bind(this)),this.options=Lt({},e.Defaults,o),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(Lt({},e.Defaults.modifiers,o.modifiers)).forEach(function(a){r.options.modifiers[a]=Lt({},e.Defaults.modifiers[a]||{},o.modifiers?o.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return Lt({name:a},r.options.modifiers[a])}).sort(function(a,s){return a.order-s.order}),this.modifiers.forEach(function(a){a.enabled&&Bw(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var i=this.options.eventsEnabled;i&&this.enableEventListeners(),this.state.eventsEnabled=i}return W6(e,[{key:"update",value:function(){return $6.call(this)}},{key:"destroy",value:function(){return H6.call(this)}},{key:"enableEventListeners",value:function(){return V6.call(this)}},{key:"disableEventListeners",value:function(){return X6.call(this)}}]),e}();ju.Utils=(typeof window!="undefined"?window:global).PopperUtils;ju.placements=Zw;ju.Defaults=mI;const bg=ju;var eS={},tS={exports:{}};(function(e,t){(function(n,r){var o=r(n);e.exports=o})(Fg,function(n){var r=["N","E","A","D"];function o(b,E){b.super_=E,b.prototype=Object.create(E.prototype,{constructor:{value:b,enumerable:!1,writable:!0,configurable:!0}})}function i(b,E){Object.defineProperty(this,"kind",{value:b,enumerable:!0}),E&&E.length&&Object.defineProperty(this,"path",{value:E,enumerable:!0})}function a(b,E,x){a.super_.call(this,"E",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0}),Object.defineProperty(this,"rhs",{value:x,enumerable:!0})}o(a,i);function s(b,E){s.super_.call(this,"N",b),Object.defineProperty(this,"rhs",{value:E,enumerable:!0})}o(s,i);function l(b,E){l.super_.call(this,"D",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0})}o(l,i);function u(b,E,x){u.super_.call(this,"A",b),Object.defineProperty(this,"index",{value:E,enumerable:!0}),Object.defineProperty(this,"item",{value:x,enumerable:!0})}o(u,i);function c(b,E,x){var _=b.slice((x||E)+1||b.length);return b.length=E<0?b.length+E:E,b.push.apply(b,_),b}function f(b){var E=typeof b;return E!=="object"?E:b===Math?"math":b===null?"null":Array.isArray(b)?"array":Object.prototype.toString.call(b)==="[object Date]"?"date":typeof b.toString=="function"&&/^\/.*\//.test(b.toString())?"regexp":"object"}function d(b){var E=0;if(b.length===0)return E;for(var x=0;x0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,D),ue=ye!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,D);if(!le&&ue)x.push(new s(H,E));else if(!ue&&le)x.push(new l(H,b));else if(f(b)!==f(E))x.push(new a(H,b,E));else if(f(b)==="date"&&b-E!==0)x.push(new a(H,b,E));else if(he==="object"&&b!==null&&E!==null){for(ne=B.length-1;ne>-1;--ne)if(B[ne].lhs===b){J=!0;break}if(J)b!==E&&x.push(new a(H,b,E));else{if(B.push({lhs:b,rhs:E}),Array.isArray(b)){for(q&&(b.sort(function(Ue,rt){return p(Ue)-p(rt)}),E.sort(function(Ue,rt){return p(Ue)-p(rt)})),ne=E.length-1,R=b.length-1;ne>R;)x.push(new u(H,ne,new s(void 0,E[ne--])));for(;R>ne;)x.push(new u(H,R,new l(void 0,b[R--])));for(;ne>=0;--ne)m(b[ne],E[ne],x,_,H,ne,B,q)}else{var ze=Object.keys(b),Fe=Object.keys(E);for(ne=0;ne=0?(m(b[Y],E[Y],x,_,H,Y,B,q),Fe[J]=null):m(b[Y],void 0,x,_,H,Y,B,q);for(ne=0;ne -*/var vI={set:wI,get:gI,has:yI,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:SI};function gI(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,o){return r&&r[o]},e)}else return typeof t=="number"?e[t]:e;else return e}function yI(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a,s){return a==s.length-1?n.own?!!(o&&o.hasOwnProperty(i)):o!==null&&typeof o=="object"&&i in o:o&&o[i]},e)}else return typeof t=="number"?t in e:!1;else return!1}function wI(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a){const s=Number.isInteger(Number(r[a+1]));return o[i]=o[i]||(s?[]:{}),r.length==a+1&&(o[i]=n),o[i]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function SI(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var o=t.split("."),i=!1,a;return a=!!o.reduce(function(s,l){return i=i||s===n||!!s&&s[l]===n,s&&s[l]},e),r.validPath?i&&a:i}else return!1;else return!1}Object.defineProperty(eS,"__esModule",{value:!0});var bI=tS.exports,dt=vI;function EI(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(o)?o.indexOf(s)>=0:s===o;return l&&(i?u:!i)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var o=dt.get(e,n),i=dt.get(t,n),a=Array.isArray(r)?r.indexOf(o)<0:o!==r,s=Array.isArray(r)?r.indexOf(i)>=0:i===r;return a&&s},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return Eg(dt.get(e,n),dt.get(t,n))&&dt.get(e,n)dt.get(t,n)}}}var xI=eS.default=AI;function Cg(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Ee(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function nS(e,t){if(e==null)return{};var n=_I(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function bn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function rS(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:bn(e)}function ls(e){var t=OI();return function(){var r=Jl(e),o;if(t){var i=Jl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return rS(this,o)}}var PI={flip:{padding:20},preventOverflow:{padding:10}},ae={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},an=Dw.canUseDOM,Ai=nr.createPortal!==void 0;function jc(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ns(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd())}function kI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function TI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function II(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,o;o=function(a){n(a),TI(e,t,o)},kI(e,t,o,r)}function xg(){}var oS=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),an?(o.node=document.createElement("div"),r.id&&(o.node.id=r.id),r.zIndex&&(o.node.style.zIndex=r.zIndex),document.body.appendChild(o.node),o):rS(o)}return as(n,[{key:"componentDidMount",value:function(){!an||Ai||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!an||Ai||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!an||!this.node||(Ai||nr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!an)return null;var o=this.props,i=o.children,a=o.setRef;if(Ai)return nr.createPortal(i,this.node);var s=nr.unstable_renderSubtreeIntoContainer(this,i.length>1?g("div",{children:i}):i[0],this.node);return a(s),null}},{key:"renderReact16",value:function(){var o=this.props,i=o.hasChildren,a=o.placement,s=o.target;return i?this.renderPortal():s||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return Ai?this.renderReact16():null}}]),n}(I.Component);qe(oS,"propTypes",{children:L.exports.oneOfType([L.exports.element,L.exports.array]),hasChildren:L.exports.bool,id:L.exports.oneOfType([L.exports.string,L.exports.number]),placement:L.exports.string,setRef:L.exports.func.isRequired,target:L.exports.oneOfType([L.exports.object,L.exports.string]),zIndex:L.exports.number});var iS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"parentStyle",get:function(){var o=this.props,i=o.placement,a=o.styles,s=a.arrow.length,l={pointerEvents:"none",position:"absolute",width:"100%"};return i.startsWith("top")?(l.bottom=0,l.left=0,l.right=0,l.height=s):i.startsWith("bottom")?(l.left=0,l.right=0,l.top=0,l.height=s):i.startsWith("left")?(l.right=0,l.top=0,l.bottom=0):i.startsWith("right")&&(l.left=0,l.top=0),l}},{key:"render",value:function(){var o=this.props,i=o.placement,a=o.setArrowRef,s=o.styles,l=s.arrow,u=l.color,c=l.display,f=l.length,d=l.margin,p=l.position,m=l.spread,y={display:c,position:p},h,v=m,w=f;return i.startsWith("top")?(h="0,0 ".concat(v/2,",").concat(w," ").concat(v,",0"),y.bottom=0,y.marginLeft=d,y.marginRight=d):i.startsWith("bottom")?(h="".concat(v,",").concat(w," ").concat(v/2,",0 0,").concat(w),y.top=0,y.marginLeft=d,y.marginRight=d):i.startsWith("left")?(w=m,v=f,h="0,0 ".concat(v,",").concat(w/2," 0,").concat(w),y.right=0,y.marginTop=d,y.marginBottom=d):i.startsWith("right")&&(w=m,v=f,h="".concat(v,",").concat(w," ").concat(v,",0 0,").concat(w/2),y.left=0,y.marginTop=d,y.marginBottom=d),g("div",{className:"__floater__arrow",style:this.parentStyle,children:g("span",{ref:a,style:y,children:g("svg",{width:v,height:w,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:g("polygon",{points:h,fill:u})})})})}}]),n}(I.Component);qe(iS,"propTypes",{placement:L.exports.string.isRequired,setArrowRef:L.exports.func.isRequired,styles:L.exports.object.isRequired});var NI=["color","height","width"],aS=function(t){var n=t.handleClick,r=t.styles,o=r.color,i=r.height,a=r.width,s=nS(r,NI);return g("button",{"aria-label":"close",onClick:n,style:s,type:"button",children:g("svg",{width:"".concat(a,"px"),height:"".concat(i,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})})};aS.propTypes={handleClick:L.exports.func.isRequired,styles:L.exports.object.isRequired};var sS=function(t){var n=t.content,r=t.footer,o=t.handleClick,i=t.open,a=t.positionWrapper,s=t.showCloseButton,l=t.title,u=t.styles,c={content:I.isValidElement(n)?n:g("div",{className:"__floater__content",style:u.content,children:n})};return l&&(c.title=I.isValidElement(l)?l:g("div",{className:"__floater__title",style:u.title,children:l})),r&&(c.footer=I.isValidElement(r)?r:g("div",{className:"__floater__footer",style:u.footer,children:r})),(s||a)&&!P.boolean(i)&&(c.close=g(aS,{styles:u.close,handleClick:o})),N("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};sS.propTypes={content:L.exports.node.isRequired,footer:L.exports.node,handleClick:L.exports.func.isRequired,open:L.exports.bool,positionWrapper:L.exports.bool.isRequired,showCloseButton:L.exports.bool.isRequired,styles:L.exports.object.isRequired,title:L.exports.node};var lS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"style",get:function(){var o=this.props,i=o.disableAnimation,a=o.component,s=o.placement,l=o.hideArrow,u=o.status,c=o.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,m=c.floaterClosing,y=c.floaterOpening,h=c.floaterWithAnimation,v=c.floaterWithComponent,w={};return l||(s.startsWith("top")?w.padding="0 0 ".concat(f,"px"):s.startsWith("bottom")?w.padding="".concat(f,"px 0 0"):s.startsWith("left")?w.padding="0 ".concat(f,"px 0 0"):s.startsWith("right")&&(w.padding="0 0 0 ".concat(f,"px"))),[ae.OPENING,ae.OPEN].indexOf(u)!==-1&&(w=Ee(Ee({},w),y)),u===ae.CLOSING&&(w=Ee(Ee({},w),m)),u===ae.OPEN&&!i&&(w=Ee(Ee({},w),h)),s==="center"&&(w=Ee(Ee({},w),p)),a&&(w=Ee(Ee({},w),v)),Ee(Ee({},d),w)}},{key:"render",value:function(){var o=this.props,i=o.component,a=o.handleClick,s=o.hideArrow,l=o.setFloaterRef,u=o.status,c={},f=["__floater"];return i?I.isValidElement(i)?c.content=I.cloneElement(i,{closeFn:a}):c.content=i({closeFn:a}):c.content=g(sS,F({},this.props)),u===ae.OPEN&&f.push("__floater__open"),s||(c.arrow=g(iS,F({},this.props))),g("div",{ref:l,className:f.join(" "),style:this.style,children:N("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(I.Component);qe(lS,"propTypes",{component:L.exports.oneOfType([L.exports.func,L.exports.element]),content:L.exports.node,disableAnimation:L.exports.bool.isRequired,footer:L.exports.node,handleClick:L.exports.func.isRequired,hideArrow:L.exports.bool.isRequired,open:L.exports.bool,placement:L.exports.string.isRequired,positionWrapper:L.exports.bool.isRequired,setArrowRef:L.exports.func.isRequired,setFloaterRef:L.exports.func.isRequired,showCloseButton:L.exports.bool,status:L.exports.string.isRequired,styles:L.exports.object.isRequired,title:L.exports.node});var uS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"render",value:function(){var o=this.props,i=o.children,a=o.handleClick,s=o.handleMouseEnter,l=o.handleMouseLeave,u=o.setChildRef,c=o.setWrapperRef,f=o.style,d=o.styles,p;if(i)if(I.Children.count(i)===1)if(!I.isValidElement(i))p=g("span",{children:i});else{var m=P.function(i.type)?"innerRef":"ref";p=I.cloneElement(I.Children.only(i),qe({},m,u))}else p=i;return p?g("span",{ref:c,style:Ee(Ee({},d),f),onClick:a,onMouseEnter:s,onMouseLeave:l,children:p}):null}}]),n}(I.Component);qe(uS,"propTypes",{children:L.exports.node,handleClick:L.exports.func.isRequired,handleMouseEnter:L.exports.func.isRequired,handleMouseLeave:L.exports.func.isRequired,setChildRef:L.exports.func.isRequired,setWrapperRef:L.exports.func.isRequired,style:L.exports.object,styles:L.exports.object.isRequired});var DI={zIndex:100};function RI(e){var t=on(DI,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var MI=["arrow","flip","offset"],LI=["position","top","right","bottom","left"],uh=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),qe(bn(o),"setArrowRef",function(i){o.arrowRef=i}),qe(bn(o),"setChildRef",function(i){o.childRef=i}),qe(bn(o),"setFloaterRef",function(i){o.floaterRef||(o.floaterRef=i)}),qe(bn(o),"setWrapperRef",function(i){o.wrapperRef=i}),qe(bn(o),"handleTransitionEnd",function(){var i=o.state.status,a=o.props.callback;o.wrapperPopper&&o.wrapperPopper.instance.update(),o.setState({status:i===ae.OPENING?ae.OPEN:ae.IDLE},function(){var s=o.state.status;a(s===ae.OPEN?"open":"close",o.props)})}),qe(bn(o),"handleClick",function(){var i=o.props,a=i.event,s=i.open;if(!P.boolean(s)){var l=o.state,u=l.positionWrapper,c=l.status;(o.event==="click"||o.event==="hover"&&u)&&(Ns({title:"click",data:[{event:a,status:c===ae.OPEN?"closing":"opening"}],debug:o.debug}),o.toggle())}}),qe(bn(o),"handleMouseEnter",function(){var i=o.props,a=i.event,s=i.open;if(!(P.boolean(s)||jc())){var l=o.state.status;o.event==="hover"&&l===ae.IDLE&&(Ns({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:o.debug}),clearTimeout(o.eventDelayTimeout),o.toggle())}}),qe(bn(o),"handleMouseLeave",function(){var i=o.props,a=i.event,s=i.eventDelay,l=i.open;if(!(P.boolean(l)||jc())){var u=o.state,c=u.status,f=u.positionWrapper;o.event==="hover"&&(Ns({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:o.debug}),s?[ae.OPENING,ae.OPEN].indexOf(c)!==-1&&!f&&!o.eventDelayTimeout&&(o.eventDelayTimeout=setTimeout(function(){delete o.eventDelayTimeout,o.toggle()},s*1e3)):o.toggle(ae.IDLE))}}),o.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ae.INIT,statusWrapper:ae.INIT},o._isMounted=!1,an&&window.addEventListener("load",function(){o.popper&&o.popper.instance.update(),o.wrapperPopper&&o.wrapperPopper.instance.update()}),o}return as(n,[{key:"componentDidMount",value:function(){if(!!an){var o=this.state.positionWrapper,i=this.props,a=i.children,s=i.open,l=i.target;this._isMounted=!0,Ns({title:"init",data:{hasChildren:!!a,hasTarget:!!l,isControlled:P.boolean(s),positionWrapper:o,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&l&&P.boolean(s)}}},{key:"componentDidUpdate",value:function(o,i){if(!!an){var a=this.props,s=a.autoOpen,l=a.open,u=a.target,c=a.wrapperOptions,f=xI(i,this.state),d=f.changedFrom,p=f.changedTo;if(o.open!==l){var m;P.boolean(l)&&(m=l?ae.OPENING:ae.CLOSING),this.toggle(m)}(o.wrapperOptions.position!==c.position||o.target!==u)&&this.changeWrapperPosition(this.props),p("status",ae.IDLE)&&l?this.toggle(ae.OPEN):d("status",ae.INIT,ae.IDLE)&&s&&this.toggle(ae.OPEN),this.popper&&p("status",ae.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ae.OPENING)||p("status",ae.CLOSING))&&II(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!an||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var o=this,i=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,s=this.props,l=s.disableFlip,u=s.getPopper,c=s.hideArrow,f=s.offset,d=s.placement,p=s.wrapperOptions,m=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ae.IDLE});else if(i&&this.floaterRef){var y=this.options,h=y.arrow,v=y.flip,w=y.offset,S=nS(y,MI);new bg(i,this.floaterRef,{placement:d,modifiers:Ee({arrow:Ee({enabled:!c,element:this.arrowRef},h),flip:Ee({enabled:!l,behavior:m},v),offset:Ee({offset:"0, ".concat(f,"px")},w)},S),onCreate:function(C){o.popper=C,u(C,"floater"),o._isMounted&&o.setState({currentPlacement:C.placement,status:ae.IDLE}),d!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){o.popper=C;var O=o.state.currentPlacement;o._isMounted&&C.placement!==O&&o.setState({currentPlacement:C.placement})}})}if(a){var A=P.undefined(p.offset)?0:p.offset;new bg(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(A,"px")},flip:{enabled:!1}},onCreate:function(C){o.wrapperPopper=C,o._isMounted&&o.setState({statusWrapper:ae.IDLE}),u(C,"wrapper"),d!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(o){var i=o.target,a=o.wrapperOptions;this.setState({positionWrapper:a.position&&!!i})}},{key:"toggle",value:function(o){var i=this.state.status,a=i===ae.OPEN?ae.CLOSING:ae.OPENING;P.undefined(o)||(a=o),this.setState({status:a})}},{key:"debug",get:function(){var o=this.props.debug;return o||!!global.ReactFloaterDebug}},{key:"event",get:function(){var o=this.props,i=o.disableHoverToClick,a=o.event;return a==="hover"&&jc()&&!i?"click":a}},{key:"options",get:function(){var o=this.props.options;return on(PI,o||{})}},{key:"styles",get:function(){var o=this,i=this.state,a=i.status,s=i.positionWrapper,l=i.statusWrapper,u=this.props.styles,c=on(RI(u),u);if(s){var f;[ae.IDLE].indexOf(a)===-1||[ae.IDLE].indexOf(l)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Ee(Ee({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},s||(LI.forEach(function(p){o.wrapperStyles[p]=d[p]}),c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!an)return null;var o=this.props.target;return o?P.domElement(o)?o:document.querySelector(o):this.childRef||this.wrapperRef}},{key:"render",value:function(){var o=this.state,i=o.currentPlacement,a=o.positionWrapper,s=o.status,l=this.props,u=l.children,c=l.component,f=l.content,d=l.disableAnimation,p=l.footer,m=l.hideArrow,y=l.id,h=l.open,v=l.showCloseButton,w=l.style,S=l.target,A=l.title,T=g(uS,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:w,styles:this.styles.wrapper,children:u}),C={};return a?C.wrapperInPortal=T:C.wrapperAsChildren=T,N("span",{children:[N(oS,{hasChildren:!!u,id:y,placement:i,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[g(lS,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:m||i==="center",open:h,placement:i,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:v,status:s,styles:this.styles,title:A}),C.wrapperInPortal]}),C.wrapperAsChildren]})}}]),n}(I.Component);qe(uh,"propTypes",{autoOpen:L.exports.bool,callback:L.exports.func,children:L.exports.node,component:mg(L.exports.oneOfType([L.exports.func,L.exports.element]),function(e){return!e.content}),content:mg(L.exports.node,function(e){return!e.component}),debug:L.exports.bool,disableAnimation:L.exports.bool,disableFlip:L.exports.bool,disableHoverToClick:L.exports.bool,event:L.exports.oneOf(["hover","click"]),eventDelay:L.exports.number,footer:L.exports.node,getPopper:L.exports.func,hideArrow:L.exports.bool,id:L.exports.oneOfType([L.exports.string,L.exports.number]),offset:L.exports.number,open:L.exports.bool,options:L.exports.object,placement:L.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:L.exports.bool,style:L.exports.object,styles:L.exports.object,target:L.exports.oneOfType([L.exports.object,L.exports.string]),title:L.exports.node,wrapperOptions:L.exports.shape({offset:L.exports.number,placement:L.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:L.exports.bool})});qe(uh,"defaultProps",{autoOpen:!1,callback:xg,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:xg,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function Og(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function W(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function Ql(e,t){if(e==null)return{};var n=UI(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Pe(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function cS(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return Pe(e)}function Vr(e){var t=FI();return function(){var r=Vl(e),o;if(t){var i=Vl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return cS(this,o)}}var oe={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},it={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ee={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},re={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},Cn=Dw.canUseDOM,xi=Na.exports.createPortal!==void 0;function fS(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function Wc(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function Oi(e){var t=[],n=function r(o){if(typeof o=="string"||typeof o=="number")t.push(o);else if(Array.isArray(o))o.forEach(function(a){return r(a)});else if(o&&o.props){var i=o.props.children;Array.isArray(i)?i.forEach(function(a){return r(a)}):r(i)}};return n(e),t.join(" ").trim()}function Pg(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function BI(e,t){return!P.plainObject(e)||!P.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function jI(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(o,i,a,s){return i+i+a+a+s+s}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function kg(e){return e.disableBeacon||e.placement==="center"}function ld(e,t){var n,r=j.exports.isValidElement(e)||j.exports.isValidElement(t),o=P.undefined(e)||P.undefined(t);if(Wc(e)!==Wc(t)||r||o)return!1;if(P.domElement(e))return e.isSameNode(t);if(P.number(e))return e===t;if(P.function(e))return e.toString()===t.toString();for(var i in e)if(Pg(e,i)){if(typeof e[i]=="undefined"||typeof t[i]=="undefined")return!1;if(n=Wc(e[i]),["object","array"].indexOf(n)!==-1&&ld(e[i],t[i])||n==="function"&&ld(e[i],t[i]))continue;if(e[i]!==t[i])return!1}for(var a in t)if(Pg(t,a)&&typeof e[a]=="undefined")return!1;return!0}function Tg(){return["chrome","safari","firefox","opera"].indexOf(fS())===-1}function jr(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var WI={action:"",controlled:!1,index:0,lifecycle:ee.INIT,size:0,status:re.IDLE},Ig=["action","index","lifecycle","status"];function YI(e){var t=new Map,n=new Map,r=function(){function o(){var i=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},s=a.continuous,l=s===void 0?!1:s,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;Mn(this,o),V(this,"listener",void 0),V(this,"setSteps",function(d){var p=i.getState(),m=p.size,y=p.status,h={size:d.length,status:y};n.set("steps",d),y===re.WAITING&&!m&&d.length&&(h.status=re.RUNNING),i.setState(h)}),V(this,"addListener",function(d){i.listener=d}),V(this,"update",function(d){if(!BI(d,Ig))throw new Error("State is not valid. Valid keys: ".concat(Ig.join(", ")));i.setState(W({},i.getNextState(W(W(W({},i.getState()),d),{},{action:d.action||oe.UPDATE}),!0)))}),V(this,"start",function(d){var p=i.getState(),m=p.index,y=p.size;i.setState(W(W({},i.getNextState({action:oe.START,index:P.number(d)?d:m},!0)),{},{status:y?re.RUNNING:re.WAITING}))}),V(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.index,y=p.status;[re.FINISHED,re.SKIPPED].indexOf(y)===-1&&i.setState(W(W({},i.getNextState({action:oe.STOP,index:m+(d?1:0)})),{},{status:re.PAUSED}))}),V(this,"close",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.CLOSE,index:p+1})))}),V(this,"go",function(d){var p=i.getState(),m=p.controlled,y=p.status;if(!(m||y!==re.RUNNING)){var h=i.getSteps()[d];i.setState(W(W({},i.getNextState({action:oe.GO,index:d})),{},{status:h?y:re.FINISHED}))}}),V(this,"info",function(){return i.getState()}),V(this,"next",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(i.getNextState({action:oe.NEXT,index:p+1}))}),V(this,"open",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.UPDATE,lifecycle:ee.TOOLTIP})))}),V(this,"prev",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.PREV,index:p-1})))}),V(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.controlled;m||i.setState(W(W({},i.getNextState({action:oe.RESET,index:0})),{},{status:d?re.RUNNING:re.READY}))}),V(this,"skip",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState({action:oe.SKIP,lifecycle:ee.INIT,status:re.SKIPPED})}),this.setState({action:oe.INIT,controlled:P.number(u),continuous:l,index:P.number(u)?u:0,lifecycle:ee.INIT,status:f.length?re.READY:re.IDLE},!0),this.setSteps(f)}return Ln(o,[{key:"setState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=W(W({},l),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,m=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",m),s&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(l)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:W({},WI)}},{key:"getNextState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=l.action,c=l.controlled,f=l.index,d=l.size,p=l.status,m=P.number(a.index)?a.index:f,y=c&&!s?f:Math.min(Math.max(m,0),d);return{action:a.action||u,controlled:c,index:y,lifecycle:a.lifecycle||ee.INIT,size:a.size||d,status:y===d?re.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var s=JSON.stringify(a),l=JSON.stringify(this.getState());return s!==l}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),o}();return new r(e)}function aa(){return document.scrollingElement||document.createElement("body")}function dS(e){return e?e.getBoundingClientRect():{}}function zI(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function or(e){return typeof e=="string"?document.querySelector(e):e}function GI(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function Wu(e,t,n){var r=Mw(e);if(r.isSameNode(aa()))return n?document:aa();var o=r.scrollHeight>r.offsetHeight;return!o&&!t?(r.style.overflow="initial",aa()):r}function Yu(e,t){if(!e)return!1;var n=Wu(e,t);return!n.isSameNode(aa())}function $I(e){return e.offsetParent!==document.body}function Go(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:GI(e).position===t?!0:Go(e.parentNode,t)}function HI(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,o=n.visibility;if(r==="none"||o==="hidden")return!1}t=t.parentNode}return!0}function JI(e,t,n){var r=dS(e),o=Wu(e,n),i=Yu(e,n),a=0;o instanceof HTMLElement&&(a=o.scrollTop);var s=r.top+(!i&&!Go(e)?a:0);return Math.floor(s-t)}function ud(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?ud(e.offsetParent)+e.offsetTop:e.offsetTop:0}function VI(e,t,n){if(!e)return 0;var r=Mw(e),o=ud(e);return Yu(e,n)&&!$I(e)&&(o-=ud(r)),Math.floor(o-t)}function QI(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:aa(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,o){var i=t.scrollTop,a=e>i?e-i:i-e;i6.top(t,e,{duration:a<100?50:n},function(s){return s&&s.message!=="Element already at target scroll position"?o(s):r()})})}function XI(e){function t(r,o,i,a,s,l){var u=a||"<>",c=l||i;if(o[i]==null)return r?new Error("Required ".concat(s," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=on(KI,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return P.plainObject(e)?e.target?!0:(jr({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(jr({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function Dg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return P.array(e)?e.every(function(n){return pS(n,t)}):(jr({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var eN=Ln(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(Mn(this,e),V(this,"element",void 0),V(this,"options",void 0),V(this,"canBeTabbed",function(o){var i=o.tabIndex;(i===null||i<0)&&(i=void 0);var a=isNaN(i);return!a&&n.canHaveFocus(o)}),V(this,"canHaveFocus",function(o){var i=/input|select|textarea|button|object/,a=o.nodeName.toLowerCase(),s=i.test(a)&&!o.getAttribute("disabled")||a==="a"&&!!o.getAttribute("href");return s&&n.isVisible(o)}),V(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),V(this,"handleKeyDown",function(o){var i=n.options.keyCode,a=i===void 0?9:i;o.keyCode===a&&n.interceptTab(o)}),V(this,"interceptTab",function(o){var i=n.findValidTabElements();if(!!i.length){o.preventDefault();var a=o.shiftKey,s=i.indexOf(document.activeElement);s===-1||!a&&s+1===i.length?s=0:a&&s===0?s=i.length-1:s+=a?-1:1,i[s].focus()}}),V(this,"isHidden",function(o){var i=o.offsetWidth<=0&&o.offsetHeight<=0,a=window.getComputedStyle(o);return i&&!o.innerHTML?!0:i&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),V(this,"isVisible",function(o){for(var i=o;i;)if(i instanceof HTMLElement){if(i===document.body)break;if(n.isHidden(i))return!1;i=i.parentNode}return!0}),V(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),V(this,"checkFocus",function(o){document.activeElement!==o&&(o.focus(),window.requestAnimationFrame(function(){return n.checkFocus(o)}))}),V(this,"setFocus",function(){var o=n.options.selector;if(!!o){var i=n.element.querySelector(o);i&&window.requestAnimationFrame(function(){return n.checkFocus(i)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),tN=function(e){Jr(n,e);var t=Vr(n);function n(r){var o;if(Mn(this,n),o=t.call(this,r),V(Pe(o),"setBeaconRef",function(l){o.beacon=l}),!r.beaconComponent){var i=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),s=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(s)),i.appendChild(a)}return o}return Ln(n,[{key:"componentDidMount",value:function(){var o=this,i=this.props.shouldFocus;setTimeout(function(){P.domElement(o.beacon)&&i&&o.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var o=document.getElementById("joyride-beacon-animation");o&&o.parentNode.removeChild(o)}},{key:"render",value:function(){var o=this.props,i=o.beaconComponent,a=o.locale,s=o.onClickOrHover,l=o.styles,u={"aria-label":a.open,onClick:s,onMouseEnter:s,ref:this.setBeaconRef,title:a.open},c;if(i){var f=i;c=g(f,F({},u))}else c=N("button",$(F({className:"react-joyride__beacon",style:l.beacon,type:"button"},u),{children:[g("span",{style:l.beaconInner}),g("span",{style:l.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(I.Component),nN=function(t){var n=t.styles;return g("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},rN=["mixBlendMode","zIndex"],oN=function(e){Jr(n,e);var t=Vr(n);function n(){var r;Mn(this,n);for(var o=arguments.length,i=new Array(o),a=0;a=p&&y<=p+c,w=h>=f&&h<=f+m,S=w&&v;S!==l&&r.updateState({mouseOverSpotlight:S})}),V(Pe(r),"handleScroll",function(){var s=r.props.target,l=or(s);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Go(l,"sticky")&&r.updateState({})}),V(Pe(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return Ln(n,[{key:"componentDidMount",value:function(){var o=this.props;o.debug,o.disableScrolling;var i=o.disableScrollParentFix,a=o.target,s=or(a);this.scrollParent=Wu(s,i,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(o){var i=this,a=this.props,s=a.lifecycle,l=a.spotlightClicks,u=Gl(o,this.props),c=u.changed;c("lifecycle",ee.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=i.state.isScrolling;f||i.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(l&&s===ee.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):s!==ee.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var o=this.state.showSpotlight,i=this.props,a=i.disableScrollParentFix,s=i.spotlightClicks,l=i.spotlightPadding,u=i.styles,c=i.target,f=or(c),d=dS(f),p=Go(f),m=JI(f,l,a);return W(W({},Tg()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+l*2),left:Math.round(d.left-l),opacity:o?1:0,pointerEvents:s?"none":"auto",position:p?"fixed":"absolute",top:m,transition:"opacity 0.2s",width:Math.round(d.width+l*2)})}},{key:"updateState",value:function(o){!this._isMounted||this.setState(o)}},{key:"render",value:function(){var o=this.state,i=o.mouseOverSpotlight,a=o.showSpotlight,s=this.props,l=s.disableOverlay,u=s.disableOverlayClose,c=s.lifecycle,f=s.onClickOverlay,d=s.placement,p=s.styles;if(l||c!==ee.TOOLTIP)return null;var m=p.overlay;Tg()&&(m=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var y=W({cursor:u?"default":"pointer",height:zI(),pointerEvents:i?"none":"auto"},m),h=d!=="center"&&a&&g(nN,{styles:this.spotlightStyles});if(fS()==="safari"){y.mixBlendMode,y.zIndex;var v=Ql(y,rN);h=g("div",{style:W({},v),children:h}),delete y.backgroundColor}return g("div",{className:"react-joyride__overlay",style:y,onClick:f,children:h})}}]),n}(I.Component),iN=["styles"],aN=["color","height","width"],sN=function(t){var n=t.styles,r=Ql(t,iN),o=n.color,i=n.height,a=n.width,s=Ql(n,aN);return g("button",$(F({style:s,type:"button"},r),{children:g("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof i=="number"?"".concat(i,"px"):i,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})}))},lN=function(e){Jr(n,e);var t=Vr(n);function n(){return Mn(this,n),t.apply(this,arguments)}return Ln(n,[{key:"render",value:function(){var o=this.props,i=o.backProps,a=o.closeProps,s=o.continuous,l=o.index,u=o.isLastStep,c=o.primaryProps,f=o.size,d=o.skipProps,p=o.step,m=o.tooltipProps,y=p.content,h=p.hideBackButton,v=p.hideCloseButton,w=p.hideFooter,S=p.showProgress,A=p.showSkipButton,T=p.title,C=p.styles,O=p.locale,b=O.back,E=O.close,x=O.last,_=O.next,k=O.skip,D={primary:E};return s&&(D.primary=u?x:_,S&&(D.primary=N("span",{children:[D.primary," (",l+1,"/",f,")"]}))),A&&!u&&(D.skip=g("button",$(F({style:C.buttonSkip,type:"button","aria-live":"off"},d),{children:k}))),!h&&l>0&&(D.back=g("button",$(F({style:C.buttonBack,type:"button"},i),{children:b}))),D.close=!v&&g(sN,F({styles:C.buttonClose},a)),N("div",$(F({className:"react-joyride__tooltip",style:C.tooltip},m),{children:[N("div",{style:C.tooltipContainer,children:[T&&g("h4",{style:C.tooltipTitle,"aria-label":T,children:T}),g("div",{style:C.tooltipContent,children:y})]}),!w&&N("div",{style:C.tooltipFooter,children:[g("div",{style:C.tooltipFooterSpacer,children:D.skip}),D.back,g("button",$(F({style:C.buttonNext,type:"button"},c),{children:D.primary}))]}),D.close]}),"JoyrideTooltip")}}]),n}(I.Component),uN=["beaconComponent","tooltipComponent"],cN=function(e){Jr(n,e);var t=Vr(n);function n(){var r;Mn(this,n);for(var o=arguments.length,i=new Array(o),a=0;a0||a===oe.PREV),C=w("action")||w("index")||w("lifecycle")||w("status"),O=S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT),b=w("action",[oe.NEXT,oe.PREV,oe.SKIP,oe.CLOSE]);if(b&&(O||u)&&s(W(W({},A),{},{index:o.index,lifecycle:ee.COMPLETE,step:o.step,type:it.STEP_AFTER})),w("index")&&f>0&&d===ee.INIT&&m===re.RUNNING&&y.placement==="center"&&h({lifecycle:ee.READY}),C&&y){var E=or(y.target),x=!!E,_=x&&HI(E);_?(S("status",re.READY,re.RUNNING)||S("lifecycle",ee.INIT,ee.READY))&&s(W(W({},A),{},{step:y,type:it.STEP_BEFORE})):(console.warn(x?"Target not visible":"Target not mounted",y),s(W(W({},A),{},{type:it.TARGET_NOT_FOUND,step:y})),u||h({index:f+([oe.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ee.INIT,ee.READY)&&h({lifecycle:kg(y)||T?ee.TOOLTIP:ee.BEACON}),w("index")&&jr({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),w("lifecycle",ee.BEACON)&&s(W(W({},A),{},{step:y,type:it.BEACON})),w("lifecycle",ee.TOOLTIP)&&(s(W(W({},A),{},{step:y,type:it.TOOLTIP})),this.scope=new eN(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var o=this.props,i=o.step,a=o.lifecycle;return!!(kg(i)||a===ee.TOOLTIP)}},{key:"render",value:function(){var o=this.props,i=o.continuous,a=o.debug,s=o.helpers,l=o.index,u=o.lifecycle,c=o.nonce,f=o.shouldScroll,d=o.size,p=o.step,m=or(p.target);return!pS(p)||!P.domElement(m)?null:N("div",{className:"react-joyride__step",children:[g(fN,{id:"react-joyride-portal",children:g(oN,$(F({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),g(uh,$(F({component:g(cN,{continuous:i,helpers:s,index:l,isLastStep:l+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(l),isPositioned:p.isFixed||Go(m),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:g(tN,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(l))}}]),n}(I.Component),hS=function(e){Jr(n,e);var t=Vr(n);function n(r){var o;return Mn(this,n),o=t.call(this,r),V(Pe(o),"initStore",function(){var i=o.props,a=i.debug,s=i.getHelpers,l=i.run,u=i.stepIndex;o.store=new YI(W(W({},o.props),{},{controlled:l&&P.number(u)})),o.helpers=o.store.getHelpers();var c=o.store.addListener;return jr({title:"init",data:[{key:"props",value:o.props},{key:"state",value:o.state}],debug:a}),c(o.syncState),s(o.helpers),o.store.getState()}),V(Pe(o),"callback",function(i){var a=o.props.callback;P.function(a)&&a(i)}),V(Pe(o),"handleKeyboard",function(i){var a=o.state,s=a.index,l=a.lifecycle,u=o.props.steps,c=u[s],f=window.Event?i.which:i.keyCode;l===ee.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&o.store.close()}),V(Pe(o),"syncState",function(i){o.setState(i)}),V(Pe(o),"setPopper",function(i,a){a==="wrapper"?o.beaconPopper=i:o.tooltipPopper=i}),V(Pe(o),"shouldScroll",function(i,a,s,l,u,c,f){return!i&&(a!==0||s||l===ee.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!Go(c))&&f.lifecycle!==l&&[ee.BEACON,ee.TOOLTIP].indexOf(l)!==-1}),o.state=o.initStore(),o}return Ln(n,[{key:"componentDidMount",value:function(){if(!!Cn){var o=this.props,i=o.disableCloseOnEsc,a=o.debug,s=o.run,l=o.steps,u=this.store.start;Dg(l,a)&&s&&u(),i||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(o,i){if(!!Cn){var a=this.state,s=a.action,l=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,m=d.run,y=d.stepIndex,h=d.steps,v=o.steps,w=o.stepIndex,S=this.store,A=S.reset,T=S.setSteps,C=S.start,O=S.stop,b=S.update,E=Gl(o,this.props),x=E.changed,_=Gl(i,this.state),k=_.changed,D=_.changedFrom,B=Pi(h[u],this.props),q=!ld(v,h),H=P.number(y)&&x("stepIndex"),ce=or(B==null?void 0:B.target);if(q&&(Dg(h,p)?T(h):console.warn("Steps are not valid",h)),x("run")&&(m?C(y):O()),H){var he=w=0?C:0,l===re.RUNNING&&QI(C,T,y)}}}},{key:"render",value:function(){if(!Cn)return null;var o=this.state,i=o.index,a=o.status,s=this.props,l=s.continuous,u=s.debug,c=s.nonce,f=s.scrollToFirstStep,d=s.steps,p=Pi(d[i],this.props),m;return a===re.RUNNING&&p&&(m=g(dN,$(F({},this.state),{callback:this.callback,continuous:l,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(i!==0||f),step:p,update:this.store.update}))),g("div",{className:"react-joyride",children:m})}}]),n}(I.Component);V(hS,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const pN=N("div",{children:[g("p",{children:"You can see how the changes impact your app with the app preview."}),g("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),g("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),hN=N("div",{children:[g("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),g("p",{children:"You can click on elements to select them or drag them around to move them."}),g("p",{children:"Cards can be resized by dragging resize handles on the sides."}),g("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),g("p",{children:g("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),mN=N("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",g("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",g("span",{className:zf.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),vN=N("div",{children:[g("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),g("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),gN=[{target:".app-view",content:hN,disableBeacon:!0},{target:".elements-panel",content:mN,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:vN,placement:"left-start"},{target:".app-preview",content:pN,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function yN(){const[e,t]=j.exports.useState(0),[n,r]=j.exports.useState(!1),o=j.exports.useCallback(a=>{const{action:s,index:l,status:u,type:c}=a;console.log({action:s,index:l,status:u,type:c}),(c===it.STEP_AFTER||c===it.TARGET_NOT_FOUND)&&(s===oe.NEXT?t(l+1):s===oe.PREV?t(l-1):s===oe.CLOSE&&r(!1)),c===it.TOUR_END&&(s===oe.NEXT&&(r(!1),t(0)),s===oe.SKIP&&r(!1))},[]),i=j.exports.useCallback(()=>{r(!0)},[]);return N(Le,{children:[N(wt,{onClick:i,title:"Take a guided tour of app",variant:"transparent",children:[g(CA,{id:"tour",size:"24px"}),"Tour App"]}),g(hS,{callback:o,steps:gN,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:SN})]})}const Rg="#e07189",wN="#f6d5dc",SN={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:Rg},beaconOuter:{backgroundColor:wN,border:`2px solid ${Rg}`}},bN="_container_1ehu8_1",EN="_elementsPanel_1ehu8_28",CN="_propertiesPanel_1ehu8_33",AN="_editorHolder_1ehu8_47",xN="_titledPanel_1ehu8_59",ON="_panelTitleHeader_1ehu8_71",_N="_header_1ehu8_80",PN="_rightSide_1ehu8_88",kN="_divider_1ehu8_109",TN="_title_1ehu8_59",IN="_shinyLogo_1ehu8_120",pt={container:bN,elementsPanel:EN,propertiesPanel:CN,editorHolder:AN,titledPanel:xN,panelTitleHeader:ON,header:_N,rightSide:PN,divider:kN,title:TN,shinyLogo:IN},NN="_container_1fh41_1",DN="_node_1fh41_12",Mg={container:NN,node:DN};function RN({tree:e,path:t,onSelect:n}){const r=t.length;let o=[];for(let i=0;i<=r;i++){const a=rr(e,t.slice(0,i));if(a===void 0)return null;o.push(en[a.uiName].title)}return g("div",{className:Mg.container,children:o.map((i,a)=>g("div",{className:Mg.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:MN(i)},i+a))})}function MN(e){return e.replace(/[a-z]+::/,"")}const LN="_settingsPanel_zsgzt_1",FN="_currentElementAbout_zsgzt_10",UN="_settingsForm_zsgzt_17",BN="_settingsInputs_zsgzt_24",jN="_buttonsHolder_zsgzt_28",WN="_validationErrorMsg_zsgzt_45",ki={settingsPanel:LN,currentElementAbout:FN,settingsForm:UN,settingsInputs:BN,buttonsHolder:jN,validationErrorMsg:WN};function YN(e){const t=vr(),[n,r]=v1(),[o,i]=j.exports.useState(n!==null?rr(e,n):null),a=j.exports.useRef(!1),s=j.exports.useMemo(()=>Fp(u=>{!n||!a.current||t(Sw({path:n,node:u}))},250),[t,n]);return j.exports.useEffect(()=>{if(a.current=!1,n===null){i(null);return}rr(e,n)!==void 0&&i(rr(e,n))},[e,n]),j.exports.useEffect(()=>{!o||s(o)},[o,s]),{currentNode:o,updateArgumentsByName:({name:u,value:c})=>{i(f=>$(F({},f),{uiArguments:$(F({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function zN({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:o}=YN(e);if(r===null)return g("div",{children:"Select an element to edit properties"});if(t===null)return N("div",{children:["Error finding requested node at path ",r.join(".")]});const i=r.length===0,{uiName:a,uiArguments:s}=t,l=en[a].SettingsComponent;return N("div",{className:ki.settingsPanel+" properties-panel",children:[g("div",{className:ki.currentElementAbout,children:g(RN,{tree:e,path:r,onSelect:o})}),g("form",{className:ki.settingsForm,onSubmit:GN,children:g("div",{className:ki.settingsInputs,children:g(r2,{onChange:n,children:g(l,{settings:s})})})}),g("div",{className:ki.buttonsHolder,children:i?null:g(m1,{path:r})})]})}function GN(e){e.preventDefault()}function $N(e){return["INITIAL-DATA"].includes(e.path)}function HN(){const e=vr(),t=Va(r=>r.uiTree),n=j.exports.useCallback(r=>{e(Ok({initialState:r}))},[e]);return{tree:t,setTree:n}}function JN(){const{tree:e,setTree:t}=HN(),{status:n,ws:r}=Ow(),[o,i]=j.exports.useState("loading"),a=j.exports.useRef(null),s=Va(l=>l.uiTree);return j.exports.useEffect(()=>{n==="connected"&&(_w(r,l=>{!$N(l)||(a.current=l.payload,t(l.payload),i("connected"))}),ia(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(i("no-backend"),t(VN),console.log("Running in static mode"))},[t,n,r]),j.exports.useEffect(()=>{s===Zp||s===a.current||n==="connected"&&ia(r,{path:"STATE-UPDATE",payload:s})},[s,n,r]),{status:o,tree:e}}const VN={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},mS=236,QN={"--properties-panel-width":`${mS}px`};function XN(){const{status:e,tree:t}=JN();return e==="loading"?g(KN,{}):N(MA,{children:[N("div",{className:pt.container,style:QN,children:[N("div",{className:pt.header,children:[g(_T,{className:pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),g("h1",{className:pt.title,children:"Shiny UI Editor"}),N("div",{className:pt.rightSide,children:[g(yN,{}),g("div",{className:pt.divider}),g(DT,{})]})]}),N("div",{className:`${pt.elementsPanel} ${pt.titledPanel} elements-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Elements"}),g(BT,{})]}),g("div",{className:pt.editorHolder+" app-view",children:g(Ep,F({},t))}),N("div",{className:`${pt.propertiesPanel}`,children:[N("div",{className:`${pt.titledPanel} properties-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Properties"}),g(zN,{tree:t})]}),g("div",{className:`${pt.titledPanel} app-preview`,children:g(ET,{})})]})]}),g(qN,{})]})}function KN(){return g("h3",{children:"Loading initial state from server"})}function qN(){return Va(t=>t.connectedToServer)?null:g(X1,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:g("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const ZN=()=>g(Ik,{children:g(Lk,{children:g(XN,{})})}),e5="modulepreload",t5=function(e,t){return new URL(e,t).href},Lg={},n5=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(o=>{if(o=t5(o,r),o in Lg)return;Lg[o]=!0;const i=o.endsWith(".css"),a=i?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${o}"]${a}`))return;const s=document.createElement("link");if(s.rel=i?"stylesheet":e5,i||(s.as="script",s.crossOrigin=""),s.href=o,document.head.appendChild(s),i)return new Promise((l,u)=>{s.addEventListener("load",l),s.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${o}`)))})})).then(()=>t())},r5=e=>{e&&e instanceof Function&&n5(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:o,getTTFB:i})=>{t(e),n(e),r(e),o(e),i(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function o5(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}nr.render(g(j.exports.StrictMode,{children:g(ZN,{})}),document.getElementById("root"));o5();r5(); diff --git a/docs/articles/demo-app/assets/index.55c00764.js b/docs/articles/demo-app/assets/index.55c00764.js deleted file mode 100644 index 7dda2eb10..000000000 --- a/docs/articles/demo-app/assets/index.55c00764.js +++ /dev/null @@ -1,145 +0,0 @@ -var bS=Object.defineProperty,ES=Object.defineProperties;var CS=Object.getOwnPropertyDescriptors;var fs=Object.getOwnPropertySymbols;var Sh=Object.prototype.hasOwnProperty,bh=Object.prototype.propertyIsEnumerable;var wh=(e,t,n)=>t in e?bS(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,F=(e,t)=>{for(var n in t||(t={}))Sh.call(t,n)&&wh(e,n,t[n]);if(fs)for(var n of fs(t))bh.call(t,n)&&wh(e,n,t[n]);return e},$=(e,t)=>ES(e,CS(t));var $t=(e,t)=>{var n={};for(var r in e)Sh.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&fs)for(var r of fs(e))t.indexOf(r)<0&&bh.call(e,r)&&(n[r]=e[r]);return n};var Eh=(e,t,n)=>new Promise((r,o)=>{var i=l=>{try{s(n.next(l))}catch(u){o(u)}},a=l=>{try{s(n.throw(l))}catch(u){o(u)}},s=l=>l.done?r(l.value):Promise.resolve(l.value).then(i,a);s((n=n.apply(e,t)).next())});const AS=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const o of document.querySelectorAll('link[rel="modulepreload"]'))r(o);new MutationObserver(o=>{for(const i of o)if(i.type==="childList")for(const a of i.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(o){const i={};return o.integrity&&(i.integrity=o.integrity),o.referrerpolicy&&(i.referrerPolicy=o.referrerpolicy),o.crossorigin==="use-credentials"?i.credentials="include":o.crossorigin==="anonymous"?i.credentials="omit":i.credentials="same-origin",i}function r(o){if(o.ep)return;o.ep=!0;const i=n(o);fetch(o.href,i)}};AS();var Fg=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Ug(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function Bg(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var o=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,o.get?o:{enumerable:!0,get:function(){return e[r]}})}),n}var j={exports:{}},se={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var Ch=Object.getOwnPropertySymbols,xS=Object.prototype.hasOwnProperty,OS=Object.prototype.propertyIsEnumerable;function _S(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function PS(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(i){return t[i]});if(r.join("")!=="0123456789")return!1;var o={};return"abcdefghijklmnopqrst".split("").forEach(function(i){o[i]=i}),Object.keys(Object.assign({},o)).join("")==="abcdefghijklmnopqrst"}catch(i){return!1}}var jg=PS()?Object.assign:function(e,t){for(var n,r=_S(e),o,i=1;i=w},o=function(){},e.unstable_forceFrameRate=function(R){0>R||125>>1,ue=R[le];if(ue!==void 0&&0b(Fe,V))rt!==void 0&&0>b(rt,Fe)?(R[le]=rt,R[Ue]=V,le=Ue):(R[le]=Fe,R[ze]=V,le=ze);else if(rt!==void 0&&0>b(rt,V))R[le]=rt,R[Ue]=V,le=Ue;else break e}}return Y}return null}function b(R,Y){var V=R.sortIndex-Y.sortIndex;return V!==0?V:R.id-Y.id}var E=[],x=[],_=1,k=null,D=3,B=!1,q=!1,H=!1;function ce(R){for(var Y=C(x);Y!==null;){if(Y.callback===null)O(x);else if(Y.startTime<=R)O(x),Y.sortIndex=Y.expirationTime,T(E,Y);else break;Y=C(x)}}function he(R){if(H=!1,ce(R),!q)if(C(E)!==null)q=!0,t(ye);else{var Y=C(x);Y!==null&&n(he,Y.startTime-R)}}function ye(R,Y){q=!1,H&&(H=!1,r()),B=!0;var V=D;try{for(ce(Y),k=C(E);k!==null&&(!(k.expirationTime>Y)||R&&!e.unstable_shouldYield());){var le=k.callback;if(typeof le=="function"){k.callback=null,D=k.priorityLevel;var ue=le(k.expirationTime<=Y);Y=e.unstable_now(),typeof ue=="function"?k.callback=ue:k===C(E)&&O(E),ce(Y)}else O(E);k=C(E)}if(k!==null)var ze=!0;else{var Fe=C(x);Fe!==null&&n(he,Fe.startTime-Y),ze=!1}return ze}finally{k=null,D=V,B=!1}}var ne=o;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(R){R.callback=null},e.unstable_continueExecution=function(){q||B||(q=!0,t(ye))},e.unstable_getCurrentPriorityLevel=function(){return D},e.unstable_getFirstCallbackNode=function(){return C(E)},e.unstable_next=function(R){switch(D){case 1:case 2:case 3:var Y=3;break;default:Y=D}var V=D;D=Y;try{return R()}finally{D=V}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=ne,e.unstable_runWithPriority=function(R,Y){switch(R){case 1:case 2:case 3:case 4:case 5:break;default:R=3}var V=D;D=R;try{return Y()}finally{D=V}},e.unstable_scheduleCallback=function(R,Y,V){var le=e.unstable_now();switch(typeof V=="object"&&V!==null?(V=V.delay,V=typeof V=="number"&&0le?(R.sortIndex=V,T(x,R),C(E)===null&&R===C(x)&&(H?r():H=!0,n(he,V-le))):(R.sortIndex=ue,T(E,R),q||B||(q=!0,t(ye))),R},e.unstable_wrapCallback=function(R){var Y=D;return function(){var V=D;D=Y;try{return R.apply(this,arguments)}finally{D=V}}}})(ty);(function(e){e.exports=ty})(ey);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Xl=j.exports,xe=jg,je=ey.exports;function L(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function st(e,t,n,r,o,i,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=o,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=i,this.removeEmptyString=a}var Je={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){Je[e]=new st(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];Je[t]=new st(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){Je[e]=new st(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){Je[e]=new st(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){Je[e]=new st(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){Je[e]=new st(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){Je[e]=new st(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){Je[e]=new st(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){Je[e]=new st(e,5,!1,e.toLowerCase(),null,!1,!1)});var md=/[\-:]([a-z])/g;function vd(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!1,!1)});Je.xlinkHref=new st("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!0,!0)});function gd(e,t,n,r){var o=Je.hasOwnProperty(t)?Je[t]:null,i=o!==null?o.type===0:r?!1:!(!(2s||o[a]!==i[s])return` -`+o[a].replace(" at new "," at ");while(1<=a&&0<=s);break}}}finally{Vu=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Ii(e):""}function US(e){switch(e.tag){case 5:return Ii(e.type);case 16:return Ii("Lazy");case 13:return Ii("Suspense");case 19:return Ii("SuspenseList");case 0:case 2:case 15:return e=ps(e.type,!1),e;case 11:return e=ps(e.type.render,!1),e;case 22:return e=ps(e.type._render,!1),e;case 1:return e=ps(e.type,!0),e;default:return""}}function po(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case Bn:return"Fragment";case Or:return"Portal";case ji:return"Profiler";case yd:return"StrictMode";case Wi:return"Suspense";case tl:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case Sd:return(e.displayName||"Context")+".Consumer";case wd:return(e._context.displayName||"Context")+".Provider";case Kl:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case ql:return po(e.type);case Ed:return po(e._render);case bd:t=e._payload,e=e._init;try{return po(e(t))}catch(n){}}return null}function ir(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function oy(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function BS(e){var t=oy(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var o=n.get,i=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return o.call(this)},set:function(a){r=""+a,i.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function hs(e){e._valueTracker||(e._valueTracker=BS(e))}function iy(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=oy(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function nl(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function Gc(e,t){var n=t.checked;return xe({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function Th(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=ir(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function ay(e,t){t=t.checked,t!=null&&gd(e,"checked",t,!1)}function $c(e,t){ay(e,t);var n=ir(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Hc(e,t.type,n):t.hasOwnProperty("defaultValue")&&Hc(e,t.type,ir(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function Ih(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Hc(e,t,n){(t!=="number"||nl(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function jS(e){var t="";return Xl.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function Vc(e,t){return e=xe({children:void 0},t),(t=jS(t.children))&&(e.children=t),e}function ho(e,t,n,r){if(e=e.options,t){t={};for(var o=0;o=n.length))throw Error(L(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:ir(n)}}function sy(e,t){var n=ir(t.value),r=ir(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function Dh(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Qc={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function ly(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Xc(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?ly(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ms,uy=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,o){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,o)})}:e}(function(e,t){if(e.namespaceURI!==Qc.svg||"innerHTML"in e)e.innerHTML=t;else{for(ms=ms||document.createElement("div"),ms.innerHTML=""+t.valueOf().toString()+"",t=ms.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function la(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Yi={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},WS=["Webkit","ms","Moz","O"];Object.keys(Yi).forEach(function(e){WS.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Yi[t]=Yi[e]})});function cy(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Yi.hasOwnProperty(e)&&Yi[e]?(""+t).trim():t+"px"}function fy(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,o=cy(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,o):e[n]=o}}var YS=xe({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Kc(e,t){if(t){if(YS[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(L(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(L(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(L(61))}if(t.style!=null&&typeof t.style!="object")throw Error(L(62))}}function qc(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function xd(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Zc=null,mo=null,vo=null;function Rh(e){if(e=Ra(e)){if(typeof Zc!="function")throw Error(L(280));var t=e.stateNode;t&&(t=ou(t),Zc(e.stateNode,e.type,t))}}function dy(e){mo?vo?vo.push(e):vo=[e]:mo=e}function py(){if(mo){var e=mo,t=vo;if(vo=mo=null,Rh(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function eu(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-ar(t),e[t]=n}var ar=Math.clz32?Math.clz32:ob,nb=Math.log,rb=Math.LN2;function ob(e){return e===0?32:31-(nb(e)/rb|0)|0}var ib=je.unstable_UserBlockingPriority,ab=je.unstable_runWithPriority,Ls=!0;function sb(e,t,n,r){_r||_d();var o=Nd,i=_r;_r=!0;try{hy(o,e,t,n,r)}finally{(_r=i)||Pd()}}function lb(e,t,n,r){ab(ib,Nd.bind(null,e,t,n,r))}function Nd(e,t,n,r){if(Ls){var o;if((o=(t&4)===0)&&0=Gi),Gh=String.fromCharCode(32),$h=!1;function Iy(e,t){switch(e){case"keyup":return Ib.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function Ny(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var io=!1;function Db(e,t){switch(e){case"compositionend":return Ny(t);case"keypress":return t.which!==32?null:($h=!0,Gh);case"textInput":return e=t.data,e===Gh&&$h?null:e;default:return null}}function Rb(e,t){if(io)return e==="compositionend"||!Fd&&Iy(e,t)?(e=ky(),Ms=Rd=zn=null,io=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Qh(n)}}function My(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?My(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Kh(){for(var e=window,t=nl();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=nl(e.document)}return t}function of(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var Gb=In&&"documentMode"in document&&11>=document.documentMode,ao=null,af=null,Hi=null,sf=!1;function qh(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;sf||ao==null||ao!==nl(r)||(r=ao,"selectionStart"in r&&of(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),Hi&&ha(Hi,r)||(Hi=r,r=al(af,"onSelect"),0lo||(e.current=uf[lo],uf[lo]=null,lo--)}function Ne(e,t){lo++,uf[lo]=e.current,e.current=t}var sr={},nt=hr(sr),gt=hr(!1),Rr=sr;function ko(e,t){var n=e.type.contextTypes;if(!n)return sr;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var o={},i;for(i in n)o[i]=t[i];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=o),o}function yt(e){return e=e.childContextTypes,e!=null}function ul(){Se(gt),Se(nt)}function sm(e,t,n){if(nt.current!==sr)throw Error(L(168));Ne(nt,t),Ne(gt,n)}function Gy(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var o in r)if(!(o in e))throw Error(L(108,po(t)||"Unknown",o));return xe({},n,r)}function Us(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||sr,Rr=nt.current,Ne(nt,e),Ne(gt,gt.current),!0}function lm(e,t,n){var r=e.stateNode;if(!r)throw Error(L(169));n?(e=Gy(e,t,Rr),r.__reactInternalMemoizedMergedChildContext=e,Se(gt),Se(nt),Ne(nt,e)):Se(gt),Ne(gt,n)}var Bd=null,Ir=null,Vb=je.unstable_runWithPriority,jd=je.unstable_scheduleCallback,cf=je.unstable_cancelCallback,Jb=je.unstable_shouldYield,um=je.unstable_requestPaint,ff=je.unstable_now,Qb=je.unstable_getCurrentPriorityLevel,iu=je.unstable_ImmediatePriority,$y=je.unstable_UserBlockingPriority,Hy=je.unstable_NormalPriority,Vy=je.unstable_LowPriority,Jy=je.unstable_IdlePriority,ac={},Xb=um!==void 0?um:function(){},En=null,Bs=null,sc=!1,cm=ff(),et=1e4>cm?ff:function(){return ff()-cm};function To(){switch(Qb()){case iu:return 99;case $y:return 98;case Hy:return 97;case Vy:return 96;case Jy:return 95;default:throw Error(L(332))}}function Qy(e){switch(e){case 99:return iu;case 98:return $y;case 97:return Hy;case 96:return Vy;case 95:return Jy;default:throw Error(L(332))}}function Lr(e,t){return e=Qy(e),Vb(e,t)}function va(e,t,n){return e=Qy(e),jd(e,t,n)}function Sn(){if(Bs!==null){var e=Bs;Bs=null,cf(e)}Xy()}function Xy(){if(!sc&&En!==null){sc=!0;var e=0;try{var t=En;Lr(99,function(){for(;eO?(b=C,C=null):b=C.sibling;var E=d(h,C,w[O],S);if(E===null){C===null&&(C=b);break}e&&C&&E.alternate===null&&t(h,C),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E,C=b}if(O===w.length)return n(h,C),A;if(C===null){for(;OO?(b=C,C=null):b=C.sibling;var x=d(h,C,E.value,S);if(x===null){C===null&&(C=b);break}e&&C&&x.alternate===null&&t(h,C),v=i(x,v,O),T===null?A=x:T.sibling=x,T=x,C=b}if(E.done)return n(h,C),A;if(C===null){for(;!E.done;O++,E=w.next())E=f(h,E.value,S),E!==null&&(v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return A}for(C=r(h,C);!E.done;O++,E=w.next())E=p(C,h,O,E.value,S),E!==null&&(e&&E.alternate!==null&&C.delete(E.key===null?O:E.key),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return e&&C.forEach(function(_){return t(h,_)}),A}return function(h,v,w,S){var A=typeof w=="object"&&w!==null&&w.type===Bn&&w.key===null;A&&(w=w.props.children);var T=typeof w=="object"&&w!==null;if(T)switch(w.$$typeof){case Ti:e:{for(T=w.key,A=v;A!==null;){if(A.key===T){switch(A.tag){case 7:if(w.type===Bn){n(h,A.sibling),v=o(A,w.props.children),v.return=h,h=v;break e}break;default:if(A.elementType===w.type){n(h,A.sibling),v=o(A,w.props),v.ref=ci(h,A,w),v.return=h,h=v;break e}}n(h,A);break}else t(h,A);A=A.sibling}w.type===Bn?(v=Eo(w.props.children,h.mode,S,w.key),v.return=h,h=v):(S=zs(w.type,w.key,w.props,null,h.mode,S),S.ref=ci(h,v,w),S.return=h,h=S)}return a(h);case Or:e:{for(A=w.key;v!==null;){if(v.key===A)if(v.tag===4&&v.stateNode.containerInfo===w.containerInfo&&v.stateNode.implementation===w.implementation){n(h,v.sibling),v=o(v,w.children||[]),v.return=h,h=v;break e}else{n(h,v);break}else t(h,v);v=v.sibling}v=pc(w,h.mode,S),v.return=h,h=v}return a(h)}if(typeof w=="string"||typeof w=="number")return w=""+w,v!==null&&v.tag===6?(n(h,v.sibling),v=o(v,w),v.return=h,h=v):(n(h,v),v=dc(w,h.mode,S),v.return=h,h=v),a(h);if(ys(w))return m(h,v,w,S);if(oi(w))return y(h,v,w,S);if(T&&ws(h,w),typeof w=="undefined"&&!A)switch(h.tag){case 1:case 22:case 0:case 11:case 15:throw Error(L(152,po(h.type)||"Component"))}return n(h,v)}}var hl=t0(!0),n0=t0(!1),La={},fn=hr(La),ya=hr(La),wa=hr(La);function kr(e){if(e===La)throw Error(L(174));return e}function pf(e,t){switch(Ne(wa,t),Ne(ya,e),Ne(fn,La),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Xc(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Xc(t,e)}Se(fn),Ne(fn,t)}function Io(){Se(fn),Se(ya),Se(wa)}function mm(e){kr(wa.current);var t=kr(fn.current),n=Xc(t,e.type);t!==n&&(Ne(ya,e),Ne(fn,n))}function Gd(e){ya.current===e&&(Se(fn),Se(ya))}var Ie=hr(0);function ml(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var xn=null,$n=null,dn=!1;function r0(e,t){var n=Lt(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function vm(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function hf(e){if(dn){var t=$n;if(t){var n=t;if(!vm(e,t)){if(t=go(n.nextSibling),!t||!vm(e,t)){e.flags=e.flags&-1025|2,dn=!1,xn=e;return}r0(xn,n)}xn=e,$n=go(t.firstChild)}else e.flags=e.flags&-1025|2,dn=!1,xn=e}}function gm(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;xn=e}function Ss(e){if(e!==xn)return!1;if(!dn)return gm(e),dn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!lf(t,e.memoizedProps))for(t=$n;t;)r0(e,t),t=go(t.nextSibling);if(gm(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(L(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){$n=go(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}$n=null}}else $n=xn?go(e.stateNode.nextSibling):null;return!0}function lc(){$n=xn=null,dn=!1}var wo=[];function $d(){for(var e=0;ei))throw Error(L(301));i+=1,He=Ke=null,t.updateQueue=null,Vi.current=tE,e=n(r,o)}while(Ji)}if(Vi.current=Sl,t=Ke!==null&&Ke.next!==null,Sa=0,He=Ke=De=null,vl=!1,t)throw Error(L(300));return e}function Tr(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return He===null?De.memoizedState=He=e:He=He.next=e,He}function Gr(){if(Ke===null){var e=De.alternate;e=e!==null?e.memoizedState:null}else e=Ke.next;var t=He===null?De.memoizedState:He.next;if(t!==null)He=t,Ke=e;else{if(e===null)throw Error(L(310));Ke=e,e={memoizedState:Ke.memoizedState,baseState:Ke.baseState,baseQueue:Ke.baseQueue,queue:Ke.queue,next:null},He===null?De.memoizedState=He=e:He=He.next=e}return He}function ln(e,t){return typeof t=="function"?t(e):t}function fi(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=Ke,o=r.baseQueue,i=n.pending;if(i!==null){if(o!==null){var a=o.next;o.next=i.next,i.next=a}r.baseQueue=o=i,n.pending=null}if(o!==null){o=o.next,r=r.baseState;var s=a=i=null,l=o;do{var u=l.lane;if((Sa&u)===u)s!==null&&(s=s.next={lane:0,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null}),r=l.eagerReducer===e?l.eagerState:e(r,l.action);else{var c={lane:u,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null};s===null?(a=s=c,i=r):s=s.next=c,De.lanes|=u,Ma|=u}l=l.next}while(l!==null&&l!==o);s===null?i=r:s.next=a,Rt(r,t.memoizedState)||(Zt=!0),t.memoizedState=r,t.baseState=i,t.baseQueue=s,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function di(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=n.dispatch,o=n.pending,i=t.memoizedState;if(o!==null){n.pending=null;var a=o=o.next;do i=e(i,a.action),a=a.next;while(a!==o);Rt(i,t.memoizedState)||(Zt=!0),t.memoizedState=i,t.baseQueue===null&&(t.baseState=i),n.lastRenderedState=i}return[i,r]}function ym(e,t,n){var r=t._getVersion;r=r(t._source);var o=t._workInProgressVersionPrimary;if(o!==null?e=o===r:(e=e.mutableReadLanes,(e=(Sa&e)===e)&&(t._workInProgressVersionPrimary=r,wo.push(t))),e)return n(t._source);throw wo.push(t),Error(L(350))}function o0(e,t,n,r){var o=at;if(o===null)throw Error(L(349));var i=t._getVersion,a=i(t._source),s=Vi.current,l=s.useState(function(){return ym(o,t,n)}),u=l[1],c=l[0];l=He;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,m=f.source;f=f.subscribe;var y=De;return e.memoizedState={refs:d,source:t,subscribe:r},s.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var h=i(t._source);if(!Rt(a,h)){h=n(t._source),Rt(c,h)||(u(h),h=Zn(y),o.mutableReadLanes|=h&o.pendingLanes),h=o.mutableReadLanes,o.entangledLanes|=h;for(var v=o.entanglements,w=h;0n?98:n,function(){e(!0)}),Lr(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[Gn]=t,e[ll]=r,p0(e,t,!1,!1),t.stateNode=e,a=qc(n,r),n){case"dialog":we("cancel",e),we("close",e),o=r;break;case"iframe":case"object":case"embed":we("load",e),o=r;break;case"video":case"audio":for(o=0;oAf&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432)}else{if(!i)if(e=ml(a),e!==null){if(t.flags|=64,i=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),hi(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!dn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*et()-r.renderingStartTime>Af&&n!==1073741824&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=et(),n.sibling=null,t=Ie.current,Ne(Ie,i?t&1|2:t&1),n):null;case 23:case 24:return tp(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(L(156,t.tag))}function oE(e){switch(e.tag){case 1:yt(e.type)&&ul();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(Io(),Se(gt),Se(nt),$d(),t=e.flags,(t&64)!==0)throw Error(L(285));return e.flags=t&-4097|64,e;case 5:return Gd(e),null;case 13:return Se(Ie),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return Se(Ie),null;case 4:return Io(),null;case 10:return Yd(e),null;case 23:case 24:return tp(),null;default:return null}}function Kd(e,t){try{var n="",r=t;do n+=US(r),r=r.return;while(r);var o=n}catch(i){o=` -Error generating stack: `+i.message+` -`+i.stack}return{value:e,source:t,stack:o}}function wf(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var iE=typeof WeakMap=="function"?WeakMap:Map;function v0(e,t,n){n=Kn(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){El||(El=!0,xf=r),wf(e,t)},n}function g0(e,t,n){n=Kn(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var o=t.value;n.payload=function(){return wf(e,t),r(o)}}var i=e.stateNode;return i!==null&&typeof i.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(un===null?un=new Set([this]):un.add(this),wf(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var aE=typeof WeakSet=="function"?WeakSet:Set;function Im(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){tr(e,n)}else t.current=null}function sE(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Qt(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ud(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(L(163))}function lE(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var o=e;r=o.next,o=o.tag,(o&4)!==0&&(o&1)!==0&&(O0(n,e),vE(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Qt(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&dm(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}dm(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&Yy(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&by(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(L(163))}function Nm(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var o=n.memoizedProps.style;o=o!=null&&o.hasOwnProperty("display")?o.display:null,r.style.display=cy("display",o)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function Dm(e,t){if(Ir&&typeof Ir.onCommitFiberUnmount=="function")try{Ir.onCommitFiberUnmount(Bd,t)}catch(i){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,o=r.destroy;if(r=r.tag,o!==void 0)if((r&4)!==0)O0(t,n);else{r=t;try{o()}catch(i){tr(r,i)}}n=n.next}while(n!==e)}break;case 1:if(Im(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(i){tr(t,i)}break;case 5:Im(t);break;case 4:y0(e,t)}}function Rm(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function Lm(e){return e.tag===5||e.tag===3||e.tag===4}function Mm(e){e:{for(var t=e.return;t!==null;){if(Lm(t))break e;t=t.return}throw Error(L(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(L(161))}n.flags&16&&(la(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||Lm(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Sf(e,n,t):bf(e,n,t)}function Sf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=sl));else if(r!==4&&(e=e.child,e!==null))for(Sf(e,t,n),e=e.sibling;e!==null;)Sf(e,t,n),e=e.sibling}function bf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(bf(e,t,n),e=e.sibling;e!==null;)bf(e,t,n),e=e.sibling}function y0(e,t){for(var n=t,r=!1,o,i;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(L(160));switch(o=r.stateNode,r.tag){case 5:i=!1;break e;case 3:o=o.containerInfo,i=!0;break e;case 4:o=o.containerInfo,i=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,s=n,l=s;;)if(Dm(a,l),l.child!==null&&l.tag!==4)l.child.return=l,l=l.child;else{if(l===s)break e;for(;l.sibling===null;){if(l.return===null||l.return===s)break e;l=l.return}l.sibling.return=l.return,l=l.sibling}i?(a=o,s=n.stateNode,a.nodeType===8?a.parentNode.removeChild(s):a.removeChild(s)):o.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){o=n.stateNode.containerInfo,i=!0,n.child.return=n,n=n.child;continue}}else if(Dm(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function fc(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var o=e!==null?e.memoizedProps:r;e=t.type;var i=t.updateQueue;if(t.updateQueue=null,i!==null){for(n[ll]=r,e==="input"&&r.type==="radio"&&r.name!=null&&ay(n,r),qc(e,o),t=qc(e,r),o=0;oo&&(o=a),n&=~i}if(n=o,n=et()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*cE(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}Ve!==5&&(Ve=2),l=Kd(l,s),d=a;do{switch(d.tag){case 3:i=l,d.flags|=4096,t&=-t,d.lanes|=t;var T=v0(d,i,t);fm(d,T);break e;case 1:i=l;var C=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof C.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(un===null||!un.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var b=g0(d,i,t);fm(d,b);break e}}d=d.return}while(d!==null)}x0(n)}catch(E){t=E,Le===n&&n!==null&&(Le=n=n.return);continue}break}while(1)}function C0(){var e=bl.current;return bl.current=Sl,e===null?Sl:e}function Ri(e,t){var n=X;X|=16;var r=C0();at===e&&tt===t||bo(e,t);do try{dE();break}catch(o){E0(e,o)}while(1);if(Wd(),X=n,bl.current=r,Le!==null)throw Error(L(261));return at=null,tt=0,Ve}function dE(){for(;Le!==null;)A0(Le)}function pE(){for(;Le!==null&&!Jb();)A0(Le)}function A0(e){var t=_0(e.alternate,e,Mr);e.memoizedProps=e.pendingProps,t===null?x0(e):Le=t,qd.current=null}function x0(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=rE(n,t,Mr),n!==null){Le=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(Mr&1073741824)!==0||(n.mode&4)===0){for(var r=0,o=n.child;o!==null;)r|=o.lanes|o.childLanes,o=o.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(s=a,a=T,T=s),s=Xh(w,T),i=Xh(w,a),s&&i&&(A.rangeCount!==1||A.anchorNode!==s.node||A.anchorOffset!==s.offset||A.focusNode!==i.node||A.focusOffset!==i.offset)&&(S=S.createRange(),S.setStart(s.node,s.offset),A.removeAllRanges(),T>a?(A.addRange(S),A.extend(i.node,i.offset)):(S.setEnd(i.node,i.offset),A.addRange(S)))))),S=[],A=w;A=A.parentNode;)A.nodeType===1&&S.push({element:A,left:A.scrollLeft,top:A.scrollTop});for(typeof w.focus=="function"&&w.focus(),w=0;wet()-ep?bo(e,0):Zd|=n),jt(e,t)}function wE(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=To()===99?1:2:(An===0&&(An=Qo),t=eo(62914560&~An),t===0&&(t=4194304))),n=Ot(),e=lu(e,t),e!==null&&(eu(e,t,n),jt(e,n))}var _0;_0=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||gt.current)Zt=!0;else if((n&r)!==0)Zt=(e.flags&16384)!==0;else{switch(Zt=!1,t.tag){case 3:Am(t),lc();break;case 5:mm(t);break;case 1:yt(t.type)&&Us(t);break;case 4:pf(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var o=t.type._context;Ne(cl,o._currentValue),o._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?xm(e,t,n):(Ne(Ie,Ie.current&1),t=On(e,t,n),t!==null?t.sibling:null);Ne(Ie,Ie.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return Tm(e,t,n);t.flags|=64}if(o=t.memoizedState,o!==null&&(o.rendering=null,o.tail=null,o.lastEffect=null),Ne(Ie,Ie.current),r)break;return null;case 23:case 24:return t.lanes=0,uc(e,t,n)}return On(e,t,n)}else Zt=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=ko(t,nt.current),yo(t,n),o=Vd(null,t,r,e,o,n),t.flags|=1,typeof o=="object"&&o!==null&&typeof o.render=="function"&&o.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,yt(r)){var i=!0;Us(t)}else i=!1;t.memoizedState=o.state!==null&&o.state!==void 0?o.state:null,zd(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&pl(t,r,a,e),o.updater=au,t.stateNode=o,o._reactInternals=t,df(t,r,e,n),t=gf(null,t,r,!0,i,n)}else t.tag=0,ht(null,t,o,n),t=t.child;return t;case 16:o=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=o._init,o=i(o._payload),t.type=o,i=t.tag=bE(o),e=Qt(o,e),i){case 0:t=vf(null,t,o,e,n);break e;case 1:t=Cm(null,t,o,e,n);break e;case 11:t=bm(null,t,o,e,n);break e;case 14:t=Em(null,t,o,Qt(o.type,e),r,n);break e}throw Error(L(306,o,""))}return t;case 0:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),vf(e,t,r,o,n);case 1:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),Cm(e,t,r,o,n);case 3:if(Am(t),r=t.updateQueue,e===null||r===null)throw Error(L(282));if(r=t.pendingProps,o=t.memoizedState,o=o!==null?o.element:null,qy(e,t),ga(t,r,null,n),r=t.memoizedState.element,r===o)lc(),t=On(e,t,n);else{if(o=t.stateNode,(i=o.hydrate)&&($n=go(t.stateNode.containerInfo.firstChild),xn=t,i=dn=!0),i){if(e=o.mutableSourceEagerHydrationData,e!=null)for(o=0;o1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:cp(e)?2:fp(e)?3:0}function Co(e,t){return qo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function cC(e,t){return qo(e)===2?e.get(t):e[t]}function H0(e,t,n){var r=qo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function V0(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function cp(e){return vC&&e instanceof Map}function fp(e){return gC&&e instanceof Set}function Cr(e){return e.o||e.t}function dp(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Q0(e);delete t[Ce];for(var n=Ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=fC),Object.freeze(e),t&&Fr(e,function(n,r){return pp(r,!0)},!0)),e}function fC(){Kt(2)}function hp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function Pn(e){var t=Rf[e];return t||Kt(18,e),t}function dC(e,t){Rf[e]||(Rf[e]=t)}function If(){return ba}function mc(e,t){t&&(Pn("Patches"),e.u=[],e.s=[],e.v=t)}function Al(e){Nf(e),e.p.forEach(pC),e.p=null}function Nf(e){e===ba&&(ba=e.l)}function Ym(e){return ba={p:[],l:ba,h:e,m:!0,_:0}}function pC(e){var t=e[Ce];t.i===0||t.i===1?t.j():t.O=!0}function vc(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||Pn("ES5").S(t,e,r),r?(n[Ce].P&&(Al(t),Kt(4)),dr(e)&&(e=xl(t,e),t.l||Ol(t,e)),t.u&&Pn("Patches").M(n[Ce],e,t.u,t.s)):e=xl(t,n,[]),Al(t),t.u&&t.v(t.u,t.s),e!==J0?e:void 0}function xl(e,t,n){if(hp(t))return t;var r=t[Ce];if(!r)return Fr(t,function(i,a){return zm(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Ol(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=dp(r.k):r.o;Fr(r.i===3?new Set(o):o,function(i,a){return zm(e,r,o,i,a,n)}),Ol(e,o,!1),n&&e.u&&Pn("Patches").R(r,n,e.u,e.s)}return r.o}function zm(e,t,n,r,o,i){if(fr(o)){var a=xl(e,o,i&&t&&t.i!==3&&!Co(t.D,r)?i.concat(r):void 0);if(H0(n,r,a),!fr(a))return;e.m=!1}if(dr(o)&&!hp(o)){if(!e.h.F&&e._<1)return;xl(e,o),t&&t.A.l||Ol(e,o)}}function Ol(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&pp(t,n)}function gc(e,t){var n=e[Ce];return(n?Cr(n):e)[t]}function Gm(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function jn(e){e.P||(e.P=!0,e.l&&jn(e.l))}function yc(e){e.o||(e.o=dp(e.t))}function Df(e,t,n){var r=cp(t)?Pn("MapSet").N(t,n):fp(t)?Pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:If(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=xo;a&&(l=[s],u=Gs);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):Pn("ES5").J(t,n);return(n?n.A:If()).p.push(r),r}function hC(e){return fr(e)||Kt(22,e),function t(n){if(!dr(n))return n;var r,o=n[Ce],i=qo(n);if(o){if(!o.P&&(o.i<4||!Pn("ES5").K(o)))return o.t;o.I=!0,r=$m(n,i),o.I=!1}else r=$m(n,i);return Fr(r,function(a,s){o&&cC(o.t,a)===s||H0(r,a,t(s))}),i===3?new Set(r):r}(e)}function $m(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return dp(e)}function mC(){function e(i,a){var s=o[i];return s?s.enumerable=a:o[i]=s={configurable:!0,enumerable:a,get:function(){var l=this[Ce];return xo.get(l,i)},set:function(l){var u=this[Ce];xo.set(u,i,l)}},s}function t(i){for(var a=i.length-1;a>=0;a--){var s=i[a][Ce];if(!s.P)switch(s.i){case 5:r(s)&&jn(s);break;case 4:n(s)&&jn(s)}}}function n(i){for(var a=i.t,s=i.k,l=Ao(s),u=l.length-1;u>=0;u--){var c=l[u];if(c!==Ce){var f=a[c];if(f===void 0&&!Co(a,c))return!0;var d=s[c],p=d&&d[Ce];if(p?p.t!==f:!V0(d,f))return!0}}var m=!!a[Ce];return l.length!==Ao(a).length+(m?0:1)}function r(i){var a=i.k;if(a.length!==i.t.length)return!0;var s=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!s||s.get)}var o={};dC("ES5",{J:function(i,a){var s=Array.isArray(i),l=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?y-1:0),v=1;v1?u-1:0),f=1;f=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=Pn("Patches").$;return fr(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),_t=new wC,SC=_t.produce;_t.produceWithPatches.bind(_t);_t.setAutoFreeze.bind(_t);_t.setUseProxies.bind(_t);_t.applyPatches.bind(_t);_t.createDraft.bind(_t);_t.finishDraft.bind(_t);const $s=SC;function bC(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Qm(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Xm(e){for(var t=1;t0&&i[i.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!i||u[1]>i[0]&&u[1]0)for(var S=p.getState(),A=Array.from(n.values()),T=0,C=A;T!1}}),iA=()=>{const e=vr();return I.useCallback(()=>{e(aA())},[e])},{DISCONNECTED_FROM_SERVER:aA}=s1.actions,sA=s1.reducer;function Xa(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(i)),o=Object.keys(t).filter(i=>!n.includes(i));if(!Xa(r,o))return!1;for(let i of r)if(e[i]!==t[i])return!1;return!0}function l1(e,t,n){return n===0?!0:Xa(e.slice(0,n),t.slice(0,n))}function uA(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:l1(e,t,n)}const u1=vp({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:c1,RESET_SELECTION:aN,STEP_BACK_SELECTION:cA}=u1.actions,fA=u1.reducer,dA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function pA(e){const t=vr();return j.exports.useCallback(()=>{e!==null&&t(bw({path:e}))},[t,e])}const hA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",mA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",vA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",Mf="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",f1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",d1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",gA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",yA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",wA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",SA="_icon_1467k_1",bA={icon:SA},EA={undo:wA,redo:gA,tour:yA,alignTop:vA,alignBottom:mA,alignCenter:hA,alignSpread:Mf,alignTextCenter:Mf,alignTextLeft:f1,alignTextRight:d1};function CA({id:e,alt:t=e,size:n}){return g("img",{src:EA[e],alt:t,className:bA.icon,style:n?{height:n}:{}})}var p1={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},rv=j.exports.createContext&&j.exports.createContext(p1),Ur=globalThis&&globalThis.__assign||function(){return Ur=Object.assign||function(e){for(var t,n=1,r=arguments.length;ng("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),Sp=e=>N("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),PA=e=>g("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),kA="_button_1dliw_1",TA="_regular_1dliw_26",IA="_icon_1dliw_34",NA="_transparent_1dliw_42",Sc={button:kA,regular:TA,delete:"_delete_1dliw_30",icon:IA,transparent:NA},wt=o=>{var i=o,{children:e,variant:t="regular",className:n}=i,r=$t(i,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(s=>Sc[s]).join(" "):Sc[t]:"";return g("button",$(F({className:Sc.button+" "+a+(n?" "+n:"")},r),{children:e}))},DA="_deleteButton_1en02_1",RA={deleteButton:DA};function m1({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=pA(e);return N(wt,{className:RA.deleteButton,onClick:o=>{o.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[g(Sp,{}),t?null:"Delete Element"]})}function v1(){const e=vr(),t=Ja(r=>r.selectedPath),n=j.exports.useCallback(r=>{e(c1({path:r}))},[e]);return[t,n]}const bp=I.createContext([null,e=>{}]),LA=({children:e})=>{const t=I.useState(null);return g(bp.Provider,{value:t,children:e})};function MA(){return I.useContext(bp)}function g1({ref:e,nodeInfo:t,immovable:n=!1}){const r=I.useRef(!1),[,o]=I.useContext(bp),i=I.useCallback(()=>{r.current===!1||n||(o(null),r.current=!1,document.body.removeEventListener("dragover",ov),document.body.removeEventListener("drop",i))},[n,o]),a=I.useCallback(s=>{s.stopPropagation(),o(t),r.current=!0,document.body.addEventListener("dragover",ov),document.body.addEventListener("drop",i)},[i,t,o]);I.useEffect(()=>{var l;if(((l=t.currentPath)==null?void 0:l.length)===0||n)return;const s=e.current;if(!!s)return s.setAttribute("draggable","true"),s.addEventListener("dragstart",a),s.addEventListener("dragend",i),()=>{s.removeEventListener("dragstart",a),s.removeEventListener("dragend",i)}},[i,n,t.currentPath,a,e])}function ov(e){e.preventDefault()}const FA="_leaf_1yzht_1",UA="_selectedOverlay_1yzht_5",BA="_container_1yzht_15",iv={leaf:FA,selectedOverlay:UA,container:BA};function jA({ref:e,path:t}){I.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const Ep=r=>{var o=r,{path:e=[],canMove:t=!0}=o,n=$t(o,["path","canMove"]);const i=I.useRef(null),{uiName:a,uiArguments:s,uiChildren:l}=n,[u,c]=v1(),f=u?Xa(e,u):!1,d=en[a],p=y=>{y.stopPropagation(),c(e)};if(g1({ref:i,nodeInfo:{node:n,currentPath:e},immovable:!t}),jA({ref:i,path:e}),d.acceptsChildren===!0){const y=d.UiComponent;return g(y,{uiArguments:s,uiChildren:l!=null?l:[],compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})}const m=d.UiComponent;return g(m,{uiArguments:s,compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})},Cp=I.forwardRef((o,r)=>{var i=o,{className:e="",children:t}=i,n=$t(i,["className","children"]);const a=e+" card";return g("div",$(F({ref:r,className:a},n),{children:t}))}),WA=I.forwardRef((r,n)=>{var o=r,{className:e=""}=o,t=$t(o,["className"]);const i=e+" card-header";return g("div",F({ref:n,className:i},t))}),YA="_container_rm196_1",zA="_withTitle_rm196_13",GA="_panelTitle_rm196_22",$A="_contentHolder_rm196_27",HA="_dropWatcher_rm196_67",VA="_lastDropWatcher_rm196_75",JA="_firstDropWatcher_rm196_78",QA="_middleDropWatcher_rm196_89",XA="_onlyDropWatcher_rm196_93",KA="_hoveringOverSwap_rm196_98",qA="_availableToSwap_rm196_99",ZA="_pulse_rm196_1",ex="_emptyGridCard_rm196_143",tx="_emptyMessage_rm196_160",xt={container:YA,withTitle:zA,panelTitle:GA,contentHolder:$A,dropWatcher:HA,lastDropWatcher:VA,firstDropWatcher:JA,middleDropWatcher:QA,onlyDropWatcher:XA,hoveringOverSwap:KA,availableToSwap:qA,pulse:ZA,emptyGridCard:ex,emptyMessage:tx};function qt(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Ap(e)?2:xp(e)?3:0}function Ff(e,t){return Zo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function nx(e,t){return Zo(e)===2?e.get(t):e[t]}function y1(e,t,n){var r=Zo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function rx(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Ap(e){return sx&&e instanceof Map}function xp(e){return lx&&e instanceof Set}function Ar(e){return e.o||e.t}function Op(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=cx(e);delete t[Pt];for(var n=Tp(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=ox),Object.freeze(e),t&&Aa(e,function(n,r){return _p(r,!0)},!0)),e}function ox(){qt(2)}function Pp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function pn(e){var t=fx[e];return t||qt(18,e),t}function av(){return xa}function bc(e,t){t&&(pn("Patches"),e.u=[],e.s=[],e.v=t)}function Tl(e){Uf(e),e.p.forEach(ix),e.p=null}function Uf(e){e===xa&&(xa=e.l)}function sv(e){return xa={p:[],l:xa,h:e,m:!0,_:0}}function ix(e){var t=e[Pt];t.i===0||t.i===1?t.j():t.O=!0}function Ec(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||pn("ES5").S(t,e,r),r?(n[Pt].P&&(Tl(t),qt(4)),Br(e)&&(e=Il(t,e),t.l||Nl(t,e)),t.u&&pn("Patches").M(n[Pt].t,e,t.u,t.s)):e=Il(t,n,[]),Tl(t),t.u&&t.v(t.u,t.s),e!==w1?e:void 0}function Il(e,t,n){if(Pp(t))return t;var r=t[Pt];if(!r)return Aa(t,function(i,a){return lv(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Nl(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=Op(r.k):r.o;Aa(r.i===3?new Set(o):o,function(i,a){return lv(e,r,o,i,a,n)}),Nl(e,o,!1),n&&e.u&&pn("Patches").R(r,n,e.u,e.s)}return r.o}function lv(e,t,n,r,o,i){if(Do(o)){var a=Il(e,o,i&&t&&t.i!==3&&!Ff(t.D,r)?i.concat(r):void 0);if(y1(n,r,a),!Do(a))return;e.m=!1}if(Br(o)&&!Pp(o)){if(!e.h.F&&e._<1)return;Il(e,o),t&&t.A.l||Nl(e,o)}}function Nl(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&_p(t,n)}function Cc(e,t){var n=e[Pt];return(n?Ar(n):e)[t]}function uv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Bf(e){e.P||(e.P=!0,e.l&&Bf(e.l))}function Ac(e){e.o||(e.o=Op(e.t))}function jf(e,t,n){var r=Ap(t)?pn("MapSet").N(t,n):xp(t)?pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:av(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=Wf;a&&(l=[s],u=Li);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):pn("ES5").J(t,n);return(n?n.A:av()).p.push(r),r}function ax(e){return Do(e)||qt(22,e),function t(n){if(!Br(n))return n;var r,o=n[Pt],i=Zo(n);if(o){if(!o.P&&(o.i<4||!pn("ES5").K(o)))return o.t;o.I=!0,r=cv(n,i),o.I=!1}else r=cv(n,i);return Aa(r,function(a,s){o&&nx(o.t,a)===s||y1(r,a,t(s))}),i===3?new Set(r):r}(e)}function cv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Op(e)}var fv,xa,kp=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",sx=typeof Map!="undefined",lx=typeof Set!="undefined",dv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",w1=kp?Symbol.for("immer-nothing"):((fv={})["immer-nothing"]=!0,fv),pv=kp?Symbol.for("immer-draftable"):"__$immer_draftable",Pt=kp?Symbol.for("immer-state"):"__$immer_state",ux=""+Object.prototype.constructor,Tp=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,cx=Object.getOwnPropertyDescriptors||function(e){var t={};return Tp(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},fx={},Wf={get:function(e,t){if(t===Pt)return e;var n=Ar(e);if(!Ff(n,t))return function(o,i,a){var s,l=uv(i,a);return l?"value"in l?l.value:(s=l.get)===null||s===void 0?void 0:s.call(o.k):void 0}(e,n,t);var r=n[t];return e.I||!Br(r)?r:r===Cc(e.t,t)?(Ac(e),e.o[t]=jf(e.A.h,r,e)):r},has:function(e,t){return t in Ar(e)},ownKeys:function(e){return Reflect.ownKeys(Ar(e))},set:function(e,t,n){var r=uv(Ar(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var o=Cc(Ar(e),t),i=o==null?void 0:o[Pt];if(i&&i.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(rx(n,o)&&(n!==void 0||Ff(e.t,t)))return!0;Ac(e),Bf(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Cc(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,Ac(e),Bf(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=Ar(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){qt(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){qt(12)}},Li={};Aa(Wf,function(e,t){Li[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Li.deleteProperty=function(e,t){return Li.set.call(this,e,t,void 0)},Li.set=function(e,t,n){return Wf.set.call(this,e[0],t,n,e[0])};var dx=function(){function e(n){var r=this;this.g=dv,this.F=!0,this.produce=function(o,i,a){if(typeof o=="function"&&typeof i!="function"){var s=i;i=o;var l=r;return function(y){var h=this;y===void 0&&(y=s);for(var v=arguments.length,w=Array(v>1?v-1:0),S=1;S1?c-1:0),d=1;d=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=pn("Patches").$;return Do(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),kt=new dx,px=kt.produce;kt.produceWithPatches.bind(kt);kt.setAutoFreeze.bind(kt);kt.setUseProxies.bind(kt);kt.applyPatches.bind(kt);kt.createDraft.bind(kt);kt.finishDraft.bind(kt);const ei=px,Dl=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+i*r)};function hv(e){let t=1/0,n=-1/0;for(let i of e)in&&(n=i);const r=n-t,o=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===o-1}}function S1(e,t){return[...new Array(t)].fill(e)}function hx(e,t){return e.filter(n=>!t.includes(n))}function Yf(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function Oa(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function mx(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const o=r[t];return r[t]=void 0,r=Oa(r,n,o),r.filter(i=>typeof i!="undefined")}function vx(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const o=e[r-1];return[...e].splice(0,r-1).join(t)+n+o}function Ip(e){return e.uiChildren!==void 0}function rr(e,t){let n=e,r;for(r of t){if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function b1(e,t){return l1(e,t,Math.min(e.length,t.length))}function Np(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const o=n-1;return Xa(e.slice(0,o),t.slice(0,o))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function E1(e,{path:t}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=gx(e,t);if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function gx(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const o=n.length===0?e:rr(e,n);if(!Ip(o))throw new Error("Somehow trying to enter a leaf node");return{parentNode:o,indexToNode:r}}function yx(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:o}){const i=rr(e,t);if(!en[i.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(i.uiChildren)||(i.uiChildren=[]);const a=r==="last"?i.uiChildren.length:r;if(o!==void 0){const s=[...t,a];if(b1(o,s))throw new Error("Invalid move request");if(Np(o,s)){const l=o[o.length-1];i.uiChildren=mx(i.uiChildren,l,a);return}E1(e,{path:o})}i.uiChildren=Oa(i.uiChildren,a,n)}function wx({fromPath:e,toPath:t}){if(e==null)return!0;if(b1(e,t))return!1;if(Np(e,t)){const n=e.length,r=e[n-1],o=t[n-1];if(r===o||r===o-1)return!1}return!0}const Sx="_canAcceptDrop_1oxcd_1",bx="_pulse_1oxcd_1",Ex="_hoveringOver_1oxcd_32",zf={canAcceptDrop:Sx,pulse:bx,hoveringOver:Ex};function Dp({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:o=zf.canAcceptDrop,hoveringOverClass:i=zf.hoveringOver}){const[a,s]=MA(),{addCanAcceptDropHighlight:l,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=Cx({watcherRef:e,canAcceptDropClass:o,hoveringOverClass:i}),d=a?t(a):!1,p=I.useCallback(h=>{h.preventDefault(),h.stopPropagation(),u(),r==null||r()},[u,r]),m=I.useCallback(h=>{h.preventDefault(),c()},[c]),y=I.useCallback(h=>{if(h.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),s(null)},[d,a,n,c,s]);I.useEffect(()=>{const h=e.current;if(!!h)return d&&(l(),h.addEventListener("dragenter",p),h.addEventListener("dragleave",m),h.addEventListener("dragover",p),h.addEventListener("drop",y)),()=>{f(),h.removeEventListener("dragenter",p),h.removeEventListener("dragleave",m),h.removeEventListener("dragover",p),h.removeEventListener("drop",y)}},[l,d,m,p,y,f,e])}function Cx({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=I.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),o=I.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),i=I.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=I.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:o,removeHoveredOverHighlight:i,removeAllHighlights:a}}function Ax({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Ew(),o=I.useCallback(({node:a,currentPath:s})=>mv(a)!==null&&wx({fromPath:s,toPath:[...n,t]}),[t,n]),i=I.useCallback(({node:a,currentPath:s})=>{const l=mv(a);if(!l)throw new Error("No node to place...");r({node:l,currentPath:s,parentPath:n,positionInChildren:t})},[t,n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i})}function mv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function xx(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function vv(e){return Et({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function gv(e){return Et({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function C1(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}var Ou=A1;function A1(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],o={}.toString.call(r).slice(8,-1);o=="Array"||o=="Object"?t[n]=A1(r):o=="Date"?t[n]=new Date(r.getTime()):o=="RegExp"?t[n]=RegExp(r.source,Ox(r)):t[n]=r}return t}function Ox(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Ka(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function _x(e,t={}){const n=new Set;for(let r of e)for(let o of r)t.ignore&&t.ignore.includes(o)||n.add(o);return[...n]}function Px(e,{index:t,arr:n,dir:r}){const o=Ou(e);switch(r){case"rows":return Oa(o,t,n);case"cols":return o.map((i,a)=>Oa(i,t,n[a]))}}function kx(e,{index:t,dir:n}){const r=Ou(e);switch(n){case"rows":return Yf(r,t);case"cols":return r.map((o,i)=>Yf(o,t))}}const vn=".";function Rp(e){const t=new Map;return Tx(e).forEach(({itemRows:n,itemCols:r},o)=>{if(o===vn)return;const i=hv(n),a=hv(r);t.set(o,{colStart:a.minVal,rowStart:i.minVal,colSpan:a.span+1,rowSpan:i.span+1,isValid:i.isSequence&&a.isSequence})}),t}function Tx(e){var o;const t=new Map,{numRows:n,numCols:r}=Ka(e);for(let i=0;i1,c=r>1,f=[];return(yv({colRange:l,rowIndex:e-1,layoutAreas:o})||u)&&f.push("up"),(yv({colRange:l,rowIndex:i+1,layoutAreas:o})||u)&&f.push("down"),(wv({rowRange:s,colIndex:n-1,layoutAreas:o})||c)&&f.push("left"),(wv({rowRange:s,colIndex:a+1,layoutAreas:o})||c)&&f.push("right"),f}function yv({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===vn)}function wv({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===vn)}const Nx="_marker_rkm38_1",Dx="_dragger_rkm38_30",Rx="_move_rkm38_50",Sv={marker:Nx,dragger:Dx,move:Rx};function _a({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function Lx(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=_a(e)),"colSpan"in t&&(t=_a(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function Mx({row:e,col:t}){return`row${e}-col${t}`}function Fx({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:o,colStart:i,colEnd:a}=_a(t),s=n.length,l=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:o,growExtent:1};u=r-1,c=1,f=o;break;case"left":if(i===1)return{shrinkExtent:a,growExtent:1};u=i-1,c=1,f=a;break;case"down":if(o===s)return{shrinkExtent:r,growExtent:s};u=o+1,c=s,f=r;break;case"right":if(a===l)return{shrinkExtent:i,growExtent:l};u=a+1,c=l,f=i;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[m,y]=d?[i,a]:[r,o],h=(S,A)=>{const[T,C]=d?[S,A]:[A,S];return n[T-1][C-1]!==vn},v=Dl(m,y),w=Dl(u,c);for(let S of w)for(let A of v)if(h(S,A))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function x1(e,t,n){const r=t=r&&e<=o}function Ux({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=Gf(t.getPropertyValue("gap")),i=Gf(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],s=Bx(t,e),l=s.length,u=[];for(let c=0;cx1(i,l,u));if(a===void 0)return;const s=Wx[n];return o[s]=a.index,o}const Wx={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function Yx({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const o=_a(t),i=I.useRef(null),a=I.useCallback(u=>{const c=e.current,f=i.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=jx({mousePos:u,dragState:f});d&&Ev(c,d)},[e]),s=I.useCallback(()=>{const u=e.current,c=i.current;if(!u||!c)return;const f=c.gridItemExtent;Lx(f,o)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),bv("on")},[o,a,r,e]);return I.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),m=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:y,growExtent:h}=Fx({dragDirection:u,gridLocation:t,layoutAreas:n});i.current={dragHandle:u,gridItemExtent:_a(t),tractExtents:Ux({dir:m,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:v})=>x1(v,y,h))},Ev(e.current,i.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",s,{once:!0}),bv("off")},[s,t,n,a,e])}function bv(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function Ev(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:o}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(o+1))}function zx({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const o=I.useRef(null),i=Yx({overlayRef:o,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=I.useMemo(()=>Ix({gridLocation:t,layoutAreas:n}),[t,n]),s=I.useMemo(()=>{let l=[];for(let u of a)l.push(g("div",{className:Sv.dragger+" "+u,onMouseDown:c=>{Gx(c),i(u)},children:$x[u]},u));return l},[a,i]);return I.useEffect(()=>{var l;(l=o.current)==null||l.style.setProperty("--grid-area",e)},[e]),g("div",{ref:o,className:Sv.marker+" grid-area-overlay",children:s})}function Gx(e){e.preventDefault(),e.stopPropagation()}const $x={up:g(gv,{}),down:g(gv,{}),left:g(vv,{}),right:g(vv,{})};function Hx({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=I.useRef(null);return Dp({watcherRef:r,onDrop:o=>{n($(F({},o),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),g("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function Vx(e,t){const{numRows:n,numCols:r}=Ka(e),o=[];for(let i=0;i{const i=r==="rows"?"cols":"rows",a=O1(o);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const s=Rp(o.areas);let l=S1(vn,a[i].length);s.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=Hf(u,r);if(f<=t&&d>t){const m=Hf(u,i);for(let y=m.itemStart-1;y1}function Kx(e,{index:t,dir:n}){let r=[];return e.forEach((o,i)=>{const{itemStart:a,itemEnd:s}=Hf(o,n);a===t&&a===s&&r.push(i)}),r}const qx="_ResizableGrid_i4cq9_1",Zx={ResizableGrid:qx,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function T1(e){var o,i;const t=((o=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:o[0])||"px",n=(i=e.match(/^[\d|\.]*/g))==null?void 0:i[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function Wn(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const e2="_container_jk9tt_8",t2="_label_jk9tt_26",n2="_mainInput_jk9tt_59",kn={container:e2,label:t2,mainInput:n2},I1=I.createContext(null);function $r(e){const t=I.useContext(I1);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const r2=({onChange:e,children:t})=>g(I1.Provider,{value:e,children:t});function o2({name:e,isDisabled:t,defaultValue:n}){const r=$r(),o=`Click to ${t?"set":"unset"} ${e} property`;return g("input",{"aria-label":o,type:"checkbox",checked:!t,title:o,onChange:i=>{r({name:e,value:i.target.checked?n:void 0})}})}function Lp({name:e,label:t,optional:n,isDisabled:r,defaultValue:o,mainInput:i,width_setting:a="full"}){return N("label",{className:kn.container,"data-disabled":r,"data-width-setting":a,children:[N("div",{className:kn.label,children:[n?g(o2,{name:e,isDisabled:r,defaultValue:o}):null,t!=null?t:e,":"]}),g("div",{className:kn.mainInput,children:i})]})}const i2="_numericInput_n1lnu_1",a2={numericInput:i2};function Mp({value:e,ariaLabel:t,onChange:n,min:r,max:o,disabled:i=!1}){var s;const a=I.useCallback((l=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+l*c;r&&(f=Math.max(f,r)),o&&(f=Math.min(f,o)),n(f)},[o,r,n,e]);return g("input",{className:a2.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:i,value:(s=e==null?void 0:e.toString())!=null?s:"",onChange:l=>n(Number(l.target.value)),min:r,onKeyDown:l=>{(l.key==="ArrowUp"||l.key==="ArrowDown")&&(l.preventDefault(),a(l.key==="ArrowUp"?1:-1,l.shiftKey))}})}function Hn({name:e,label:t,value:n,min:r=0,max:o,onChange:i,optional:a=!1,defaultValue:s=1,disabled:l=n===void 0}){const u=$r(i);return g(Lp,{name:e,label:t,optional:a,isDisabled:l,defaultValue:s,width_setting:"fit",mainInput:g(Mp,{ariaLabel:t!=null?t:e,disabled:l,value:n,onChange:c=>u({name:e,value:c}),min:r,max:o})})}var Fp=s2;function s2(e,t,n){var r=null,o=null,i=function(){r&&(clearTimeout(r),o=null,r=null)},a=function(){var l=o;i(),l&&l()},s=function(){if(!t)return e.apply(this,arguments);var l=this,u=arguments,c=n&&!r;if(i(),o=function(){e.apply(l,u)},r=setTimeout(function(){if(r=null,!c){var f=o;return o=null,f()}},t),c)return o()};return s.cancel=i,s.flush=a,s}var Av=function(t){return t.reduce(function(n,r){var o=r[0],i=r[1];return n[o]=i,n},{})},xv=typeof window!="undefined"&&window.document&&window.document.createElement?j.exports.useLayoutEffect:j.exports.useEffect,St="top",Wt="bottom",Yt="right",bt="left",Up="auto",qa=[St,Wt,Yt,bt],Ro="start",Pa="end",l2="clippingParents",N1="viewport",vi="popper",u2="reference",Ov=qa.reduce(function(e,t){return e.concat([t+"-"+Ro,t+"-"+Pa])},[]),D1=[].concat(qa,[Up]).reduce(function(e,t){return e.concat([t,t+"-"+Ro,t+"-"+Pa])},[]),c2="beforeRead",f2="read",d2="afterRead",p2="beforeMain",h2="main",m2="afterMain",v2="beforeWrite",g2="write",y2="afterWrite",w2=[c2,f2,d2,p2,h2,m2,v2,g2,y2];function gn(e){return e?(e.nodeName||"").toLowerCase():null}function nn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function Lo(e){var t=nn(e).Element;return e instanceof t||e instanceof Element}function Ut(e){var t=nn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function R1(e){if(typeof ShadowRoot=="undefined")return!1;var t=nn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function S2(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},o=t.attributes[n]||{},i=t.elements[n];!Ut(i)||!gn(i)||(Object.assign(i.style,r),Object.keys(o).forEach(function(a){var s=o[a];s===!1?i.removeAttribute(a):i.setAttribute(a,s===!0?"":s)}))})}function b2(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var o=t.elements[r],i=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),s=a.reduce(function(l,u){return l[u]="",l},{});!Ut(o)||!gn(o)||(Object.assign(o.style,s),Object.keys(i).forEach(function(l){o.removeAttribute(l)}))})}}const E2={name:"applyStyles",enabled:!0,phase:"write",fn:S2,effect:b2,requires:["computeStyles"]};function hn(e){return e.split("-")[0]}var Nr=Math.max,Rl=Math.min,Mo=Math.round;function Fo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,o=1;if(Ut(e)&&t){var i=e.offsetHeight,a=e.offsetWidth;a>0&&(r=Mo(n.width)/a||1),i>0&&(o=Mo(n.height)/i||1)}return{width:n.width/r,height:n.height/o,top:n.top/o,right:n.right/r,bottom:n.bottom/o,left:n.left/r,x:n.left/r,y:n.top/o}}function Bp(e){var t=Fo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function L1(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&R1(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function Nn(e){return nn(e).getComputedStyle(e)}function C2(e){return["table","td","th"].indexOf(gn(e))>=0}function gr(e){return((Lo(e)?e.ownerDocument:e.document)||window.document).documentElement}function _u(e){return gn(e)==="html"?e:e.assignedSlot||e.parentNode||(R1(e)?e.host:null)||gr(e)}function _v(e){return!Ut(e)||Nn(e).position==="fixed"?null:e.offsetParent}function A2(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&Ut(e)){var r=Nn(e);if(r.position==="fixed")return null}for(var o=_u(e);Ut(o)&&["html","body"].indexOf(gn(o))<0;){var i=Nn(o);if(i.transform!=="none"||i.perspective!=="none"||i.contain==="paint"||["transform","perspective"].indexOf(i.willChange)!==-1||t&&i.willChange==="filter"||t&&i.filter&&i.filter!=="none")return o;o=o.parentNode}return null}function Za(e){for(var t=nn(e),n=_v(e);n&&C2(n)&&Nn(n).position==="static";)n=_v(n);return n&&(gn(n)==="html"||gn(n)==="body"&&Nn(n).position==="static")?t:n||A2(e)||t}function jp(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function qi(e,t,n){return Nr(e,Rl(t,n))}function x2(e,t,n){var r=qi(e,t,n);return r>n?n:r}function M1(){return{top:0,right:0,bottom:0,left:0}}function F1(e){return Object.assign({},M1(),e)}function U1(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var O2=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,F1(typeof t!="number"?t:U1(t,qa))};function _2(e){var t,n=e.state,r=e.name,o=e.options,i=n.elements.arrow,a=n.modifiersData.popperOffsets,s=hn(n.placement),l=jp(s),u=[bt,Yt].indexOf(s)>=0,c=u?"height":"width";if(!(!i||!a)){var f=O2(o.padding,n),d=Bp(i),p=l==="y"?St:bt,m=l==="y"?Wt:Yt,y=n.rects.reference[c]+n.rects.reference[l]-a[l]-n.rects.popper[c],h=a[l]-n.rects.reference[l],v=Za(i),w=v?l==="y"?v.clientHeight||0:v.clientWidth||0:0,S=y/2-h/2,A=f[p],T=w-d[c]-f[m],C=w/2-d[c]/2+S,O=qi(A,C,T),b=l;n.modifiersData[r]=(t={},t[b]=O,t.centerOffset=O-C,t)}}function P2(e){var t=e.state,n=e.options,r=n.element,o=r===void 0?"[data-popper-arrow]":r;o!=null&&(typeof o=="string"&&(o=t.elements.popper.querySelector(o),!o)||!L1(t.elements.popper,o)||(t.elements.arrow=o))}const k2={name:"arrow",enabled:!0,phase:"main",fn:_2,effect:P2,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Uo(e){return e.split("-")[1]}var T2={top:"auto",right:"auto",bottom:"auto",left:"auto"};function I2(e){var t=e.x,n=e.y,r=window,o=r.devicePixelRatio||1;return{x:Mo(t*o)/o||0,y:Mo(n*o)/o||0}}function Pv(e){var t,n=e.popper,r=e.popperRect,o=e.placement,i=e.variation,a=e.offsets,s=e.position,l=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,m=a.y,y=m===void 0?0:m,h=typeof c=="function"?c({x:p,y}):{x:p,y};p=h.x,y=h.y;var v=a.hasOwnProperty("x"),w=a.hasOwnProperty("y"),S=bt,A=St,T=window;if(u){var C=Za(n),O="clientHeight",b="clientWidth";if(C===nn(n)&&(C=gr(n),Nn(C).position!=="static"&&s==="absolute"&&(O="scrollHeight",b="scrollWidth")),C=C,o===St||(o===bt||o===Yt)&&i===Pa){A=Wt;var E=f&&T.visualViewport?T.visualViewport.height:C[O];y-=E-r.height,y*=l?1:-1}if(o===bt||(o===St||o===Wt)&&i===Pa){S=Yt;var x=f&&T.visualViewport?T.visualViewport.width:C[b];p-=x-r.width,p*=l?1:-1}}var _=Object.assign({position:s},u&&T2),k=c===!0?I2({x:p,y}):{x:p,y};if(p=k.x,y=k.y,l){var D;return Object.assign({},_,(D={},D[A]=w?"0":"",D[S]=v?"0":"",D.transform=(T.devicePixelRatio||1)<=1?"translate("+p+"px, "+y+"px)":"translate3d("+p+"px, "+y+"px, 0)",D))}return Object.assign({},_,(t={},t[A]=w?y+"px":"",t[S]=v?p+"px":"",t.transform="",t))}function N2(e){var t=e.state,n=e.options,r=n.gpuAcceleration,o=r===void 0?!0:r,i=n.adaptive,a=i===void 0?!0:i,s=n.roundOffsets,l=s===void 0?!0:s,u={placement:hn(t.placement),variation:Uo(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:o,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,Pv(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:l})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,Pv(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:l})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const D2={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:N2,data:{}};var As={passive:!0};function R2(e){var t=e.state,n=e.instance,r=e.options,o=r.scroll,i=o===void 0?!0:o,a=r.resize,s=a===void 0?!0:a,l=nn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return i&&u.forEach(function(c){c.addEventListener("scroll",n.update,As)}),s&&l.addEventListener("resize",n.update,As),function(){i&&u.forEach(function(c){c.removeEventListener("scroll",n.update,As)}),s&&l.removeEventListener("resize",n.update,As)}}const L2={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:R2,data:{}};var M2={left:"right",right:"left",bottom:"top",top:"bottom"};function Hs(e){return e.replace(/left|right|bottom|top/g,function(t){return M2[t]})}var F2={start:"end",end:"start"};function kv(e){return e.replace(/start|end/g,function(t){return F2[t]})}function Wp(e){var t=nn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Yp(e){return Fo(gr(e)).left+Wp(e).scrollLeft}function U2(e){var t=nn(e),n=gr(e),r=t.visualViewport,o=n.clientWidth,i=n.clientHeight,a=0,s=0;return r&&(o=r.width,i=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,s=r.offsetTop)),{width:o,height:i,x:a+Yp(e),y:s}}function B2(e){var t,n=gr(e),r=Wp(e),o=(t=e.ownerDocument)==null?void 0:t.body,i=Nr(n.scrollWidth,n.clientWidth,o?o.scrollWidth:0,o?o.clientWidth:0),a=Nr(n.scrollHeight,n.clientHeight,o?o.scrollHeight:0,o?o.clientHeight:0),s=-r.scrollLeft+Yp(e),l=-r.scrollTop;return Nn(o||n).direction==="rtl"&&(s+=Nr(n.clientWidth,o?o.clientWidth:0)-i),{width:i,height:a,x:s,y:l}}function zp(e){var t=Nn(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+o+r)}function B1(e){return["html","body","#document"].indexOf(gn(e))>=0?e.ownerDocument.body:Ut(e)&&zp(e)?e:B1(_u(e))}function Zi(e,t){var n;t===void 0&&(t=[]);var r=B1(e),o=r===((n=e.ownerDocument)==null?void 0:n.body),i=nn(r),a=o?[i].concat(i.visualViewport||[],zp(r)?r:[]):r,s=t.concat(a);return o?s:s.concat(Zi(_u(a)))}function Vf(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function j2(e){var t=Fo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function Tv(e,t){return t===N1?Vf(U2(e)):Lo(t)?j2(t):Vf(B2(gr(e)))}function W2(e){var t=Zi(_u(e)),n=["absolute","fixed"].indexOf(Nn(e).position)>=0,r=n&&Ut(e)?Za(e):e;return Lo(r)?t.filter(function(o){return Lo(o)&&L1(o,r)&&gn(o)!=="body"}):[]}function Y2(e,t,n){var r=t==="clippingParents"?W2(e):[].concat(t),o=[].concat(r,[n]),i=o[0],a=o.reduce(function(s,l){var u=Tv(e,l);return s.top=Nr(u.top,s.top),s.right=Rl(u.right,s.right),s.bottom=Rl(u.bottom,s.bottom),s.left=Nr(u.left,s.left),s},Tv(e,i));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function j1(e){var t=e.reference,n=e.element,r=e.placement,o=r?hn(r):null,i=r?Uo(r):null,a=t.x+t.width/2-n.width/2,s=t.y+t.height/2-n.height/2,l;switch(o){case St:l={x:a,y:t.y-n.height};break;case Wt:l={x:a,y:t.y+t.height};break;case Yt:l={x:t.x+t.width,y:s};break;case bt:l={x:t.x-n.width,y:s};break;default:l={x:t.x,y:t.y}}var u=o?jp(o):null;if(u!=null){var c=u==="y"?"height":"width";switch(i){case Ro:l[u]=l[u]-(t[c]/2-n[c]/2);break;case Pa:l[u]=l[u]+(t[c]/2-n[c]/2);break}}return l}function ka(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=r===void 0?e.placement:r,i=n.boundary,a=i===void 0?l2:i,s=n.rootBoundary,l=s===void 0?N1:s,u=n.elementContext,c=u===void 0?vi:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,m=p===void 0?0:p,y=F1(typeof m!="number"?m:U1(m,qa)),h=c===vi?u2:vi,v=e.rects.popper,w=e.elements[d?h:c],S=Y2(Lo(w)?w:w.contextElement||gr(e.elements.popper),a,l),A=Fo(e.elements.reference),T=j1({reference:A,element:v,strategy:"absolute",placement:o}),C=Vf(Object.assign({},v,T)),O=c===vi?C:A,b={top:S.top-O.top+y.top,bottom:O.bottom-S.bottom+y.bottom,left:S.left-O.left+y.left,right:O.right-S.right+y.right},E=e.modifiersData.offset;if(c===vi&&E){var x=E[o];Object.keys(b).forEach(function(_){var k=[Yt,Wt].indexOf(_)>=0?1:-1,D=[St,Wt].indexOf(_)>=0?"y":"x";b[_]+=x[D]*k})}return b}function z2(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=n.boundary,i=n.rootBoundary,a=n.padding,s=n.flipVariations,l=n.allowedAutoPlacements,u=l===void 0?D1:l,c=Uo(r),f=c?s?Ov:Ov.filter(function(m){return Uo(m)===c}):qa,d=f.filter(function(m){return u.indexOf(m)>=0});d.length===0&&(d=f);var p=d.reduce(function(m,y){return m[y]=ka(e,{placement:y,boundary:o,rootBoundary:i,padding:a})[hn(y)],m},{});return Object.keys(p).sort(function(m,y){return p[m]-p[y]})}function G2(e){if(hn(e)===Up)return[];var t=Hs(e);return[kv(e),t,kv(t)]}function $2(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!0:a,l=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,m=p===void 0?!0:p,y=n.allowedAutoPlacements,h=t.options.placement,v=hn(h),w=v===h,S=l||(w||!m?[Hs(h)]:G2(h)),A=[h].concat(S).reduce(function(le,ue){return le.concat(hn(ue)===Up?z2(t,{placement:ue,boundary:c,rootBoundary:f,padding:u,flipVariations:m,allowedAutoPlacements:y}):ue)},[]),T=t.rects.reference,C=t.rects.popper,O=new Map,b=!0,E=A[0],x=0;x=0,q=B?"width":"height",H=ka(t,{placement:_,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),ce=B?D?Yt:bt:D?Wt:St;T[q]>C[q]&&(ce=Hs(ce));var he=Hs(ce),ye=[];if(i&&ye.push(H[k]<=0),s&&ye.push(H[ce]<=0,H[he]<=0),ye.every(function(le){return le})){E=_,b=!1;break}O.set(_,ye)}if(b)for(var ne=m?3:1,R=function(ue){var ze=A.find(function(Fe){var Ue=O.get(Fe);if(Ue)return Ue.slice(0,ue).every(function(rt){return rt})});if(ze)return E=ze,"break"},Y=ne;Y>0;Y--){var V=R(Y);if(V==="break")break}t.placement!==E&&(t.modifiersData[r]._skip=!0,t.placement=E,t.reset=!0)}}const H2={name:"flip",enabled:!0,phase:"main",fn:$2,requiresIfExists:["offset"],data:{_skip:!1}};function Iv(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function Nv(e){return[St,Yt,Wt,bt].some(function(t){return e[t]>=0})}function V2(e){var t=e.state,n=e.name,r=t.rects.reference,o=t.rects.popper,i=t.modifiersData.preventOverflow,a=ka(t,{elementContext:"reference"}),s=ka(t,{altBoundary:!0}),l=Iv(a,r),u=Iv(s,o,i),c=Nv(l),f=Nv(u);t.modifiersData[n]={referenceClippingOffsets:l,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const J2={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:V2};function Q2(e,t,n){var r=hn(e),o=[bt,St].indexOf(r)>=0?-1:1,i=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=i[0],s=i[1];return a=a||0,s=(s||0)*o,[bt,Yt].indexOf(r)>=0?{x:s,y:a}:{x:a,y:s}}function X2(e){var t=e.state,n=e.options,r=e.name,o=n.offset,i=o===void 0?[0,0]:o,a=D1.reduce(function(c,f){return c[f]=Q2(f,t.rects,i),c},{}),s=a[t.placement],l=s.x,u=s.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=l,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const K2={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:X2};function q2(e){var t=e.state,n=e.name;t.modifiersData[n]=j1({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const Z2={name:"popperOffsets",enabled:!0,phase:"read",fn:q2,data:{}};function eO(e){return e==="x"?"y":"x"}function tO(e){var t=e.state,n=e.options,r=e.name,o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!1:a,l=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,m=n.tetherOffset,y=m===void 0?0:m,h=ka(t,{boundary:l,rootBoundary:u,padding:f,altBoundary:c}),v=hn(t.placement),w=Uo(t.placement),S=!w,A=jp(v),T=eO(A),C=t.modifiersData.popperOffsets,O=t.rects.reference,b=t.rects.popper,E=typeof y=="function"?y(Object.assign({},t.rects,{placement:t.placement})):y,x=typeof E=="number"?{mainAxis:E,altAxis:E}:Object.assign({mainAxis:0,altAxis:0},E),_=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,k={x:0,y:0};if(!!C){if(i){var D,B=A==="y"?St:bt,q=A==="y"?Wt:Yt,H=A==="y"?"height":"width",ce=C[A],he=ce+h[B],ye=ce-h[q],ne=p?-b[H]/2:0,R=w===Ro?O[H]:b[H],Y=w===Ro?-b[H]:-O[H],V=t.elements.arrow,le=p&&V?Bp(V):{width:0,height:0},ue=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:M1(),ze=ue[B],Fe=ue[q],Ue=qi(0,O[H],le[H]),rt=S?O[H]/2-ne-Ue-ze-x.mainAxis:R-Ue-ze-x.mainAxis,us=S?-O[H]/2+ne+Ue+Fe+x.mainAxis:Y+Ue+Fe+x.mainAxis,zu=t.elements.arrow&&Za(t.elements.arrow),vS=zu?A==="y"?zu.clientTop||0:zu.clientLeft||0:0,ch=(D=_==null?void 0:_[A])!=null?D:0,gS=ce+rt-ch-vS,yS=ce+us-ch,fh=qi(p?Rl(he,gS):he,ce,p?Nr(ye,yS):ye);C[A]=fh,k[A]=fh-ce}if(s){var dh,wS=A==="x"?St:bt,SS=A==="x"?Wt:Yt,yr=C[T],cs=T==="y"?"height":"width",ph=yr+h[wS],hh=yr-h[SS],Gu=[St,bt].indexOf(v)!==-1,mh=(dh=_==null?void 0:_[T])!=null?dh:0,vh=Gu?ph:yr-O[cs]-b[cs]-mh+x.altAxis,gh=Gu?yr+O[cs]+b[cs]-mh-x.altAxis:hh,yh=p&&Gu?x2(vh,yr,gh):qi(p?vh:ph,yr,p?gh:hh);C[T]=yh,k[T]=yh-yr}t.modifiersData[r]=k}}const nO={name:"preventOverflow",enabled:!0,phase:"main",fn:tO,requiresIfExists:["offset"]};function rO(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function oO(e){return e===nn(e)||!Ut(e)?Wp(e):rO(e)}function iO(e){var t=e.getBoundingClientRect(),n=Mo(t.width)/e.offsetWidth||1,r=Mo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function aO(e,t,n){n===void 0&&(n=!1);var r=Ut(t),o=Ut(t)&&iO(t),i=gr(t),a=Fo(e,o),s={scrollLeft:0,scrollTop:0},l={x:0,y:0};return(r||!r&&!n)&&((gn(t)!=="body"||zp(i))&&(s=oO(t)),Ut(t)?(l=Fo(t,!0),l.x+=t.clientLeft,l.y+=t.clientTop):i&&(l.x=Yp(i))),{x:a.left+s.scrollLeft-l.x,y:a.top+s.scrollTop-l.y,width:a.width,height:a.height}}function sO(e){var t=new Map,n=new Set,r=[];e.forEach(function(i){t.set(i.name,i)});function o(i){n.add(i.name);var a=[].concat(i.requires||[],i.requiresIfExists||[]);a.forEach(function(s){if(!n.has(s)){var l=t.get(s);l&&o(l)}}),r.push(i)}return e.forEach(function(i){n.has(i.name)||o(i)}),r}function lO(e){var t=sO(e);return w2.reduce(function(n,r){return n.concat(t.filter(function(o){return o.phase===r}))},[])}function uO(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function cO(e){var t=e.reduce(function(n,r){var o=n[r.name];return n[r.name]=o?Object.assign({},o,r,{options:Object.assign({},o.options,r.options),data:Object.assign({},o.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var Dv={placement:"bottom",modifiers:[],strategy:"absolute"};function Rv(){for(var e=arguments.length,t=new Array(e),n=0;n{var l=s,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:o,openDelayMs:i=0}=l,a=$t(l,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);const[u,c]=I.useState(null),[f,d]=I.useState(null),[p,m]=I.useState(null),{styles:y,attributes:h,update:v}=SO(u,f,{placement:t,modifiers:[{name:"arrow",options:{element:p}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),w=I.useMemo(()=>$(F({},y.popper),{backgroundColor:o}),[o,y.popper]),S=I.useMemo(()=>{let T;function C(){T=setTimeout(()=>{v==null||v(),f==null||f.setAttribute("data-show","")},i)}function O(){clearTimeout(T),f==null||f.removeAttribute("data-show")}return{[n==="hover"?"onMouseEnter":"onClick"]:()=>C(),onMouseLeave:()=>O()}},[i,f,n,v]),A=typeof r=="string";return N(Me,{children:[g("button",$(F(F({},a),S),{ref:c,children:e})),N("div",$(F({ref:d,className:xc.popover,style:w},h.popper),{children:[A?g("div",{className:xc.textContent,children:r}):r,g("div",{ref:m,className:xc.popperArrow,style:y.arrow})]}))]})},AO="_infoIcon_15ri6_1",xO="_container_15ri6_10",OO="_header_15ri6_15",_O="_info_15ri6_1",PO="_unit_15ri6_27",kO="_description_15ri6_31",to={infoIcon:AO,container:xO,header:OO,info:_O,unit:PO,description:kO},W1=({units:e})=>g(Gp,{className:to.infoIcon,popoverContent:g(TO,{units:e}),openDelayMs:500,placement:"auto",children:g(OA,{})});function TO({units:e}){return N("div",{className:to.container,children:[g("div",{className:to.header,children:"CSS size options"}),g("div",{className:to.info,children:e.map(t=>N(I.Fragment,{children:[g("div",{className:to.unit,children:t}),g("div",{className:to.description,children:IO[t]})]},t))})]})}const IO={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},NO="_wrapper_13r28_1",DO="_unitSelector_13r28_10",Ll={wrapper:NO,unitSelector:DO};function RO(e){const[t,n]=j.exports.useState(T1(e)),r=j.exports.useCallback(i=>{if(i===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:i})},[t.unit]),o=j.exports.useCallback(i=>{n(a=>{const s=a.unit;return i==="auto"?{unit:i,count:null}:s==="auto"?{unit:i,count:Y1[i]}:{unit:i,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:o}}const Y1={fr:1,px:10,rem:1,"%":100};function LO({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:o,updateCount:i,updateUnit:a}=RO(e!=null?e:"auto"),s=I.useMemo(()=>Fp(u=>{t(u)},500),[t]);if(I.useEffect(()=>{const u=Wn(o);if(e!==u)return s(Wn(o)),()=>s.cancel()},[o,s,e]),e===void 0&&!r)return null;const l=r||o.count===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(Wn(o))},children:[g(Mp,{ariaLabel:"value-count",value:l?void 0:o.count,disabled:l,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>g("option",{value:u,children:u},u))}),g(W1,{units:n})]})}function yn(s){var l=s,{name:e,label:t,onChange:n,optional:r,value:o,defaultValue:i="10px"}=l,a=$t(l,["name","label","onChange","optional","value","defaultValue"]);const u=$r(n),c=o===void 0;return g(Lp,{name:e,label:t,optional:r,isDisabled:c,defaultValue:i,width_setting:"fit",mainInput:g(LO,$(F({value:o!=null?o:i},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function MO({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:o}=T1(e),i=I.useCallback(l=>{if(l===void 0){if(o!=="auto")throw new Error("Undefined count with auto units");t(Wn({unit:o,count:null}));return}if(o==="auto"){console.error("How did you change the count of an auto unit?");return}t(Wn({unit:o,count:l}))},[t,o]),a=I.useCallback(l=>{if(l==="auto"){t(Wn({unit:l,count:null}));return}if(o==="auto"){t(Wn({unit:l,count:Y1[l]}));return}t(Wn({unit:l,count:r}))},[r,t,o]),s=r===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",children:[g(Mp,{ariaLabel:"value-count",value:s?void 0:r,disabled:s,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o,onChange:l=>a(l.target.value),children:n.map(l=>g("option",{value:l,children:l},l))}),g(W1,{units:n})]})}const FO="_tractInfoDisplay_9993b_1",UO="_sizeWidget_9993b_61",BO="_hoverListener_9993b_88",jO="_buttons_9993b_108",WO="_tractAddButton_9993b_121",YO="_deleteButton_9993b_122",co={tractInfoDisplay:FO,sizeWidget:UO,hoverListener:BO,buttons:jO,tractAddButton:WO,deleteButton:YO},zO=["fr","px"];function GO({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:o}){const i=j.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=j.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),s=j.exports.useCallback(()=>a(t),[a,t]),l=j.exports.useCallback(()=>a(t+1),[a,t]),u=j.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return N("div",{className:co.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[g("div",{className:co.hoverListener}),N("div",{className:co.sizeWidget,onClick:HO,children:[N("div",{className:co.buttons,children:[g(Lv,{dir:e,onClick:s}),g($O,{onClick:u,deletionConflicts:o}),g(Lv,{dir:e,onClick:l})]}),g(MO,{value:n,units:zO,onChange:i})]})]})}const z1=200;function $O({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return g(Gp,{className:co.deleteButton,onClick:G1(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:z1,children:g(Sp,{})})}function Lv({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return g(Gp,{className:co.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:G1(t),openDelayMs:z1,children:g(C1,{})})}function G1(e){return function(t){t.currentTarget.blur(),e==null||e()}}function Mv({dir:e,sizes:t,areas:n,onUpdate:r}){const o=j.exports.useCallback(({dir:i,index:a})=>k1(n,{dir:i,index:a+1}),[n]);return g(Me,{children:t.map((i,a)=>g(GO,{index:a,dir:e,size:i,onUpdate:r,deletionConflicts:o({dir:e,index:a})},e+a))})}function HO(e){e.stopPropagation()}const VO="_columnSizer_3i83d_1",JO="_rowSizer_3i83d_2",Fv={columnSizer:VO,rowSizer:JO};function Uv({dir:e,index:t,onStartDrag:n}){return g("div",{className:e==="rows"?Fv.rowSizer:Fv.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function QO(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const Ml=40,XO=.15,$1=e=>t=>Math.round(t/e)*e,KO=5,$p=$1(KO),qO=.01,ZO=$1(qO),Bv=e=>Number(e.toFixed(4));function e3(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const o=ZO(e*t),i=n.count+o,a=r.count-o;return(o<0?i/a:a/i)=i.length?null:i[u];if(c==="auto"||f==="auto"){const m=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=m[l],i[l]=c),f==="auto"&&(f=m[u],i[u]=f),r.style[o]=m.join(" ")}const d=o3(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=$(F({dir:t,mouseStart:V1(e,t),originalSizes:i,currentSizes:[...i],beforeIndex:l,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=i3({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function s3({mousePosition:e,drag:t,container:n}){const o=V1(e,t.dir)-t.mouseStart,i=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=n3(o,t);break;case"after-pixel":a=r3(o,t);break;case"both-pixel":a=t3(o,t);break;case"both-relative":a=e3(o,t);break}a!=="no-change"&&(a.beforeSize&&(i[t.beforeIndex]=a.beforeSize),a.afterSize&&(i[t.afterIndex]=a.afterSize),t.currentSizes=i,t.dir==="cols"?n.style.gridTemplateColumns=i.join(" "):n.style.gridTemplateRows=i.join(" "))}function l3(e){return e.match(/[0-9|.]+px/)!==null}function H1(e){return e.match(/[0-9|.]+fr/)!==null}function Fl(e){if(H1(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(l3(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function V1(e,t){return t==="rows"?e.clientY:e.clientX}function u3(e){return e.some(t=>H1(t))}function c3(e){return e.some(t=>t==="auto")}function jv(e,t){const n=Math.abs(t-e)+1,r=ee+i*r)}function f3({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(o=>`"${o.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function Wv(e){return e.split(" ")}function d3(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function p3(e){const t=Wv(e.style.gridTemplateRows),n=Wv(e.style.gridTemplateColumns),r=d3(e.style.gridTemplateAreas),o=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:o}}function h3({containerRef:e,onDragEnd:t}){return I.useCallback(({e:r,dir:o,index:i})=>{const a=QO(e,"How are you dragging on an element without a container?");r.preventDefault();const s=a3({mousePosition:r,dir:o,index:i,container:a}),{beforeIndex:l,afterIndex:u}=s,c=Yv(a,{dir:o,index:l,size:s.currentSizes[l]}),f=Yv(a,{dir:o,index:u,size:s.currentSizes[u]});m3(a,s.dir,{move:d=>{s3({mousePosition:d,drag:s,container:a}),c.update(s.currentSizes[l]),f.update(s.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(p3(a))}})},[e,t])}function Yv(e,{dir:t,index:n,size:r}){const o=document.createElement("div"),i=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(o.style,i,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,o.appendChild(a),e.appendChild(o),{remove:()=>o.remove(),update:s=>{a.innerHTML=s}}}function m3(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const o=()=>{i(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",o),r.addEventListener("mouseleave",o);function i(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",o),r.removeEventListener("mouseleave",o),r.remove()}}const v3="1fr";function g3(o){var i=o,{className:e,children:t,onNewLayout:n}=i,r=$t(i,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:s}=r,l=j.exports.useRef(null),u=f3(r),c=jv(2,s.length),f=jv(2,a.length),d=h3({containerRef:l,onDragEnd:n}),p=[Zx.ResizableGrid];e&&p.push(e);const m=j.exports.useCallback(h=>{switch(h.type){case"ADD":return _1(r,{afterIndex:h.index,dir:h.dir,size:v3});case"RESIZE":return y3(r,h);case"DELETE":return P1(r,h)}},[r]),y=j.exports.useCallback(h=>n(m(h)),[m,n]);return N("div",{className:p.join(" "),ref:l,style:u,children:[c.map(h=>g(Uv,{dir:"cols",index:h,onStartDrag:d},"cols"+h)),f.map(h=>g(Uv,{dir:"rows",index:h,onStartDrag:d},"rows"+h)),t,g(Mv,{dir:"cols",sizes:s,areas:r.areas,onUpdate:y}),g(Mv,{dir:"rows",sizes:a,areas:r.areas,onUpdate:y})]})}function y3(e,{dir:t,index:n,size:r}){return ei(e,o=>{o[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function w3(e,r){var o=r,{name:t}=o,n=$t(o,["name"]);const{rowStart:i,colStart:a}=n,s="rowEnd"in n?n.rowEnd:i+n.rowSpan-1,l="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Ou(e.areas);for(let c=0;c=i-1&&c=a-1&&d{for(let o of n)S3(r,o)})}function b3(e,t){return J1(e,t)}function E3(e,t,n){return ei(e,({areas:r})=>{const{numRows:o,numCols:i}=Ka(r);for(let a=0;a{const i=n==="rows"?"row_sizes":"col_sizes";o[i][t-1]=r})}function A3(e,{item_a:t,item_b:n}){return t===n?e:ei(e,r=>{const{n_rows:o,n_cols:i}=x3(r.areas);let a=!1,s=!1;for(let l=0;l{a.current&&r&&setTimeout(()=>{var s;return(s=a==null?void 0:a.current)==null?void 0:s.focus()},1)},[r]),g("input",{ref:a,className:k3.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:i,onChange:s=>n(s.target.value),disabled:o})}function pe({name:e,label:t,value:n,placeholder:r,onChange:o,autoFocus:i=!1,optional:a=!1,defaultValue:s="my-text"}){const l=$r(o),u=n===void 0,c=I.useRef(null);return I.useEffect(()=>{c.current&&i&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[i]),g(Lp,{name:e,label:t,optional:a,isDisabled:u,defaultValue:s,width_setting:"full",mainInput:g(T3,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>l({name:e,value:f}),autoFocus:i,disabled:u})})}const I3="_container_1ehu8_1",N3="_elementsPanel_1ehu8_28",D3="_propertiesPanel_1ehu8_33",R3="_editorHolder_1ehu8_47",L3="_titledPanel_1ehu8_59",M3="_panelTitleHeader_1ehu8_71",F3="_header_1ehu8_80",U3="_rightSide_1ehu8_88",B3="_divider_1ehu8_109",j3="_title_1ehu8_59",W3="_shinyLogo_1ehu8_120",Q1={container:I3,elementsPanel:N3,propertiesPanel:D3,editorHolder:R3,titledPanel:L3,panelTitleHeader:M3,header:F3,rightSide:U3,divider:B3,title:j3,shinyLogo:W3},Y3="_portalHolder_18ua3_1",z3="_portalModal_18ua3_11",G3="_title_18ua3_21",$3="_body_18ua3_25",H3="_portalForm_18ua3_30",V3="_portalFormInputs_18ua3_35",J3="_portalFormFooter_18ua3_42",Q3="_validationMsg_18ua3_48",X3="_infoText_18ua3_53",xs={portalHolder:Y3,portalModal:z3,title:G3,body:$3,portalForm:H3,portalFormInputs:V3,portalFormFooter:J3,validationMsg:Q3,infoText:X3},K3=({children:e,el:t="div"})=>{const[n]=j.exports.useState(document.createElement(t));return j.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Na.exports.createPortal(e,n)},X1=({children:e,title:t,label:n,onConfirm:r,onCancel:o})=>g(K3,{children:g("div",{className:xs.portalHolder,onClick:()=>o(),onKeyDown:i=>{i.key==="Escape"&&o()},children:N("div",{className:xs.portalModal,onClick:i=>i.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?g("div",{className:xs.title+" "+Q1.panelTitleHeader,children:t}):null,g("div",{className:xs.body,children:e})]})})}),q3="_portalHolder_18ua3_1",Z3="_portalModal_18ua3_11",e4="_title_18ua3_21",t4="_body_18ua3_25",n4="_portalForm_18ua3_30",r4="_portalFormInputs_18ua3_35",o4="_portalFormFooter_18ua3_42",i4="_validationMsg_18ua3_48",a4="_infoText_18ua3_53",gi={portalHolder:q3,portalModal:Z3,title:e4,body:t4,portalForm:n4,portalFormInputs:r4,portalFormFooter:o4,validationMsg:i4,infoText:a4};function s4({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[o,i]=I.useState(r),[a,s]=I.useState(null),l=I.useCallback(c=>{c&&c.preventDefault();const f=l4({name:o,existingAreaNames:n});if(f){s(f);return}t(o)},[n,o,t]),u=I.useCallback(({value:c})=>{s(null),i(c!=null?c:r)},[r]);return N(X1,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(o),onCancel:e,children:[g("form",{className:gi.portalForm,onSubmit:l,children:N("div",{className:gi.portalFormInputs,children:[g("span",{className:gi.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),g(pe,{label:"Name of new grid area",name:"New-Item-Name",value:o,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?g("div",{className:gi.validationMsg,children:a}):null]})}),N("div",{className:gi.portalFormFooter,children:[g(wt,{variant:"delete",onClick:e,children:"Cancel"}),g(wt,{onClick:()=>l(),children:"Done"})]})]})}function l4({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const u4="_container_1hvsg_1",c4={container:u4},K1=I.createContext(null),f4=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:o,compRef:i})=>{const a=vr(),s=Ew(),{onClick:l}=r,{uniqueAreas:u}=Qx(e),T=e,{areas:c}=T,f=$t(T,["areas"]),d=C=>{a(Sw({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:F(F({},f),C)}}))},p=I.useMemo(()=>Rp(c),[c]),[m,y]=I.useState(null),h=C=>{const{node:O,currentPath:b,pos:E}=C,x=b!==void 0,_=$f.includes(O.uiName);if(x&&_&&"area"in O.uiArguments&&O.uiArguments.area){const k=O.uiArguments.area;v({type:"MOVE_ITEM",name:k,pos:E});return}y(C)},v=C=>{d(Hp(e,C))},w=u.map(C=>g(zx,{area:C,areas:c,gridLocation:p.get(C),onNewPos:O=>v({type:"MOVE_ITEM",name:C,pos:O})},C)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},A=(C,{node:O,currentPath:b,pos:E})=>{if($f.includes(O.uiName)){const x=$(F({},O.uiArguments),{area:C});O.uiArguments=x}else O={uiName:"gridlayout::grid_card",uiArguments:{area:C},uiChildren:[O]};s({parentPath:[],node:O,currentPath:b}),v({type:"ADD_ITEM",name:C,pos:E}),y(null)};return N(K1.Provider,{value:v,children:[g("div",{ref:i,style:S,className:c4.container,onClick:l,draggable:!1,onDragStart:()=>{},children:N(g3,$(F({},e),{onNewLayout:d,children:[Jx(c).map(({row:C,col:O})=>g(Hx,{gridRow:C,gridColumn:O,onDroppedNode:h},Mx({row:C,col:O}))),t==null?void 0:t.map((C,O)=>g(Ep,F({path:[...o.path,O]},C),o.path.join(".")+O)),n,w]}))}),m?g(s4,{info:m,onCancel:()=>y(null),onDone:C=>A(C,m),existingAreaNames:u}):null]})};function d4(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function p4(){return I.useContext(K1)}function Vp({containerRef:e,path:t,area:n}){const r=p4(),o=I.useCallback(({node:a,currentPath:s})=>s===void 0||!$f.includes(a.uiName)?!1:Np(s,t),[t]),i=I.useCallback(a=>{var l;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const s=(l=a.node.uiArguments.area)!=null?l:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:s})},[n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i,canAcceptDropClass:xt.availableToSwap,hoveringOverClass:xt.hoveringOverSwap})}const h4=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:o},children:i,eventHandlers:a,compRef:s})=>{const l=r.length>0;return Vp({containerRef:s,area:e,path:o}),N(Cp,{className:xt.container+" "+(n?xt.withTitle:""),ref:s,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?g(WA,{className:xt.panelTitle,children:n}):null,N("div",{className:xt.contentHolder,"data-alignment":"top",children:[g(zv,{index:0,parentPath:o,numChildren:r.length}),l?r==null?void 0:r.map((u,c)=>N(I.Fragment,{children:[g(Ep,F({path:[...o,c]},u)),g(zv,{index:c+1,numChildren:r.length,parentPath:o})]},o.join(".")+c)):g(v4,{path:o})]}),i]})};function zv({index:e,numChildren:t,parentPath:n}){const r=I.useRef(null);Ax({watcherRef:r,positionInChildren:e,parentPath:n});const o=m4(e,t);return g("div",{ref:r,className:xt.dropWatcher+" "+o,"aria-label":"drop watcher"})}function m4(e,t){return e===0&&t===0?xt.onlyDropWatcher:e===0?xt.firstDropWatcher:e===t?xt.lastDropWatcher:xt.middleDropWatcher}function v4({path:e}){return N("div",{className:xt.emptyGridCard,children:[g("span",{className:xt.emptyMessage,children:"Empty grid card"}),g(m1,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const g4=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e.area}),g(pe,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),g(yn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},y4={area:"default-area",item_gap:"12px"},w4={title:"Grid Card",UiComponent:h4,SettingsComponent:g4,acceptsChildren:!0,defaultSettings:y4,iconSrc:dA,category:"gridlayout"},q1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function S4(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const Z1=({type:e,name:t,className:n})=>N("code",{className:n,children:[N("span",{style:{opacity:.55},children:[e,"$"]}),g("span",{children:t})]}),b4="_container_1rlbk_1",E4="_plotPlaceholder_1rlbk_5",C4="_label_1rlbk_19",Jf={container:b4,plotPlaceholder:E4,label:C4};function ew({outputId:e}){const t=j.exports.useRef(null),n=A4(t),r=n===null?100:Math.min(n.width,n.height);return N("div",{ref:t,className:Jf.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[g(Z1,{className:Jf.label,type:"output",name:e}),g(S4,{size:`calc(${r}px - 80px)`})]})}function A4(e){const[t,n]=j.exports.useState(null);return j.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(o=>{if(!e.current)return;const{offsetHeight:i,offsetWidth:a}=e.current;n({width:a,height:i})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const x4="_gridCardPlot_1a94v_1",O4={gridCardPlot:x4},_4=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:o,compRef:i})=>(Vp({containerRef:i,area:t,path:r}),N(Cp,$(F({ref:i,style:{gridArea:t},className:O4.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},o),{children:[g(ew,{outputId:e!=null?e:t}),n]}))),P4=({settings:{area:e,outputId:t}})=>N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e}),g(pe,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),k4={title:"Grid Plot Card",UiComponent:_4,SettingsComponent:P4,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:q1,category:"gridlayout"},T4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",I4="_textPanel_525i2_1",N4={textPanel:I4},D4=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:o},eventHandlers:i,compRef:a})=>(Vp({containerRef:a,area:t,path:o}),N(Cp,$(F({ref:a,className:N4.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},i),{children:[g("h1",{children:e}),r]}))),R4="_checkboxInput_12wa8_1",L4="_checkboxLabel_12wa8_10",Gv={checkboxInput:R4,checkboxLabel:L4};function tw({name:e,label:t,value:n,onChange:r,disabled:o,noLabel:i}){const a=$r(r),s=i?void 0:t!=null?t:e,l=`${e}-checkbox-input`,u=N(Me,{children:[g("input",{className:Gv.checkboxInput,id:l,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:o,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),g("label",{className:Gv.checkboxLabel,htmlFor:l,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return s!==void 0?N("div",{className:kn.container,children:[N("label",{className:kn.label,children:[s,":"]}),u]}):u}const M4="_radioContainer_1regb_1",F4="_option_1regb_15",U4="_radioInput_1regb_22",B4="_radioLabel_1regb_26",j4="_icon_1regb_41",yi={radioContainer:M4,option:F4,radioInput:U4,radioLabel:B4,icon:j4};function W4({name:e,label:t,options:n,currentSelection:r,onChange:o,optionsPerColumn:i}){const a=Object.keys(n),s=$r(o),l=j.exports.useMemo(()=>({gridTemplateColumns:i?`repeat(${i}, 1fr)`:void 0}),[i]);return N("div",{className:kn.container,"data-full-width":"true",children:[N("label",{htmlFor:e,className:kn.label,children:[t!=null?t:e,":"]}),g("fieldset",{className:yi.radioContainer,id:e,style:l,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return N("div",{className:yi.option,children:[g("input",{className:yi.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>s({name:e,value:u}),checked:u===r}),g("label",{className:yi.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?g("img",{src:c,alt:f,className:yi.icon}):c})]},u)})})]})}const Y4={start:{icon:f1,label:"left"},center:{icon:Mf,label:"center"},end:{icon:d1,label:"right"}},z4=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),g(pe,{name:"content",label:"Panel content",value:e.content}),g(W4,{name:"alignment",label:"Text Alignment",options:Y4,currentSelection:e.alignment,optionsPerColumn:3}),g(tw,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},G4={title:"Grid Text Card",UiComponent:D4,SettingsComponent:z4,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:T4,category:"gridlayout"},$4=({settings:e})=>g(Me,{children:g(yn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function H4(e,{path:t,node:n}){var s;const r=nw({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:o}=r,i=d4(o.uiChildren)[t[0]],a=(s=n.uiArguments.area)!=null?s:vn;i!==a&&(o.uiArguments=Hp(o.uiArguments,{type:"RENAME_ITEM",oldName:i,newName:a}))}function V4(e,{path:t}){const n=nw({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:o}=n,i=o.uiArguments.area;if(!i){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Hp(r.uiArguments,{type:"REMOVE_ITEM",name:i})}function nw({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=rr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const J4={title:"Grid Page",UiComponent:f4,SettingsComponent:$4,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:H4,DELETE_NODE:V4},category:"gridlayout"},Q4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",X4=({settings:e})=>{const{inputId:t,label:n}=e;return N(Me,{children:[g(pe,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),g(pe,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},K4="_container_tyghz_1",q4={container:K4},Z4=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:o="My Action Button",width:i}=e;return N("div",$(F({className:q4.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[g(wt,{style:i?{width:i}:void 0,children:o}),t]}))},e_={title:"Action Button",UiComponent:Z4,SettingsComponent:X4,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:Q4,category:"Inputs"},t_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",n_="_categoryDivider_8d7ls_1",r_={categoryDivider:n_};function ti({category:e}){return g("div",{className:r_.categoryDivider,children:g("span",{children:e?`${e}:`:null})})}function o_(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var rw={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function $v(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function wn(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function s_(e,t){if(e==null)return{};var n=a_(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function l_(e){return u_(e)||c_(e)||f_(e)||d_()}function u_(e){if(Array.isArray(e))return Qf(e)}function c_(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function f_(e,t){if(!!e){if(typeof e=="string")return Qf(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Qf(e,t)}}function Qf(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function h_(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function Xt(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Ul(e,t):Ul(e,t))||r&&e===n)return e;if(e===n)break}while(e=h_(e))}return null}var Vv=/\s+/g;function _e(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(Vv," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(Vv," ")}}function G(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function Dr(e,t){var n="";if(typeof e=="string")n=e;else do{var r=G(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var o=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return o&&new o(n)}function sw(e,t,n){if(e){var r=e.getElementsByTagName(t),o=0,i=r.length;if(n)for(;o=i:a=o<=i,!a)return r;if(r===mn())break;r=Vn(r,!1)}return!1}function Bo(e,t,n,r){for(var o=0,i=0,a=e.children;i2&&arguments[2]!==void 0?arguments[2]:{},o=r.evt,i=s_(r,b_);ts.pluginEvent.bind(Q)(t,n,wn({dragEl:U,parentEl:ke,ghostEl:Z,rootEl:be,nextEl:xr,lastDownEl:Qs,cloneEl:Oe,cloneHidden:Yn,dragStarted:Fi,putSortable:$e,activeSortable:Q.active,originalEvent:o,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un,hideGhostForTarget:pw,unhideGhostForTarget:hw,cloneNowHidden:function(){Yn=!0},cloneNowShown:function(){Yn=!1},dispatchSortableEvent:function(s){ot({sortable:n,name:s,originalEvent:o})}},i))};function ot(e){Mi(wn({putSortable:$e,cloneEl:Oe,targetEl:U,rootEl:be,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un},e))}var U,ke,Z,be,xr,Qs,Oe,Yn,fo,At,na,Un,Os,$e,no=!1,Bl=!1,jl=[],wr,Vt,kc,Tc,Kv,qv,Fi,Kr,ra,oa=!1,_s=!1,Xs,Qe,Ic=[],Xf=!1,Wl=[],Pu=typeof document!="undefined",Ps=ow,Zv=es||Rn?"cssFloat":"float",E_=Pu&&!iw&&!ow&&"draggable"in document.createElement("div"),cw=function(){if(!!Pu){if(Rn)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),fw=function(t,n){var r=G(t),o=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),i=Bo(t,0,n),a=Bo(t,1,n),s=i&&G(i),l=a&&G(a),u=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Ae(i).width,c=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Ae(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(i&&s.float&&s.float!=="none"){var f=s.float==="left"?"left":"right";return a&&(l.clear==="both"||l.clear===f)?"vertical":"horizontal"}return i&&(s.display==="block"||s.display==="flex"||s.display==="table"||s.display==="grid"||u>=o&&r[Zv]==="none"||a&&r[Zv]==="none"&&u+c>o)?"vertical":"horizontal"},C_=function(t,n,r){var o=r?t.left:t.top,i=r?t.right:t.bottom,a=r?t.width:t.height,s=r?n.left:n.top,l=r?n.right:n.bottom,u=r?n.width:n.height;return o===s||i===l||o+a/2===s+u/2},A_=function(t,n){var r;return jl.some(function(o){var i=o[Ze].options.emptyInsertThreshold;if(!(!i||Jp(o))){var a=Ae(o),s=t>=a.left-i&&t<=a.right+i,l=n>=a.top-i&&n<=a.bottom+i;if(s&&l)return r=o}}),r},dw=function(t){function n(i,a){return function(s,l,u,c){var f=s.options.group.name&&l.options.group.name&&s.options.group.name===l.options.group.name;if(i==null&&(a||f))return!0;if(i==null||i===!1)return!1;if(a&&i==="clone")return i;if(typeof i=="function")return n(i(s,l,u,c),a)(s,l,u,c);var d=(a?s:l).options.group.name;return i===!0||typeof i=="string"&&i===d||i.join&&i.indexOf(d)>-1}}var r={},o=t.group;(!o||Js(o)!="object")&&(o={name:o}),r.name=o.name,r.checkPull=n(o.pull,!0),r.checkPut=n(o.put),r.revertClone=o.revertClone,t.group=r},pw=function(){!cw&&Z&&G(Z,"display","none")},hw=function(){!cw&&Z&&G(Z,"display","")};Pu&&!iw&&document.addEventListener("click",function(e){if(Bl)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Bl=!1,!1},!0);var Sr=function(t){if(U){t=t.touches?t.touches[0]:t;var n=A_(t.clientX,t.clientY);if(n){var r={};for(var o in t)t.hasOwnProperty(o)&&(r[o]=t[o]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[Ze]._onDragOver(r)}}},x_=function(t){U&&U.parentNode[Ze]._isOutsideThisEl(t.target)};function Q(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=zt({},t),e[Ze]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return fw(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,s){a.setData("Text",s.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:Q.supportPointer!==!1&&"PointerEvent"in window&&!ea,emptyInsertThreshold:5};ts.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);dw(t);for(var o in this)o.charAt(0)==="_"&&typeof this[o]=="function"&&(this[o]=this[o].bind(this));this.nativeDraggable=t.forceFallback?!1:E_,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ie(e,"pointerdown",this._onTapStart):(ie(e,"mousedown",this._onTapStart),ie(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ie(e,"dragover",this),ie(e,"dragenter",this)),jl.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),zt(this,y_())}Q.prototype={constructor:Q,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Kr=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,U):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,o=this.options,i=o.preventOnFilter,a=t.type,s=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,l=(s||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||l,c=o.filter;if(D_(r),!U&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||o.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&ea&&l&&l.tagName.toUpperCase()==="SELECT")&&(l=Xt(l,o.draggable,r,!1),!(l&&l.animated)&&Qs!==l)){if(fo=Te(l),na=Te(l,o.draggable),typeof c=="function"){if(c.call(this,t,l,this)){ot({sortable:n,rootEl:u,name:"filter",targetEl:l,toEl:r,fromEl:r}),ut("filter",n,{evt:t}),i&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=Xt(u,f.trim(),r,!1),f)return ot({sortable:n,rootEl:f,name:"filter",targetEl:l,fromEl:r,toEl:r}),ut("filter",n,{evt:t}),!0}),c)){i&&t.cancelable&&t.preventDefault();return}o.handle&&!Xt(u,o.handle,r,!1)||this._prepareDragStart(t,s,l)}}},_prepareDragStart:function(t,n,r){var o=this,i=o.el,a=o.options,s=i.ownerDocument,l;if(r&&!U&&r.parentNode===i){var u=Ae(r);if(be=i,U=r,ke=U.parentNode,xr=U.nextSibling,Qs=r,Os=a.group,Q.dragged=U,wr={target:U,clientX:(n||t).clientX,clientY:(n||t).clientY},Kv=wr.clientX-u.left,qv=wr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,U.style["will-change"]="all",l=function(){if(ut("delayEnded",o,{evt:t}),Q.eventCanceled){o._onDrop();return}o._disableDelayedDragEvents(),!Hv&&o.nativeDraggable&&(U.draggable=!0),o._triggerDragStart(t,n),ot({sortable:o,name:"choose",originalEvent:t}),_e(U,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){sw(U,c.trim(),Nc)}),ie(s,"dragover",Sr),ie(s,"mousemove",Sr),ie(s,"touchmove",Sr),ie(s,"mouseup",o._onDrop),ie(s,"touchend",o._onDrop),ie(s,"touchcancel",o._onDrop),Hv&&this.nativeDraggable&&(this.options.touchStartThreshold=4,U.draggable=!0),ut("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(es||Rn))){if(Q.eventCanceled){this._onDrop();return}ie(s,"mouseup",o._disableDelayedDrag),ie(s,"touchend",o._disableDelayedDrag),ie(s,"touchcancel",o._disableDelayedDrag),ie(s,"mousemove",o._delayedDragTouchMoveHandler),ie(s,"touchmove",o._delayedDragTouchMoveHandler),a.supportPointer&&ie(s,"pointermove",o._delayedDragTouchMoveHandler),o._dragStartTimer=setTimeout(l,a.delay)}else l()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){U&&Nc(U),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;te(t,"mouseup",this._disableDelayedDrag),te(t,"touchend",this._disableDelayedDrag),te(t,"touchcancel",this._disableDelayedDrag),te(t,"mousemove",this._delayedDragTouchMoveHandler),te(t,"touchmove",this._delayedDragTouchMoveHandler),te(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ie(document,"pointermove",this._onTouchMove):n?ie(document,"touchmove",this._onTouchMove):ie(document,"mousemove",this._onTouchMove):(ie(U,"dragend",this),ie(be,"dragstart",this._onDragStart));try{document.selection?Ks(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(no=!1,be&&U){ut("dragStarted",this,{evt:n}),this.nativeDraggable&&ie(document,"dragover",x_);var r=this.options;!t&&_e(U,r.dragClass,!1),_e(U,r.ghostClass,!0),Q.active=this,t&&this._appendGhost(),ot({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(Vt){this._lastX=Vt.clientX,this._lastY=Vt.clientY,pw();for(var t=document.elementFromPoint(Vt.clientX,Vt.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(Vt.clientX,Vt.clientY),t!==n);)n=t;if(U.parentNode[Ze]._isOutsideThisEl(t),n)do{if(n[Ze]){var r=void 0;if(r=n[Ze]._onDragOver({clientX:Vt.clientX,clientY:Vt.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);hw()}},_onTouchMove:function(t){if(wr){var n=this.options,r=n.fallbackTolerance,o=n.fallbackOffset,i=t.touches?t.touches[0]:t,a=Z&&Dr(Z,!0),s=Z&&a&&a.a,l=Z&&a&&a.d,u=Ps&&Qe&&Qv(Qe),c=(i.clientX-wr.clientX+o.x)/(s||1)+(u?u[0]-Ic[0]:0)/(s||1),f=(i.clientY-wr.clientY+o.y)/(l||1)+(u?u[1]-Ic[1]:0)/(l||1);if(!Q.active&&!no){if(r&&Math.max(Math.abs(i.clientX-this._lastX),Math.abs(i.clientY-this._lastY))=0&&(ot({rootEl:ke,name:"add",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"remove",toEl:ke,originalEvent:t}),ot({rootEl:ke,name:"sort",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),$e&&$e.save()):At!==fo&&At>=0&&(ot({sortable:this,name:"update",toEl:ke,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),Q.active&&((At==null||At===-1)&&(At=fo,Un=na),ot({sortable:this,name:"end",toEl:ke,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){ut("nulling",this),be=U=ke=Z=xr=Oe=Qs=Yn=wr=Vt=Fi=At=Un=fo=na=Kr=ra=$e=Os=Q.dragged=Q.ghost=Q.clone=Q.active=null,Wl.forEach(function(t){t.checked=!0}),Wl.length=kc=Tc=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":U&&(this._onDragOver(t),O_(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,o=0,i=r.length,a=this.options;or.right+o||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+o}function T_(e,t,n,r,o,i,a,s){var l=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(s&&Xsc+u*i/2:lf-Xs)return-ra}else if(l>c+u*(1-o)/2&&lf-u*i/2)?l>c+u/2?1:-1:0}function I_(e){return Te(U)1&&(K.forEach(function(s){i.addAnimationState({target:s,rect:ct?Ae(s):a}),_c(s),s.fromRect=a,r.removeAnimationState(s)}),ct=!1,U_(!this.options.removeCloneOnHide,o))},dragOverCompleted:function(n){var r=n.sortable,o=n.isOwner,i=n.insertion,a=n.activeSortable,s=n.parentEl,l=n.putSortable,u=this.options;if(i){if(o&&a._hideClone(),Si=!1,u.animation&&K.length>1&&(ct||!o&&!a.options.sort&&!l)){var c=Ae(ve,!1,!0,!0);K.forEach(function(d){d!==ve&&(Xv(d,c),s.appendChild(d))}),ct=!0}if(!o)if(ct||Is(),K.length>1){var f=Ts;a._showClone(r),a.options.animation&&!Ts&&f&&Ct.forEach(function(d){a.addAnimationState({target:d,rect:bi}),d.fromRect=bi,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,o=n.isOwner,i=n.activeSortable;if(K.forEach(function(s){s.thisAnimationDuration=null}),i.options.animation&&!o&&i.multiDrag.isMultiDrag){bi=zt({},r);var a=Dr(ve,!0);bi.top-=a.f,bi.left-=a.e}},dragOverAnimationComplete:function(){ct&&(ct=!1,Is())},drop:function(n){var r=n.originalEvent,o=n.rootEl,i=n.parentEl,a=n.sortable,s=n.dispatchSortableEvent,l=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=i.children;if(!qr)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),_e(ve,f.selectedClass,!~K.indexOf(ve)),~K.indexOf(ve))K.splice(K.indexOf(ve),1),wi=null,Mi({sortable:a,rootEl:o,name:"deselect",targetEl:ve,originalEvent:r});else{if(K.push(ve),Mi({sortable:a,rootEl:o,name:"select",targetEl:ve,originalEvent:r}),r.shiftKey&&wi&&a.el.contains(wi)){var p=Te(wi),m=Te(ve);if(~p&&~m&&p!==m){var y,h;for(m>p?(h=p,y=m):(h=m,y=p+1);h1){var v=Ae(ve),w=Te(ve,":not(."+this.options.selectedClass+")");if(!Si&&f.animation&&(ve.thisAnimationDuration=null),c.captureAnimationState(),!Si&&(f.animation&&(ve.fromRect=v,K.forEach(function(A){if(A.thisAnimationDuration=null,A!==ve){var T=ct?Ae(A):v;A.fromRect=T,c.addAnimationState({target:A,rect:T})}})),Is(),K.forEach(function(A){d[w]?i.insertBefore(A,d[w]):i.appendChild(A),w++}),l===Te(ve))){var S=!1;K.forEach(function(A){if(A.sortableIndex!==Te(A)){S=!0;return}}),S&&s("update")}K.forEach(function(A){_c(A)}),c.animateAll()}Jt=c}(o===i||u&&u.lastPutMode!=="clone")&&Ct.forEach(function(A){A.parentNode&&A.parentNode.removeChild(A)})}},nullingGlobal:function(){this.isMultiDrag=qr=!1,Ct.length=0},destroyGlobal:function(){this._deselectMultiDrag(),te(document,"pointerup",this._deselectMultiDrag),te(document,"mouseup",this._deselectMultiDrag),te(document,"touchend",this._deselectMultiDrag),te(document,"keydown",this._checkKeyDown),te(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof qr!="undefined"&&qr)&&Jt===this.sortable&&!(n&&Xt(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;K.length;){var r=K[0];_e(r,this.options.selectedClass,!1),K.shift(),Mi({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},zt(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[Ze];!r||!r.options.multiDrag||~K.indexOf(n)||(Jt&&Jt!==r&&(Jt.multiDrag._deselectMultiDrag(),Jt=r),_e(n,r.options.selectedClass,!0),K.push(n))},deselect:function(n){var r=n.parentNode[Ze],o=K.indexOf(n);!r||!r.options.multiDrag||!~o||(_e(n,r.options.selectedClass,!1),K.splice(o,1))}},eventProperties:function(){var n=this,r=[],o=[];return K.forEach(function(i){r.push({multiDragElement:i,index:i.sortableIndex});var a;ct&&i!==ve?a=-1:ct?a=Te(i,":not(."+n.options.selectedClass+")"):a=Te(i),o.push({multiDragElement:i,index:a})}),{items:l_(K),clones:[].concat(Ct),oldIndicies:r,newIndicies:o}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function U_(e,t){K.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function tg(e,t){Ct.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function Is(){K.forEach(function(e){e!==ve&&e.parentNode&&e.parentNode.removeChild(e)})}Q.mount(new R_);Q.mount(Kp,Xp);const B_=Object.freeze(Object.defineProperty({__proto__:null,default:Q,MultiDrag:F_,Sortable:Q,Swap:L_},Symbol.toStringTag,{value:"Module"})),j_=Bg(B_);var vw={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],o=0;o$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>A);function l(C){C.parentElement!==null&&C.parentElement.removeChild(C)}function u(C,O,b){const E=C.children[b]||null;C.insertBefore(O,E)}function c(C){C.forEach(O=>l(O.element))}function f(C){C.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(C,O){const b=h(C),E={parentElement:C.from};let x=[];switch(b){case"normal":x=[{element:C.item,newIndex:C.newIndex,oldIndex:C.oldIndex,parentElement:C.from}];break;case"swap":const D=F({element:C.item,oldIndex:C.oldIndex,newIndex:C.newIndex},E),B=F({element:C.swapItem,oldIndex:C.newIndex,newIndex:C.oldIndex},E);x=[D,B];break;case"multidrag":x=C.oldIndicies.map((q,H)=>F({element:q.multiDragElement,oldIndex:q.index,newIndex:C.newIndicies[H].index},E));break}return v(x,O)}function p(C,O){const b=m(C,O);return y(C,b)}function m(C,O){const b=[...O];return C.concat().reverse().forEach(E=>b.splice(E.oldIndex,1)),b}function y(C,O,b,E){const x=[...O];return C.forEach(_=>{const k=E&&b&&E(_.item,b);x.splice(_.newIndex,0,k||_.item)}),x}function h(C){return C.oldIndicies&&C.oldIndicies.length>0?"multidrag":C.swapItem?"swap":"normal"}function v(C,O){return C.map(E=>$(F({},E),{item:O[E.oldIndex]})).sort((E,x)=>E.oldIndex-x.oldIndex)}function w(C){const us=C,{list:O,setList:b,children:E,tag:x,style:_,className:k,clone:D,onAdd:B,onChange:q,onChoose:H,onClone:ce,onEnd:he,onFilter:ye,onRemove:ne,onSort:R,onStart:Y,onUnchoose:V,onUpdate:le,onMove:ue,onSpill:ze,onSelect:Fe,onDeselect:Ue}=us;return $t(us,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class A extends r.Component{constructor(O){super(O),this.ref=r.createRef();const b=[...O.list].map(E=>Object.assign(E,{chosen:!1,selected:!1}));O.setList(b,this.sortable,S),i(o)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();i(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:b,className:E,id:x}=this.props,_={style:b,className:E,id:x},k=!O||O===null?"div":O;return r.createElement(k,F({ref:this.ref},_),this.getChildren())}getChildren(){const{children:O,dataIdAttr:b,selectedClass:E="sortable-selected",chosenClass:x="sortable-chosen",dragClass:_="sortable-drag",fallbackClass:k="sortable-falback",ghostClass:D="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:q="sortable-filter",list:H}=this.props;if(!O||O==null)return null;const ce=b||"data-id";return r.Children.map(O,(he,ye)=>{if(he===void 0)return;const ne=H[ye]||{},{className:R}=he.props,Y=typeof q=="string"&&{[q.replace(".","")]:!!ne.filtered},V=i(n)(R,F({[E]:ne.selected,[x]:ne.chosen},Y));return r.cloneElement(he,{[ce]:he.key,className:V})})}get sortable(){const O=this.ref.current;if(O===null)return null;const b=Object.keys(O).find(E=>E.includes("Sortable"));return b?O[b]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],b=["onChange","onClone","onFilter","onSort"],E=w(this.props);O.forEach(_=>E[_]=this.prepareOnHandlerPropAndDOM(_)),b.forEach(_=>E[_]=this.prepareOnHandlerProp(_));const x=(_,k)=>{const{onMove:D}=this.props,B=_.willInsertAfter||-1;if(!D)return B;const q=D(_,k,this.sortable,S);return typeof q=="undefined"?!1:q};return $(F({},E),{onMove:x})}prepareOnHandlerPropAndDOM(O){return b=>{this.callOnHandlerProp(b,O),this[O](b)}}prepareOnHandlerProp(O){return b=>{this.callOnHandlerProp(b,O)}}callOnHandlerProp(O,b){const E=this.props[b];E&&E(O,this.sortable,S)}onAdd(O){const{list:b,setList:E,clone:x}=this.props,_=[...S.dragging.props.list],k=d(O,_);c(k);const D=y(k,b,O,x).map(B=>Object.assign(B,{selected:!1}));E(D,this.sortable,S)}onRemove(O){const{list:b,setList:E}=this.props,x=h(O),_=d(O,b);f(_);let k=[...b];if(O.pullMode!=="clone")k=m(_,k);else{let D=_;switch(x){case"multidrag":D=_.map((B,q)=>$(F({},B),{element:O.clones[q]}));break;case"normal":D=_.map(B=>$(F({},B),{element:O.clone}));break;case"swap":default:i(o)(!0,`mode "${x}" cannot clone. Please remove "props.clone" from when using the "${x}" plugin`)}c(D),_.forEach(B=>{const q=B.oldIndex,H=this.props.clone(B.item,O);k.splice(q,1,H)})}k=k.map(D=>Object.assign(D,{selected:!1})),E(k,this.sortable,S)}onUpdate(O){const{list:b,setList:E}=this.props,x=d(O,b);c(x),f(x);const _=p(x,b);return E(_,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(_,{chosen:!0})),D});E(x,this.sortable,S)}onUnchoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(D,{chosen:!1})),D});E(x,this.sortable,S)}onSpill(O){const{removeOnSpill:b,revertOnSpill:E}=this.props;b&&!E&&l(O.item)}onSelect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;if(k===-1){console.log(`"${O.type}" had indice of "${_.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}x[k].selected=!0}),E(x,this.sortable,S)}onDeselect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;k!==-1&&(x[k].selected=!0)}),E(x,this.sortable,S)}}A.defaultProps={clone:C=>C};var T={};s(e.exports,T)})(rw);const $_="_container_xt7ji_1",H_="_list_xt7ji_6",V_="_item_xt7ji_15",J_="_keyField_xt7ji_29",Q_="_valueField_xt7ji_34",X_="_header_xt7ji_39",K_="_dragHandle_xt7ji_45",q_="_deleteButton_xt7ji_55",Z_="_addItemButton_xt7ji_65",eP="_separator_xt7ji_72",ft={container:$_,list:H_,item:V_,keyField:J_,valueField:Q_,header:X_,dragHandle:K_,deleteButton:q_,addItemButton:Z_,separator:eP};function qp({name:e,label:t,value:n,onChange:r,optional:o=!1,newItemValue:i={key:"myKey",value:"myValue"}}){const[a,s]=I.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),l=$r(r);I.useEffect(()=>{const f=tP(a);lA(f,n!=null?n:{})||l({name:e,value:f})},[e,l,a,n]);const u=I.useCallback(f=>{s(d=>d.filter(({id:p})=>p!==f))},[]),c=I.useCallback(()=>{s(f=>[...f,F({id:-1},i)].map((d,p)=>$(F({},d),{id:p})))},[i]);return N("div",{className:ft.container,children:[g(ti,{category:e!=null?e:t}),N("div",{className:ft.list,children:[N("div",{className:ft.item+" "+ft.header,children:[g("span",{className:ft.keyField,children:"Key"}),g("span",{className:ft.valueField,children:"Value"})]}),g(rw.exports.ReactSortable,{list:a,setList:s,handle:`.${ft.dragHandle}`,children:a.map((f,d)=>N("div",{className:ft.item,children:[g("div",{className:ft.dragHandle,title:"Reorder list",children:g(o_,{})}),g("input",{className:ft.keyField,type:"text",value:f.key,onChange:p=>{const m=[...a];m[d]=$(F({},f),{key:p.target.value}),s(m)}}),g("span",{className:ft.separator,children:":"}),g("input",{className:ft.valueField,type:"text",value:f.value,onChange:p=>{const m=[...a];m[d]=$(F({},f),{value:p.target.value}),s(m)}}),g(wt,{className:ft.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:g(Sp,{})})]},f.id))}),g(wt,{className:ft.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:g(C1,{})})]})]})}function tP(e){return e.reduce((n,{key:r,value:o})=>(n[r]=o,n),{})}const nP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),rP="_container_162lp_1",oP="_checkbox_162lp_14",Mc={container:rP,checkbox:oP},iP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices;return N("div",$(F({ref:r,className:Mc.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:Object.keys(o).map((i,a)=>g("div",{className:Mc.radio,children:N("label",{className:Mc.checkbox,children:[g("input",{type:"checkbox",name:o[i],value:o[i],defaultChecked:a===0}),g("span",{children:i})]})},i))}),e]}))},aP={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},sP={title:"Checkbox Group",UiComponent:iP,SettingsComponent:nP,acceptsChildren:!1,defaultSettings:aP,iconSrc:t_,category:"Inputs"},lP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",uP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(tw,{label:"Starting value",name:"value",value:e.value}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),cP="_container_1x0tz_1",fP="_label_1x0tz_10",ng={container:cP,label:fP},dP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=(l=t.width)!=null?l:"auto",i=F({},t),[a,s]=j.exports.useState(i.value);return j.exports.useEffect(()=>{s(i.value)},[i.value]),N("div",$(F({className:ng.container+" shiny::checkbox",style:{width:o},"aria-label":"shiny::checkbox",ref:r},n),{children:[N("label",{htmlFor:i.inputId,children:[g("input",{id:i.inputId,type:"checkbox",checked:a,onChange:u=>s(u.target.checked)}),g("span",{className:ng.label,children:i.label})]}),e]}))},pP={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},hP={title:"Checkbox Input",UiComponent:dP,SettingsComponent:uP,acceptsChildren:!1,defaultSettings:pP,iconSrc:lP,category:"Inputs"},mP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",vP="_wrappedSection_1dn9g_1",gP="_sectionContainer_1dn9g_9",zl={wrappedSection:vP,sectionContainer:gP},gw=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.wrappedSection,children:t})]}),yP=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.inputSection,children:t})]}),wP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(gw,{name:"Values",children:[g(Hn,{name:"value",value:e.value}),g(Hn,{name:"min",value:e.min,optional:!0,defaultValue:0}),g(Hn,{name:"max",value:e.max,optional:!0,defaultValue:10}),g(Hn,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),SP="_container_yicbr_1",bP={container:SP},EP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=F({},t),i=(l=o.width)!=null?l:"200px",[a,s]=j.exports.useState(o.value);return j.exports.useEffect(()=>{s(o.value)},[o.value]),N("div",$(F({className:bP.container+" shiny::numericInput",style:{width:i},"aria-label":"shiny::numericInput",ref:r},n),{children:[g("span",{children:o.label}),g("input",{type:"number",value:a,onChange:u=>s(Number(u.target.value)),min:o.min,max:o.max,step:o.step}),e]}))},CP={inputId:"myNumericInput",label:"Numeric Input",value:10},AP={title:"Numeric Input",UiComponent:EP,SettingsComponent:wP,acceptsChildren:!1,defaultSettings:CP,iconSrc:mP,category:"Inputs"},xP=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>N(Me,{children:[g(pe,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),g(yn,{name:"width",units:["px","%"],value:t}),g(yn,{name:"height",units:["px","%"],value:n})]}),OP=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:o,compRef:i})=>N("div",$(F({className:Jf.container,ref:i,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},o),{children:[g(ew,{outputId:e}),r]})),_P={title:"Plot Output",UiComponent:OP,SettingsComponent:xP,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:q1,category:"Outputs"},PP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",kP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),TP="_container_sgn7c_1",rg={container:TP},IP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=Object.keys(o),a=Object.values(o),[s,l]=I.useState(a[0]);return I.useEffect(()=>{a.includes(s)||l(a[0])},[s,a]),N("div",$(F({ref:r,className:rg.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:a.map((u,c)=>g("div",{className:rg.radio,children:N("label",{children:[g("input",{type:"radio",name:t.inputId,value:u,onChange:f=>l(f.target.value),checked:u===s}),g("span",{children:i[c]})]})},u))}),e]}))},NP={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},DP={title:"Radio Buttons",UiComponent:IP,SettingsComponent:kP,acceptsChildren:!1,defaultSettings:NP,iconSrc:PP,category:"Inputs"},RP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",LP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),MP="_container_1e5dd_1",FP={container:MP},UP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=t.inputId;return N("div",$(F({ref:r,className:FP.container},n),{children:[g("label",{htmlFor:i,children:t.label}),g("select",{id:i,children:Object.keys(o).map((a,s)=>g("option",{value:o[a],children:a},a))}),e]}))},BP={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},jP={title:"Select Input",UiComponent:UP,SettingsComponent:LP,acceptsChildren:!1,defaultSettings:BP,iconSrc:RP,category:"Inputs"},WP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",YP=({settings:e})=>{const t=F({},e);return N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:t.inputId}),g(pe,{name:"label",value:t.label}),N(gw,{name:"Values",children:[g(Hn,{name:"min",value:t.min}),g(Hn,{name:"max",value:t.max}),g(Hn,{name:"value",label:"start",value:t.value}),g(Hn,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},zP="_container_1f2js_1",GP="_sliderWrapper_1f2js_11",$P="_sliderInput_1f2js_16",Fc={container:zP,sliderWrapper:GP,sliderInput:$P},HP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=F({},t),{width:i="200px"}=o,[a,s]=j.exports.useState(o.value);return N("div",$(F({className:Fc.container+" shiny::sliderInput",style:{width:i},"aria-label":"shiny::sliderInput",ref:r},n),{children:[g("div",{children:o.label}),g("div",{className:Fc.sliderWrapper,children:g("input",{type:"range",min:o.min,max:o.max,value:a,onChange:l=>s(Number(l.target.value)),className:"slider "+Fc.sliderInput,"aria-label":"slider input","data-min":o.min,"data-max":o.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),N("div",{children:[g(Z1,{type:"input",name:o.inputId})," = ",a]}),e]}))},VP={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},JP={title:"Slider Input",UiComponent:HP,SettingsComponent:YP,acceptsChildren:!1,defaultSettings:VP,iconSrc:WP,category:"Inputs"},QP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",XP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(yP,{name:"Values",children:[g(pe,{name:"value",value:e.value}),g(pe,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),KP="_container_yicbr_1",qP={container:KP},ZP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o="200px",i="auto",a=F({},t),[s,l]=j.exports.useState(a.value);return j.exports.useEffect(()=>{l(a.value)},[a.value]),N("div",$(F({className:qP.container+" shiny::textInput",style:{height:i,width:o},"aria-label":"shiny::textInput",ref:r},n),{children:[g("label",{htmlFor:a.inputId,children:a.label}),g("input",{id:a.inputId,type:"text",value:s,onChange:u=>l(u.target.value),placeholder:a.placeholder}),e]}))},ek={inputId:"myTextInput",label:"Text Input",value:""},tk={title:"Text Input",UiComponent:ZP,SettingsComponent:XP,acceptsChildren:!1,defaultSettings:ek,iconSrc:QP,category:"Inputs"},nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",rk=({settings:e})=>g(pe,{label:"Output ID",name:"outputId",value:e.outputId}),ok="_container_1i6yi_1",ik={container:ok},ak=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>N("div",$(F({className:ik.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",N("code",{children:["output$",e.outputId]}),t]})),sk={title:"Text Output",UiComponent:ak,SettingsComponent:rk,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:nk,category:"Outputs"},lk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",uk=({settings:e})=>{var t;return g(pe,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},ck="_container_1xnzo_1",fk={container:ck},dk=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:o="shiny-ui-output"}=e;return N("div",$(F({className:fk.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",o,"!"]}),t]}))},pk={title:"Dynamic UI Output",UiComponent:dk,SettingsComponent:uk,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:lk,category:"Outputs"};function hk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function mk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function vk(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const gk="_container_p6wnj_1",yk="_infoMsg_p6wnj_14",wk="_codeHolder_p6wnj_19",ed={container:gk,infoMsg:yk,codeHolder:wk},Sk=({settings:e})=>N("div",{children:[g("div",{className:kn.container,children:N("span",{className:ed.infoMsg,children:[g(hk,{}),"Unknown function call. Can't modify with visual editor."]})}),g(ti,{category:"Code"}),g("div",{className:kn.container,children:g("pre",{className:ed.codeHolder,children:vk(e.text)})})]}),bk=20,Ek=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const o=e.text.slice(0,bk).replaceAll(/\s$/g,"")+"...";return N("div",$(F({className:ed.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{children:["unknown ui output: ",g("code",{children:o})]}),t]}))},Ck={title:"Unknown UI Function",UiComponent:Ek,SettingsComponent:Sk,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},en={"shiny::actionButton":e_,"shiny::numericInput":AP,"shiny::sliderInput":JP,"shiny::textInput":tk,"shiny::checkboxInput":hP,"shiny::checkboxGroupInput":sP,"shiny::selectInput":jP,"shiny::radioButtons":DP,"shiny::plotOutput":_P,"shiny::textOutput":sk,"shiny::uiOutput":pk,"gridlayout::grid_page":J4,"gridlayout::grid_card":w4,"gridlayout::grid_card_text":G4,"gridlayout::grid_card_plot":k4,unknownUiFunction:Ck};function Ak(e,{path:t,node:n}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=rr(e,t);Object.assign(r,n)}const Zp={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},yw=vp({name:"uiTree",initialState:Zp,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>ww(t.payload.initialState),UPDATE_NODE:(e,t)=>{Ak(e,t.payload)},PLACE_NODE:(e,t)=>{yx(e,t.payload)},DELETE_NODE:(e,t)=>{E1(e,t.payload)}}});function ww(e){const t=en[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return hx(r,n).length>0&&(e.uiArguments=F(F({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(i=>ww(i)),e}const{UPDATE_NODE:Sw,PLACE_NODE:xk,DELETE_NODE:bw,INIT_STATE:Ok,SET_FULL_STATE:_k}=yw.actions;function Ew(){const e=vr();return I.useCallback(n=>{e(xk(n))},[e])}const Pk=yw.reducer,Cw=oA();Cw.startListening({actionCreator:bw,effect:(e,t)=>Eh(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Xa(n,r)&&t.dispatch(cA()),r.lengthi)return;const a=[...r];a[n.length-1]=i-1,t.dispatch(c1({path:a}))})});const kk=Cw.middleware,Tk=FC({reducer:{uiTree:Pk,selectedPath:fA,connectedToServer:sA},middleware:e=>e().concat(kk)}),Ik=({children:e})=>g(jE,{store:Tk,children:e}),Nk=!1,Dk=!0;console.log("Env Vars",{VITE_PREBUILT_TREE:"True",VITE_SHOW_FAKE_PREVIEW:"TRUE",BASE_URL:"./",MODE:"production",DEV:!1,PROD:!0});const Zs={ws:null,msg:null},Aw=$(F({},Zs),{status:"connecting"});function Rk(e,t){switch(t.type){case"CONNECTED":return $(F({},Zs),{status:"connected",ws:t.ws});case"FAILED":return $(F({},Zs),{status:"failed-to-open"});case"CLOSED":return $(F({},Zs),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function Lk(){const[e,t]=I.useReducer(Rk,Aw),n=I.useRef(!1);return I.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=Nk?"localhost:8888":window.location.host,o=new WebSocket(`ws://${r}`);return o.onerror=i=>{console.error("Error with httpuv websocket connection",i)},o.onopen=i=>{n.current=!0,t({type:"CONNECTED",ws:o})},o.onclose=i=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>o.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const xw=I.createContext(Aw),Mk=({children:e})=>{const t=Lk();return g(xw.Provider,{value:t,children:e})};function Ow(){return I.useContext(xw)}function Fk(e){return JSON.parse(e.data)}function _w(e,t){e.addEventListener("message",n=>{t(Fk(n))})}function td(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const Uk="_appViewerHolder_wu0cb_1",Bk="_title_wu0cb_55",jk="_appContainer_wu0cb_89",Wk="_previewFrame_wu0cb_109",Yk="_expandButton_wu0cb_134",zk="_reloadButton_wu0cb_135",Gk="_spin_wu0cb_160",$k="_restartButton_wu0cb_198",Hk="_loadingMessage_wu0cb_225",Vk="_error_wu0cb_236",mt={appViewerHolder:Uk,title:Bk,appContainer:jk,previewFrame:Wk,expandButton:Yk,reloadButton:zk,spin:Gk,restartButton:$k,loadingMessage:Hk,error:Vk},Jk="_fakeApp_t3dh1_1",Qk="_fakeDashboard_t3dh1_7",Xk="_header_t3dh1_22",Kk="_sidebar_t3dh1_31",qk="_top_t3dh1_35",Zk="_bottom_t3dh1_39",Ei={fakeApp:Jk,fakeDashboard:Qk,header:Xk,sidebar:Kk,top:qk,bottom:Zk},eT=()=>g("div",{className:mt.appContainer,children:N("div",{className:Ei.fakeDashboard+" "+mt.previewFrame,children:[g("div",{className:Ei.header,children:g("h1",{children:"App preview not available"})}),g("div",{className:Ei.sidebar}),g("div",{className:Ei.top}),g("div",{className:Ei.bottom})]})});function tT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function nT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function rT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function oT(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const iT="_logs_xjp5l_2",aT="_logsContents_xjp5l_25",sT="_expandTab_xjp5l_29",lT="_clearLogsButton_xjp5l_69",uT="_logLine_xjp5l_75",cT="_noLogsMsg_xjp5l_81",fT="_expandedLogs_xjp5l_93",dT="_expandLogsButton_xjp5l_101",pT="_unseenLogsNotification_xjp5l_108",hT="_slidein_xjp5l_1",br={logs:iT,logsContents:aT,expandTab:sT,clearLogsButton:lT,logLine:uT,noLogsMsg:cT,expandedLogs:fT,expandLogsButton:dT,unseenLogsNotification:pT,slidein:hT};function mT({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:o}=vT(e),i=e.length===0;return N("div",{className:br.logs,"data-expanded":n,children:[N("button",{className:br.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[g(rT,{className:br.unseenLogsNotification,"data-show":o}),"App Logs",n?g(tT,{}):g(nT,{})]}),N("div",{className:br.logsContents,children:[i?g("p",{className:br.noLogsMsg,children:"No recent logs"}):e.map((a,s)=>g("p",{className:br.logLine,children:a},s)),i?null:g(wt,{variant:"icon",title:"clear logs",className:br.clearLogsButton,onClick:t,children:g(oT,{})})]})]})}function vT(e){const[t,n]=I.useState(!1),[r,o]=I.useState(!1),[i,a]=I.useState(null),[s,l]=I.useState(new Date),u=I.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),o(!1)},[t]);return I.useEffect(()=>{l(new Date)},[e]),I.useEffect(()=>{if(t||e.length===0){o(!1);return}if(i===null||i{u==="connected"&&(ia(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>ia(c,{path:"APP-PREVIEW-RESTART"})),m(()=>()=>ia(c,{path:"APP-PREVIEW-STOP"})),_w(c,w=>{if(!gT(w))return;const{path:S,payload:A}=w;switch(S){case"SHINY_READY":l(!1),a(!1),n(A);break;case"SHINY_LOGS":o(wT(A));break;case"SHINY_CRASH":l(A);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:w})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=I.useState(()=>()=>console.log("No app running to reset")),[p,m]=I.useState(()=>()=>console.log("No app running to stop")),y=I.useCallback(()=>{o([])},[]),h={appLogs:r,clearLogs:y,restartApp:f,stopApp:p};return i?Object.assign(h,{status:"no-preview",appLoc:null}):s?Object.assign(h,{status:"crashed",error:s,appLoc:null}):t?Object.assign(h,{status:"finished",appLoc:t,error:null}):Object.assign(h,{status:"loading",appLoc:null,error:null})}function wT(e){return Array.isArray(e)?e:[e]}function ST(){const[e,t]=I.useState(.2),n=xT();return I.useEffect(()=>{!n||t(bT(n.width))},[n]),e}function bT(e){const t=mS-Pw*2,n=e-kw*2;return t/n}const Pw=16,kw=55;function ET(){const e=I.useRef(null),[t,n]=I.useState(!1),r=I.useCallback(()=>{n(f=>!f)},[]),{status:o,appLoc:i,appLogs:a,clearLogs:s,restartApp:l}=yT(),u=ST(),c=I.useCallback(f=>{!e.current||!i||(e.current.src=i,OT(f.currentTarget))},[i]);return o==="no-preview"&&!Dk?null:N(Me,{children:[N("h3",{className:mt.title+" "+Q1.panelTitleHeader,children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),"App Preview"]}),g("div",{className:mt.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Pw}px`,"--expanded-inset-horizontal":`${kw}px`},children:o==="loading"?g(AT,{}):o==="crashed"?g(CT,{onClick:l}):N(Me,{children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),N("div",{className:mt.appContainer,children:[o==="no-preview"?g(eT,{}):g("iframe",{className:mt.previewFrame,src:i,title:"Application Preview",ref:e}),g(wt,{variant:"icon",className:mt.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?g(mk,{}):g(xx,{})})]}),g(mT,{appLogs:a,clearLogs:s})]})})]})}function CT({onClick:e}){return N("div",{className:mt.appContainer,children:[N("p",{children:["App preview crashed.",g("br",{})," Try and restart?"]}),N(wt,{className:mt.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",g(td,{})]})]})}function AT(){return g("div",{className:mt.loadingMessage,children:g("h2",{children:"Loading app preview..."})})}function xT(){const[e,t]=I.useState(null),n=I.useMemo(()=>Fp(()=>{const{innerWidth:r,innerHeight:o}=window;t({width:r,height:o})},500),[]);return I.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function OT(e){e.classList.add(mt.spin),e.addEventListener("animationend",()=>e.classList.remove(mt.spin),!1)}const _T=e=>g("svg",$(F({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:g("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class PT{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function kT(){const e=Ja(c=>c.uiTree),t=vr(),[n,r]=I.useState(!1),[o,i]=I.useState(!1),a=I.useRef(new PT({comparisonFn:TT}));I.useEffect(()=>{if(!e||e===Zp)return;const c=a.current;c.addEntry(e),i(c.canGoBackwards()),r(c.canGoForwards())},[e]);const s=I.useCallback(c=>{t(_k({state:c}))},[t]),l=I.useCallback(()=>{console.log("Navigating backwards"),s(a.current.goBackwards())},[s]),u=I.useCallback(()=>{console.log("Navigating forwards"),s(a.current.goForwards())},[s]);return{goBackward:l,goForward:u,canGoBackward:o,canGoForward:n}}function TT(e,t){return typeof t=="undefined"?!1:e===t}const IT="_container_1d7pe_1",NT={container:IT};function DT(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=kT();return N("div",{className:NT.container+" undo-redo-buttons",children:[g(wt,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:g(PA,{height:"100%"})}),g(wt,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:g(_A,{height:"100%"})})]})}const RT="_elementsPalette_zecez_1",LT="_OptionItem_zecez_18",MT="_OptionIcon_zecez_27",FT="_OptionLabel_zecez_35",el={elementsPalette:RT,OptionItem:LT,OptionIcon:MT,OptionLabel:FT},og=["Inputs","Outputs","gridlayout","uncategorized"];function UT(e,t){var o,i;const n=og.indexOf(((o=en[e])==null?void 0:o.category)||"uncategorized"),r=og.indexOf(((i=en[t])==null?void 0:i.category)||"uncategorized");return nr?1:0}function BT({availableUi:e=en}){const t=j.exports.useMemo(()=>Object.keys(e).sort(UT),[e]);return g("div",{className:el.elementsPalette,children:t.map(n=>g(jT,{uiName:n},n))})}function jT({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r}=en[e],o={uiName:e,uiArguments:r},i=j.exports.useRef(null);return g1({ref:i,nodeInfo:{node:o}}),t===void 0?null:N("div",{ref:i,className:el.OptionItem,"data-ui-name":e,children:[g("img",{src:t,alt:n,className:el.OptionIcon}),g("label",{className:el.OptionLabel,children:n})]})}function Tw(e){return function(t){return typeof t===e}}var WT=Tw("function"),YT=function(e){return e===null},ig=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},ag=function(e){return!zT(e)&&!YT(e)&&(WT(e)||typeof e=="object")},zT=Tw("undefined"),nd=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function GT(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!vt(e[r],t[r]))return!1;return!0}function $T(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),o=e.byteLength;o--;)if(n.getUint8(o)!==r.getUint8(o))return!1;return!0}function HT(e,t){var n,r,o,i;if(e.size!==t.size)return!1;try{for(var a=nd(e.entries()),s=a.next();!s.done;s=a.next()){var l=s.value;if(!t.has(l[0]))return!1}}catch(f){n={error:f}}finally{try{s&&!s.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=nd(e.entries()),c=u.next();!c.done;c=u.next()){var l=c.value;if(!vt(l[1],t.get(l[0])))return!1}}catch(f){o={error:f}}finally{try{c&&!c.done&&(i=u.return)&&i.call(u)}finally{if(o)throw o.error}}return!0}function VT(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var o=nd(e.entries()),i=o.next();!i.done;i=o.next()){var a=i.value;if(!t.has(a[0]))return!1}}catch(s){n={error:s}}finally{try{i&&!i.done&&(r=o.return)&&r.call(o)}finally{if(n)throw n.error}}return!0}function vt(e,t){if(e===t)return!0;if(e&&ag(e)&&t&&ag(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return GT(e,t);if(e instanceof Map&&t instanceof Map)return HT(e,t);if(e instanceof Set&&t instanceof Set)return VT(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return $T(e,t);if(ig(e)&&ig(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var o=n.length;o--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[o]))return!1;for(var o=n.length;o--!==0;){var i=n[o];if(!(i==="_owner"&&e.$$typeof)&&!vt(e[i],t[i]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var JT=["innerHTML","ownerDocument","style","attributes","nodeValue"],QT=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],XT=["bigint","boolean","null","number","string","symbol","undefined"];function ku(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(KT(t))return t}function rn(e){return function(t){return ku(t)===e}}function KT(e){return QT.includes(e)}function ni(e){return function(t){return typeof t===e}}function qT(e){return XT.includes(e)}function P(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(P.array(e))return"Array";if(P.plainFunction(e))return"Function";var t=ku(e);return t||"Object"}P.array=Array.isArray;P.arrayOf=function(e,t){return!P.array(e)&&!P.function(t)?!1:e.every(function(n){return t(n)})};P.asyncGeneratorFunction=function(e){return ku(e)==="AsyncGeneratorFunction"};P.asyncFunction=rn("AsyncFunction");P.bigint=ni("bigint");P.boolean=function(e){return e===!0||e===!1};P.date=rn("Date");P.defined=function(e){return!P.undefined(e)};P.domElement=function(e){return P.object(e)&&!P.plainObject(e)&&e.nodeType===1&&P.string(e.nodeName)&&JT.every(function(t){return t in e})};P.empty=function(e){return P.string(e)&&e.length===0||P.array(e)&&e.length===0||P.object(e)&&!P.map(e)&&!P.set(e)&&Object.keys(e).length===0||P.set(e)&&e.size===0||P.map(e)&&e.size===0};P.error=rn("Error");P.function=ni("function");P.generator=function(e){return P.iterable(e)&&P.function(e.next)&&P.function(e.throw)};P.generatorFunction=rn("GeneratorFunction");P.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};P.iterable=function(e){return!P.nullOrUndefined(e)&&P.function(e[Symbol.iterator])};P.map=rn("Map");P.nan=function(e){return Number.isNaN(e)};P.null=function(e){return e===null};P.nullOrUndefined=function(e){return P.null(e)||P.undefined(e)};P.number=function(e){return ni("number")(e)&&!P.nan(e)};P.numericString=function(e){return P.string(e)&&e.length>0&&!Number.isNaN(Number(e))};P.object=function(e){return!P.nullOrUndefined(e)&&(P.function(e)||typeof e=="object")};P.oneOf=function(e,t){return P.array(e)?e.indexOf(t)>-1:!1};P.plainFunction=rn("Function");P.plainObject=function(e){if(ku(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};P.primitive=function(e){return P.null(e)||qT(typeof e)};P.promise=rn("Promise");P.propertyOf=function(e,t,n){if(!P.object(e)||!t)return!1;var r=e[t];return P.function(n)?n(r):P.defined(r)};P.regexp=rn("RegExp");P.set=rn("Set");P.string=ni("string");P.symbol=ni("symbol");P.undefined=ni("undefined");P.weakMap=rn("WeakMap");P.weakSet=rn("WeakSet");function ZT(){for(var e=[],t=0;tl);return P.undefined(r)||(u=u&&l===r),P.undefined(i)||(u=u&&s===i),u}function lg(e,t,n){var r=n.key,o=n.type,i=n.value,a=cn(e,r),s=cn(t,r),l=o==="added"?a:s,u=o==="added"?s:a;if(!P.nullOrUndefined(i)){if(P.defined(l)){if(P.array(l)||P.plainObject(l))return e6(l,u,i)}else return vt(u,i);return!1}return[a,s].every(P.array)?!u.every(eh(l)):[a,s].every(P.plainObject)?t6(Object.keys(l),Object.keys(u)):![a,s].every(function(c){return P.primitive(c)&&P.defined(c)})&&(o==="added"?!P.defined(a)&&P.defined(s):P.defined(a)&&!P.defined(s))}function ug(e,t,n){var r=n===void 0?{}:n,o=r.key,i=cn(e,o),a=cn(t,o);if(!Iw(i,a))throw new TypeError("Inputs have different types");if(!ZT(i,a))throw new TypeError("Inputs don't have length");return[i,a].every(P.plainObject)&&(i=Object.keys(i),a=Object.keys(a)),[i,a]}function cg(e){return function(t){var n=t[0],r=t[1];return P.array(e)?vt(e,r)||e.some(function(o){return vt(o,r)||P.array(r)&&eh(r)(o)}):P.plainObject(e)&&e[n]?!!e[n]&&vt(e[n],r):vt(e,r)}}function t6(e,t){return t.some(function(n){return!e.includes(n)})}function fg(e){return function(t){return P.array(e)?e.some(function(n){return vt(n,t)||P.array(t)&&eh(t)(n)}):vt(e,t)}}function Ci(e,t){return P.array(e)?e.some(function(n){return vt(n,t)}):vt(e,t)}function eh(e){return function(t){return e.some(function(n){return vt(n,t)})}}function Iw(){for(var e=[],t=0;t=0)return 1;return 0}();function R6(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function L6(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},D6))}}var M6=ns&&window.Promise,F6=M6?R6:L6;function Bw(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Hr(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function oh(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function rs(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Hr(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/(auto|scroll|overlay)/.test(n+o+r)?e:rs(oh(e))}function jw(e){return e&&e.referenceNode?e.referenceNode:e}var vg=ns&&!!(window.MSInputMethodContext&&document.documentMode),gg=ns&&/MSIE 10/.test(navigator.userAgent);function ri(e){return e===11?vg:e===10?gg:vg||gg}function Wo(e){if(!e)return document.documentElement;for(var t=ri(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Hr(n,"position")==="static"?Wo(n):n}function U6(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Wo(e.firstElementChild)===e}function rd(e){return e.parentNode!==null?rd(e.parentNode):e}function $l(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,o=n?t:e,i=document.createRange();i.setStart(r,0),i.setEnd(o,0);var a=i.commonAncestorContainer;if(e!==a&&t!==a||r.contains(o))return U6(a)?a:Wo(a);var s=rd(e);return s.host?$l(s.host,t):$l(e,rd(t).host)}function Yo(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var o=e.ownerDocument.documentElement,i=e.ownerDocument.scrollingElement||o;return i[n]}return e[n]}function B6(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Yo(t,"top"),o=Yo(t,"left"),i=n?-1:1;return e.top+=r*i,e.bottom+=r*i,e.left+=o*i,e.right+=o*i,e}function yg(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function wg(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],ri(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function Ww(e){var t=e.body,n=e.documentElement,r=ri(10)&&getComputedStyle(n);return{height:wg("Height",t,n,r),width:wg("Width",t,n,r)}}var j6=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},W6=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=ri(10),o=t.nodeName==="HTML",i=od(e),a=od(t),s=rs(e),l=Hr(t),u=parseFloat(l.borderTopWidth),c=parseFloat(l.borderLeftWidth);n&&o&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=pr({top:i.top-a.top-u,left:i.left-a.left-c,width:i.width,height:i.height});if(f.marginTop=0,f.marginLeft=0,!r&&o){var d=parseFloat(l.marginTop),p=parseFloat(l.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(s):t===s&&s.nodeName!=="BODY")&&(f=B6(f,t)),f}function Y6(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=ih(e,n),o=Math.max(n.clientWidth,window.innerWidth||0),i=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Yo(n),s=t?0:Yo(n,"left"),l={top:a-r.top+r.marginTop,left:s-r.left+r.marginLeft,width:o,height:i};return pr(l)}function Yw(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Hr(e,"position")==="fixed")return!0;var n=oh(e);return n?Yw(n):!1}function zw(e){if(!e||!e.parentElement||ri())return document.documentElement;for(var t=e.parentElement;t&&Hr(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function ah(e,t,n,r){var o=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,i={top:0,left:0},a=o?zw(e):$l(e,jw(t));if(r==="viewport")i=Y6(a,o);else{var s=void 0;r==="scrollParent"?(s=rs(oh(t)),s.nodeName==="BODY"&&(s=e.ownerDocument.documentElement)):r==="window"?s=e.ownerDocument.documentElement:s=r;var l=ih(s,a,o);if(s.nodeName==="HTML"&&!Yw(a)){var u=Ww(e.ownerDocument),c=u.height,f=u.width;i.top+=l.top-l.marginTop,i.bottom=c+l.top,i.left+=l.left-l.marginLeft,i.right=f+l.left}else i=l}n=n||0;var d=typeof n=="number";return i.left+=d?n:n.left||0,i.top+=d?n:n.top||0,i.right-=d?n:n.right||0,i.bottom-=d?n:n.bottom||0,i}function z6(e){var t=e.width,n=e.height;return t*n}function Gw(e,t,n,r,o){var i=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=ah(n,r,i,o),s={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},l=Object.keys(s).map(function(d){return Mt({key:d},s[d],{area:z6(s[d])})}).sort(function(d,p){return p.area-d.area}),u=l.filter(function(d){var p=d.width,m=d.height;return p>=n.clientWidth&&m>=n.clientHeight}),c=u.length>0?u[0].key:l[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function $w(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,o=r?zw(t):$l(t,jw(n));return ih(n,o,r)}function Hw(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),o=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),i={width:e.offsetWidth+o,height:e.offsetHeight+r};return i}function Hl(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function Vw(e,t,n){n=n.split("-")[0];var r=Hw(e),o={width:r.width,height:r.height},i=["right","left"].indexOf(n)!==-1,a=i?"top":"left",s=i?"left":"top",l=i?"height":"width",u=i?"width":"height";return o[a]=t[a]+t[l]/2-r[l]/2,n===s?o[s]=t[s]-r[u]:o[s]=t[Hl(s)],o}function os(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function G6(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(o){return o[t]===n});var r=os(e,function(o){return o[t]===n});return e.indexOf(r)}function Jw(e,t,n){var r=n===void 0?e:e.slice(0,G6(e,"name",n));return r.forEach(function(o){o.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var i=o.function||o.fn;o.enabled&&Bw(i)&&(t.offsets.popper=pr(t.offsets.popper),t.offsets.reference=pr(t.offsets.reference),t=i(t,o))}),t}function $6(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=$w(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=Gw(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=Vw(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=Jw(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function Qw(e,t){return e.some(function(n){var r=n.name,o=n.enabled;return o&&r===t})}function sh(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=s[f]+m-a[p]),e.offsets.popper=pr(e.offsets.popper);var y=s[f]+s[u]/2-m/2,h=Hr(e.instance.popper),v=parseFloat(h["margin"+c]),w=parseFloat(h["border"+c+"Width"]),S=y-e.offsets.popper[f]-v-w;return S=Math.max(Math.min(a[u]-m,S),0),e.arrowElement=r,e.offsets.arrow=(n={},zo(n,f,Math.round(S)),zo(n,d,""),n),e}function oI(e){return e==="end"?"start":e==="start"?"end":e}var Zw=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],Uc=Zw.slice(3);function Sg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=Uc.indexOf(e),r=Uc.slice(n+1).concat(Uc.slice(0,n));return t?r.reverse():r}var Bc={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function iI(e,t){if(Qw(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=ah(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],o=Hl(r),i=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case Bc.FLIP:a=[r,o];break;case Bc.CLOCKWISE:a=Sg(r);break;case Bc.COUNTERCLOCKWISE:a=Sg(r,!0);break;default:a=t.behavior}return a.forEach(function(s,l){if(r!==s||a.length===l+1)return e;r=e.placement.split("-")[0],o=Hl(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),y=f(u.top)f(n.bottom),v=r==="left"&&p||r==="right"&&m||r==="top"&&y||r==="bottom"&&h,w=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(w&&i==="start"&&p||w&&i==="end"&&m||!w&&i==="start"&&y||!w&&i==="end"&&h),A=!!t.flipVariationsByContent&&(w&&i==="start"&&m||w&&i==="end"&&p||!w&&i==="start"&&h||!w&&i==="end"&&y),T=S||A;(d||v||T)&&(e.flipped=!0,(d||v)&&(r=a[l+1]),T&&(i=oI(i)),e.placement=r+(i?"-"+i:""),e.offsets.popper=Mt({},e.offsets.popper,Vw(e.instance.popper,e.offsets.reference,e.placement)),e=Jw(e.instance.modifiers,e,"flip"))}),e}function aI(e){var t=e.offsets,n=t.popper,r=t.reference,o=e.placement.split("-")[0],i=Math.floor,a=["top","bottom"].indexOf(o)!==-1,s=a?"right":"bottom",l=a?"left":"top",u=a?"width":"height";return n[s]i(r[s])&&(e.offsets.popper[l]=i(r[s])),e}function sI(e,t,n,r){var o=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),i=+o[1],a=o[2];if(!i)return e;if(a.indexOf("%")===0){var s=void 0;switch(a){case"%p":s=n;break;case"%":case"%r":default:s=r}var l=pr(s);return l[t]/100*i}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*i}else return i}function lI(e,t,n,r){var o=[0,0],i=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),s=a.indexOf(os(a,function(c){return c.search(/,|\s/)!==-1}));a[s]&&a[s].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var l=/\s*,\s*|\s+/,u=s!==-1?[a.slice(0,s).concat([a[s].split(l)[0]]),[a[s].split(l)[1]].concat(a.slice(s+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!i:i)?"height":"width",p=!1;return c.reduce(function(m,y){return m[m.length-1]===""&&["+","-"].indexOf(y)!==-1?(m[m.length-1]=y,p=!0,m):p?(m[m.length-1]+=y,p=!1,m):m.concat(y)},[]).map(function(m){return sI(m,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){lh(d)&&(o[f]+=d*(c[p-1]==="-"?-1:1))})}),o}function uI(e,t){var n=t.offset,r=e.placement,o=e.offsets,i=o.popper,a=o.reference,s=r.split("-")[0],l=void 0;return lh(+n)?l=[+n,0]:l=lI(n,i,a,s),s==="left"?(i.top+=l[0],i.left-=l[1]):s==="right"?(i.top+=l[0],i.left+=l[1]):s==="top"?(i.left+=l[0],i.top-=l[1]):s==="bottom"&&(i.left+=l[0],i.top+=l[1]),e.popper=i,e}function cI(e,t){var n=t.boundariesElement||Wo(e.instance.popper);e.instance.reference===n&&(n=Wo(n));var r=sh("transform"),o=e.instance.popper.style,i=o.top,a=o.left,s=o[r];o.top="",o.left="",o[r]="";var l=ah(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);o.top=i,o.left=a,o[r]=s,t.boundaries=l;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var m=c[p];return c[p]l[p]&&!t.escapeWithReference&&(y=Math.min(c[m],l[p]-(p==="right"?c.width:c.height))),zo({},m,y)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=Mt({},c,f[p](d))}),e.offsets.popper=c,e}function fI(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var o=e.offsets,i=o.reference,a=o.popper,s=["bottom","top"].indexOf(n)!==-1,l=s?"left":"top",u=s?"width":"height",c={start:zo({},l,i[l]),end:zo({},l,i[l]+i[u]-a[u])};e.offsets.popper=Mt({},a,c[r])}return e}function dI(e){if(!qw(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=os(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};j6(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=F6(this.update.bind(this)),this.options=Mt({},e.Defaults,o),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(Mt({},e.Defaults.modifiers,o.modifiers)).forEach(function(a){r.options.modifiers[a]=Mt({},e.Defaults.modifiers[a]||{},o.modifiers?o.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return Mt({name:a},r.options.modifiers[a])}).sort(function(a,s){return a.order-s.order}),this.modifiers.forEach(function(a){a.enabled&&Bw(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var i=this.options.eventsEnabled;i&&this.enableEventListeners(),this.state.eventsEnabled=i}return W6(e,[{key:"update",value:function(){return $6.call(this)}},{key:"destroy",value:function(){return H6.call(this)}},{key:"enableEventListeners",value:function(){return J6.call(this)}},{key:"disableEventListeners",value:function(){return X6.call(this)}}]),e}();ju.Utils=(typeof window!="undefined"?window:global).PopperUtils;ju.placements=Zw;ju.Defaults=mI;const bg=ju;var eS={},tS={exports:{}};(function(e,t){(function(n,r){var o=r(n);e.exports=o})(Fg,function(n){var r=["N","E","A","D"];function o(b,E){b.super_=E,b.prototype=Object.create(E.prototype,{constructor:{value:b,enumerable:!1,writable:!0,configurable:!0}})}function i(b,E){Object.defineProperty(this,"kind",{value:b,enumerable:!0}),E&&E.length&&Object.defineProperty(this,"path",{value:E,enumerable:!0})}function a(b,E,x){a.super_.call(this,"E",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0}),Object.defineProperty(this,"rhs",{value:x,enumerable:!0})}o(a,i);function s(b,E){s.super_.call(this,"N",b),Object.defineProperty(this,"rhs",{value:E,enumerable:!0})}o(s,i);function l(b,E){l.super_.call(this,"D",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0})}o(l,i);function u(b,E,x){u.super_.call(this,"A",b),Object.defineProperty(this,"index",{value:E,enumerable:!0}),Object.defineProperty(this,"item",{value:x,enumerable:!0})}o(u,i);function c(b,E,x){var _=b.slice((x||E)+1||b.length);return b.length=E<0?b.length+E:E,b.push.apply(b,_),b}function f(b){var E=typeof b;return E!=="object"?E:b===Math?"math":b===null?"null":Array.isArray(b)?"array":Object.prototype.toString.call(b)==="[object Date]"?"date":typeof b.toString=="function"&&/^\/.*\//.test(b.toString())?"regexp":"object"}function d(b){var E=0;if(b.length===0)return E;for(var x=0;x0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,D),ue=ye!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,D);if(!le&&ue)x.push(new s(H,E));else if(!ue&&le)x.push(new l(H,b));else if(f(b)!==f(E))x.push(new a(H,b,E));else if(f(b)==="date"&&b-E!==0)x.push(new a(H,b,E));else if(he==="object"&&b!==null&&E!==null){for(ne=B.length-1;ne>-1;--ne)if(B[ne].lhs===b){V=!0;break}if(V)b!==E&&x.push(new a(H,b,E));else{if(B.push({lhs:b,rhs:E}),Array.isArray(b)){for(q&&(b.sort(function(Ue,rt){return p(Ue)-p(rt)}),E.sort(function(Ue,rt){return p(Ue)-p(rt)})),ne=E.length-1,R=b.length-1;ne>R;)x.push(new u(H,ne,new s(void 0,E[ne--])));for(;R>ne;)x.push(new u(H,R,new l(void 0,b[R--])));for(;ne>=0;--ne)m(b[ne],E[ne],x,_,H,ne,B,q)}else{var ze=Object.keys(b),Fe=Object.keys(E);for(ne=0;ne=0?(m(b[Y],E[Y],x,_,H,Y,B,q),Fe[V]=null):m(b[Y],void 0,x,_,H,Y,B,q);for(ne=0;ne -*/var vI={set:wI,get:gI,has:yI,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:SI};function gI(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,o){return r&&r[o]},e)}else return typeof t=="number"?e[t]:e;else return e}function yI(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a,s){return a==s.length-1?n.own?!!(o&&o.hasOwnProperty(i)):o!==null&&typeof o=="object"&&i in o:o&&o[i]},e)}else return typeof t=="number"?t in e:!1;else return!1}function wI(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a){const s=Number.isInteger(Number(r[a+1]));return o[i]=o[i]||(s?[]:{}),r.length==a+1&&(o[i]=n),o[i]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function SI(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var o=t.split("."),i=!1,a;return a=!!o.reduce(function(s,l){return i=i||s===n||!!s&&s[l]===n,s&&s[l]},e),r.validPath?i&&a:i}else return!1;else return!1}Object.defineProperty(eS,"__esModule",{value:!0});var bI=tS.exports,dt=vI;function EI(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(o)?o.indexOf(s)>=0:s===o;return l&&(i?u:!i)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var o=dt.get(e,n),i=dt.get(t,n),a=Array.isArray(r)?r.indexOf(o)<0:o!==r,s=Array.isArray(r)?r.indexOf(i)>=0:i===r;return a&&s},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return Eg(dt.get(e,n),dt.get(t,n))&&dt.get(e,n)dt.get(t,n)}}}var xI=eS.default=AI;function Cg(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Ee(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function nS(e,t){if(e==null)return{};var n=_I(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function bn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function rS(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:bn(e)}function ls(e){var t=OI();return function(){var r=Vl(e),o;if(t){var i=Vl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return rS(this,o)}}var PI={flip:{padding:20},preventOverflow:{padding:10}},ae={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},an=Dw.canUseDOM,Ai=nr.createPortal!==void 0;function jc(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ns(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd())}function kI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function TI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function II(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,o;o=function(a){n(a),TI(e,t,o)},kI(e,t,o,r)}function xg(){}var oS=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),an?(o.node=document.createElement("div"),r.id&&(o.node.id=r.id),r.zIndex&&(o.node.style.zIndex=r.zIndex),document.body.appendChild(o.node),o):rS(o)}return as(n,[{key:"componentDidMount",value:function(){!an||Ai||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!an||Ai||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!an||!this.node||(Ai||nr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!an)return null;var o=this.props,i=o.children,a=o.setRef;if(Ai)return nr.createPortal(i,this.node);var s=nr.unstable_renderSubtreeIntoContainer(this,i.length>1?g("div",{children:i}):i[0],this.node);return a(s),null}},{key:"renderReact16",value:function(){var o=this.props,i=o.hasChildren,a=o.placement,s=o.target;return i?this.renderPortal():s||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return Ai?this.renderReact16():null}}]),n}(I.Component);qe(oS,"propTypes",{children:M.exports.oneOfType([M.exports.element,M.exports.array]),hasChildren:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),placement:M.exports.string,setRef:M.exports.func.isRequired,target:M.exports.oneOfType([M.exports.object,M.exports.string]),zIndex:M.exports.number});var iS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"parentStyle",get:function(){var o=this.props,i=o.placement,a=o.styles,s=a.arrow.length,l={pointerEvents:"none",position:"absolute",width:"100%"};return i.startsWith("top")?(l.bottom=0,l.left=0,l.right=0,l.height=s):i.startsWith("bottom")?(l.left=0,l.right=0,l.top=0,l.height=s):i.startsWith("left")?(l.right=0,l.top=0,l.bottom=0):i.startsWith("right")&&(l.left=0,l.top=0),l}},{key:"render",value:function(){var o=this.props,i=o.placement,a=o.setArrowRef,s=o.styles,l=s.arrow,u=l.color,c=l.display,f=l.length,d=l.margin,p=l.position,m=l.spread,y={display:c,position:p},h,v=m,w=f;return i.startsWith("top")?(h="0,0 ".concat(v/2,",").concat(w," ").concat(v,",0"),y.bottom=0,y.marginLeft=d,y.marginRight=d):i.startsWith("bottom")?(h="".concat(v,",").concat(w," ").concat(v/2,",0 0,").concat(w),y.top=0,y.marginLeft=d,y.marginRight=d):i.startsWith("left")?(w=m,v=f,h="0,0 ".concat(v,",").concat(w/2," 0,").concat(w),y.right=0,y.marginTop=d,y.marginBottom=d):i.startsWith("right")&&(w=m,v=f,h="".concat(v,",").concat(w," ").concat(v,",0 0,").concat(w/2),y.left=0,y.marginTop=d,y.marginBottom=d),g("div",{className:"__floater__arrow",style:this.parentStyle,children:g("span",{ref:a,style:y,children:g("svg",{width:v,height:w,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:g("polygon",{points:h,fill:u})})})})}}]),n}(I.Component);qe(iS,"propTypes",{placement:M.exports.string.isRequired,setArrowRef:M.exports.func.isRequired,styles:M.exports.object.isRequired});var NI=["color","height","width"],aS=function(t){var n=t.handleClick,r=t.styles,o=r.color,i=r.height,a=r.width,s=nS(r,NI);return g("button",{"aria-label":"close",onClick:n,style:s,type:"button",children:g("svg",{width:"".concat(a,"px"),height:"".concat(i,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})})};aS.propTypes={handleClick:M.exports.func.isRequired,styles:M.exports.object.isRequired};var sS=function(t){var n=t.content,r=t.footer,o=t.handleClick,i=t.open,a=t.positionWrapper,s=t.showCloseButton,l=t.title,u=t.styles,c={content:I.isValidElement(n)?n:g("div",{className:"__floater__content",style:u.content,children:n})};return l&&(c.title=I.isValidElement(l)?l:g("div",{className:"__floater__title",style:u.title,children:l})),r&&(c.footer=I.isValidElement(r)?r:g("div",{className:"__floater__footer",style:u.footer,children:r})),(s||a)&&!P.boolean(i)&&(c.close=g(aS,{styles:u.close,handleClick:o})),N("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};sS.propTypes={content:M.exports.node.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,open:M.exports.bool,positionWrapper:M.exports.bool.isRequired,showCloseButton:M.exports.bool.isRequired,styles:M.exports.object.isRequired,title:M.exports.node};var lS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"style",get:function(){var o=this.props,i=o.disableAnimation,a=o.component,s=o.placement,l=o.hideArrow,u=o.status,c=o.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,m=c.floaterClosing,y=c.floaterOpening,h=c.floaterWithAnimation,v=c.floaterWithComponent,w={};return l||(s.startsWith("top")?w.padding="0 0 ".concat(f,"px"):s.startsWith("bottom")?w.padding="".concat(f,"px 0 0"):s.startsWith("left")?w.padding="0 ".concat(f,"px 0 0"):s.startsWith("right")&&(w.padding="0 0 0 ".concat(f,"px"))),[ae.OPENING,ae.OPEN].indexOf(u)!==-1&&(w=Ee(Ee({},w),y)),u===ae.CLOSING&&(w=Ee(Ee({},w),m)),u===ae.OPEN&&!i&&(w=Ee(Ee({},w),h)),s==="center"&&(w=Ee(Ee({},w),p)),a&&(w=Ee(Ee({},w),v)),Ee(Ee({},d),w)}},{key:"render",value:function(){var o=this.props,i=o.component,a=o.handleClick,s=o.hideArrow,l=o.setFloaterRef,u=o.status,c={},f=["__floater"];return i?I.isValidElement(i)?c.content=I.cloneElement(i,{closeFn:a}):c.content=i({closeFn:a}):c.content=g(sS,F({},this.props)),u===ae.OPEN&&f.push("__floater__open"),s||(c.arrow=g(iS,F({},this.props))),g("div",{ref:l,className:f.join(" "),style:this.style,children:N("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(I.Component);qe(lS,"propTypes",{component:M.exports.oneOfType([M.exports.func,M.exports.element]),content:M.exports.node,disableAnimation:M.exports.bool.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,hideArrow:M.exports.bool.isRequired,open:M.exports.bool,placement:M.exports.string.isRequired,positionWrapper:M.exports.bool.isRequired,setArrowRef:M.exports.func.isRequired,setFloaterRef:M.exports.func.isRequired,showCloseButton:M.exports.bool,status:M.exports.string.isRequired,styles:M.exports.object.isRequired,title:M.exports.node});var uS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"render",value:function(){var o=this.props,i=o.children,a=o.handleClick,s=o.handleMouseEnter,l=o.handleMouseLeave,u=o.setChildRef,c=o.setWrapperRef,f=o.style,d=o.styles,p;if(i)if(I.Children.count(i)===1)if(!I.isValidElement(i))p=g("span",{children:i});else{var m=P.function(i.type)?"innerRef":"ref";p=I.cloneElement(I.Children.only(i),qe({},m,u))}else p=i;return p?g("span",{ref:c,style:Ee(Ee({},d),f),onClick:a,onMouseEnter:s,onMouseLeave:l,children:p}):null}}]),n}(I.Component);qe(uS,"propTypes",{children:M.exports.node,handleClick:M.exports.func.isRequired,handleMouseEnter:M.exports.func.isRequired,handleMouseLeave:M.exports.func.isRequired,setChildRef:M.exports.func.isRequired,setWrapperRef:M.exports.func.isRequired,style:M.exports.object,styles:M.exports.object.isRequired});var DI={zIndex:100};function RI(e){var t=on(DI,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var LI=["arrow","flip","offset"],MI=["position","top","right","bottom","left"],uh=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),qe(bn(o),"setArrowRef",function(i){o.arrowRef=i}),qe(bn(o),"setChildRef",function(i){o.childRef=i}),qe(bn(o),"setFloaterRef",function(i){o.floaterRef||(o.floaterRef=i)}),qe(bn(o),"setWrapperRef",function(i){o.wrapperRef=i}),qe(bn(o),"handleTransitionEnd",function(){var i=o.state.status,a=o.props.callback;o.wrapperPopper&&o.wrapperPopper.instance.update(),o.setState({status:i===ae.OPENING?ae.OPEN:ae.IDLE},function(){var s=o.state.status;a(s===ae.OPEN?"open":"close",o.props)})}),qe(bn(o),"handleClick",function(){var i=o.props,a=i.event,s=i.open;if(!P.boolean(s)){var l=o.state,u=l.positionWrapper,c=l.status;(o.event==="click"||o.event==="hover"&&u)&&(Ns({title:"click",data:[{event:a,status:c===ae.OPEN?"closing":"opening"}],debug:o.debug}),o.toggle())}}),qe(bn(o),"handleMouseEnter",function(){var i=o.props,a=i.event,s=i.open;if(!(P.boolean(s)||jc())){var l=o.state.status;o.event==="hover"&&l===ae.IDLE&&(Ns({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:o.debug}),clearTimeout(o.eventDelayTimeout),o.toggle())}}),qe(bn(o),"handleMouseLeave",function(){var i=o.props,a=i.event,s=i.eventDelay,l=i.open;if(!(P.boolean(l)||jc())){var u=o.state,c=u.status,f=u.positionWrapper;o.event==="hover"&&(Ns({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:o.debug}),s?[ae.OPENING,ae.OPEN].indexOf(c)!==-1&&!f&&!o.eventDelayTimeout&&(o.eventDelayTimeout=setTimeout(function(){delete o.eventDelayTimeout,o.toggle()},s*1e3)):o.toggle(ae.IDLE))}}),o.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ae.INIT,statusWrapper:ae.INIT},o._isMounted=!1,an&&window.addEventListener("load",function(){o.popper&&o.popper.instance.update(),o.wrapperPopper&&o.wrapperPopper.instance.update()}),o}return as(n,[{key:"componentDidMount",value:function(){if(!!an){var o=this.state.positionWrapper,i=this.props,a=i.children,s=i.open,l=i.target;this._isMounted=!0,Ns({title:"init",data:{hasChildren:!!a,hasTarget:!!l,isControlled:P.boolean(s),positionWrapper:o,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&l&&P.boolean(s)}}},{key:"componentDidUpdate",value:function(o,i){if(!!an){var a=this.props,s=a.autoOpen,l=a.open,u=a.target,c=a.wrapperOptions,f=xI(i,this.state),d=f.changedFrom,p=f.changedTo;if(o.open!==l){var m;P.boolean(l)&&(m=l?ae.OPENING:ae.CLOSING),this.toggle(m)}(o.wrapperOptions.position!==c.position||o.target!==u)&&this.changeWrapperPosition(this.props),p("status",ae.IDLE)&&l?this.toggle(ae.OPEN):d("status",ae.INIT,ae.IDLE)&&s&&this.toggle(ae.OPEN),this.popper&&p("status",ae.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ae.OPENING)||p("status",ae.CLOSING))&&II(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!an||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var o=this,i=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,s=this.props,l=s.disableFlip,u=s.getPopper,c=s.hideArrow,f=s.offset,d=s.placement,p=s.wrapperOptions,m=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ae.IDLE});else if(i&&this.floaterRef){var y=this.options,h=y.arrow,v=y.flip,w=y.offset,S=nS(y,LI);new bg(i,this.floaterRef,{placement:d,modifiers:Ee({arrow:Ee({enabled:!c,element:this.arrowRef},h),flip:Ee({enabled:!l,behavior:m},v),offset:Ee({offset:"0, ".concat(f,"px")},w)},S),onCreate:function(C){o.popper=C,u(C,"floater"),o._isMounted&&o.setState({currentPlacement:C.placement,status:ae.IDLE}),d!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){o.popper=C;var O=o.state.currentPlacement;o._isMounted&&C.placement!==O&&o.setState({currentPlacement:C.placement})}})}if(a){var A=P.undefined(p.offset)?0:p.offset;new bg(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(A,"px")},flip:{enabled:!1}},onCreate:function(C){o.wrapperPopper=C,o._isMounted&&o.setState({statusWrapper:ae.IDLE}),u(C,"wrapper"),d!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(o){var i=o.target,a=o.wrapperOptions;this.setState({positionWrapper:a.position&&!!i})}},{key:"toggle",value:function(o){var i=this.state.status,a=i===ae.OPEN?ae.CLOSING:ae.OPENING;P.undefined(o)||(a=o),this.setState({status:a})}},{key:"debug",get:function(){var o=this.props.debug;return o||!!global.ReactFloaterDebug}},{key:"event",get:function(){var o=this.props,i=o.disableHoverToClick,a=o.event;return a==="hover"&&jc()&&!i?"click":a}},{key:"options",get:function(){var o=this.props.options;return on(PI,o||{})}},{key:"styles",get:function(){var o=this,i=this.state,a=i.status,s=i.positionWrapper,l=i.statusWrapper,u=this.props.styles,c=on(RI(u),u);if(s){var f;[ae.IDLE].indexOf(a)===-1||[ae.IDLE].indexOf(l)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Ee(Ee({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},s||(MI.forEach(function(p){o.wrapperStyles[p]=d[p]}),c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!an)return null;var o=this.props.target;return o?P.domElement(o)?o:document.querySelector(o):this.childRef||this.wrapperRef}},{key:"render",value:function(){var o=this.state,i=o.currentPlacement,a=o.positionWrapper,s=o.status,l=this.props,u=l.children,c=l.component,f=l.content,d=l.disableAnimation,p=l.footer,m=l.hideArrow,y=l.id,h=l.open,v=l.showCloseButton,w=l.style,S=l.target,A=l.title,T=g(uS,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:w,styles:this.styles.wrapper,children:u}),C={};return a?C.wrapperInPortal=T:C.wrapperAsChildren=T,N("span",{children:[N(oS,{hasChildren:!!u,id:y,placement:i,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[g(lS,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:m||i==="center",open:h,placement:i,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:v,status:s,styles:this.styles,title:A}),C.wrapperInPortal]}),C.wrapperAsChildren]})}}]),n}(I.Component);qe(uh,"propTypes",{autoOpen:M.exports.bool,callback:M.exports.func,children:M.exports.node,component:mg(M.exports.oneOfType([M.exports.func,M.exports.element]),function(e){return!e.content}),content:mg(M.exports.node,function(e){return!e.component}),debug:M.exports.bool,disableAnimation:M.exports.bool,disableFlip:M.exports.bool,disableHoverToClick:M.exports.bool,event:M.exports.oneOf(["hover","click"]),eventDelay:M.exports.number,footer:M.exports.node,getPopper:M.exports.func,hideArrow:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),offset:M.exports.number,open:M.exports.bool,options:M.exports.object,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:M.exports.bool,style:M.exports.object,styles:M.exports.object,target:M.exports.oneOfType([M.exports.object,M.exports.string]),title:M.exports.node,wrapperOptions:M.exports.shape({offset:M.exports.number,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:M.exports.bool})});qe(uh,"defaultProps",{autoOpen:!1,callback:xg,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:xg,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function Og(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function W(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function Ql(e,t){if(e==null)return{};var n=UI(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Pe(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function cS(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return Pe(e)}function Jr(e){var t=FI();return function(){var r=Jl(e),o;if(t){var i=Jl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return cS(this,o)}}var oe={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},it={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ee={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},re={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},Cn=Dw.canUseDOM,xi=Na.exports.createPortal!==void 0;function fS(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function Wc(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function Oi(e){var t=[],n=function r(o){if(typeof o=="string"||typeof o=="number")t.push(o);else if(Array.isArray(o))o.forEach(function(a){return r(a)});else if(o&&o.props){var i=o.props.children;Array.isArray(i)?i.forEach(function(a){return r(a)}):r(i)}};return n(e),t.join(" ").trim()}function Pg(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function BI(e,t){return!P.plainObject(e)||!P.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function jI(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(o,i,a,s){return i+i+a+a+s+s}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function kg(e){return e.disableBeacon||e.placement==="center"}function ld(e,t){var n,r=j.exports.isValidElement(e)||j.exports.isValidElement(t),o=P.undefined(e)||P.undefined(t);if(Wc(e)!==Wc(t)||r||o)return!1;if(P.domElement(e))return e.isSameNode(t);if(P.number(e))return e===t;if(P.function(e))return e.toString()===t.toString();for(var i in e)if(Pg(e,i)){if(typeof e[i]=="undefined"||typeof t[i]=="undefined")return!1;if(n=Wc(e[i]),["object","array"].indexOf(n)!==-1&&ld(e[i],t[i])||n==="function"&&ld(e[i],t[i]))continue;if(e[i]!==t[i])return!1}for(var a in t)if(Pg(t,a)&&typeof e[a]=="undefined")return!1;return!0}function Tg(){return["chrome","safari","firefox","opera"].indexOf(fS())===-1}function jr(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var WI={action:"",controlled:!1,index:0,lifecycle:ee.INIT,size:0,status:re.IDLE},Ig=["action","index","lifecycle","status"];function YI(e){var t=new Map,n=new Map,r=function(){function o(){var i=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},s=a.continuous,l=s===void 0?!1:s,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;Ln(this,o),J(this,"listener",void 0),J(this,"setSteps",function(d){var p=i.getState(),m=p.size,y=p.status,h={size:d.length,status:y};n.set("steps",d),y===re.WAITING&&!m&&d.length&&(h.status=re.RUNNING),i.setState(h)}),J(this,"addListener",function(d){i.listener=d}),J(this,"update",function(d){if(!BI(d,Ig))throw new Error("State is not valid. Valid keys: ".concat(Ig.join(", ")));i.setState(W({},i.getNextState(W(W(W({},i.getState()),d),{},{action:d.action||oe.UPDATE}),!0)))}),J(this,"start",function(d){var p=i.getState(),m=p.index,y=p.size;i.setState(W(W({},i.getNextState({action:oe.START,index:P.number(d)?d:m},!0)),{},{status:y?re.RUNNING:re.WAITING}))}),J(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.index,y=p.status;[re.FINISHED,re.SKIPPED].indexOf(y)===-1&&i.setState(W(W({},i.getNextState({action:oe.STOP,index:m+(d?1:0)})),{},{status:re.PAUSED}))}),J(this,"close",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.CLOSE,index:p+1})))}),J(this,"go",function(d){var p=i.getState(),m=p.controlled,y=p.status;if(!(m||y!==re.RUNNING)){var h=i.getSteps()[d];i.setState(W(W({},i.getNextState({action:oe.GO,index:d})),{},{status:h?y:re.FINISHED}))}}),J(this,"info",function(){return i.getState()}),J(this,"next",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(i.getNextState({action:oe.NEXT,index:p+1}))}),J(this,"open",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.UPDATE,lifecycle:ee.TOOLTIP})))}),J(this,"prev",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.PREV,index:p-1})))}),J(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.controlled;m||i.setState(W(W({},i.getNextState({action:oe.RESET,index:0})),{},{status:d?re.RUNNING:re.READY}))}),J(this,"skip",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState({action:oe.SKIP,lifecycle:ee.INIT,status:re.SKIPPED})}),this.setState({action:oe.INIT,controlled:P.number(u),continuous:l,index:P.number(u)?u:0,lifecycle:ee.INIT,status:f.length?re.READY:re.IDLE},!0),this.setSteps(f)}return Mn(o,[{key:"setState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=W(W({},l),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,m=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",m),s&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(l)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:W({},WI)}},{key:"getNextState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=l.action,c=l.controlled,f=l.index,d=l.size,p=l.status,m=P.number(a.index)?a.index:f,y=c&&!s?f:Math.min(Math.max(m,0),d);return{action:a.action||u,controlled:c,index:y,lifecycle:a.lifecycle||ee.INIT,size:a.size||d,status:y===d?re.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var s=JSON.stringify(a),l=JSON.stringify(this.getState());return s!==l}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),o}();return new r(e)}function aa(){return document.scrollingElement||document.createElement("body")}function dS(e){return e?e.getBoundingClientRect():{}}function zI(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function or(e){return typeof e=="string"?document.querySelector(e):e}function GI(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function Wu(e,t,n){var r=Lw(e);if(r.isSameNode(aa()))return n?document:aa();var o=r.scrollHeight>r.offsetHeight;return!o&&!t?(r.style.overflow="initial",aa()):r}function Yu(e,t){if(!e)return!1;var n=Wu(e,t);return!n.isSameNode(aa())}function $I(e){return e.offsetParent!==document.body}function Go(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:GI(e).position===t?!0:Go(e.parentNode,t)}function HI(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,o=n.visibility;if(r==="none"||o==="hidden")return!1}t=t.parentNode}return!0}function VI(e,t,n){var r=dS(e),o=Wu(e,n),i=Yu(e,n),a=0;o instanceof HTMLElement&&(a=o.scrollTop);var s=r.top+(!i&&!Go(e)?a:0);return Math.floor(s-t)}function ud(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?ud(e.offsetParent)+e.offsetTop:e.offsetTop:0}function JI(e,t,n){if(!e)return 0;var r=Lw(e),o=ud(e);return Yu(e,n)&&!$I(e)&&(o-=ud(r)),Math.floor(o-t)}function QI(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:aa(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,o){var i=t.scrollTop,a=e>i?e-i:i-e;i6.top(t,e,{duration:a<100?50:n},function(s){return s&&s.message!=="Element already at target scroll position"?o(s):r()})})}function XI(e){function t(r,o,i,a,s,l){var u=a||"<>",c=l||i;if(o[i]==null)return r?new Error("Required ".concat(s," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=on(KI,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return P.plainObject(e)?e.target?!0:(jr({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(jr({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function Dg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return P.array(e)?e.every(function(n){return pS(n,t)}):(jr({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var e5=Mn(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(Ln(this,e),J(this,"element",void 0),J(this,"options",void 0),J(this,"canBeTabbed",function(o){var i=o.tabIndex;(i===null||i<0)&&(i=void 0);var a=isNaN(i);return!a&&n.canHaveFocus(o)}),J(this,"canHaveFocus",function(o){var i=/input|select|textarea|button|object/,a=o.nodeName.toLowerCase(),s=i.test(a)&&!o.getAttribute("disabled")||a==="a"&&!!o.getAttribute("href");return s&&n.isVisible(o)}),J(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),J(this,"handleKeyDown",function(o){var i=n.options.keyCode,a=i===void 0?9:i;o.keyCode===a&&n.interceptTab(o)}),J(this,"interceptTab",function(o){var i=n.findValidTabElements();if(!!i.length){o.preventDefault();var a=o.shiftKey,s=i.indexOf(document.activeElement);s===-1||!a&&s+1===i.length?s=0:a&&s===0?s=i.length-1:s+=a?-1:1,i[s].focus()}}),J(this,"isHidden",function(o){var i=o.offsetWidth<=0&&o.offsetHeight<=0,a=window.getComputedStyle(o);return i&&!o.innerHTML?!0:i&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),J(this,"isVisible",function(o){for(var i=o;i;)if(i instanceof HTMLElement){if(i===document.body)break;if(n.isHidden(i))return!1;i=i.parentNode}return!0}),J(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),J(this,"checkFocus",function(o){document.activeElement!==o&&(o.focus(),window.requestAnimationFrame(function(){return n.checkFocus(o)}))}),J(this,"setFocus",function(){var o=n.options.selector;if(!!o){var i=n.element.querySelector(o);i&&window.requestAnimationFrame(function(){return n.checkFocus(i)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),t5=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;if(Ln(this,n),o=t.call(this,r),J(Pe(o),"setBeaconRef",function(l){o.beacon=l}),!r.beaconComponent){var i=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),s=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(s)),i.appendChild(a)}return o}return Mn(n,[{key:"componentDidMount",value:function(){var o=this,i=this.props.shouldFocus;setTimeout(function(){P.domElement(o.beacon)&&i&&o.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var o=document.getElementById("joyride-beacon-animation");o&&o.parentNode.removeChild(o)}},{key:"render",value:function(){var o=this.props,i=o.beaconComponent,a=o.locale,s=o.onClickOrHover,l=o.styles,u={"aria-label":a.open,onClick:s,onMouseEnter:s,ref:this.setBeaconRef,title:a.open},c;if(i){var f=i;c=g(f,F({},u))}else c=N("button",$(F({className:"react-joyride__beacon",style:l.beacon,type:"button"},u),{children:[g("span",{style:l.beaconInner}),g("span",{style:l.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(I.Component),n5=function(t){var n=t.styles;return g("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},r5=["mixBlendMode","zIndex"],o5=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a=p&&y<=p+c,w=h>=f&&h<=f+m,S=w&&v;S!==l&&r.updateState({mouseOverSpotlight:S})}),J(Pe(r),"handleScroll",function(){var s=r.props.target,l=or(s);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Go(l,"sticky")&&r.updateState({})}),J(Pe(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return Mn(n,[{key:"componentDidMount",value:function(){var o=this.props;o.debug,o.disableScrolling;var i=o.disableScrollParentFix,a=o.target,s=or(a);this.scrollParent=Wu(s,i,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(o){var i=this,a=this.props,s=a.lifecycle,l=a.spotlightClicks,u=Gl(o,this.props),c=u.changed;c("lifecycle",ee.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=i.state.isScrolling;f||i.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(l&&s===ee.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):s!==ee.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var o=this.state.showSpotlight,i=this.props,a=i.disableScrollParentFix,s=i.spotlightClicks,l=i.spotlightPadding,u=i.styles,c=i.target,f=or(c),d=dS(f),p=Go(f),m=VI(f,l,a);return W(W({},Tg()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+l*2),left:Math.round(d.left-l),opacity:o?1:0,pointerEvents:s?"none":"auto",position:p?"fixed":"absolute",top:m,transition:"opacity 0.2s",width:Math.round(d.width+l*2)})}},{key:"updateState",value:function(o){!this._isMounted||this.setState(o)}},{key:"render",value:function(){var o=this.state,i=o.mouseOverSpotlight,a=o.showSpotlight,s=this.props,l=s.disableOverlay,u=s.disableOverlayClose,c=s.lifecycle,f=s.onClickOverlay,d=s.placement,p=s.styles;if(l||c!==ee.TOOLTIP)return null;var m=p.overlay;Tg()&&(m=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var y=W({cursor:u?"default":"pointer",height:zI(),pointerEvents:i?"none":"auto"},m),h=d!=="center"&&a&&g(n5,{styles:this.spotlightStyles});if(fS()==="safari"){y.mixBlendMode,y.zIndex;var v=Ql(y,r5);h=g("div",{style:W({},v),children:h}),delete y.backgroundColor}return g("div",{className:"react-joyride__overlay",style:y,onClick:f,children:h})}}]),n}(I.Component),i5=["styles"],a5=["color","height","width"],s5=function(t){var n=t.styles,r=Ql(t,i5),o=n.color,i=n.height,a=n.width,s=Ql(n,a5);return g("button",$(F({style:s,type:"button"},r),{children:g("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof i=="number"?"".concat(i,"px"):i,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})}))},l5=function(e){Vr(n,e);var t=Jr(n);function n(){return Ln(this,n),t.apply(this,arguments)}return Mn(n,[{key:"render",value:function(){var o=this.props,i=o.backProps,a=o.closeProps,s=o.continuous,l=o.index,u=o.isLastStep,c=o.primaryProps,f=o.size,d=o.skipProps,p=o.step,m=o.tooltipProps,y=p.content,h=p.hideBackButton,v=p.hideCloseButton,w=p.hideFooter,S=p.showProgress,A=p.showSkipButton,T=p.title,C=p.styles,O=p.locale,b=O.back,E=O.close,x=O.last,_=O.next,k=O.skip,D={primary:E};return s&&(D.primary=u?x:_,S&&(D.primary=N("span",{children:[D.primary," (",l+1,"/",f,")"]}))),A&&!u&&(D.skip=g("button",$(F({style:C.buttonSkip,type:"button","aria-live":"off"},d),{children:k}))),!h&&l>0&&(D.back=g("button",$(F({style:C.buttonBack,type:"button"},i),{children:b}))),D.close=!v&&g(s5,F({styles:C.buttonClose},a)),N("div",$(F({className:"react-joyride__tooltip",style:C.tooltip},m),{children:[N("div",{style:C.tooltipContainer,children:[T&&g("h4",{style:C.tooltipTitle,"aria-label":T,children:T}),g("div",{style:C.tooltipContent,children:y})]}),!w&&N("div",{style:C.tooltipFooter,children:[g("div",{style:C.tooltipFooterSpacer,children:D.skip}),D.back,g("button",$(F({style:C.buttonNext,type:"button"},c),{children:D.primary}))]}),D.close]}),"JoyrideTooltip")}}]),n}(I.Component),u5=["beaconComponent","tooltipComponent"],c5=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a0||a===oe.PREV),C=w("action")||w("index")||w("lifecycle")||w("status"),O=S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT),b=w("action",[oe.NEXT,oe.PREV,oe.SKIP,oe.CLOSE]);if(b&&(O||u)&&s(W(W({},A),{},{index:o.index,lifecycle:ee.COMPLETE,step:o.step,type:it.STEP_AFTER})),w("index")&&f>0&&d===ee.INIT&&m===re.RUNNING&&y.placement==="center"&&h({lifecycle:ee.READY}),C&&y){var E=or(y.target),x=!!E,_=x&&HI(E);_?(S("status",re.READY,re.RUNNING)||S("lifecycle",ee.INIT,ee.READY))&&s(W(W({},A),{},{step:y,type:it.STEP_BEFORE})):(console.warn(x?"Target not visible":"Target not mounted",y),s(W(W({},A),{},{type:it.TARGET_NOT_FOUND,step:y})),u||h({index:f+([oe.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ee.INIT,ee.READY)&&h({lifecycle:kg(y)||T?ee.TOOLTIP:ee.BEACON}),w("index")&&jr({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),w("lifecycle",ee.BEACON)&&s(W(W({},A),{},{step:y,type:it.BEACON})),w("lifecycle",ee.TOOLTIP)&&(s(W(W({},A),{},{step:y,type:it.TOOLTIP})),this.scope=new e5(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var o=this.props,i=o.step,a=o.lifecycle;return!!(kg(i)||a===ee.TOOLTIP)}},{key:"render",value:function(){var o=this.props,i=o.continuous,a=o.debug,s=o.helpers,l=o.index,u=o.lifecycle,c=o.nonce,f=o.shouldScroll,d=o.size,p=o.step,m=or(p.target);return!pS(p)||!P.domElement(m)?null:N("div",{className:"react-joyride__step",children:[g(f5,{id:"react-joyride-portal",children:g(o5,$(F({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),g(uh,$(F({component:g(c5,{continuous:i,helpers:s,index:l,isLastStep:l+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(l),isPositioned:p.isFixed||Go(m),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:g(t5,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(l))}}]),n}(I.Component),hS=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;return Ln(this,n),o=t.call(this,r),J(Pe(o),"initStore",function(){var i=o.props,a=i.debug,s=i.getHelpers,l=i.run,u=i.stepIndex;o.store=new YI(W(W({},o.props),{},{controlled:l&&P.number(u)})),o.helpers=o.store.getHelpers();var c=o.store.addListener;return jr({title:"init",data:[{key:"props",value:o.props},{key:"state",value:o.state}],debug:a}),c(o.syncState),s(o.helpers),o.store.getState()}),J(Pe(o),"callback",function(i){var a=o.props.callback;P.function(a)&&a(i)}),J(Pe(o),"handleKeyboard",function(i){var a=o.state,s=a.index,l=a.lifecycle,u=o.props.steps,c=u[s],f=window.Event?i.which:i.keyCode;l===ee.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&o.store.close()}),J(Pe(o),"syncState",function(i){o.setState(i)}),J(Pe(o),"setPopper",function(i,a){a==="wrapper"?o.beaconPopper=i:o.tooltipPopper=i}),J(Pe(o),"shouldScroll",function(i,a,s,l,u,c,f){return!i&&(a!==0||s||l===ee.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!Go(c))&&f.lifecycle!==l&&[ee.BEACON,ee.TOOLTIP].indexOf(l)!==-1}),o.state=o.initStore(),o}return Mn(n,[{key:"componentDidMount",value:function(){if(!!Cn){var o=this.props,i=o.disableCloseOnEsc,a=o.debug,s=o.run,l=o.steps,u=this.store.start;Dg(l,a)&&s&&u(),i||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(o,i){if(!!Cn){var a=this.state,s=a.action,l=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,m=d.run,y=d.stepIndex,h=d.steps,v=o.steps,w=o.stepIndex,S=this.store,A=S.reset,T=S.setSteps,C=S.start,O=S.stop,b=S.update,E=Gl(o,this.props),x=E.changed,_=Gl(i,this.state),k=_.changed,D=_.changedFrom,B=Pi(h[u],this.props),q=!ld(v,h),H=P.number(y)&&x("stepIndex"),ce=or(B==null?void 0:B.target);if(q&&(Dg(h,p)?T(h):console.warn("Steps are not valid",h)),x("run")&&(m?C(y):O()),H){var he=w=0?C:0,l===re.RUNNING&&QI(C,T,y)}}}},{key:"render",value:function(){if(!Cn)return null;var o=this.state,i=o.index,a=o.status,s=this.props,l=s.continuous,u=s.debug,c=s.nonce,f=s.scrollToFirstStep,d=s.steps,p=Pi(d[i],this.props),m;return a===re.RUNNING&&p&&(m=g(d5,$(F({},this.state),{callback:this.callback,continuous:l,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(i!==0||f),step:p,update:this.store.update}))),g("div",{className:"react-joyride",children:m})}}]),n}(I.Component);J(hS,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const p5=N("div",{children:[g("p",{children:"You can see how the changes impact your app with the app preview."}),g("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),g("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),h5=N("div",{children:[g("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),g("p",{children:"You can click on elements to select them or drag them around to move them."}),g("p",{children:"Cards can be resized by dragging resize handles on the sides."}),g("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),g("p",{children:g("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),m5=N("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",g("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",g("span",{className:zf.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),v5=N("div",{children:[g("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),g("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),g5=[{target:".app-view",content:h5,disableBeacon:!0},{target:".elements-panel",content:m5,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:v5,placement:"left-start"},{target:".app-preview",content:p5,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function y5(){const[e,t]=j.exports.useState(0),[n,r]=j.exports.useState(!1),o=j.exports.useCallback(a=>{const{action:s,index:l,status:u,type:c}=a;console.log({action:s,index:l,status:u,type:c}),(c===it.STEP_AFTER||c===it.TARGET_NOT_FOUND)&&(s===oe.NEXT?t(l+1):s===oe.PREV?t(l-1):s===oe.CLOSE&&r(!1)),c===it.TOUR_END&&(s===oe.NEXT&&(r(!1),t(0)),s===oe.SKIP&&r(!1))},[]),i=j.exports.useCallback(()=>{r(!0)},[]);return N(Me,{children:[N(wt,{onClick:i,title:"Take a guided tour of app",variant:"transparent",children:[g(CA,{id:"tour",size:"24px"}),"Tour App"]}),g(hS,{callback:o,steps:g5,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:S5})]})}const Rg="#e07189",w5="#f6d5dc",S5={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:Rg},beaconOuter:{backgroundColor:w5,border:`2px solid ${Rg}`}},b5="_container_1ehu8_1",E5="_elementsPanel_1ehu8_28",C5="_propertiesPanel_1ehu8_33",A5="_editorHolder_1ehu8_47",x5="_titledPanel_1ehu8_59",O5="_panelTitleHeader_1ehu8_71",_5="_header_1ehu8_80",P5="_rightSide_1ehu8_88",k5="_divider_1ehu8_109",T5="_title_1ehu8_59",I5="_shinyLogo_1ehu8_120",pt={container:b5,elementsPanel:E5,propertiesPanel:C5,editorHolder:A5,titledPanel:x5,panelTitleHeader:O5,header:_5,rightSide:P5,divider:k5,title:T5,shinyLogo:I5},N5="_container_1fh41_1",D5="_node_1fh41_12",Lg={container:N5,node:D5};function R5({tree:e,path:t,onSelect:n}){const r=t.length;let o=[];for(let i=0;i<=r;i++){const a=rr(e,t.slice(0,i));if(a===void 0)return null;o.push(en[a.uiName].title)}return g("div",{className:Lg.container,children:o.map((i,a)=>g("div",{className:Lg.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:L5(i)},i+a))})}function L5(e){return e.replace(/[a-z]+::/,"")}const M5="_settingsPanel_zsgzt_1",F5="_currentElementAbout_zsgzt_10",U5="_settingsForm_zsgzt_17",B5="_settingsInputs_zsgzt_24",j5="_buttonsHolder_zsgzt_28",W5="_validationErrorMsg_zsgzt_45",ki={settingsPanel:M5,currentElementAbout:F5,settingsForm:U5,settingsInputs:B5,buttonsHolder:j5,validationErrorMsg:W5};function Y5(e){const t=vr(),[n,r]=v1(),[o,i]=j.exports.useState(n!==null?rr(e,n):null),a=j.exports.useRef(!1),s=j.exports.useMemo(()=>Fp(u=>{!n||!a.current||t(Sw({path:n,node:u}))},250),[t,n]);return j.exports.useEffect(()=>{if(a.current=!1,n===null){i(null);return}rr(e,n)!==void 0&&i(rr(e,n))},[e,n]),j.exports.useEffect(()=>{!o||s(o)},[o,s]),{currentNode:o,updateArgumentsByName:({name:u,value:c})=>{i(f=>$(F({},f),{uiArguments:$(F({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function z5({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:o}=Y5(e);if(r===null)return g("div",{children:"Select an element to edit properties"});if(t===null)return N("div",{children:["Error finding requested node at path ",r.join(".")]});const i=r.length===0,{uiName:a,uiArguments:s}=t,l=en[a].SettingsComponent;return N("div",{className:ki.settingsPanel+" properties-panel",children:[g("div",{className:ki.currentElementAbout,children:g(R5,{tree:e,path:r,onSelect:o})}),g("form",{className:ki.settingsForm,onSubmit:G5,children:g("div",{className:ki.settingsInputs,children:g(r2,{onChange:n,children:g(l,{settings:s})})})}),g("div",{className:ki.buttonsHolder,children:i?null:g(m1,{path:r})})]})}function G5(e){e.preventDefault()}function $5(e){return["INITIAL-DATA"].includes(e.path)}function H5(){const e=vr(),t=Ja(r=>r.uiTree),n=j.exports.useCallback(r=>{e(Ok({initialState:r}))},[e]);return{tree:t,setTree:n}}function V5(){const{tree:e,setTree:t}=H5(),{status:n,ws:r}=Ow(),[o,i]=j.exports.useState("loading"),a=j.exports.useRef(null),s=Ja(l=>l.uiTree);return j.exports.useEffect(()=>{n==="connected"&&(_w(r,l=>{!$5(l)||(a.current=l.payload,t(l.payload),i("connected"))}),ia(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(i("no-backend"),t(J5),console.log("Running in test mode"))},[t,n,r]),j.exports.useEffect(()=>{s===Zp||s===a.current||n==="connected"&&ia(r,{path:"STATE-UPDATE",payload:s})},[s,n,r]),{status:o,tree:e}}const J5={uiName:"gridlayout::grid_page",uiArguments:{areas:[[".","."],[".","."]],row_sizes:["1fr","1fr"],col_sizes:["1fr","1fr"],gap_size:"1rem"},uiChildren:[]},mS=236,Q5={"--properties-panel-width":`${mS}px`};function X5(){const{status:e,tree:t}=V5();return e==="loading"?g(K5,{}):N(LA,{children:[N("div",{className:pt.container,style:Q5,children:[N("div",{className:pt.header,children:[g(_T,{className:pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),g("h1",{className:pt.title,children:"Shiny UI Editor"}),N("div",{className:pt.rightSide,children:[g(y5,{}),g("div",{className:pt.divider}),g(DT,{})]})]}),N("div",{className:`${pt.elementsPanel} ${pt.titledPanel} elements-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Elements"}),g(BT,{})]}),g("div",{className:pt.editorHolder+" app-view",children:g(Ep,F({},t))}),N("div",{className:`${pt.propertiesPanel}`,children:[N("div",{className:`${pt.titledPanel} properties-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Properties"}),g(z5,{tree:t})]}),g("div",{className:`${pt.titledPanel} app-preview`,children:g(ET,{})})]})]}),g(q5,{})]})}function K5(){return g("h3",{children:"Loading initial state from server"})}function q5(){return Ja(t=>t.connectedToServer)?null:g(X1,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:g("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const Z5=()=>g(Ik,{children:g(Mk,{children:g(X5,{})})}),eN="modulepreload",tN=function(e,t){return new URL(e,t).href},Mg={},nN=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(o=>{if(o=tN(o,r),o in Mg)return;Mg[o]=!0;const i=o.endsWith(".css"),a=i?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${o}"]${a}`))return;const s=document.createElement("link");if(s.rel=i?"stylesheet":eN,i||(s.as="script",s.crossOrigin=""),s.href=o,document.head.appendChild(s),i)return new Promise((l,u)=>{s.addEventListener("load",l),s.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${o}`)))})})).then(()=>t())},rN=e=>{e&&e instanceof Function&&nN(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:o,getTTFB:i})=>{t(e),n(e),r(e),o(e),i(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function oN(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}nr.render(g(j.exports.StrictMode,{children:g(Z5,{})}),document.getElementById("root"));oN();rN(); diff --git a/docs/articles/demo-app/assets/index.5a373dd7.js b/docs/articles/demo-app/assets/index.5a373dd7.js deleted file mode 100644 index 67aa41f3f..000000000 --- a/docs/articles/demo-app/assets/index.5a373dd7.js +++ /dev/null @@ -1,145 +0,0 @@ -var bS=Object.defineProperty,ES=Object.defineProperties;var CS=Object.getOwnPropertyDescriptors;var fs=Object.getOwnPropertySymbols;var Sh=Object.prototype.hasOwnProperty,bh=Object.prototype.propertyIsEnumerable;var wh=(e,t,n)=>t in e?bS(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,F=(e,t)=>{for(var n in t||(t={}))Sh.call(t,n)&&wh(e,n,t[n]);if(fs)for(var n of fs(t))bh.call(t,n)&&wh(e,n,t[n]);return e},$=(e,t)=>ES(e,CS(t));var $t=(e,t)=>{var n={};for(var r in e)Sh.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&fs)for(var r of fs(e))t.indexOf(r)<0&&bh.call(e,r)&&(n[r]=e[r]);return n};var Eh=(e,t,n)=>new Promise((r,o)=>{var i=l=>{try{s(n.next(l))}catch(u){o(u)}},a=l=>{try{s(n.throw(l))}catch(u){o(u)}},s=l=>l.done?r(l.value):Promise.resolve(l.value).then(i,a);s((n=n.apply(e,t)).next())});const AS=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const o of document.querySelectorAll('link[rel="modulepreload"]'))r(o);new MutationObserver(o=>{for(const i of o)if(i.type==="childList")for(const a of i.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(o){const i={};return o.integrity&&(i.integrity=o.integrity),o.referrerpolicy&&(i.referrerPolicy=o.referrerpolicy),o.crossorigin==="use-credentials"?i.credentials="include":o.crossorigin==="anonymous"?i.credentials="omit":i.credentials="same-origin",i}function r(o){if(o.ep)return;o.ep=!0;const i=n(o);fetch(o.href,i)}};AS();var Fg=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Ug(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function Bg(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var o=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,o.get?o:{enumerable:!0,get:function(){return e[r]}})}),n}var j={exports:{}},se={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var Ch=Object.getOwnPropertySymbols,xS=Object.prototype.hasOwnProperty,OS=Object.prototype.propertyIsEnumerable;function _S(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function PS(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(i){return t[i]});if(r.join("")!=="0123456789")return!1;var o={};return"abcdefghijklmnopqrst".split("").forEach(function(i){o[i]=i}),Object.keys(Object.assign({},o)).join("")==="abcdefghijklmnopqrst"}catch(i){return!1}}var jg=PS()?Object.assign:function(e,t){for(var n,r=_S(e),o,i=1;i=w},o=function(){},e.unstable_forceFrameRate=function(R){0>R||125>>1,ue=R[le];if(ue!==void 0&&0b(Fe,J))rt!==void 0&&0>b(rt,Fe)?(R[le]=rt,R[Ue]=J,le=Ue):(R[le]=Fe,R[ze]=J,le=ze);else if(rt!==void 0&&0>b(rt,J))R[le]=rt,R[Ue]=J,le=Ue;else break e}}return Y}return null}function b(R,Y){var J=R.sortIndex-Y.sortIndex;return J!==0?J:R.id-Y.id}var E=[],x=[],_=1,k=null,D=3,B=!1,q=!1,H=!1;function ce(R){for(var Y=C(x);Y!==null;){if(Y.callback===null)O(x);else if(Y.startTime<=R)O(x),Y.sortIndex=Y.expirationTime,T(E,Y);else break;Y=C(x)}}function he(R){if(H=!1,ce(R),!q)if(C(E)!==null)q=!0,t(ye);else{var Y=C(x);Y!==null&&n(he,Y.startTime-R)}}function ye(R,Y){q=!1,H&&(H=!1,r()),B=!0;var J=D;try{for(ce(Y),k=C(E);k!==null&&(!(k.expirationTime>Y)||R&&!e.unstable_shouldYield());){var le=k.callback;if(typeof le=="function"){k.callback=null,D=k.priorityLevel;var ue=le(k.expirationTime<=Y);Y=e.unstable_now(),typeof ue=="function"?k.callback=ue:k===C(E)&&O(E),ce(Y)}else O(E);k=C(E)}if(k!==null)var ze=!0;else{var Fe=C(x);Fe!==null&&n(he,Fe.startTime-Y),ze=!1}return ze}finally{k=null,D=J,B=!1}}var ne=o;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(R){R.callback=null},e.unstable_continueExecution=function(){q||B||(q=!0,t(ye))},e.unstable_getCurrentPriorityLevel=function(){return D},e.unstable_getFirstCallbackNode=function(){return C(E)},e.unstable_next=function(R){switch(D){case 1:case 2:case 3:var Y=3;break;default:Y=D}var J=D;D=Y;try{return R()}finally{D=J}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=ne,e.unstable_runWithPriority=function(R,Y){switch(R){case 1:case 2:case 3:case 4:case 5:break;default:R=3}var J=D;D=R;try{return Y()}finally{D=J}},e.unstable_scheduleCallback=function(R,Y,J){var le=e.unstable_now();switch(typeof J=="object"&&J!==null?(J=J.delay,J=typeof J=="number"&&0le?(R.sortIndex=J,T(x,R),C(E)===null&&R===C(x)&&(H?r():H=!0,n(he,J-le))):(R.sortIndex=ue,T(E,R),q||B||(q=!0,t(ye))),R},e.unstable_wrapCallback=function(R){var Y=D;return function(){var J=D;D=Y;try{return R.apply(this,arguments)}finally{D=J}}}})(ty);(function(e){e.exports=ty})(ey);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Xl=j.exports,xe=jg,je=ey.exports;function L(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function st(e,t,n,r,o,i,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=o,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=i,this.removeEmptyString=a}var Ve={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){Ve[e]=new st(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];Ve[t]=new st(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){Ve[e]=new st(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){Ve[e]=new st(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){Ve[e]=new st(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){Ve[e]=new st(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){Ve[e]=new st(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){Ve[e]=new st(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){Ve[e]=new st(e,5,!1,e.toLowerCase(),null,!1,!1)});var md=/[\-:]([a-z])/g;function vd(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(md,vd);Ve[t]=new st(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(md,vd);Ve[t]=new st(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(md,vd);Ve[t]=new st(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){Ve[e]=new st(e,1,!1,e.toLowerCase(),null,!1,!1)});Ve.xlinkHref=new st("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){Ve[e]=new st(e,1,!1,e.toLowerCase(),null,!0,!0)});function gd(e,t,n,r){var o=Ve.hasOwnProperty(t)?Ve[t]:null,i=o!==null?o.type===0:r?!1:!(!(2s||o[a]!==i[s])return` -`+o[a].replace(" at new "," at ");while(1<=a&&0<=s);break}}}finally{Ju=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Ii(e):""}function US(e){switch(e.tag){case 5:return Ii(e.type);case 16:return Ii("Lazy");case 13:return Ii("Suspense");case 19:return Ii("SuspenseList");case 0:case 2:case 15:return e=ps(e.type,!1),e;case 11:return e=ps(e.type.render,!1),e;case 22:return e=ps(e.type._render,!1),e;case 1:return e=ps(e.type,!0),e;default:return""}}function po(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case Bn:return"Fragment";case Or:return"Portal";case ji:return"Profiler";case yd:return"StrictMode";case Wi:return"Suspense";case tl:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case Sd:return(e.displayName||"Context")+".Consumer";case wd:return(e._context.displayName||"Context")+".Provider";case Kl:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case ql:return po(e.type);case Ed:return po(e._render);case bd:t=e._payload,e=e._init;try{return po(e(t))}catch(n){}}return null}function ir(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function oy(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function BS(e){var t=oy(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var o=n.get,i=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return o.call(this)},set:function(a){r=""+a,i.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function hs(e){e._valueTracker||(e._valueTracker=BS(e))}function iy(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=oy(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function nl(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function Gc(e,t){var n=t.checked;return xe({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function Th(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=ir(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function ay(e,t){t=t.checked,t!=null&&gd(e,"checked",t,!1)}function $c(e,t){ay(e,t);var n=ir(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Hc(e,t.type,n):t.hasOwnProperty("defaultValue")&&Hc(e,t.type,ir(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function Ih(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Hc(e,t,n){(t!=="number"||nl(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function jS(e){var t="";return Xl.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function Jc(e,t){return e=xe({children:void 0},t),(t=jS(t.children))&&(e.children=t),e}function ho(e,t,n,r){if(e=e.options,t){t={};for(var o=0;o=n.length))throw Error(L(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:ir(n)}}function sy(e,t){var n=ir(t.value),r=ir(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function Dh(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Qc={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function ly(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Xc(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?ly(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ms,uy=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,o){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,o)})}:e}(function(e,t){if(e.namespaceURI!==Qc.svg||"innerHTML"in e)e.innerHTML=t;else{for(ms=ms||document.createElement("div"),ms.innerHTML=""+t.valueOf().toString()+"",t=ms.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function la(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Yi={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},WS=["Webkit","ms","Moz","O"];Object.keys(Yi).forEach(function(e){WS.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Yi[t]=Yi[e]})});function cy(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Yi.hasOwnProperty(e)&&Yi[e]?(""+t).trim():t+"px"}function fy(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,o=cy(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,o):e[n]=o}}var YS=xe({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Kc(e,t){if(t){if(YS[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(L(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(L(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(L(61))}if(t.style!=null&&typeof t.style!="object")throw Error(L(62))}}function qc(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function xd(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Zc=null,mo=null,vo=null;function Rh(e){if(e=Ra(e)){if(typeof Zc!="function")throw Error(L(280));var t=e.stateNode;t&&(t=ou(t),Zc(e.stateNode,e.type,t))}}function dy(e){mo?vo?vo.push(e):vo=[e]:mo=e}function py(){if(mo){var e=mo,t=vo;if(vo=mo=null,Rh(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function eu(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-ar(t),e[t]=n}var ar=Math.clz32?Math.clz32:ob,nb=Math.log,rb=Math.LN2;function ob(e){return e===0?32:31-(nb(e)/rb|0)|0}var ib=je.unstable_UserBlockingPriority,ab=je.unstable_runWithPriority,Ls=!0;function sb(e,t,n,r){_r||_d();var o=Nd,i=_r;_r=!0;try{hy(o,e,t,n,r)}finally{(_r=i)||Pd()}}function lb(e,t,n,r){ab(ib,Nd.bind(null,e,t,n,r))}function Nd(e,t,n,r){if(Ls){var o;if((o=(t&4)===0)&&0=Gi),Gh=String.fromCharCode(32),$h=!1;function Iy(e,t){switch(e){case"keyup":return Ib.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function Ny(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var io=!1;function Db(e,t){switch(e){case"compositionend":return Ny(t);case"keypress":return t.which!==32?null:($h=!0,Gh);case"textInput":return e=t.data,e===Gh&&$h?null:e;default:return null}}function Rb(e,t){if(io)return e==="compositionend"||!Fd&&Iy(e,t)?(e=ky(),Ms=Rd=zn=null,io=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Qh(n)}}function My(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?My(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Kh(){for(var e=window,t=nl();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=nl(e.document)}return t}function of(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var Gb=In&&"documentMode"in document&&11>=document.documentMode,ao=null,af=null,Hi=null,sf=!1;function qh(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;sf||ao==null||ao!==nl(r)||(r=ao,"selectionStart"in r&&of(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),Hi&&ha(Hi,r)||(Hi=r,r=al(af,"onSelect"),0lo||(e.current=uf[lo],uf[lo]=null,lo--)}function Ne(e,t){lo++,uf[lo]=e.current,e.current=t}var sr={},nt=hr(sr),gt=hr(!1),Rr=sr;function ko(e,t){var n=e.type.contextTypes;if(!n)return sr;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var o={},i;for(i in n)o[i]=t[i];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=o),o}function yt(e){return e=e.childContextTypes,e!=null}function ul(){Se(gt),Se(nt)}function sm(e,t,n){if(nt.current!==sr)throw Error(L(168));Ne(nt,t),Ne(gt,n)}function Gy(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var o in r)if(!(o in e))throw Error(L(108,po(t)||"Unknown",o));return xe({},n,r)}function Us(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||sr,Rr=nt.current,Ne(nt,e),Ne(gt,gt.current),!0}function lm(e,t,n){var r=e.stateNode;if(!r)throw Error(L(169));n?(e=Gy(e,t,Rr),r.__reactInternalMemoizedMergedChildContext=e,Se(gt),Se(nt),Ne(nt,e)):Se(gt),Ne(gt,n)}var Bd=null,Ir=null,Jb=je.unstable_runWithPriority,jd=je.unstable_scheduleCallback,cf=je.unstable_cancelCallback,Vb=je.unstable_shouldYield,um=je.unstable_requestPaint,ff=je.unstable_now,Qb=je.unstable_getCurrentPriorityLevel,iu=je.unstable_ImmediatePriority,$y=je.unstable_UserBlockingPriority,Hy=je.unstable_NormalPriority,Jy=je.unstable_LowPriority,Vy=je.unstable_IdlePriority,ac={},Xb=um!==void 0?um:function(){},En=null,Bs=null,sc=!1,cm=ff(),et=1e4>cm?ff:function(){return ff()-cm};function To(){switch(Qb()){case iu:return 99;case $y:return 98;case Hy:return 97;case Jy:return 96;case Vy:return 95;default:throw Error(L(332))}}function Qy(e){switch(e){case 99:return iu;case 98:return $y;case 97:return Hy;case 96:return Jy;case 95:return Vy;default:throw Error(L(332))}}function Lr(e,t){return e=Qy(e),Jb(e,t)}function va(e,t,n){return e=Qy(e),jd(e,t,n)}function Sn(){if(Bs!==null){var e=Bs;Bs=null,cf(e)}Xy()}function Xy(){if(!sc&&En!==null){sc=!0;var e=0;try{var t=En;Lr(99,function(){for(;eO?(b=C,C=null):b=C.sibling;var E=d(h,C,w[O],S);if(E===null){C===null&&(C=b);break}e&&C&&E.alternate===null&&t(h,C),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E,C=b}if(O===w.length)return n(h,C),A;if(C===null){for(;OO?(b=C,C=null):b=C.sibling;var x=d(h,C,E.value,S);if(x===null){C===null&&(C=b);break}e&&C&&x.alternate===null&&t(h,C),v=i(x,v,O),T===null?A=x:T.sibling=x,T=x,C=b}if(E.done)return n(h,C),A;if(C===null){for(;!E.done;O++,E=w.next())E=f(h,E.value,S),E!==null&&(v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return A}for(C=r(h,C);!E.done;O++,E=w.next())E=p(C,h,O,E.value,S),E!==null&&(e&&E.alternate!==null&&C.delete(E.key===null?O:E.key),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return e&&C.forEach(function(_){return t(h,_)}),A}return function(h,v,w,S){var A=typeof w=="object"&&w!==null&&w.type===Bn&&w.key===null;A&&(w=w.props.children);var T=typeof w=="object"&&w!==null;if(T)switch(w.$$typeof){case Ti:e:{for(T=w.key,A=v;A!==null;){if(A.key===T){switch(A.tag){case 7:if(w.type===Bn){n(h,A.sibling),v=o(A,w.props.children),v.return=h,h=v;break e}break;default:if(A.elementType===w.type){n(h,A.sibling),v=o(A,w.props),v.ref=ci(h,A,w),v.return=h,h=v;break e}}n(h,A);break}else t(h,A);A=A.sibling}w.type===Bn?(v=Eo(w.props.children,h.mode,S,w.key),v.return=h,h=v):(S=zs(w.type,w.key,w.props,null,h.mode,S),S.ref=ci(h,v,w),S.return=h,h=S)}return a(h);case Or:e:{for(A=w.key;v!==null;){if(v.key===A)if(v.tag===4&&v.stateNode.containerInfo===w.containerInfo&&v.stateNode.implementation===w.implementation){n(h,v.sibling),v=o(v,w.children||[]),v.return=h,h=v;break e}else{n(h,v);break}else t(h,v);v=v.sibling}v=pc(w,h.mode,S),v.return=h,h=v}return a(h)}if(typeof w=="string"||typeof w=="number")return w=""+w,v!==null&&v.tag===6?(n(h,v.sibling),v=o(v,w),v.return=h,h=v):(n(h,v),v=dc(w,h.mode,S),v.return=h,h=v),a(h);if(ys(w))return m(h,v,w,S);if(oi(w))return y(h,v,w,S);if(T&&ws(h,w),typeof w=="undefined"&&!A)switch(h.tag){case 1:case 22:case 0:case 11:case 15:throw Error(L(152,po(h.type)||"Component"))}return n(h,v)}}var hl=t0(!0),n0=t0(!1),La={},fn=hr(La),ya=hr(La),wa=hr(La);function kr(e){if(e===La)throw Error(L(174));return e}function pf(e,t){switch(Ne(wa,t),Ne(ya,e),Ne(fn,La),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Xc(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Xc(t,e)}Se(fn),Ne(fn,t)}function Io(){Se(fn),Se(ya),Se(wa)}function mm(e){kr(wa.current);var t=kr(fn.current),n=Xc(t,e.type);t!==n&&(Ne(ya,e),Ne(fn,n))}function Gd(e){ya.current===e&&(Se(fn),Se(ya))}var Ie=hr(0);function ml(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var xn=null,$n=null,dn=!1;function r0(e,t){var n=Lt(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function vm(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function hf(e){if(dn){var t=$n;if(t){var n=t;if(!vm(e,t)){if(t=go(n.nextSibling),!t||!vm(e,t)){e.flags=e.flags&-1025|2,dn=!1,xn=e;return}r0(xn,n)}xn=e,$n=go(t.firstChild)}else e.flags=e.flags&-1025|2,dn=!1,xn=e}}function gm(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;xn=e}function Ss(e){if(e!==xn)return!1;if(!dn)return gm(e),dn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!lf(t,e.memoizedProps))for(t=$n;t;)r0(e,t),t=go(t.nextSibling);if(gm(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(L(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){$n=go(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}$n=null}}else $n=xn?go(e.stateNode.nextSibling):null;return!0}function lc(){$n=xn=null,dn=!1}var wo=[];function $d(){for(var e=0;ei))throw Error(L(301));i+=1,He=Ke=null,t.updateQueue=null,Ji.current=tE,e=n(r,o)}while(Vi)}if(Ji.current=Sl,t=Ke!==null&&Ke.next!==null,Sa=0,He=Ke=De=null,vl=!1,t)throw Error(L(300));return e}function Tr(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return He===null?De.memoizedState=He=e:He=He.next=e,He}function Gr(){if(Ke===null){var e=De.alternate;e=e!==null?e.memoizedState:null}else e=Ke.next;var t=He===null?De.memoizedState:He.next;if(t!==null)He=t,Ke=e;else{if(e===null)throw Error(L(310));Ke=e,e={memoizedState:Ke.memoizedState,baseState:Ke.baseState,baseQueue:Ke.baseQueue,queue:Ke.queue,next:null},He===null?De.memoizedState=He=e:He=He.next=e}return He}function ln(e,t){return typeof t=="function"?t(e):t}function fi(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=Ke,o=r.baseQueue,i=n.pending;if(i!==null){if(o!==null){var a=o.next;o.next=i.next,i.next=a}r.baseQueue=o=i,n.pending=null}if(o!==null){o=o.next,r=r.baseState;var s=a=i=null,l=o;do{var u=l.lane;if((Sa&u)===u)s!==null&&(s=s.next={lane:0,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null}),r=l.eagerReducer===e?l.eagerState:e(r,l.action);else{var c={lane:u,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null};s===null?(a=s=c,i=r):s=s.next=c,De.lanes|=u,Ma|=u}l=l.next}while(l!==null&&l!==o);s===null?i=r:s.next=a,Rt(r,t.memoizedState)||(Zt=!0),t.memoizedState=r,t.baseState=i,t.baseQueue=s,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function di(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=n.dispatch,o=n.pending,i=t.memoizedState;if(o!==null){n.pending=null;var a=o=o.next;do i=e(i,a.action),a=a.next;while(a!==o);Rt(i,t.memoizedState)||(Zt=!0),t.memoizedState=i,t.baseQueue===null&&(t.baseState=i),n.lastRenderedState=i}return[i,r]}function ym(e,t,n){var r=t._getVersion;r=r(t._source);var o=t._workInProgressVersionPrimary;if(o!==null?e=o===r:(e=e.mutableReadLanes,(e=(Sa&e)===e)&&(t._workInProgressVersionPrimary=r,wo.push(t))),e)return n(t._source);throw wo.push(t),Error(L(350))}function o0(e,t,n,r){var o=at;if(o===null)throw Error(L(349));var i=t._getVersion,a=i(t._source),s=Ji.current,l=s.useState(function(){return ym(o,t,n)}),u=l[1],c=l[0];l=He;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,m=f.source;f=f.subscribe;var y=De;return e.memoizedState={refs:d,source:t,subscribe:r},s.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var h=i(t._source);if(!Rt(a,h)){h=n(t._source),Rt(c,h)||(u(h),h=Zn(y),o.mutableReadLanes|=h&o.pendingLanes),h=o.mutableReadLanes,o.entangledLanes|=h;for(var v=o.entanglements,w=h;0n?98:n,function(){e(!0)}),Lr(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[Gn]=t,e[ll]=r,p0(e,t,!1,!1),t.stateNode=e,a=qc(n,r),n){case"dialog":we("cancel",e),we("close",e),o=r;break;case"iframe":case"object":case"embed":we("load",e),o=r;break;case"video":case"audio":for(o=0;oAf&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432)}else{if(!i)if(e=ml(a),e!==null){if(t.flags|=64,i=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),hi(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!dn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*et()-r.renderingStartTime>Af&&n!==1073741824&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=et(),n.sibling=null,t=Ie.current,Ne(Ie,i?t&1|2:t&1),n):null;case 23:case 24:return tp(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(L(156,t.tag))}function oE(e){switch(e.tag){case 1:yt(e.type)&&ul();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(Io(),Se(gt),Se(nt),$d(),t=e.flags,(t&64)!==0)throw Error(L(285));return e.flags=t&-4097|64,e;case 5:return Gd(e),null;case 13:return Se(Ie),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return Se(Ie),null;case 4:return Io(),null;case 10:return Yd(e),null;case 23:case 24:return tp(),null;default:return null}}function Kd(e,t){try{var n="",r=t;do n+=US(r),r=r.return;while(r);var o=n}catch(i){o=` -Error generating stack: `+i.message+` -`+i.stack}return{value:e,source:t,stack:o}}function wf(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var iE=typeof WeakMap=="function"?WeakMap:Map;function v0(e,t,n){n=Kn(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){El||(El=!0,xf=r),wf(e,t)},n}function g0(e,t,n){n=Kn(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var o=t.value;n.payload=function(){return wf(e,t),r(o)}}var i=e.stateNode;return i!==null&&typeof i.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(un===null?un=new Set([this]):un.add(this),wf(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var aE=typeof WeakSet=="function"?WeakSet:Set;function Im(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){tr(e,n)}else t.current=null}function sE(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Qt(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ud(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(L(163))}function lE(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var o=e;r=o.next,o=o.tag,(o&4)!==0&&(o&1)!==0&&(O0(n,e),vE(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Qt(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&dm(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}dm(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&Yy(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&by(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(L(163))}function Nm(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var o=n.memoizedProps.style;o=o!=null&&o.hasOwnProperty("display")?o.display:null,r.style.display=cy("display",o)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function Dm(e,t){if(Ir&&typeof Ir.onCommitFiberUnmount=="function")try{Ir.onCommitFiberUnmount(Bd,t)}catch(i){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,o=r.destroy;if(r=r.tag,o!==void 0)if((r&4)!==0)O0(t,n);else{r=t;try{o()}catch(i){tr(r,i)}}n=n.next}while(n!==e)}break;case 1:if(Im(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(i){tr(t,i)}break;case 5:Im(t);break;case 4:y0(e,t)}}function Rm(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function Lm(e){return e.tag===5||e.tag===3||e.tag===4}function Mm(e){e:{for(var t=e.return;t!==null;){if(Lm(t))break e;t=t.return}throw Error(L(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(L(161))}n.flags&16&&(la(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||Lm(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Sf(e,n,t):bf(e,n,t)}function Sf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=sl));else if(r!==4&&(e=e.child,e!==null))for(Sf(e,t,n),e=e.sibling;e!==null;)Sf(e,t,n),e=e.sibling}function bf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(bf(e,t,n),e=e.sibling;e!==null;)bf(e,t,n),e=e.sibling}function y0(e,t){for(var n=t,r=!1,o,i;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(L(160));switch(o=r.stateNode,r.tag){case 5:i=!1;break e;case 3:o=o.containerInfo,i=!0;break e;case 4:o=o.containerInfo,i=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,s=n,l=s;;)if(Dm(a,l),l.child!==null&&l.tag!==4)l.child.return=l,l=l.child;else{if(l===s)break e;for(;l.sibling===null;){if(l.return===null||l.return===s)break e;l=l.return}l.sibling.return=l.return,l=l.sibling}i?(a=o,s=n.stateNode,a.nodeType===8?a.parentNode.removeChild(s):a.removeChild(s)):o.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){o=n.stateNode.containerInfo,i=!0,n.child.return=n,n=n.child;continue}}else if(Dm(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function fc(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var o=e!==null?e.memoizedProps:r;e=t.type;var i=t.updateQueue;if(t.updateQueue=null,i!==null){for(n[ll]=r,e==="input"&&r.type==="radio"&&r.name!=null&&ay(n,r),qc(e,o),t=qc(e,r),o=0;oo&&(o=a),n&=~i}if(n=o,n=et()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*cE(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}Je!==5&&(Je=2),l=Kd(l,s),d=a;do{switch(d.tag){case 3:i=l,d.flags|=4096,t&=-t,d.lanes|=t;var T=v0(d,i,t);fm(d,T);break e;case 1:i=l;var C=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof C.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(un===null||!un.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var b=g0(d,i,t);fm(d,b);break e}}d=d.return}while(d!==null)}x0(n)}catch(E){t=E,Le===n&&n!==null&&(Le=n=n.return);continue}break}while(1)}function C0(){var e=bl.current;return bl.current=Sl,e===null?Sl:e}function Ri(e,t){var n=X;X|=16;var r=C0();at===e&&tt===t||bo(e,t);do try{dE();break}catch(o){E0(e,o)}while(1);if(Wd(),X=n,bl.current=r,Le!==null)throw Error(L(261));return at=null,tt=0,Je}function dE(){for(;Le!==null;)A0(Le)}function pE(){for(;Le!==null&&!Vb();)A0(Le)}function A0(e){var t=_0(e.alternate,e,Mr);e.memoizedProps=e.pendingProps,t===null?x0(e):Le=t,qd.current=null}function x0(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=rE(n,t,Mr),n!==null){Le=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(Mr&1073741824)!==0||(n.mode&4)===0){for(var r=0,o=n.child;o!==null;)r|=o.lanes|o.childLanes,o=o.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(s=a,a=T,T=s),s=Xh(w,T),i=Xh(w,a),s&&i&&(A.rangeCount!==1||A.anchorNode!==s.node||A.anchorOffset!==s.offset||A.focusNode!==i.node||A.focusOffset!==i.offset)&&(S=S.createRange(),S.setStart(s.node,s.offset),A.removeAllRanges(),T>a?(A.addRange(S),A.extend(i.node,i.offset)):(S.setEnd(i.node,i.offset),A.addRange(S)))))),S=[],A=w;A=A.parentNode;)A.nodeType===1&&S.push({element:A,left:A.scrollLeft,top:A.scrollTop});for(typeof w.focus=="function"&&w.focus(),w=0;wet()-ep?bo(e,0):Zd|=n),jt(e,t)}function wE(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=To()===99?1:2:(An===0&&(An=Qo),t=eo(62914560&~An),t===0&&(t=4194304))),n=Ot(),e=lu(e,t),e!==null&&(eu(e,t,n),jt(e,n))}var _0;_0=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||gt.current)Zt=!0;else if((n&r)!==0)Zt=(e.flags&16384)!==0;else{switch(Zt=!1,t.tag){case 3:Am(t),lc();break;case 5:mm(t);break;case 1:yt(t.type)&&Us(t);break;case 4:pf(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var o=t.type._context;Ne(cl,o._currentValue),o._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?xm(e,t,n):(Ne(Ie,Ie.current&1),t=On(e,t,n),t!==null?t.sibling:null);Ne(Ie,Ie.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return Tm(e,t,n);t.flags|=64}if(o=t.memoizedState,o!==null&&(o.rendering=null,o.tail=null,o.lastEffect=null),Ne(Ie,Ie.current),r)break;return null;case 23:case 24:return t.lanes=0,uc(e,t,n)}return On(e,t,n)}else Zt=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=ko(t,nt.current),yo(t,n),o=Jd(null,t,r,e,o,n),t.flags|=1,typeof o=="object"&&o!==null&&typeof o.render=="function"&&o.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,yt(r)){var i=!0;Us(t)}else i=!1;t.memoizedState=o.state!==null&&o.state!==void 0?o.state:null,zd(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&pl(t,r,a,e),o.updater=au,t.stateNode=o,o._reactInternals=t,df(t,r,e,n),t=gf(null,t,r,!0,i,n)}else t.tag=0,ht(null,t,o,n),t=t.child;return t;case 16:o=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=o._init,o=i(o._payload),t.type=o,i=t.tag=bE(o),e=Qt(o,e),i){case 0:t=vf(null,t,o,e,n);break e;case 1:t=Cm(null,t,o,e,n);break e;case 11:t=bm(null,t,o,e,n);break e;case 14:t=Em(null,t,o,Qt(o.type,e),r,n);break e}throw Error(L(306,o,""))}return t;case 0:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),vf(e,t,r,o,n);case 1:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),Cm(e,t,r,o,n);case 3:if(Am(t),r=t.updateQueue,e===null||r===null)throw Error(L(282));if(r=t.pendingProps,o=t.memoizedState,o=o!==null?o.element:null,qy(e,t),ga(t,r,null,n),r=t.memoizedState.element,r===o)lc(),t=On(e,t,n);else{if(o=t.stateNode,(i=o.hydrate)&&($n=go(t.stateNode.containerInfo.firstChild),xn=t,i=dn=!0),i){if(e=o.mutableSourceEagerHydrationData,e!=null)for(o=0;o1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:cp(e)?2:fp(e)?3:0}function Co(e,t){return qo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function cC(e,t){return qo(e)===2?e.get(t):e[t]}function H0(e,t,n){var r=qo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function J0(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function cp(e){return vC&&e instanceof Map}function fp(e){return gC&&e instanceof Set}function Cr(e){return e.o||e.t}function dp(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Q0(e);delete t[Ce];for(var n=Ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=fC),Object.freeze(e),t&&Fr(e,function(n,r){return pp(r,!0)},!0)),e}function fC(){Kt(2)}function hp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function Pn(e){var t=Rf[e];return t||Kt(18,e),t}function dC(e,t){Rf[e]||(Rf[e]=t)}function If(){return ba}function mc(e,t){t&&(Pn("Patches"),e.u=[],e.s=[],e.v=t)}function Al(e){Nf(e),e.p.forEach(pC),e.p=null}function Nf(e){e===ba&&(ba=e.l)}function Ym(e){return ba={p:[],l:ba,h:e,m:!0,_:0}}function pC(e){var t=e[Ce];t.i===0||t.i===1?t.j():t.O=!0}function vc(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||Pn("ES5").S(t,e,r),r?(n[Ce].P&&(Al(t),Kt(4)),dr(e)&&(e=xl(t,e),t.l||Ol(t,e)),t.u&&Pn("Patches").M(n[Ce],e,t.u,t.s)):e=xl(t,n,[]),Al(t),t.u&&t.v(t.u,t.s),e!==V0?e:void 0}function xl(e,t,n){if(hp(t))return t;var r=t[Ce];if(!r)return Fr(t,function(i,a){return zm(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Ol(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=dp(r.k):r.o;Fr(r.i===3?new Set(o):o,function(i,a){return zm(e,r,o,i,a,n)}),Ol(e,o,!1),n&&e.u&&Pn("Patches").R(r,n,e.u,e.s)}return r.o}function zm(e,t,n,r,o,i){if(fr(o)){var a=xl(e,o,i&&t&&t.i!==3&&!Co(t.D,r)?i.concat(r):void 0);if(H0(n,r,a),!fr(a))return;e.m=!1}if(dr(o)&&!hp(o)){if(!e.h.F&&e._<1)return;xl(e,o),t&&t.A.l||Ol(e,o)}}function Ol(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&pp(t,n)}function gc(e,t){var n=e[Ce];return(n?Cr(n):e)[t]}function Gm(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function jn(e){e.P||(e.P=!0,e.l&&jn(e.l))}function yc(e){e.o||(e.o=dp(e.t))}function Df(e,t,n){var r=cp(t)?Pn("MapSet").N(t,n):fp(t)?Pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:If(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=xo;a&&(l=[s],u=Gs);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):Pn("ES5").J(t,n);return(n?n.A:If()).p.push(r),r}function hC(e){return fr(e)||Kt(22,e),function t(n){if(!dr(n))return n;var r,o=n[Ce],i=qo(n);if(o){if(!o.P&&(o.i<4||!Pn("ES5").K(o)))return o.t;o.I=!0,r=$m(n,i),o.I=!1}else r=$m(n,i);return Fr(r,function(a,s){o&&cC(o.t,a)===s||H0(r,a,t(s))}),i===3?new Set(r):r}(e)}function $m(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return dp(e)}function mC(){function e(i,a){var s=o[i];return s?s.enumerable=a:o[i]=s={configurable:!0,enumerable:a,get:function(){var l=this[Ce];return xo.get(l,i)},set:function(l){var u=this[Ce];xo.set(u,i,l)}},s}function t(i){for(var a=i.length-1;a>=0;a--){var s=i[a][Ce];if(!s.P)switch(s.i){case 5:r(s)&&jn(s);break;case 4:n(s)&&jn(s)}}}function n(i){for(var a=i.t,s=i.k,l=Ao(s),u=l.length-1;u>=0;u--){var c=l[u];if(c!==Ce){var f=a[c];if(f===void 0&&!Co(a,c))return!0;var d=s[c],p=d&&d[Ce];if(p?p.t!==f:!J0(d,f))return!0}}var m=!!a[Ce];return l.length!==Ao(a).length+(m?0:1)}function r(i){var a=i.k;if(a.length!==i.t.length)return!0;var s=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!s||s.get)}var o={};dC("ES5",{J:function(i,a){var s=Array.isArray(i),l=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?y-1:0),v=1;v1?u-1:0),f=1;f=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=Pn("Patches").$;return fr(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),_t=new wC,SC=_t.produce;_t.produceWithPatches.bind(_t);_t.setAutoFreeze.bind(_t);_t.setUseProxies.bind(_t);_t.applyPatches.bind(_t);_t.createDraft.bind(_t);_t.finishDraft.bind(_t);const $s=SC;function bC(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Qm(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Xm(e){for(var t=1;t0&&i[i.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!i||u[1]>i[0]&&u[1]0)for(var S=p.getState(),A=Array.from(n.values()),T=0,C=A;T!1}}),iA=()=>{const e=vr();return I.useCallback(()=>{e(aA())},[e])},{DISCONNECTED_FROM_SERVER:aA}=s1.actions,sA=s1.reducer;function Xa(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(i)),o=Object.keys(t).filter(i=>!n.includes(i));if(!Xa(r,o))return!1;for(let i of r)if(e[i]!==t[i])return!1;return!0}function l1(e,t,n){return n===0?!0:Xa(e.slice(0,n),t.slice(0,n))}function uA(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:l1(e,t,n)}const u1=vp({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:c1,RESET_SELECTION:a5,STEP_BACK_SELECTION:cA}=u1.actions,fA=u1.reducer,dA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function pA(e){const t=vr();return j.exports.useCallback(()=>{e!==null&&t(bw({path:e}))},[t,e])}const hA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",mA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",vA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",Mf="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",f1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",d1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",gA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",yA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",wA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",SA="_icon_1467k_1",bA={icon:SA},EA={undo:wA,redo:gA,tour:yA,alignTop:vA,alignBottom:mA,alignCenter:hA,alignSpread:Mf,alignTextCenter:Mf,alignTextLeft:f1,alignTextRight:d1};function CA({id:e,alt:t=e,size:n}){return g("img",{src:EA[e],alt:t,className:bA.icon,style:n?{height:n}:{}})}var p1={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},rv=j.exports.createContext&&j.exports.createContext(p1),Ur=globalThis&&globalThis.__assign||function(){return Ur=Object.assign||function(e){for(var t,n=1,r=arguments.length;ng("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),Sp=e=>N("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),PA=e=>g("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),kA="_button_1dliw_1",TA="_regular_1dliw_26",IA="_icon_1dliw_34",NA="_transparent_1dliw_42",Sc={button:kA,regular:TA,delete:"_delete_1dliw_30",icon:IA,transparent:NA},wt=o=>{var i=o,{children:e,variant:t="regular",className:n}=i,r=$t(i,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(s=>Sc[s]).join(" "):Sc[t]:"";return g("button",$(F({className:Sc.button+" "+a+(n?" "+n:"")},r),{children:e}))},DA="_deleteButton_1en02_1",RA={deleteButton:DA};function m1({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=pA(e);return N(wt,{className:RA.deleteButton,onClick:o=>{o.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[g(Sp,{}),t?null:"Delete Element"]})}function v1(){const e=vr(),t=Va(r=>r.selectedPath),n=j.exports.useCallback(r=>{e(c1({path:r}))},[e]);return[t,n]}const bp=I.createContext([null,e=>{}]),LA=({children:e})=>{const t=I.useState(null);return g(bp.Provider,{value:t,children:e})};function MA(){return I.useContext(bp)}function g1({ref:e,nodeInfo:t,immovable:n=!1}){const r=I.useRef(!1),[,o]=I.useContext(bp),i=I.useCallback(()=>{r.current===!1||n||(o(null),r.current=!1,document.body.removeEventListener("dragover",ov),document.body.removeEventListener("drop",i))},[n,o]),a=I.useCallback(s=>{s.stopPropagation(),o(t),r.current=!0,document.body.addEventListener("dragover",ov),document.body.addEventListener("drop",i)},[i,t,o]);I.useEffect(()=>{var l;if(((l=t.currentPath)==null?void 0:l.length)===0||n)return;const s=e.current;if(!!s)return s.setAttribute("draggable","true"),s.addEventListener("dragstart",a),s.addEventListener("dragend",i),()=>{s.removeEventListener("dragstart",a),s.removeEventListener("dragend",i)}},[i,n,t.currentPath,a,e])}function ov(e){e.preventDefault()}const FA="_leaf_1yzht_1",UA="_selectedOverlay_1yzht_5",BA="_container_1yzht_15",iv={leaf:FA,selectedOverlay:UA,container:BA};function jA({ref:e,path:t}){I.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const Ep=r=>{var o=r,{path:e=[],canMove:t=!0}=o,n=$t(o,["path","canMove"]);const i=I.useRef(null),{uiName:a,uiArguments:s,uiChildren:l}=n,[u,c]=v1(),f=u?Xa(e,u):!1,d=en[a],p=y=>{y.stopPropagation(),c(e)};if(g1({ref:i,nodeInfo:{node:n,currentPath:e},immovable:!t}),jA({ref:i,path:e}),d.acceptsChildren===!0){const y=d.UiComponent;return g(y,{uiArguments:s,uiChildren:l!=null?l:[],compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})}const m=d.UiComponent;return g(m,{uiArguments:s,compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})},Cp=I.forwardRef((o,r)=>{var i=o,{className:e="",children:t}=i,n=$t(i,["className","children"]);const a=e+" card";return g("div",$(F({ref:r,className:a},n),{children:t}))}),WA=I.forwardRef((r,n)=>{var o=r,{className:e=""}=o,t=$t(o,["className"]);const i=e+" card-header";return g("div",F({ref:n,className:i},t))}),YA="_container_rm196_1",zA="_withTitle_rm196_13",GA="_panelTitle_rm196_22",$A="_contentHolder_rm196_27",HA="_dropWatcher_rm196_67",JA="_lastDropWatcher_rm196_75",VA="_firstDropWatcher_rm196_78",QA="_middleDropWatcher_rm196_89",XA="_onlyDropWatcher_rm196_93",KA="_hoveringOverSwap_rm196_98",qA="_availableToSwap_rm196_99",ZA="_pulse_rm196_1",ex="_emptyGridCard_rm196_143",tx="_emptyMessage_rm196_160",xt={container:YA,withTitle:zA,panelTitle:GA,contentHolder:$A,dropWatcher:HA,lastDropWatcher:JA,firstDropWatcher:VA,middleDropWatcher:QA,onlyDropWatcher:XA,hoveringOverSwap:KA,availableToSwap:qA,pulse:ZA,emptyGridCard:ex,emptyMessage:tx};function qt(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Ap(e)?2:xp(e)?3:0}function Ff(e,t){return Zo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function nx(e,t){return Zo(e)===2?e.get(t):e[t]}function y1(e,t,n){var r=Zo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function rx(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Ap(e){return sx&&e instanceof Map}function xp(e){return lx&&e instanceof Set}function Ar(e){return e.o||e.t}function Op(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=cx(e);delete t[Pt];for(var n=Tp(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=ox),Object.freeze(e),t&&Aa(e,function(n,r){return _p(r,!0)},!0)),e}function ox(){qt(2)}function Pp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function pn(e){var t=fx[e];return t||qt(18,e),t}function av(){return xa}function bc(e,t){t&&(pn("Patches"),e.u=[],e.s=[],e.v=t)}function Tl(e){Uf(e),e.p.forEach(ix),e.p=null}function Uf(e){e===xa&&(xa=e.l)}function sv(e){return xa={p:[],l:xa,h:e,m:!0,_:0}}function ix(e){var t=e[Pt];t.i===0||t.i===1?t.j():t.O=!0}function Ec(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||pn("ES5").S(t,e,r),r?(n[Pt].P&&(Tl(t),qt(4)),Br(e)&&(e=Il(t,e),t.l||Nl(t,e)),t.u&&pn("Patches").M(n[Pt].t,e,t.u,t.s)):e=Il(t,n,[]),Tl(t),t.u&&t.v(t.u,t.s),e!==w1?e:void 0}function Il(e,t,n){if(Pp(t))return t;var r=t[Pt];if(!r)return Aa(t,function(i,a){return lv(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Nl(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=Op(r.k):r.o;Aa(r.i===3?new Set(o):o,function(i,a){return lv(e,r,o,i,a,n)}),Nl(e,o,!1),n&&e.u&&pn("Patches").R(r,n,e.u,e.s)}return r.o}function lv(e,t,n,r,o,i){if(Do(o)){var a=Il(e,o,i&&t&&t.i!==3&&!Ff(t.D,r)?i.concat(r):void 0);if(y1(n,r,a),!Do(a))return;e.m=!1}if(Br(o)&&!Pp(o)){if(!e.h.F&&e._<1)return;Il(e,o),t&&t.A.l||Nl(e,o)}}function Nl(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&_p(t,n)}function Cc(e,t){var n=e[Pt];return(n?Ar(n):e)[t]}function uv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Bf(e){e.P||(e.P=!0,e.l&&Bf(e.l))}function Ac(e){e.o||(e.o=Op(e.t))}function jf(e,t,n){var r=Ap(t)?pn("MapSet").N(t,n):xp(t)?pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:av(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=Wf;a&&(l=[s],u=Li);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):pn("ES5").J(t,n);return(n?n.A:av()).p.push(r),r}function ax(e){return Do(e)||qt(22,e),function t(n){if(!Br(n))return n;var r,o=n[Pt],i=Zo(n);if(o){if(!o.P&&(o.i<4||!pn("ES5").K(o)))return o.t;o.I=!0,r=cv(n,i),o.I=!1}else r=cv(n,i);return Aa(r,function(a,s){o&&nx(o.t,a)===s||y1(r,a,t(s))}),i===3?new Set(r):r}(e)}function cv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Op(e)}var fv,xa,kp=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",sx=typeof Map!="undefined",lx=typeof Set!="undefined",dv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",w1=kp?Symbol.for("immer-nothing"):((fv={})["immer-nothing"]=!0,fv),pv=kp?Symbol.for("immer-draftable"):"__$immer_draftable",Pt=kp?Symbol.for("immer-state"):"__$immer_state",ux=""+Object.prototype.constructor,Tp=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,cx=Object.getOwnPropertyDescriptors||function(e){var t={};return Tp(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},fx={},Wf={get:function(e,t){if(t===Pt)return e;var n=Ar(e);if(!Ff(n,t))return function(o,i,a){var s,l=uv(i,a);return l?"value"in l?l.value:(s=l.get)===null||s===void 0?void 0:s.call(o.k):void 0}(e,n,t);var r=n[t];return e.I||!Br(r)?r:r===Cc(e.t,t)?(Ac(e),e.o[t]=jf(e.A.h,r,e)):r},has:function(e,t){return t in Ar(e)},ownKeys:function(e){return Reflect.ownKeys(Ar(e))},set:function(e,t,n){var r=uv(Ar(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var o=Cc(Ar(e),t),i=o==null?void 0:o[Pt];if(i&&i.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(rx(n,o)&&(n!==void 0||Ff(e.t,t)))return!0;Ac(e),Bf(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Cc(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,Ac(e),Bf(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=Ar(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){qt(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){qt(12)}},Li={};Aa(Wf,function(e,t){Li[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Li.deleteProperty=function(e,t){return Li.set.call(this,e,t,void 0)},Li.set=function(e,t,n){return Wf.set.call(this,e[0],t,n,e[0])};var dx=function(){function e(n){var r=this;this.g=dv,this.F=!0,this.produce=function(o,i,a){if(typeof o=="function"&&typeof i!="function"){var s=i;i=o;var l=r;return function(y){var h=this;y===void 0&&(y=s);for(var v=arguments.length,w=Array(v>1?v-1:0),S=1;S1?c-1:0),d=1;d=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=pn("Patches").$;return Do(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),kt=new dx,px=kt.produce;kt.produceWithPatches.bind(kt);kt.setAutoFreeze.bind(kt);kt.setUseProxies.bind(kt);kt.applyPatches.bind(kt);kt.createDraft.bind(kt);kt.finishDraft.bind(kt);const ei=px,Dl=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+i*r)};function hv(e){let t=1/0,n=-1/0;for(let i of e)in&&(n=i);const r=n-t,o=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===o-1}}function S1(e,t){return[...new Array(t)].fill(e)}function hx(e,t){return e.filter(n=>!t.includes(n))}function Yf(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function Oa(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function mx(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const o=r[t];return r[t]=void 0,r=Oa(r,n,o),r.filter(i=>typeof i!="undefined")}function vx(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const o=e[r-1];return[...e].splice(0,r-1).join(t)+n+o}function Ip(e){return e.uiChildren!==void 0}function rr(e,t){let n=e,r;for(r of t){if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function b1(e,t){return l1(e,t,Math.min(e.length,t.length))}function Np(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const o=n-1;return Xa(e.slice(0,o),t.slice(0,o))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function E1(e,{path:t}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=gx(e,t);if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function gx(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const o=n.length===0?e:rr(e,n);if(!Ip(o))throw new Error("Somehow trying to enter a leaf node");return{parentNode:o,indexToNode:r}}function yx(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:o}){const i=rr(e,t);if(!en[i.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(i.uiChildren)||(i.uiChildren=[]);const a=r==="last"?i.uiChildren.length:r;if(o!==void 0){const s=[...t,a];if(b1(o,s))throw new Error("Invalid move request");if(Np(o,s)){const l=o[o.length-1];i.uiChildren=mx(i.uiChildren,l,a);return}E1(e,{path:o})}i.uiChildren=Oa(i.uiChildren,a,n)}function wx({fromPath:e,toPath:t}){if(e==null)return!0;if(b1(e,t))return!1;if(Np(e,t)){const n=e.length,r=e[n-1],o=t[n-1];if(r===o||r===o-1)return!1}return!0}const Sx="_canAcceptDrop_1oxcd_1",bx="_pulse_1oxcd_1",Ex="_hoveringOver_1oxcd_32",zf={canAcceptDrop:Sx,pulse:bx,hoveringOver:Ex};function Dp({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:o=zf.canAcceptDrop,hoveringOverClass:i=zf.hoveringOver}){const[a,s]=MA(),{addCanAcceptDropHighlight:l,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=Cx({watcherRef:e,canAcceptDropClass:o,hoveringOverClass:i}),d=a?t(a):!1,p=I.useCallback(h=>{h.preventDefault(),h.stopPropagation(),u(),r==null||r()},[u,r]),m=I.useCallback(h=>{h.preventDefault(),c()},[c]),y=I.useCallback(h=>{if(h.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),s(null)},[d,a,n,c,s]);I.useEffect(()=>{const h=e.current;if(!!h)return d&&(l(),h.addEventListener("dragenter",p),h.addEventListener("dragleave",m),h.addEventListener("dragover",p),h.addEventListener("drop",y)),()=>{f(),h.removeEventListener("dragenter",p),h.removeEventListener("dragleave",m),h.removeEventListener("dragover",p),h.removeEventListener("drop",y)}},[l,d,m,p,y,f,e])}function Cx({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=I.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),o=I.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),i=I.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=I.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:o,removeHoveredOverHighlight:i,removeAllHighlights:a}}function Ax({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Ew(),o=I.useCallback(({node:a,currentPath:s})=>mv(a)!==null&&wx({fromPath:s,toPath:[...n,t]}),[t,n]),i=I.useCallback(({node:a,currentPath:s})=>{const l=mv(a);if(!l)throw new Error("No node to place...");r({node:l,currentPath:s,parentPath:n,positionInChildren:t})},[t,n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i})}function mv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function xx(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function vv(e){return Et({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function gv(e){return Et({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function C1(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}var Ou=A1;function A1(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],o={}.toString.call(r).slice(8,-1);o=="Array"||o=="Object"?t[n]=A1(r):o=="Date"?t[n]=new Date(r.getTime()):o=="RegExp"?t[n]=RegExp(r.source,Ox(r)):t[n]=r}return t}function Ox(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Ka(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function _x(e,t={}){const n=new Set;for(let r of e)for(let o of r)t.ignore&&t.ignore.includes(o)||n.add(o);return[...n]}function Px(e,{index:t,arr:n,dir:r}){const o=Ou(e);switch(r){case"rows":return Oa(o,t,n);case"cols":return o.map((i,a)=>Oa(i,t,n[a]))}}function kx(e,{index:t,dir:n}){const r=Ou(e);switch(n){case"rows":return Yf(r,t);case"cols":return r.map((o,i)=>Yf(o,t))}}const vn=".";function Rp(e){const t=new Map;return Tx(e).forEach(({itemRows:n,itemCols:r},o)=>{if(o===vn)return;const i=hv(n),a=hv(r);t.set(o,{colStart:a.minVal,rowStart:i.minVal,colSpan:a.span+1,rowSpan:i.span+1,isValid:i.isSequence&&a.isSequence})}),t}function Tx(e){var o;const t=new Map,{numRows:n,numCols:r}=Ka(e);for(let i=0;i1,c=r>1,f=[];return(yv({colRange:l,rowIndex:e-1,layoutAreas:o})||u)&&f.push("up"),(yv({colRange:l,rowIndex:i+1,layoutAreas:o})||u)&&f.push("down"),(wv({rowRange:s,colIndex:n-1,layoutAreas:o})||c)&&f.push("left"),(wv({rowRange:s,colIndex:a+1,layoutAreas:o})||c)&&f.push("right"),f}function yv({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===vn)}function wv({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===vn)}const Nx="_marker_rkm38_1",Dx="_dragger_rkm38_30",Rx="_move_rkm38_50",Sv={marker:Nx,dragger:Dx,move:Rx};function _a({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function Lx(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=_a(e)),"colSpan"in t&&(t=_a(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function Mx({row:e,col:t}){return`row${e}-col${t}`}function Fx({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:o,colStart:i,colEnd:a}=_a(t),s=n.length,l=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:o,growExtent:1};u=r-1,c=1,f=o;break;case"left":if(i===1)return{shrinkExtent:a,growExtent:1};u=i-1,c=1,f=a;break;case"down":if(o===s)return{shrinkExtent:r,growExtent:s};u=o+1,c=s,f=r;break;case"right":if(a===l)return{shrinkExtent:i,growExtent:l};u=a+1,c=l,f=i;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[m,y]=d?[i,a]:[r,o],h=(S,A)=>{const[T,C]=d?[S,A]:[A,S];return n[T-1][C-1]!==vn},v=Dl(m,y),w=Dl(u,c);for(let S of w)for(let A of v)if(h(S,A))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function x1(e,t,n){const r=t=r&&e<=o}function Ux({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=Gf(t.getPropertyValue("gap")),i=Gf(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],s=Bx(t,e),l=s.length,u=[];for(let c=0;cx1(i,l,u));if(a===void 0)return;const s=Wx[n];return o[s]=a.index,o}const Wx={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function Yx({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const o=_a(t),i=I.useRef(null),a=I.useCallback(u=>{const c=e.current,f=i.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=jx({mousePos:u,dragState:f});d&&Ev(c,d)},[e]),s=I.useCallback(()=>{const u=e.current,c=i.current;if(!u||!c)return;const f=c.gridItemExtent;Lx(f,o)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),bv("on")},[o,a,r,e]);return I.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),m=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:y,growExtent:h}=Fx({dragDirection:u,gridLocation:t,layoutAreas:n});i.current={dragHandle:u,gridItemExtent:_a(t),tractExtents:Ux({dir:m,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:v})=>x1(v,y,h))},Ev(e.current,i.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",s,{once:!0}),bv("off")},[s,t,n,a,e])}function bv(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function Ev(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:o}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(o+1))}function zx({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const o=I.useRef(null),i=Yx({overlayRef:o,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=I.useMemo(()=>Ix({gridLocation:t,layoutAreas:n}),[t,n]),s=I.useMemo(()=>{let l=[];for(let u of a)l.push(g("div",{className:Sv.dragger+" "+u,onMouseDown:c=>{Gx(c),i(u)},children:$x[u]},u));return l},[a,i]);return I.useEffect(()=>{var l;(l=o.current)==null||l.style.setProperty("--grid-area",e)},[e]),g("div",{ref:o,className:Sv.marker+" grid-area-overlay",children:s})}function Gx(e){e.preventDefault(),e.stopPropagation()}const $x={up:g(gv,{}),down:g(gv,{}),left:g(vv,{}),right:g(vv,{})};function Hx({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=I.useRef(null);return Dp({watcherRef:r,onDrop:o=>{n($(F({},o),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),g("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function Jx(e,t){const{numRows:n,numCols:r}=Ka(e),o=[];for(let i=0;i{const i=r==="rows"?"cols":"rows",a=O1(o);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const s=Rp(o.areas);let l=S1(vn,a[i].length);s.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=Hf(u,r);if(f<=t&&d>t){const m=Hf(u,i);for(let y=m.itemStart-1;y1}function Kx(e,{index:t,dir:n}){let r=[];return e.forEach((o,i)=>{const{itemStart:a,itemEnd:s}=Hf(o,n);a===t&&a===s&&r.push(i)}),r}const qx="_ResizableGrid_i4cq9_1",Zx={ResizableGrid:qx,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function T1(e){var o,i;const t=((o=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:o[0])||"px",n=(i=e.match(/^[\d|\.]*/g))==null?void 0:i[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function Wn(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const e2="_container_jk9tt_8",t2="_label_jk9tt_26",n2="_mainInput_jk9tt_59",kn={container:e2,label:t2,mainInput:n2},I1=I.createContext(null);function $r(e){const t=I.useContext(I1);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const r2=({onChange:e,children:t})=>g(I1.Provider,{value:e,children:t});function o2({name:e,isDisabled:t,defaultValue:n}){const r=$r(),o=`Click to ${t?"set":"unset"} ${e} property`;return g("input",{"aria-label":o,type:"checkbox",checked:!t,title:o,onChange:i=>{r({name:e,value:i.target.checked?n:void 0})}})}function Lp({name:e,label:t,optional:n,isDisabled:r,defaultValue:o,mainInput:i,width_setting:a="full"}){return N("label",{className:kn.container,"data-disabled":r,"data-width-setting":a,children:[N("div",{className:kn.label,children:[n?g(o2,{name:e,isDisabled:r,defaultValue:o}):null,t!=null?t:e,":"]}),g("div",{className:kn.mainInput,children:i})]})}const i2="_numericInput_n1lnu_1",a2={numericInput:i2};function Mp({value:e,ariaLabel:t,onChange:n,min:r,max:o,disabled:i=!1}){var s;const a=I.useCallback((l=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+l*c;r&&(f=Math.max(f,r)),o&&(f=Math.min(f,o)),n(f)},[o,r,n,e]);return g("input",{className:a2.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:i,value:(s=e==null?void 0:e.toString())!=null?s:"",onChange:l=>n(Number(l.target.value)),min:r,onKeyDown:l=>{(l.key==="ArrowUp"||l.key==="ArrowDown")&&(l.preventDefault(),a(l.key==="ArrowUp"?1:-1,l.shiftKey))}})}function Hn({name:e,label:t,value:n,min:r=0,max:o,onChange:i,optional:a=!1,defaultValue:s=1,disabled:l=n===void 0}){const u=$r(i);return g(Lp,{name:e,label:t,optional:a,isDisabled:l,defaultValue:s,width_setting:"fit",mainInput:g(Mp,{ariaLabel:t!=null?t:e,disabled:l,value:n,onChange:c=>u({name:e,value:c}),min:r,max:o})})}var Fp=s2;function s2(e,t,n){var r=null,o=null,i=function(){r&&(clearTimeout(r),o=null,r=null)},a=function(){var l=o;i(),l&&l()},s=function(){if(!t)return e.apply(this,arguments);var l=this,u=arguments,c=n&&!r;if(i(),o=function(){e.apply(l,u)},r=setTimeout(function(){if(r=null,!c){var f=o;return o=null,f()}},t),c)return o()};return s.cancel=i,s.flush=a,s}var Av=function(t){return t.reduce(function(n,r){var o=r[0],i=r[1];return n[o]=i,n},{})},xv=typeof window!="undefined"&&window.document&&window.document.createElement?j.exports.useLayoutEffect:j.exports.useEffect,St="top",Wt="bottom",Yt="right",bt="left",Up="auto",qa=[St,Wt,Yt,bt],Ro="start",Pa="end",l2="clippingParents",N1="viewport",vi="popper",u2="reference",Ov=qa.reduce(function(e,t){return e.concat([t+"-"+Ro,t+"-"+Pa])},[]),D1=[].concat(qa,[Up]).reduce(function(e,t){return e.concat([t,t+"-"+Ro,t+"-"+Pa])},[]),c2="beforeRead",f2="read",d2="afterRead",p2="beforeMain",h2="main",m2="afterMain",v2="beforeWrite",g2="write",y2="afterWrite",w2=[c2,f2,d2,p2,h2,m2,v2,g2,y2];function gn(e){return e?(e.nodeName||"").toLowerCase():null}function nn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function Lo(e){var t=nn(e).Element;return e instanceof t||e instanceof Element}function Ut(e){var t=nn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function R1(e){if(typeof ShadowRoot=="undefined")return!1;var t=nn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function S2(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},o=t.attributes[n]||{},i=t.elements[n];!Ut(i)||!gn(i)||(Object.assign(i.style,r),Object.keys(o).forEach(function(a){var s=o[a];s===!1?i.removeAttribute(a):i.setAttribute(a,s===!0?"":s)}))})}function b2(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var o=t.elements[r],i=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),s=a.reduce(function(l,u){return l[u]="",l},{});!Ut(o)||!gn(o)||(Object.assign(o.style,s),Object.keys(i).forEach(function(l){o.removeAttribute(l)}))})}}const E2={name:"applyStyles",enabled:!0,phase:"write",fn:S2,effect:b2,requires:["computeStyles"]};function hn(e){return e.split("-")[0]}var Nr=Math.max,Rl=Math.min,Mo=Math.round;function Fo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,o=1;if(Ut(e)&&t){var i=e.offsetHeight,a=e.offsetWidth;a>0&&(r=Mo(n.width)/a||1),i>0&&(o=Mo(n.height)/i||1)}return{width:n.width/r,height:n.height/o,top:n.top/o,right:n.right/r,bottom:n.bottom/o,left:n.left/r,x:n.left/r,y:n.top/o}}function Bp(e){var t=Fo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function L1(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&R1(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function Nn(e){return nn(e).getComputedStyle(e)}function C2(e){return["table","td","th"].indexOf(gn(e))>=0}function gr(e){return((Lo(e)?e.ownerDocument:e.document)||window.document).documentElement}function _u(e){return gn(e)==="html"?e:e.assignedSlot||e.parentNode||(R1(e)?e.host:null)||gr(e)}function _v(e){return!Ut(e)||Nn(e).position==="fixed"?null:e.offsetParent}function A2(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&Ut(e)){var r=Nn(e);if(r.position==="fixed")return null}for(var o=_u(e);Ut(o)&&["html","body"].indexOf(gn(o))<0;){var i=Nn(o);if(i.transform!=="none"||i.perspective!=="none"||i.contain==="paint"||["transform","perspective"].indexOf(i.willChange)!==-1||t&&i.willChange==="filter"||t&&i.filter&&i.filter!=="none")return o;o=o.parentNode}return null}function Za(e){for(var t=nn(e),n=_v(e);n&&C2(n)&&Nn(n).position==="static";)n=_v(n);return n&&(gn(n)==="html"||gn(n)==="body"&&Nn(n).position==="static")?t:n||A2(e)||t}function jp(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function qi(e,t,n){return Nr(e,Rl(t,n))}function x2(e,t,n){var r=qi(e,t,n);return r>n?n:r}function M1(){return{top:0,right:0,bottom:0,left:0}}function F1(e){return Object.assign({},M1(),e)}function U1(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var O2=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,F1(typeof t!="number"?t:U1(t,qa))};function _2(e){var t,n=e.state,r=e.name,o=e.options,i=n.elements.arrow,a=n.modifiersData.popperOffsets,s=hn(n.placement),l=jp(s),u=[bt,Yt].indexOf(s)>=0,c=u?"height":"width";if(!(!i||!a)){var f=O2(o.padding,n),d=Bp(i),p=l==="y"?St:bt,m=l==="y"?Wt:Yt,y=n.rects.reference[c]+n.rects.reference[l]-a[l]-n.rects.popper[c],h=a[l]-n.rects.reference[l],v=Za(i),w=v?l==="y"?v.clientHeight||0:v.clientWidth||0:0,S=y/2-h/2,A=f[p],T=w-d[c]-f[m],C=w/2-d[c]/2+S,O=qi(A,C,T),b=l;n.modifiersData[r]=(t={},t[b]=O,t.centerOffset=O-C,t)}}function P2(e){var t=e.state,n=e.options,r=n.element,o=r===void 0?"[data-popper-arrow]":r;o!=null&&(typeof o=="string"&&(o=t.elements.popper.querySelector(o),!o)||!L1(t.elements.popper,o)||(t.elements.arrow=o))}const k2={name:"arrow",enabled:!0,phase:"main",fn:_2,effect:P2,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Uo(e){return e.split("-")[1]}var T2={top:"auto",right:"auto",bottom:"auto",left:"auto"};function I2(e){var t=e.x,n=e.y,r=window,o=r.devicePixelRatio||1;return{x:Mo(t*o)/o||0,y:Mo(n*o)/o||0}}function Pv(e){var t,n=e.popper,r=e.popperRect,o=e.placement,i=e.variation,a=e.offsets,s=e.position,l=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,m=a.y,y=m===void 0?0:m,h=typeof c=="function"?c({x:p,y}):{x:p,y};p=h.x,y=h.y;var v=a.hasOwnProperty("x"),w=a.hasOwnProperty("y"),S=bt,A=St,T=window;if(u){var C=Za(n),O="clientHeight",b="clientWidth";if(C===nn(n)&&(C=gr(n),Nn(C).position!=="static"&&s==="absolute"&&(O="scrollHeight",b="scrollWidth")),C=C,o===St||(o===bt||o===Yt)&&i===Pa){A=Wt;var E=f&&T.visualViewport?T.visualViewport.height:C[O];y-=E-r.height,y*=l?1:-1}if(o===bt||(o===St||o===Wt)&&i===Pa){S=Yt;var x=f&&T.visualViewport?T.visualViewport.width:C[b];p-=x-r.width,p*=l?1:-1}}var _=Object.assign({position:s},u&&T2),k=c===!0?I2({x:p,y}):{x:p,y};if(p=k.x,y=k.y,l){var D;return Object.assign({},_,(D={},D[A]=w?"0":"",D[S]=v?"0":"",D.transform=(T.devicePixelRatio||1)<=1?"translate("+p+"px, "+y+"px)":"translate3d("+p+"px, "+y+"px, 0)",D))}return Object.assign({},_,(t={},t[A]=w?y+"px":"",t[S]=v?p+"px":"",t.transform="",t))}function N2(e){var t=e.state,n=e.options,r=n.gpuAcceleration,o=r===void 0?!0:r,i=n.adaptive,a=i===void 0?!0:i,s=n.roundOffsets,l=s===void 0?!0:s,u={placement:hn(t.placement),variation:Uo(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:o,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,Pv(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:l})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,Pv(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:l})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const D2={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:N2,data:{}};var As={passive:!0};function R2(e){var t=e.state,n=e.instance,r=e.options,o=r.scroll,i=o===void 0?!0:o,a=r.resize,s=a===void 0?!0:a,l=nn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return i&&u.forEach(function(c){c.addEventListener("scroll",n.update,As)}),s&&l.addEventListener("resize",n.update,As),function(){i&&u.forEach(function(c){c.removeEventListener("scroll",n.update,As)}),s&&l.removeEventListener("resize",n.update,As)}}const L2={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:R2,data:{}};var M2={left:"right",right:"left",bottom:"top",top:"bottom"};function Hs(e){return e.replace(/left|right|bottom|top/g,function(t){return M2[t]})}var F2={start:"end",end:"start"};function kv(e){return e.replace(/start|end/g,function(t){return F2[t]})}function Wp(e){var t=nn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Yp(e){return Fo(gr(e)).left+Wp(e).scrollLeft}function U2(e){var t=nn(e),n=gr(e),r=t.visualViewport,o=n.clientWidth,i=n.clientHeight,a=0,s=0;return r&&(o=r.width,i=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,s=r.offsetTop)),{width:o,height:i,x:a+Yp(e),y:s}}function B2(e){var t,n=gr(e),r=Wp(e),o=(t=e.ownerDocument)==null?void 0:t.body,i=Nr(n.scrollWidth,n.clientWidth,o?o.scrollWidth:0,o?o.clientWidth:0),a=Nr(n.scrollHeight,n.clientHeight,o?o.scrollHeight:0,o?o.clientHeight:0),s=-r.scrollLeft+Yp(e),l=-r.scrollTop;return Nn(o||n).direction==="rtl"&&(s+=Nr(n.clientWidth,o?o.clientWidth:0)-i),{width:i,height:a,x:s,y:l}}function zp(e){var t=Nn(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+o+r)}function B1(e){return["html","body","#document"].indexOf(gn(e))>=0?e.ownerDocument.body:Ut(e)&&zp(e)?e:B1(_u(e))}function Zi(e,t){var n;t===void 0&&(t=[]);var r=B1(e),o=r===((n=e.ownerDocument)==null?void 0:n.body),i=nn(r),a=o?[i].concat(i.visualViewport||[],zp(r)?r:[]):r,s=t.concat(a);return o?s:s.concat(Zi(_u(a)))}function Jf(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function j2(e){var t=Fo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function Tv(e,t){return t===N1?Jf(U2(e)):Lo(t)?j2(t):Jf(B2(gr(e)))}function W2(e){var t=Zi(_u(e)),n=["absolute","fixed"].indexOf(Nn(e).position)>=0,r=n&&Ut(e)?Za(e):e;return Lo(r)?t.filter(function(o){return Lo(o)&&L1(o,r)&&gn(o)!=="body"}):[]}function Y2(e,t,n){var r=t==="clippingParents"?W2(e):[].concat(t),o=[].concat(r,[n]),i=o[0],a=o.reduce(function(s,l){var u=Tv(e,l);return s.top=Nr(u.top,s.top),s.right=Rl(u.right,s.right),s.bottom=Rl(u.bottom,s.bottom),s.left=Nr(u.left,s.left),s},Tv(e,i));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function j1(e){var t=e.reference,n=e.element,r=e.placement,o=r?hn(r):null,i=r?Uo(r):null,a=t.x+t.width/2-n.width/2,s=t.y+t.height/2-n.height/2,l;switch(o){case St:l={x:a,y:t.y-n.height};break;case Wt:l={x:a,y:t.y+t.height};break;case Yt:l={x:t.x+t.width,y:s};break;case bt:l={x:t.x-n.width,y:s};break;default:l={x:t.x,y:t.y}}var u=o?jp(o):null;if(u!=null){var c=u==="y"?"height":"width";switch(i){case Ro:l[u]=l[u]-(t[c]/2-n[c]/2);break;case Pa:l[u]=l[u]+(t[c]/2-n[c]/2);break}}return l}function ka(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=r===void 0?e.placement:r,i=n.boundary,a=i===void 0?l2:i,s=n.rootBoundary,l=s===void 0?N1:s,u=n.elementContext,c=u===void 0?vi:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,m=p===void 0?0:p,y=F1(typeof m!="number"?m:U1(m,qa)),h=c===vi?u2:vi,v=e.rects.popper,w=e.elements[d?h:c],S=Y2(Lo(w)?w:w.contextElement||gr(e.elements.popper),a,l),A=Fo(e.elements.reference),T=j1({reference:A,element:v,strategy:"absolute",placement:o}),C=Jf(Object.assign({},v,T)),O=c===vi?C:A,b={top:S.top-O.top+y.top,bottom:O.bottom-S.bottom+y.bottom,left:S.left-O.left+y.left,right:O.right-S.right+y.right},E=e.modifiersData.offset;if(c===vi&&E){var x=E[o];Object.keys(b).forEach(function(_){var k=[Yt,Wt].indexOf(_)>=0?1:-1,D=[St,Wt].indexOf(_)>=0?"y":"x";b[_]+=x[D]*k})}return b}function z2(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=n.boundary,i=n.rootBoundary,a=n.padding,s=n.flipVariations,l=n.allowedAutoPlacements,u=l===void 0?D1:l,c=Uo(r),f=c?s?Ov:Ov.filter(function(m){return Uo(m)===c}):qa,d=f.filter(function(m){return u.indexOf(m)>=0});d.length===0&&(d=f);var p=d.reduce(function(m,y){return m[y]=ka(e,{placement:y,boundary:o,rootBoundary:i,padding:a})[hn(y)],m},{});return Object.keys(p).sort(function(m,y){return p[m]-p[y]})}function G2(e){if(hn(e)===Up)return[];var t=Hs(e);return[kv(e),t,kv(t)]}function $2(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!0:a,l=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,m=p===void 0?!0:p,y=n.allowedAutoPlacements,h=t.options.placement,v=hn(h),w=v===h,S=l||(w||!m?[Hs(h)]:G2(h)),A=[h].concat(S).reduce(function(le,ue){return le.concat(hn(ue)===Up?z2(t,{placement:ue,boundary:c,rootBoundary:f,padding:u,flipVariations:m,allowedAutoPlacements:y}):ue)},[]),T=t.rects.reference,C=t.rects.popper,O=new Map,b=!0,E=A[0],x=0;x=0,q=B?"width":"height",H=ka(t,{placement:_,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),ce=B?D?Yt:bt:D?Wt:St;T[q]>C[q]&&(ce=Hs(ce));var he=Hs(ce),ye=[];if(i&&ye.push(H[k]<=0),s&&ye.push(H[ce]<=0,H[he]<=0),ye.every(function(le){return le})){E=_,b=!1;break}O.set(_,ye)}if(b)for(var ne=m?3:1,R=function(ue){var ze=A.find(function(Fe){var Ue=O.get(Fe);if(Ue)return Ue.slice(0,ue).every(function(rt){return rt})});if(ze)return E=ze,"break"},Y=ne;Y>0;Y--){var J=R(Y);if(J==="break")break}t.placement!==E&&(t.modifiersData[r]._skip=!0,t.placement=E,t.reset=!0)}}const H2={name:"flip",enabled:!0,phase:"main",fn:$2,requiresIfExists:["offset"],data:{_skip:!1}};function Iv(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function Nv(e){return[St,Yt,Wt,bt].some(function(t){return e[t]>=0})}function J2(e){var t=e.state,n=e.name,r=t.rects.reference,o=t.rects.popper,i=t.modifiersData.preventOverflow,a=ka(t,{elementContext:"reference"}),s=ka(t,{altBoundary:!0}),l=Iv(a,r),u=Iv(s,o,i),c=Nv(l),f=Nv(u);t.modifiersData[n]={referenceClippingOffsets:l,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const V2={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:J2};function Q2(e,t,n){var r=hn(e),o=[bt,St].indexOf(r)>=0?-1:1,i=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=i[0],s=i[1];return a=a||0,s=(s||0)*o,[bt,Yt].indexOf(r)>=0?{x:s,y:a}:{x:a,y:s}}function X2(e){var t=e.state,n=e.options,r=e.name,o=n.offset,i=o===void 0?[0,0]:o,a=D1.reduce(function(c,f){return c[f]=Q2(f,t.rects,i),c},{}),s=a[t.placement],l=s.x,u=s.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=l,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const K2={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:X2};function q2(e){var t=e.state,n=e.name;t.modifiersData[n]=j1({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const Z2={name:"popperOffsets",enabled:!0,phase:"read",fn:q2,data:{}};function eO(e){return e==="x"?"y":"x"}function tO(e){var t=e.state,n=e.options,r=e.name,o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!1:a,l=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,m=n.tetherOffset,y=m===void 0?0:m,h=ka(t,{boundary:l,rootBoundary:u,padding:f,altBoundary:c}),v=hn(t.placement),w=Uo(t.placement),S=!w,A=jp(v),T=eO(A),C=t.modifiersData.popperOffsets,O=t.rects.reference,b=t.rects.popper,E=typeof y=="function"?y(Object.assign({},t.rects,{placement:t.placement})):y,x=typeof E=="number"?{mainAxis:E,altAxis:E}:Object.assign({mainAxis:0,altAxis:0},E),_=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,k={x:0,y:0};if(!!C){if(i){var D,B=A==="y"?St:bt,q=A==="y"?Wt:Yt,H=A==="y"?"height":"width",ce=C[A],he=ce+h[B],ye=ce-h[q],ne=p?-b[H]/2:0,R=w===Ro?O[H]:b[H],Y=w===Ro?-b[H]:-O[H],J=t.elements.arrow,le=p&&J?Bp(J):{width:0,height:0},ue=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:M1(),ze=ue[B],Fe=ue[q],Ue=qi(0,O[H],le[H]),rt=S?O[H]/2-ne-Ue-ze-x.mainAxis:R-Ue-ze-x.mainAxis,us=S?-O[H]/2+ne+Ue+Fe+x.mainAxis:Y+Ue+Fe+x.mainAxis,zu=t.elements.arrow&&Za(t.elements.arrow),vS=zu?A==="y"?zu.clientTop||0:zu.clientLeft||0:0,ch=(D=_==null?void 0:_[A])!=null?D:0,gS=ce+rt-ch-vS,yS=ce+us-ch,fh=qi(p?Rl(he,gS):he,ce,p?Nr(ye,yS):ye);C[A]=fh,k[A]=fh-ce}if(s){var dh,wS=A==="x"?St:bt,SS=A==="x"?Wt:Yt,yr=C[T],cs=T==="y"?"height":"width",ph=yr+h[wS],hh=yr-h[SS],Gu=[St,bt].indexOf(v)!==-1,mh=(dh=_==null?void 0:_[T])!=null?dh:0,vh=Gu?ph:yr-O[cs]-b[cs]-mh+x.altAxis,gh=Gu?yr+O[cs]+b[cs]-mh-x.altAxis:hh,yh=p&&Gu?x2(vh,yr,gh):qi(p?vh:ph,yr,p?gh:hh);C[T]=yh,k[T]=yh-yr}t.modifiersData[r]=k}}const nO={name:"preventOverflow",enabled:!0,phase:"main",fn:tO,requiresIfExists:["offset"]};function rO(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function oO(e){return e===nn(e)||!Ut(e)?Wp(e):rO(e)}function iO(e){var t=e.getBoundingClientRect(),n=Mo(t.width)/e.offsetWidth||1,r=Mo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function aO(e,t,n){n===void 0&&(n=!1);var r=Ut(t),o=Ut(t)&&iO(t),i=gr(t),a=Fo(e,o),s={scrollLeft:0,scrollTop:0},l={x:0,y:0};return(r||!r&&!n)&&((gn(t)!=="body"||zp(i))&&(s=oO(t)),Ut(t)?(l=Fo(t,!0),l.x+=t.clientLeft,l.y+=t.clientTop):i&&(l.x=Yp(i))),{x:a.left+s.scrollLeft-l.x,y:a.top+s.scrollTop-l.y,width:a.width,height:a.height}}function sO(e){var t=new Map,n=new Set,r=[];e.forEach(function(i){t.set(i.name,i)});function o(i){n.add(i.name);var a=[].concat(i.requires||[],i.requiresIfExists||[]);a.forEach(function(s){if(!n.has(s)){var l=t.get(s);l&&o(l)}}),r.push(i)}return e.forEach(function(i){n.has(i.name)||o(i)}),r}function lO(e){var t=sO(e);return w2.reduce(function(n,r){return n.concat(t.filter(function(o){return o.phase===r}))},[])}function uO(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function cO(e){var t=e.reduce(function(n,r){var o=n[r.name];return n[r.name]=o?Object.assign({},o,r,{options:Object.assign({},o.options,r.options),data:Object.assign({},o.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var Dv={placement:"bottom",modifiers:[],strategy:"absolute"};function Rv(){for(var e=arguments.length,t=new Array(e),n=0;n{var l=s,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:o,openDelayMs:i=0}=l,a=$t(l,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);const[u,c]=I.useState(null),[f,d]=I.useState(null),[p,m]=I.useState(null),{styles:y,attributes:h,update:v}=SO(u,f,{placement:t,modifiers:[{name:"arrow",options:{element:p}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),w=I.useMemo(()=>$(F({},y.popper),{backgroundColor:o}),[o,y.popper]),S=I.useMemo(()=>{let T;function C(){T=setTimeout(()=>{v==null||v(),f==null||f.setAttribute("data-show","")},i)}function O(){clearTimeout(T),f==null||f.removeAttribute("data-show")}return{[n==="hover"?"onMouseEnter":"onClick"]:()=>C(),onMouseLeave:()=>O()}},[i,f,n,v]),A=typeof r=="string";return N(Me,{children:[g("button",$(F(F({},a),S),{ref:c,children:e})),N("div",$(F({ref:d,className:xc.popover,style:w},h.popper),{children:[A?g("div",{className:xc.textContent,children:r}):r,g("div",{ref:m,className:xc.popperArrow,style:y.arrow})]}))]})},AO="_infoIcon_15ri6_1",xO="_container_15ri6_10",OO="_header_15ri6_15",_O="_info_15ri6_1",PO="_unit_15ri6_27",kO="_description_15ri6_31",to={infoIcon:AO,container:xO,header:OO,info:_O,unit:PO,description:kO},W1=({units:e})=>g(Gp,{className:to.infoIcon,popoverContent:g(TO,{units:e}),openDelayMs:500,placement:"auto",children:g(OA,{})});function TO({units:e}){return N("div",{className:to.container,children:[g("div",{className:to.header,children:"CSS size options"}),g("div",{className:to.info,children:e.map(t=>N(I.Fragment,{children:[g("div",{className:to.unit,children:t}),g("div",{className:to.description,children:IO[t]})]},t))})]})}const IO={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},NO="_wrapper_13r28_1",DO="_unitSelector_13r28_10",Ll={wrapper:NO,unitSelector:DO};function RO(e){const[t,n]=j.exports.useState(T1(e)),r=j.exports.useCallback(i=>{if(i===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:i})},[t.unit]),o=j.exports.useCallback(i=>{n(a=>{const s=a.unit;return i==="auto"?{unit:i,count:null}:s==="auto"?{unit:i,count:Y1[i]}:{unit:i,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:o}}const Y1={fr:1,px:10,rem:1,"%":100};function LO({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:o,updateCount:i,updateUnit:a}=RO(e!=null?e:"auto"),s=I.useMemo(()=>Fp(u=>{t(u)},500),[t]);if(I.useEffect(()=>{const u=Wn(o);if(e!==u)return s(Wn(o)),()=>s.cancel()},[o,s,e]),e===void 0&&!r)return null;const l=r||o.count===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(Wn(o))},children:[g(Mp,{ariaLabel:"value-count",value:l?void 0:o.count,disabled:l,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>g("option",{value:u,children:u},u))}),g(W1,{units:n})]})}function yn(s){var l=s,{name:e,label:t,onChange:n,optional:r,value:o,defaultValue:i="10px"}=l,a=$t(l,["name","label","onChange","optional","value","defaultValue"]);const u=$r(n),c=o===void 0;return g(Lp,{name:e,label:t,optional:r,isDisabled:c,defaultValue:i,width_setting:"fit",mainInput:g(LO,$(F({value:o!=null?o:i},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function MO({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:o}=T1(e),i=I.useCallback(l=>{if(l===void 0){if(o!=="auto")throw new Error("Undefined count with auto units");t(Wn({unit:o,count:null}));return}if(o==="auto"){console.error("How did you change the count of an auto unit?");return}t(Wn({unit:o,count:l}))},[t,o]),a=I.useCallback(l=>{if(l==="auto"){t(Wn({unit:l,count:null}));return}if(o==="auto"){t(Wn({unit:l,count:Y1[l]}));return}t(Wn({unit:l,count:r}))},[r,t,o]),s=r===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",children:[g(Mp,{ariaLabel:"value-count",value:s?void 0:r,disabled:s,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o,onChange:l=>a(l.target.value),children:n.map(l=>g("option",{value:l,children:l},l))}),g(W1,{units:n})]})}const FO="_tractInfoDisplay_9993b_1",UO="_sizeWidget_9993b_61",BO="_hoverListener_9993b_88",jO="_buttons_9993b_108",WO="_tractAddButton_9993b_121",YO="_deleteButton_9993b_122",co={tractInfoDisplay:FO,sizeWidget:UO,hoverListener:BO,buttons:jO,tractAddButton:WO,deleteButton:YO},zO=["fr","px"];function GO({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:o}){const i=j.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=j.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),s=j.exports.useCallback(()=>a(t),[a,t]),l=j.exports.useCallback(()=>a(t+1),[a,t]),u=j.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return N("div",{className:co.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[g("div",{className:co.hoverListener}),N("div",{className:co.sizeWidget,onClick:HO,children:[N("div",{className:co.buttons,children:[g(Lv,{dir:e,onClick:s}),g($O,{onClick:u,deletionConflicts:o}),g(Lv,{dir:e,onClick:l})]}),g(MO,{value:n,units:zO,onChange:i})]})]})}const z1=200;function $O({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return g(Gp,{className:co.deleteButton,onClick:G1(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:z1,children:g(Sp,{})})}function Lv({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return g(Gp,{className:co.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:G1(t),openDelayMs:z1,children:g(C1,{})})}function G1(e){return function(t){t.currentTarget.blur(),e==null||e()}}function Mv({dir:e,sizes:t,areas:n,onUpdate:r}){const o=j.exports.useCallback(({dir:i,index:a})=>k1(n,{dir:i,index:a+1}),[n]);return g(Me,{children:t.map((i,a)=>g(GO,{index:a,dir:e,size:i,onUpdate:r,deletionConflicts:o({dir:e,index:a})},e+a))})}function HO(e){e.stopPropagation()}const JO="_columnSizer_3i83d_1",VO="_rowSizer_3i83d_2",Fv={columnSizer:JO,rowSizer:VO};function Uv({dir:e,index:t,onStartDrag:n}){return g("div",{className:e==="rows"?Fv.rowSizer:Fv.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function QO(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const Ml=40,XO=.15,$1=e=>t=>Math.round(t/e)*e,KO=5,$p=$1(KO),qO=.01,ZO=$1(qO),Bv=e=>Number(e.toFixed(4));function e3(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const o=ZO(e*t),i=n.count+o,a=r.count-o;return(o<0?i/a:a/i)=i.length?null:i[u];if(c==="auto"||f==="auto"){const m=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=m[l],i[l]=c),f==="auto"&&(f=m[u],i[u]=f),r.style[o]=m.join(" ")}const d=o3(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=$(F({dir:t,mouseStart:J1(e,t),originalSizes:i,currentSizes:[...i],beforeIndex:l,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=i3({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function s3({mousePosition:e,drag:t,container:n}){const o=J1(e,t.dir)-t.mouseStart,i=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=n3(o,t);break;case"after-pixel":a=r3(o,t);break;case"both-pixel":a=t3(o,t);break;case"both-relative":a=e3(o,t);break}a!=="no-change"&&(a.beforeSize&&(i[t.beforeIndex]=a.beforeSize),a.afterSize&&(i[t.afterIndex]=a.afterSize),t.currentSizes=i,t.dir==="cols"?n.style.gridTemplateColumns=i.join(" "):n.style.gridTemplateRows=i.join(" "))}function l3(e){return e.match(/[0-9|.]+px/)!==null}function H1(e){return e.match(/[0-9|.]+fr/)!==null}function Fl(e){if(H1(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(l3(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function J1(e,t){return t==="rows"?e.clientY:e.clientX}function u3(e){return e.some(t=>H1(t))}function c3(e){return e.some(t=>t==="auto")}function jv(e,t){const n=Math.abs(t-e)+1,r=ee+i*r)}function f3({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(o=>`"${o.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function Wv(e){return e.split(" ")}function d3(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function p3(e){const t=Wv(e.style.gridTemplateRows),n=Wv(e.style.gridTemplateColumns),r=d3(e.style.gridTemplateAreas),o=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:o}}function h3({containerRef:e,onDragEnd:t}){return I.useCallback(({e:r,dir:o,index:i})=>{const a=QO(e,"How are you dragging on an element without a container?");r.preventDefault();const s=a3({mousePosition:r,dir:o,index:i,container:a}),{beforeIndex:l,afterIndex:u}=s,c=Yv(a,{dir:o,index:l,size:s.currentSizes[l]}),f=Yv(a,{dir:o,index:u,size:s.currentSizes[u]});m3(a,s.dir,{move:d=>{s3({mousePosition:d,drag:s,container:a}),c.update(s.currentSizes[l]),f.update(s.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(p3(a))}})},[e,t])}function Yv(e,{dir:t,index:n,size:r}){const o=document.createElement("div"),i=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(o.style,i,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,o.appendChild(a),e.appendChild(o),{remove:()=>o.remove(),update:s=>{a.innerHTML=s}}}function m3(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const o=()=>{i(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",o),r.addEventListener("mouseleave",o);function i(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",o),r.removeEventListener("mouseleave",o),r.remove()}}const v3="1fr";function g3(o){var i=o,{className:e,children:t,onNewLayout:n}=i,r=$t(i,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:s}=r,l=j.exports.useRef(null),u=f3(r),c=jv(2,s.length),f=jv(2,a.length),d=h3({containerRef:l,onDragEnd:n}),p=[Zx.ResizableGrid];e&&p.push(e);const m=j.exports.useCallback(h=>{switch(h.type){case"ADD":return _1(r,{afterIndex:h.index,dir:h.dir,size:v3});case"RESIZE":return y3(r,h);case"DELETE":return P1(r,h)}},[r]),y=j.exports.useCallback(h=>n(m(h)),[m,n]);return N("div",{className:p.join(" "),ref:l,style:u,children:[c.map(h=>g(Uv,{dir:"cols",index:h,onStartDrag:d},"cols"+h)),f.map(h=>g(Uv,{dir:"rows",index:h,onStartDrag:d},"rows"+h)),t,g(Mv,{dir:"cols",sizes:s,areas:r.areas,onUpdate:y}),g(Mv,{dir:"rows",sizes:a,areas:r.areas,onUpdate:y})]})}function y3(e,{dir:t,index:n,size:r}){return ei(e,o=>{o[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function w3(e,r){var o=r,{name:t}=o,n=$t(o,["name"]);const{rowStart:i,colStart:a}=n,s="rowEnd"in n?n.rowEnd:i+n.rowSpan-1,l="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Ou(e.areas);for(let c=0;c=i-1&&c=a-1&&d{for(let o of n)S3(r,o)})}function b3(e,t){return V1(e,t)}function E3(e,t,n){return ei(e,({areas:r})=>{const{numRows:o,numCols:i}=Ka(r);for(let a=0;a{const i=n==="rows"?"row_sizes":"col_sizes";o[i][t-1]=r})}function A3(e,{item_a:t,item_b:n}){return t===n?e:ei(e,r=>{const{n_rows:o,n_cols:i}=x3(r.areas);let a=!1,s=!1;for(let l=0;l{a.current&&r&&setTimeout(()=>{var s;return(s=a==null?void 0:a.current)==null?void 0:s.focus()},1)},[r]),g("input",{ref:a,className:k3.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:i,onChange:s=>n(s.target.value),disabled:o})}function pe({name:e,label:t,value:n,placeholder:r,onChange:o,autoFocus:i=!1,optional:a=!1,defaultValue:s="my-text"}){const l=$r(o),u=n===void 0,c=I.useRef(null);return I.useEffect(()=>{c.current&&i&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[i]),g(Lp,{name:e,label:t,optional:a,isDisabled:u,defaultValue:s,width_setting:"full",mainInput:g(T3,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>l({name:e,value:f}),autoFocus:i,disabled:u})})}const I3="_container_1ehu8_1",N3="_elementsPanel_1ehu8_28",D3="_propertiesPanel_1ehu8_33",R3="_editorHolder_1ehu8_47",L3="_titledPanel_1ehu8_59",M3="_panelTitleHeader_1ehu8_71",F3="_header_1ehu8_80",U3="_rightSide_1ehu8_88",B3="_divider_1ehu8_109",j3="_title_1ehu8_59",W3="_shinyLogo_1ehu8_120",Q1={container:I3,elementsPanel:N3,propertiesPanel:D3,editorHolder:R3,titledPanel:L3,panelTitleHeader:M3,header:F3,rightSide:U3,divider:B3,title:j3,shinyLogo:W3},Y3="_portalHolder_18ua3_1",z3="_portalModal_18ua3_11",G3="_title_18ua3_21",$3="_body_18ua3_25",H3="_portalForm_18ua3_30",J3="_portalFormInputs_18ua3_35",V3="_portalFormFooter_18ua3_42",Q3="_validationMsg_18ua3_48",X3="_infoText_18ua3_53",xs={portalHolder:Y3,portalModal:z3,title:G3,body:$3,portalForm:H3,portalFormInputs:J3,portalFormFooter:V3,validationMsg:Q3,infoText:X3},K3=({children:e,el:t="div"})=>{const[n]=j.exports.useState(document.createElement(t));return j.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Na.exports.createPortal(e,n)},X1=({children:e,title:t,label:n,onConfirm:r,onCancel:o})=>g(K3,{children:g("div",{className:xs.portalHolder,onClick:()=>o(),onKeyDown:i=>{i.key==="Escape"&&o()},children:N("div",{className:xs.portalModal,onClick:i=>i.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?g("div",{className:xs.title+" "+Q1.panelTitleHeader,children:t}):null,g("div",{className:xs.body,children:e})]})})}),q3="_portalHolder_18ua3_1",Z3="_portalModal_18ua3_11",e4="_title_18ua3_21",t4="_body_18ua3_25",n4="_portalForm_18ua3_30",r4="_portalFormInputs_18ua3_35",o4="_portalFormFooter_18ua3_42",i4="_validationMsg_18ua3_48",a4="_infoText_18ua3_53",gi={portalHolder:q3,portalModal:Z3,title:e4,body:t4,portalForm:n4,portalFormInputs:r4,portalFormFooter:o4,validationMsg:i4,infoText:a4};function s4({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[o,i]=I.useState(r),[a,s]=I.useState(null),l=I.useCallback(c=>{c&&c.preventDefault();const f=l4({name:o,existingAreaNames:n});if(f){s(f);return}t(o)},[n,o,t]),u=I.useCallback(({value:c})=>{s(null),i(c!=null?c:r)},[r]);return N(X1,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(o),onCancel:e,children:[g("form",{className:gi.portalForm,onSubmit:l,children:N("div",{className:gi.portalFormInputs,children:[g("span",{className:gi.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),g(pe,{label:"Name of new grid area",name:"New-Item-Name",value:o,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?g("div",{className:gi.validationMsg,children:a}):null]})}),N("div",{className:gi.portalFormFooter,children:[g(wt,{variant:"delete",onClick:e,children:"Cancel"}),g(wt,{onClick:()=>l(),children:"Done"})]})]})}function l4({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const u4="_container_1hvsg_1",c4={container:u4},K1=I.createContext(null),f4=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:o,compRef:i})=>{const a=vr(),s=Ew(),{onClick:l}=r,{uniqueAreas:u}=Qx(e),T=e,{areas:c}=T,f=$t(T,["areas"]),d=C=>{a(Sw({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:F(F({},f),C)}}))},p=I.useMemo(()=>Rp(c),[c]),[m,y]=I.useState(null),h=C=>{const{node:O,currentPath:b,pos:E}=C,x=b!==void 0,_=$f.includes(O.uiName);if(x&&_&&"area"in O.uiArguments&&O.uiArguments.area){const k=O.uiArguments.area;v({type:"MOVE_ITEM",name:k,pos:E});return}y(C)},v=C=>{d(Hp(e,C))},w=u.map(C=>g(zx,{area:C,areas:c,gridLocation:p.get(C),onNewPos:O=>v({type:"MOVE_ITEM",name:C,pos:O})},C)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},A=(C,{node:O,currentPath:b,pos:E})=>{if($f.includes(O.uiName)){const x=$(F({},O.uiArguments),{area:C});O.uiArguments=x}else O={uiName:"gridlayout::grid_card",uiArguments:{area:C},uiChildren:[O]};s({parentPath:[],node:O,currentPath:b}),v({type:"ADD_ITEM",name:C,pos:E}),y(null)};return N(K1.Provider,{value:v,children:[g("div",{ref:i,style:S,className:c4.container,onClick:l,draggable:!1,onDragStart:()=>{},children:N(g3,$(F({},e),{onNewLayout:d,children:[Vx(c).map(({row:C,col:O})=>g(Hx,{gridRow:C,gridColumn:O,onDroppedNode:h},Mx({row:C,col:O}))),t==null?void 0:t.map((C,O)=>g(Ep,F({path:[...o.path,O]},C),o.path.join(".")+O)),n,w]}))}),m?g(s4,{info:m,onCancel:()=>y(null),onDone:C=>A(C,m),existingAreaNames:u}):null]})};function d4(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function p4(){return I.useContext(K1)}function Jp({containerRef:e,path:t,area:n}){const r=p4(),o=I.useCallback(({node:a,currentPath:s})=>s===void 0||!$f.includes(a.uiName)?!1:Np(s,t),[t]),i=I.useCallback(a=>{var l;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const s=(l=a.node.uiArguments.area)!=null?l:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:s})},[n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i,canAcceptDropClass:xt.availableToSwap,hoveringOverClass:xt.hoveringOverSwap})}const h4=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:o},children:i,eventHandlers:a,compRef:s})=>{const l=r.length>0;return Jp({containerRef:s,area:e,path:o}),N(Cp,{className:xt.container+" "+(n?xt.withTitle:""),ref:s,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?g(WA,{className:xt.panelTitle,children:n}):null,N("div",{className:xt.contentHolder,"data-alignment":"top",children:[g(zv,{index:0,parentPath:o,numChildren:r.length}),l?r==null?void 0:r.map((u,c)=>N(I.Fragment,{children:[g(Ep,F({path:[...o,c]},u)),g(zv,{index:c+1,numChildren:r.length,parentPath:o})]},o.join(".")+c)):g(v4,{path:o})]}),i]})};function zv({index:e,numChildren:t,parentPath:n}){const r=I.useRef(null);Ax({watcherRef:r,positionInChildren:e,parentPath:n});const o=m4(e,t);return g("div",{ref:r,className:xt.dropWatcher+" "+o,"aria-label":"drop watcher"})}function m4(e,t){return e===0&&t===0?xt.onlyDropWatcher:e===0?xt.firstDropWatcher:e===t?xt.lastDropWatcher:xt.middleDropWatcher}function v4({path:e}){return N("div",{className:xt.emptyGridCard,children:[g("span",{className:xt.emptyMessage,children:"Empty grid card"}),g(m1,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const g4=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e.area}),g(pe,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),g(yn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},y4={area:"default-area",item_gap:"12px"},w4={title:"Grid Card",UiComponent:h4,SettingsComponent:g4,acceptsChildren:!0,defaultSettings:y4,iconSrc:dA,category:"gridlayout"},q1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function S4(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const Z1=({type:e,name:t,className:n})=>N("code",{className:n,children:[N("span",{style:{opacity:.55},children:[e,"$"]}),g("span",{children:t})]}),b4="_container_1rlbk_1",E4="_plotPlaceholder_1rlbk_5",C4="_label_1rlbk_19",Vf={container:b4,plotPlaceholder:E4,label:C4};function ew({outputId:e}){const t=j.exports.useRef(null),n=A4(t),r=n===null?100:Math.min(n.width,n.height);return N("div",{ref:t,className:Vf.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[g(Z1,{className:Vf.label,type:"output",name:e}),g(S4,{size:`calc(${r}px - 80px)`})]})}function A4(e){const[t,n]=j.exports.useState(null);return j.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(o=>{if(!e.current)return;const{offsetHeight:i,offsetWidth:a}=e.current;n({width:a,height:i})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const x4="_gridCardPlot_1a94v_1",O4={gridCardPlot:x4},_4=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:o,compRef:i})=>(Jp({containerRef:i,area:t,path:r}),N(Cp,$(F({ref:i,style:{gridArea:t},className:O4.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},o),{children:[g(ew,{outputId:e!=null?e:t}),n]}))),P4=({settings:{area:e,outputId:t}})=>N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e}),g(pe,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),k4={title:"Grid Plot Card",UiComponent:_4,SettingsComponent:P4,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:q1,category:"gridlayout"},T4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",I4="_textPanel_525i2_1",N4={textPanel:I4},D4=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:o},eventHandlers:i,compRef:a})=>(Jp({containerRef:a,area:t,path:o}),N(Cp,$(F({ref:a,className:N4.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},i),{children:[g("h1",{children:e}),r]}))),R4="_checkboxInput_12wa8_1",L4="_checkboxLabel_12wa8_10",Gv={checkboxInput:R4,checkboxLabel:L4};function tw({name:e,label:t,value:n,onChange:r,disabled:o,noLabel:i}){const a=$r(r),s=i?void 0:t!=null?t:e,l=`${e}-checkbox-input`,u=N(Me,{children:[g("input",{className:Gv.checkboxInput,id:l,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:o,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),g("label",{className:Gv.checkboxLabel,htmlFor:l,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return s!==void 0?N("div",{className:kn.container,children:[N("label",{className:kn.label,children:[s,":"]}),u]}):u}const M4="_radioContainer_1regb_1",F4="_option_1regb_15",U4="_radioInput_1regb_22",B4="_radioLabel_1regb_26",j4="_icon_1regb_41",yi={radioContainer:M4,option:F4,radioInput:U4,radioLabel:B4,icon:j4};function W4({name:e,label:t,options:n,currentSelection:r,onChange:o,optionsPerColumn:i}){const a=Object.keys(n),s=$r(o),l=j.exports.useMemo(()=>({gridTemplateColumns:i?`repeat(${i}, 1fr)`:void 0}),[i]);return N("div",{className:kn.container,"data-full-width":"true",children:[N("label",{htmlFor:e,className:kn.label,children:[t!=null?t:e,":"]}),g("fieldset",{className:yi.radioContainer,id:e,style:l,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return N("div",{className:yi.option,children:[g("input",{className:yi.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>s({name:e,value:u}),checked:u===r}),g("label",{className:yi.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?g("img",{src:c,alt:f,className:yi.icon}):c})]},u)})})]})}const Y4={start:{icon:f1,label:"left"},center:{icon:Mf,label:"center"},end:{icon:d1,label:"right"}},z4=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),g(pe,{name:"content",label:"Panel content",value:e.content}),g(W4,{name:"alignment",label:"Text Alignment",options:Y4,currentSelection:e.alignment,optionsPerColumn:3}),g(tw,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},G4={title:"Grid Text Card",UiComponent:D4,SettingsComponent:z4,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:T4,category:"gridlayout"},$4=({settings:e})=>g(Me,{children:g(yn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function H4(e,{path:t,node:n}){var s;const r=nw({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:o}=r,i=d4(o.uiChildren)[t[0]],a=(s=n.uiArguments.area)!=null?s:vn;i!==a&&(o.uiArguments=Hp(o.uiArguments,{type:"RENAME_ITEM",oldName:i,newName:a}))}function J4(e,{path:t}){const n=nw({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:o}=n,i=o.uiArguments.area;if(!i){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Hp(r.uiArguments,{type:"REMOVE_ITEM",name:i})}function nw({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=rr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const V4={title:"Grid Page",UiComponent:f4,SettingsComponent:$4,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:H4,DELETE_NODE:J4},category:"gridlayout"},Q4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",X4=({settings:e})=>{const{inputId:t,label:n}=e;return N(Me,{children:[g(pe,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),g(pe,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},K4="_container_tyghz_1",q4={container:K4},Z4=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:o="My Action Button",width:i}=e;return N("div",$(F({className:q4.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[g(wt,{style:i?{width:i}:void 0,children:o}),t]}))},e_={title:"Action Button",UiComponent:Z4,SettingsComponent:X4,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:Q4,category:"Inputs"},t_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",n_="_categoryDivider_8d7ls_1",r_={categoryDivider:n_};function ti({category:e}){return g("div",{className:r_.categoryDivider,children:g("span",{children:e?`${e}:`:null})})}function o_(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var rw={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function $v(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function wn(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function s_(e,t){if(e==null)return{};var n=a_(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function l_(e){return u_(e)||c_(e)||f_(e)||d_()}function u_(e){if(Array.isArray(e))return Qf(e)}function c_(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function f_(e,t){if(!!e){if(typeof e=="string")return Qf(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Qf(e,t)}}function Qf(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function h_(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function Xt(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Ul(e,t):Ul(e,t))||r&&e===n)return e;if(e===n)break}while(e=h_(e))}return null}var Jv=/\s+/g;function _e(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(Jv," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(Jv," ")}}function G(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function Dr(e,t){var n="";if(typeof e=="string")n=e;else do{var r=G(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var o=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return o&&new o(n)}function sw(e,t,n){if(e){var r=e.getElementsByTagName(t),o=0,i=r.length;if(n)for(;o=i:a=o<=i,!a)return r;if(r===mn())break;r=Jn(r,!1)}return!1}function Bo(e,t,n,r){for(var o=0,i=0,a=e.children;i2&&arguments[2]!==void 0?arguments[2]:{},o=r.evt,i=s_(r,b_);ts.pluginEvent.bind(Q)(t,n,wn({dragEl:U,parentEl:ke,ghostEl:Z,rootEl:be,nextEl:xr,lastDownEl:Qs,cloneEl:Oe,cloneHidden:Yn,dragStarted:Fi,putSortable:$e,activeSortable:Q.active,originalEvent:o,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un,hideGhostForTarget:pw,unhideGhostForTarget:hw,cloneNowHidden:function(){Yn=!0},cloneNowShown:function(){Yn=!1},dispatchSortableEvent:function(s){ot({sortable:n,name:s,originalEvent:o})}},i))};function ot(e){Mi(wn({putSortable:$e,cloneEl:Oe,targetEl:U,rootEl:be,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un},e))}var U,ke,Z,be,xr,Qs,Oe,Yn,fo,At,na,Un,Os,$e,no=!1,Bl=!1,jl=[],wr,Jt,kc,Tc,Kv,qv,Fi,Kr,ra,oa=!1,_s=!1,Xs,Qe,Ic=[],Xf=!1,Wl=[],Pu=typeof document!="undefined",Ps=ow,Zv=es||Rn?"cssFloat":"float",E_=Pu&&!iw&&!ow&&"draggable"in document.createElement("div"),cw=function(){if(!!Pu){if(Rn)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),fw=function(t,n){var r=G(t),o=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),i=Bo(t,0,n),a=Bo(t,1,n),s=i&&G(i),l=a&&G(a),u=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Ae(i).width,c=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Ae(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(i&&s.float&&s.float!=="none"){var f=s.float==="left"?"left":"right";return a&&(l.clear==="both"||l.clear===f)?"vertical":"horizontal"}return i&&(s.display==="block"||s.display==="flex"||s.display==="table"||s.display==="grid"||u>=o&&r[Zv]==="none"||a&&r[Zv]==="none"&&u+c>o)?"vertical":"horizontal"},C_=function(t,n,r){var o=r?t.left:t.top,i=r?t.right:t.bottom,a=r?t.width:t.height,s=r?n.left:n.top,l=r?n.right:n.bottom,u=r?n.width:n.height;return o===s||i===l||o+a/2===s+u/2},A_=function(t,n){var r;return jl.some(function(o){var i=o[Ze].options.emptyInsertThreshold;if(!(!i||Vp(o))){var a=Ae(o),s=t>=a.left-i&&t<=a.right+i,l=n>=a.top-i&&n<=a.bottom+i;if(s&&l)return r=o}}),r},dw=function(t){function n(i,a){return function(s,l,u,c){var f=s.options.group.name&&l.options.group.name&&s.options.group.name===l.options.group.name;if(i==null&&(a||f))return!0;if(i==null||i===!1)return!1;if(a&&i==="clone")return i;if(typeof i=="function")return n(i(s,l,u,c),a)(s,l,u,c);var d=(a?s:l).options.group.name;return i===!0||typeof i=="string"&&i===d||i.join&&i.indexOf(d)>-1}}var r={},o=t.group;(!o||Vs(o)!="object")&&(o={name:o}),r.name=o.name,r.checkPull=n(o.pull,!0),r.checkPut=n(o.put),r.revertClone=o.revertClone,t.group=r},pw=function(){!cw&&Z&&G(Z,"display","none")},hw=function(){!cw&&Z&&G(Z,"display","")};Pu&&!iw&&document.addEventListener("click",function(e){if(Bl)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Bl=!1,!1},!0);var Sr=function(t){if(U){t=t.touches?t.touches[0]:t;var n=A_(t.clientX,t.clientY);if(n){var r={};for(var o in t)t.hasOwnProperty(o)&&(r[o]=t[o]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[Ze]._onDragOver(r)}}},x_=function(t){U&&U.parentNode[Ze]._isOutsideThisEl(t.target)};function Q(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=zt({},t),e[Ze]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return fw(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,s){a.setData("Text",s.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:Q.supportPointer!==!1&&"PointerEvent"in window&&!ea,emptyInsertThreshold:5};ts.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);dw(t);for(var o in this)o.charAt(0)==="_"&&typeof this[o]=="function"&&(this[o]=this[o].bind(this));this.nativeDraggable=t.forceFallback?!1:E_,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ie(e,"pointerdown",this._onTapStart):(ie(e,"mousedown",this._onTapStart),ie(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ie(e,"dragover",this),ie(e,"dragenter",this)),jl.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),zt(this,y_())}Q.prototype={constructor:Q,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Kr=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,U):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,o=this.options,i=o.preventOnFilter,a=t.type,s=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,l=(s||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||l,c=o.filter;if(D_(r),!U&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||o.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&ea&&l&&l.tagName.toUpperCase()==="SELECT")&&(l=Xt(l,o.draggable,r,!1),!(l&&l.animated)&&Qs!==l)){if(fo=Te(l),na=Te(l,o.draggable),typeof c=="function"){if(c.call(this,t,l,this)){ot({sortable:n,rootEl:u,name:"filter",targetEl:l,toEl:r,fromEl:r}),ut("filter",n,{evt:t}),i&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=Xt(u,f.trim(),r,!1),f)return ot({sortable:n,rootEl:f,name:"filter",targetEl:l,fromEl:r,toEl:r}),ut("filter",n,{evt:t}),!0}),c)){i&&t.cancelable&&t.preventDefault();return}o.handle&&!Xt(u,o.handle,r,!1)||this._prepareDragStart(t,s,l)}}},_prepareDragStart:function(t,n,r){var o=this,i=o.el,a=o.options,s=i.ownerDocument,l;if(r&&!U&&r.parentNode===i){var u=Ae(r);if(be=i,U=r,ke=U.parentNode,xr=U.nextSibling,Qs=r,Os=a.group,Q.dragged=U,wr={target:U,clientX:(n||t).clientX,clientY:(n||t).clientY},Kv=wr.clientX-u.left,qv=wr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,U.style["will-change"]="all",l=function(){if(ut("delayEnded",o,{evt:t}),Q.eventCanceled){o._onDrop();return}o._disableDelayedDragEvents(),!Hv&&o.nativeDraggable&&(U.draggable=!0),o._triggerDragStart(t,n),ot({sortable:o,name:"choose",originalEvent:t}),_e(U,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){sw(U,c.trim(),Nc)}),ie(s,"dragover",Sr),ie(s,"mousemove",Sr),ie(s,"touchmove",Sr),ie(s,"mouseup",o._onDrop),ie(s,"touchend",o._onDrop),ie(s,"touchcancel",o._onDrop),Hv&&this.nativeDraggable&&(this.options.touchStartThreshold=4,U.draggable=!0),ut("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(es||Rn))){if(Q.eventCanceled){this._onDrop();return}ie(s,"mouseup",o._disableDelayedDrag),ie(s,"touchend",o._disableDelayedDrag),ie(s,"touchcancel",o._disableDelayedDrag),ie(s,"mousemove",o._delayedDragTouchMoveHandler),ie(s,"touchmove",o._delayedDragTouchMoveHandler),a.supportPointer&&ie(s,"pointermove",o._delayedDragTouchMoveHandler),o._dragStartTimer=setTimeout(l,a.delay)}else l()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){U&&Nc(U),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;te(t,"mouseup",this._disableDelayedDrag),te(t,"touchend",this._disableDelayedDrag),te(t,"touchcancel",this._disableDelayedDrag),te(t,"mousemove",this._delayedDragTouchMoveHandler),te(t,"touchmove",this._delayedDragTouchMoveHandler),te(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ie(document,"pointermove",this._onTouchMove):n?ie(document,"touchmove",this._onTouchMove):ie(document,"mousemove",this._onTouchMove):(ie(U,"dragend",this),ie(be,"dragstart",this._onDragStart));try{document.selection?Ks(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(no=!1,be&&U){ut("dragStarted",this,{evt:n}),this.nativeDraggable&&ie(document,"dragover",x_);var r=this.options;!t&&_e(U,r.dragClass,!1),_e(U,r.ghostClass,!0),Q.active=this,t&&this._appendGhost(),ot({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(Jt){this._lastX=Jt.clientX,this._lastY=Jt.clientY,pw();for(var t=document.elementFromPoint(Jt.clientX,Jt.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(Jt.clientX,Jt.clientY),t!==n);)n=t;if(U.parentNode[Ze]._isOutsideThisEl(t),n)do{if(n[Ze]){var r=void 0;if(r=n[Ze]._onDragOver({clientX:Jt.clientX,clientY:Jt.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);hw()}},_onTouchMove:function(t){if(wr){var n=this.options,r=n.fallbackTolerance,o=n.fallbackOffset,i=t.touches?t.touches[0]:t,a=Z&&Dr(Z,!0),s=Z&&a&&a.a,l=Z&&a&&a.d,u=Ps&&Qe&&Qv(Qe),c=(i.clientX-wr.clientX+o.x)/(s||1)+(u?u[0]-Ic[0]:0)/(s||1),f=(i.clientY-wr.clientY+o.y)/(l||1)+(u?u[1]-Ic[1]:0)/(l||1);if(!Q.active&&!no){if(r&&Math.max(Math.abs(i.clientX-this._lastX),Math.abs(i.clientY-this._lastY))=0&&(ot({rootEl:ke,name:"add",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"remove",toEl:ke,originalEvent:t}),ot({rootEl:ke,name:"sort",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),$e&&$e.save()):At!==fo&&At>=0&&(ot({sortable:this,name:"update",toEl:ke,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),Q.active&&((At==null||At===-1)&&(At=fo,Un=na),ot({sortable:this,name:"end",toEl:ke,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){ut("nulling",this),be=U=ke=Z=xr=Oe=Qs=Yn=wr=Jt=Fi=At=Un=fo=na=Kr=ra=$e=Os=Q.dragged=Q.ghost=Q.clone=Q.active=null,Wl.forEach(function(t){t.checked=!0}),Wl.length=kc=Tc=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":U&&(this._onDragOver(t),O_(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,o=0,i=r.length,a=this.options;or.right+o||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+o}function T_(e,t,n,r,o,i,a,s){var l=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(s&&Xsc+u*i/2:lf-Xs)return-ra}else if(l>c+u*(1-o)/2&&lf-u*i/2)?l>c+u/2?1:-1:0}function I_(e){return Te(U)1&&(K.forEach(function(s){i.addAnimationState({target:s,rect:ct?Ae(s):a}),_c(s),s.fromRect=a,r.removeAnimationState(s)}),ct=!1,U_(!this.options.removeCloneOnHide,o))},dragOverCompleted:function(n){var r=n.sortable,o=n.isOwner,i=n.insertion,a=n.activeSortable,s=n.parentEl,l=n.putSortable,u=this.options;if(i){if(o&&a._hideClone(),Si=!1,u.animation&&K.length>1&&(ct||!o&&!a.options.sort&&!l)){var c=Ae(ve,!1,!0,!0);K.forEach(function(d){d!==ve&&(Xv(d,c),s.appendChild(d))}),ct=!0}if(!o)if(ct||Is(),K.length>1){var f=Ts;a._showClone(r),a.options.animation&&!Ts&&f&&Ct.forEach(function(d){a.addAnimationState({target:d,rect:bi}),d.fromRect=bi,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,o=n.isOwner,i=n.activeSortable;if(K.forEach(function(s){s.thisAnimationDuration=null}),i.options.animation&&!o&&i.multiDrag.isMultiDrag){bi=zt({},r);var a=Dr(ve,!0);bi.top-=a.f,bi.left-=a.e}},dragOverAnimationComplete:function(){ct&&(ct=!1,Is())},drop:function(n){var r=n.originalEvent,o=n.rootEl,i=n.parentEl,a=n.sortable,s=n.dispatchSortableEvent,l=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=i.children;if(!qr)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),_e(ve,f.selectedClass,!~K.indexOf(ve)),~K.indexOf(ve))K.splice(K.indexOf(ve),1),wi=null,Mi({sortable:a,rootEl:o,name:"deselect",targetEl:ve,originalEvent:r});else{if(K.push(ve),Mi({sortable:a,rootEl:o,name:"select",targetEl:ve,originalEvent:r}),r.shiftKey&&wi&&a.el.contains(wi)){var p=Te(wi),m=Te(ve);if(~p&&~m&&p!==m){var y,h;for(m>p?(h=p,y=m):(h=m,y=p+1);h1){var v=Ae(ve),w=Te(ve,":not(."+this.options.selectedClass+")");if(!Si&&f.animation&&(ve.thisAnimationDuration=null),c.captureAnimationState(),!Si&&(f.animation&&(ve.fromRect=v,K.forEach(function(A){if(A.thisAnimationDuration=null,A!==ve){var T=ct?Ae(A):v;A.fromRect=T,c.addAnimationState({target:A,rect:T})}})),Is(),K.forEach(function(A){d[w]?i.insertBefore(A,d[w]):i.appendChild(A),w++}),l===Te(ve))){var S=!1;K.forEach(function(A){if(A.sortableIndex!==Te(A)){S=!0;return}}),S&&s("update")}K.forEach(function(A){_c(A)}),c.animateAll()}Vt=c}(o===i||u&&u.lastPutMode!=="clone")&&Ct.forEach(function(A){A.parentNode&&A.parentNode.removeChild(A)})}},nullingGlobal:function(){this.isMultiDrag=qr=!1,Ct.length=0},destroyGlobal:function(){this._deselectMultiDrag(),te(document,"pointerup",this._deselectMultiDrag),te(document,"mouseup",this._deselectMultiDrag),te(document,"touchend",this._deselectMultiDrag),te(document,"keydown",this._checkKeyDown),te(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof qr!="undefined"&&qr)&&Vt===this.sortable&&!(n&&Xt(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;K.length;){var r=K[0];_e(r,this.options.selectedClass,!1),K.shift(),Mi({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},zt(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[Ze];!r||!r.options.multiDrag||~K.indexOf(n)||(Vt&&Vt!==r&&(Vt.multiDrag._deselectMultiDrag(),Vt=r),_e(n,r.options.selectedClass,!0),K.push(n))},deselect:function(n){var r=n.parentNode[Ze],o=K.indexOf(n);!r||!r.options.multiDrag||!~o||(_e(n,r.options.selectedClass,!1),K.splice(o,1))}},eventProperties:function(){var n=this,r=[],o=[];return K.forEach(function(i){r.push({multiDragElement:i,index:i.sortableIndex});var a;ct&&i!==ve?a=-1:ct?a=Te(i,":not(."+n.options.selectedClass+")"):a=Te(i),o.push({multiDragElement:i,index:a})}),{items:l_(K),clones:[].concat(Ct),oldIndicies:r,newIndicies:o}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function U_(e,t){K.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function tg(e,t){Ct.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function Is(){K.forEach(function(e){e!==ve&&e.parentNode&&e.parentNode.removeChild(e)})}Q.mount(new R_);Q.mount(Kp,Xp);const B_=Object.freeze(Object.defineProperty({__proto__:null,default:Q,MultiDrag:F_,Sortable:Q,Swap:L_},Symbol.toStringTag,{value:"Module"})),j_=Bg(B_);var vw={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],o=0;o$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>A);function l(C){C.parentElement!==null&&C.parentElement.removeChild(C)}function u(C,O,b){const E=C.children[b]||null;C.insertBefore(O,E)}function c(C){C.forEach(O=>l(O.element))}function f(C){C.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(C,O){const b=h(C),E={parentElement:C.from};let x=[];switch(b){case"normal":x=[{element:C.item,newIndex:C.newIndex,oldIndex:C.oldIndex,parentElement:C.from}];break;case"swap":const D=F({element:C.item,oldIndex:C.oldIndex,newIndex:C.newIndex},E),B=F({element:C.swapItem,oldIndex:C.newIndex,newIndex:C.oldIndex},E);x=[D,B];break;case"multidrag":x=C.oldIndicies.map((q,H)=>F({element:q.multiDragElement,oldIndex:q.index,newIndex:C.newIndicies[H].index},E));break}return v(x,O)}function p(C,O){const b=m(C,O);return y(C,b)}function m(C,O){const b=[...O];return C.concat().reverse().forEach(E=>b.splice(E.oldIndex,1)),b}function y(C,O,b,E){const x=[...O];return C.forEach(_=>{const k=E&&b&&E(_.item,b);x.splice(_.newIndex,0,k||_.item)}),x}function h(C){return C.oldIndicies&&C.oldIndicies.length>0?"multidrag":C.swapItem?"swap":"normal"}function v(C,O){return C.map(E=>$(F({},E),{item:O[E.oldIndex]})).sort((E,x)=>E.oldIndex-x.oldIndex)}function w(C){const us=C,{list:O,setList:b,children:E,tag:x,style:_,className:k,clone:D,onAdd:B,onChange:q,onChoose:H,onClone:ce,onEnd:he,onFilter:ye,onRemove:ne,onSort:R,onStart:Y,onUnchoose:J,onUpdate:le,onMove:ue,onSpill:ze,onSelect:Fe,onDeselect:Ue}=us;return $t(us,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class A extends r.Component{constructor(O){super(O),this.ref=r.createRef();const b=[...O.list].map(E=>Object.assign(E,{chosen:!1,selected:!1}));O.setList(b,this.sortable,S),i(o)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();i(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:b,className:E,id:x}=this.props,_={style:b,className:E,id:x},k=!O||O===null?"div":O;return r.createElement(k,F({ref:this.ref},_),this.getChildren())}getChildren(){const{children:O,dataIdAttr:b,selectedClass:E="sortable-selected",chosenClass:x="sortable-chosen",dragClass:_="sortable-drag",fallbackClass:k="sortable-falback",ghostClass:D="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:q="sortable-filter",list:H}=this.props;if(!O||O==null)return null;const ce=b||"data-id";return r.Children.map(O,(he,ye)=>{if(he===void 0)return;const ne=H[ye]||{},{className:R}=he.props,Y=typeof q=="string"&&{[q.replace(".","")]:!!ne.filtered},J=i(n)(R,F({[E]:ne.selected,[x]:ne.chosen},Y));return r.cloneElement(he,{[ce]:he.key,className:J})})}get sortable(){const O=this.ref.current;if(O===null)return null;const b=Object.keys(O).find(E=>E.includes("Sortable"));return b?O[b]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],b=["onChange","onClone","onFilter","onSort"],E=w(this.props);O.forEach(_=>E[_]=this.prepareOnHandlerPropAndDOM(_)),b.forEach(_=>E[_]=this.prepareOnHandlerProp(_));const x=(_,k)=>{const{onMove:D}=this.props,B=_.willInsertAfter||-1;if(!D)return B;const q=D(_,k,this.sortable,S);return typeof q=="undefined"?!1:q};return $(F({},E),{onMove:x})}prepareOnHandlerPropAndDOM(O){return b=>{this.callOnHandlerProp(b,O),this[O](b)}}prepareOnHandlerProp(O){return b=>{this.callOnHandlerProp(b,O)}}callOnHandlerProp(O,b){const E=this.props[b];E&&E(O,this.sortable,S)}onAdd(O){const{list:b,setList:E,clone:x}=this.props,_=[...S.dragging.props.list],k=d(O,_);c(k);const D=y(k,b,O,x).map(B=>Object.assign(B,{selected:!1}));E(D,this.sortable,S)}onRemove(O){const{list:b,setList:E}=this.props,x=h(O),_=d(O,b);f(_);let k=[...b];if(O.pullMode!=="clone")k=m(_,k);else{let D=_;switch(x){case"multidrag":D=_.map((B,q)=>$(F({},B),{element:O.clones[q]}));break;case"normal":D=_.map(B=>$(F({},B),{element:O.clone}));break;case"swap":default:i(o)(!0,`mode "${x}" cannot clone. Please remove "props.clone" from when using the "${x}" plugin`)}c(D),_.forEach(B=>{const q=B.oldIndex,H=this.props.clone(B.item,O);k.splice(q,1,H)})}k=k.map(D=>Object.assign(D,{selected:!1})),E(k,this.sortable,S)}onUpdate(O){const{list:b,setList:E}=this.props,x=d(O,b);c(x),f(x);const _=p(x,b);return E(_,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(_,{chosen:!0})),D});E(x,this.sortable,S)}onUnchoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(D,{chosen:!1})),D});E(x,this.sortable,S)}onSpill(O){const{removeOnSpill:b,revertOnSpill:E}=this.props;b&&!E&&l(O.item)}onSelect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;if(k===-1){console.log(`"${O.type}" had indice of "${_.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}x[k].selected=!0}),E(x,this.sortable,S)}onDeselect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;k!==-1&&(x[k].selected=!0)}),E(x,this.sortable,S)}}A.defaultProps={clone:C=>C};var T={};s(e.exports,T)})(rw);const $_="_container_xt7ji_1",H_="_list_xt7ji_6",J_="_item_xt7ji_15",V_="_keyField_xt7ji_29",Q_="_valueField_xt7ji_34",X_="_header_xt7ji_39",K_="_dragHandle_xt7ji_45",q_="_deleteButton_xt7ji_55",Z_="_addItemButton_xt7ji_65",eP="_separator_xt7ji_72",ft={container:$_,list:H_,item:J_,keyField:V_,valueField:Q_,header:X_,dragHandle:K_,deleteButton:q_,addItemButton:Z_,separator:eP};function qp({name:e,label:t,value:n,onChange:r,optional:o=!1,newItemValue:i={key:"myKey",value:"myValue"}}){const[a,s]=I.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),l=$r(r);I.useEffect(()=>{const f=tP(a);lA(f,n!=null?n:{})||l({name:e,value:f})},[e,l,a,n]);const u=I.useCallback(f=>{s(d=>d.filter(({id:p})=>p!==f))},[]),c=I.useCallback(()=>{s(f=>[...f,F({id:-1},i)].map((d,p)=>$(F({},d),{id:p})))},[i]);return N("div",{className:ft.container,children:[g(ti,{category:e!=null?e:t}),N("div",{className:ft.list,children:[N("div",{className:ft.item+" "+ft.header,children:[g("span",{className:ft.keyField,children:"Key"}),g("span",{className:ft.valueField,children:"Value"})]}),g(rw.exports.ReactSortable,{list:a,setList:s,handle:`.${ft.dragHandle}`,children:a.map((f,d)=>N("div",{className:ft.item,children:[g("div",{className:ft.dragHandle,title:"Reorder list",children:g(o_,{})}),g("input",{className:ft.keyField,type:"text",value:f.key,onChange:p=>{const m=[...a];m[d]=$(F({},f),{key:p.target.value}),s(m)}}),g("span",{className:ft.separator,children:":"}),g("input",{className:ft.valueField,type:"text",value:f.value,onChange:p=>{const m=[...a];m[d]=$(F({},f),{value:p.target.value}),s(m)}}),g(wt,{className:ft.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:g(Sp,{})})]},f.id))}),g(wt,{className:ft.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:g(C1,{})})]})]})}function tP(e){return e.reduce((n,{key:r,value:o})=>(n[r]=o,n),{})}const nP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),rP="_container_162lp_1",oP="_checkbox_162lp_14",Mc={container:rP,checkbox:oP},iP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices;return N("div",$(F({ref:r,className:Mc.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:Object.keys(o).map((i,a)=>g("div",{className:Mc.radio,children:N("label",{className:Mc.checkbox,children:[g("input",{type:"checkbox",name:o[i],value:o[i],defaultChecked:a===0}),g("span",{children:i})]})},i))}),e]}))},aP={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},sP={title:"Checkbox Group",UiComponent:iP,SettingsComponent:nP,acceptsChildren:!1,defaultSettings:aP,iconSrc:t_,category:"Inputs"},lP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",uP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(tw,{label:"Starting value",name:"value",value:e.value}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),cP="_container_1x0tz_1",fP="_label_1x0tz_10",ng={container:cP,label:fP},dP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=(l=t.width)!=null?l:"auto",i=F({},t),[a,s]=j.exports.useState(i.value);return j.exports.useEffect(()=>{s(i.value)},[i.value]),N("div",$(F({className:ng.container+" shiny::checkbox",style:{width:o},"aria-label":"shiny::checkbox",ref:r},n),{children:[N("label",{htmlFor:i.inputId,children:[g("input",{id:i.inputId,type:"checkbox",checked:a,onChange:u=>s(u.target.checked)}),g("span",{className:ng.label,children:i.label})]}),e]}))},pP={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},hP={title:"Checkbox Input",UiComponent:dP,SettingsComponent:uP,acceptsChildren:!1,defaultSettings:pP,iconSrc:lP,category:"Inputs"},mP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",vP="_wrappedSection_1dn9g_1",gP="_sectionContainer_1dn9g_9",zl={wrappedSection:vP,sectionContainer:gP},gw=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.wrappedSection,children:t})]}),yP=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.inputSection,children:t})]}),wP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(gw,{name:"Values",children:[g(Hn,{name:"value",value:e.value}),g(Hn,{name:"min",value:e.min,optional:!0,defaultValue:0}),g(Hn,{name:"max",value:e.max,optional:!0,defaultValue:10}),g(Hn,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),SP="_container_yicbr_1",bP={container:SP},EP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=F({},t),i=(l=o.width)!=null?l:"200px",[a,s]=j.exports.useState(o.value);return j.exports.useEffect(()=>{s(o.value)},[o.value]),N("div",$(F({className:bP.container+" shiny::numericInput",style:{width:i},"aria-label":"shiny::numericInput",ref:r},n),{children:[g("span",{children:o.label}),g("input",{type:"number",value:a,onChange:u=>s(Number(u.target.value)),min:o.min,max:o.max,step:o.step}),e]}))},CP={inputId:"myNumericInput",label:"Numeric Input",value:10},AP={title:"Numeric Input",UiComponent:EP,SettingsComponent:wP,acceptsChildren:!1,defaultSettings:CP,iconSrc:mP,category:"Inputs"},xP=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>N(Me,{children:[g(pe,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),g(yn,{name:"width",units:["px","%"],value:t}),g(yn,{name:"height",units:["px","%"],value:n})]}),OP=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:o,compRef:i})=>N("div",$(F({className:Vf.container,ref:i,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},o),{children:[g(ew,{outputId:e}),r]})),_P={title:"Plot Output",UiComponent:OP,SettingsComponent:xP,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:q1,category:"Outputs"},PP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",kP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),TP="_container_sgn7c_1",rg={container:TP},IP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=Object.keys(o),a=Object.values(o),[s,l]=I.useState(a[0]);return I.useEffect(()=>{a.includes(s)||l(a[0])},[s,a]),N("div",$(F({ref:r,className:rg.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:a.map((u,c)=>g("div",{className:rg.radio,children:N("label",{children:[g("input",{type:"radio",name:t.inputId,value:u,onChange:f=>l(f.target.value),checked:u===s}),g("span",{children:i[c]})]})},u))}),e]}))},NP={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},DP={title:"Radio Buttons",UiComponent:IP,SettingsComponent:kP,acceptsChildren:!1,defaultSettings:NP,iconSrc:PP,category:"Inputs"},RP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",LP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),MP="_container_1e5dd_1",FP={container:MP},UP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=t.inputId;return N("div",$(F({ref:r,className:FP.container},n),{children:[g("label",{htmlFor:i,children:t.label}),g("select",{id:i,children:Object.keys(o).map((a,s)=>g("option",{value:o[a],children:a},a))}),e]}))},BP={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},jP={title:"Select Input",UiComponent:UP,SettingsComponent:LP,acceptsChildren:!1,defaultSettings:BP,iconSrc:RP,category:"Inputs"},WP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",YP=({settings:e})=>{const t=F({},e);return N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:t.inputId}),g(pe,{name:"label",value:t.label}),N(gw,{name:"Values",children:[g(Hn,{name:"min",value:t.min}),g(Hn,{name:"max",value:t.max}),g(Hn,{name:"value",label:"start",value:t.value}),g(Hn,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},zP="_container_1f2js_1",GP="_sliderWrapper_1f2js_11",$P="_sliderInput_1f2js_16",Fc={container:zP,sliderWrapper:GP,sliderInput:$P},HP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=F({},t),{width:i="200px"}=o,[a,s]=j.exports.useState(o.value);return N("div",$(F({className:Fc.container+" shiny::sliderInput",style:{width:i},"aria-label":"shiny::sliderInput",ref:r},n),{children:[g("div",{children:o.label}),g("div",{className:Fc.sliderWrapper,children:g("input",{type:"range",min:o.min,max:o.max,value:a,onChange:l=>s(Number(l.target.value)),className:"slider "+Fc.sliderInput,"aria-label":"slider input","data-min":o.min,"data-max":o.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),N("div",{children:[g(Z1,{type:"input",name:o.inputId})," = ",a]}),e]}))},JP={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},VP={title:"Slider Input",UiComponent:HP,SettingsComponent:YP,acceptsChildren:!1,defaultSettings:JP,iconSrc:WP,category:"Inputs"},QP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",XP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(yP,{name:"Values",children:[g(pe,{name:"value",value:e.value}),g(pe,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),KP="_container_yicbr_1",qP={container:KP},ZP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o="200px",i="auto",a=F({},t),[s,l]=j.exports.useState(a.value);return j.exports.useEffect(()=>{l(a.value)},[a.value]),N("div",$(F({className:qP.container+" shiny::textInput",style:{height:i,width:o},"aria-label":"shiny::textInput",ref:r},n),{children:[g("label",{htmlFor:a.inputId,children:a.label}),g("input",{id:a.inputId,type:"text",value:s,onChange:u=>l(u.target.value),placeholder:a.placeholder}),e]}))},ek={inputId:"myTextInput",label:"Text Input",value:""},tk={title:"Text Input",UiComponent:ZP,SettingsComponent:XP,acceptsChildren:!1,defaultSettings:ek,iconSrc:QP,category:"Inputs"},nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",rk=({settings:e})=>g(pe,{label:"Output ID",name:"outputId",value:e.outputId}),ok="_container_1i6yi_1",ik={container:ok},ak=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>N("div",$(F({className:ik.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",N("code",{children:["output$",e.outputId]}),t]})),sk={title:"Text Output",UiComponent:ak,SettingsComponent:rk,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:nk,category:"Outputs"},lk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",uk=({settings:e})=>{var t;return g(pe,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},ck="_container_1xnzo_1",fk={container:ck},dk=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:o="shiny-ui-output"}=e;return N("div",$(F({className:fk.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",o,"!"]}),t]}))},pk={title:"Dynamic UI Output",UiComponent:dk,SettingsComponent:uk,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:lk,category:"Outputs"};function hk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function mk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function vk(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const gk="_container_p6wnj_1",yk="_infoMsg_p6wnj_14",wk="_codeHolder_p6wnj_19",ed={container:gk,infoMsg:yk,codeHolder:wk},Sk=({settings:e})=>N("div",{children:[g("div",{className:kn.container,children:N("span",{className:ed.infoMsg,children:[g(hk,{}),"Unknown function call. Can't modify with visual editor."]})}),g(ti,{category:"Code"}),g("div",{className:kn.container,children:g("pre",{className:ed.codeHolder,children:vk(e.text)})})]}),bk=20,Ek=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const o=e.text.slice(0,bk).replaceAll(/\s$/g,"")+"...";return N("div",$(F({className:ed.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{children:["unknown ui output: ",g("code",{children:o})]}),t]}))},Ck={title:"Unknown UI Function",UiComponent:Ek,SettingsComponent:Sk,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},en={"shiny::actionButton":e_,"shiny::numericInput":AP,"shiny::sliderInput":VP,"shiny::textInput":tk,"shiny::checkboxInput":hP,"shiny::checkboxGroupInput":sP,"shiny::selectInput":jP,"shiny::radioButtons":DP,"shiny::plotOutput":_P,"shiny::textOutput":sk,"shiny::uiOutput":pk,"gridlayout::grid_page":V4,"gridlayout::grid_card":w4,"gridlayout::grid_card_text":G4,"gridlayout::grid_card_plot":k4,unknownUiFunction:Ck};function Ak(e,{path:t,node:n}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=rr(e,t);Object.assign(r,n)}const Zp={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},yw=vp({name:"uiTree",initialState:Zp,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>ww(t.payload.initialState),UPDATE_NODE:(e,t)=>{Ak(e,t.payload)},PLACE_NODE:(e,t)=>{yx(e,t.payload)},DELETE_NODE:(e,t)=>{E1(e,t.payload)}}});function ww(e){const t=en[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return hx(r,n).length>0&&(e.uiArguments=F(F({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(i=>ww(i)),e}const{UPDATE_NODE:Sw,PLACE_NODE:xk,DELETE_NODE:bw,INIT_STATE:Ok,SET_FULL_STATE:_k}=yw.actions;function Ew(){const e=vr();return I.useCallback(n=>{e(xk(n))},[e])}const Pk=yw.reducer,Cw=oA();Cw.startListening({actionCreator:bw,effect:(e,t)=>Eh(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Xa(n,r)&&t.dispatch(cA()),r.lengthi)return;const a=[...r];a[n.length-1]=i-1,t.dispatch(c1({path:a}))})});const kk=Cw.middleware,Tk=FC({reducer:{uiTree:Pk,selectedPath:fA,connectedToServer:sA},middleware:e=>e().concat(kk)}),Ik=({children:e})=>g(jE,{store:Tk,children:e}),Nk=!1;function Dk(){const e=window.location.host+window.location.pathname;return(window.location.protocol==="https:"?"wss:":"ws:")+"//"+e}const Zs={ws:null,msg:null},Aw=$(F({},Zs),{status:"connecting"});function Rk(e,t){switch(t.type){case"CONNECTED":return $(F({},Zs),{status:"connected",ws:t.ws});case"FAILED":return $(F({},Zs),{status:"failed-to-open"});case"CLOSED":return $(F({},Zs),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function Lk(){const[e,t]=I.useReducer(Rk,Aw),n=I.useRef(!1);return I.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=Dk(),o=new WebSocket(r);return o.onerror=i=>{console.error("Error with httpuv websocket connection",i)},o.onopen=i=>{n.current=!0,t({type:"CONNECTED",ws:o})},o.onclose=i=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>o.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const xw=I.createContext(Aw),Mk=({children:e})=>{const t=Lk();return g(xw.Provider,{value:t,children:e})};function Ow(){return I.useContext(xw)}function Fk(e){return JSON.parse(e.data)}function _w(e,t){e.addEventListener("message",n=>{t(Fk(n))})}function td(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const Uk="_appViewerHolder_wu0cb_1",Bk="_title_wu0cb_55",jk="_appContainer_wu0cb_89",Wk="_previewFrame_wu0cb_109",Yk="_expandButton_wu0cb_134",zk="_reloadButton_wu0cb_135",Gk="_spin_wu0cb_160",$k="_restartButton_wu0cb_198",Hk="_loadingMessage_wu0cb_225",Jk="_error_wu0cb_236",mt={appViewerHolder:Uk,title:Bk,appContainer:jk,previewFrame:Wk,expandButton:Yk,reloadButton:zk,spin:Gk,restartButton:$k,loadingMessage:Hk,error:Jk},Vk="_fakeApp_t3dh1_1",Qk="_fakeDashboard_t3dh1_7",Xk="_header_t3dh1_22",Kk="_sidebar_t3dh1_31",qk="_top_t3dh1_35",Zk="_bottom_t3dh1_39",Ei={fakeApp:Vk,fakeDashboard:Qk,header:Xk,sidebar:Kk,top:qk,bottom:Zk},eT=()=>g("div",{className:mt.appContainer,children:N("div",{className:Ei.fakeDashboard+" "+mt.previewFrame,children:[g("div",{className:Ei.header,children:g("h1",{children:"App preview not available"})}),g("div",{className:Ei.sidebar}),g("div",{className:Ei.top}),g("div",{className:Ei.bottom})]})});function tT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function nT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function rT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function oT(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const iT="_logs_xjp5l_2",aT="_logsContents_xjp5l_25",sT="_expandTab_xjp5l_29",lT="_clearLogsButton_xjp5l_69",uT="_logLine_xjp5l_75",cT="_noLogsMsg_xjp5l_81",fT="_expandedLogs_xjp5l_93",dT="_expandLogsButton_xjp5l_101",pT="_unseenLogsNotification_xjp5l_108",hT="_slidein_xjp5l_1",br={logs:iT,logsContents:aT,expandTab:sT,clearLogsButton:lT,logLine:uT,noLogsMsg:cT,expandedLogs:fT,expandLogsButton:dT,unseenLogsNotification:pT,slidein:hT};function mT({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:o}=vT(e),i=e.length===0;return N("div",{className:br.logs,"data-expanded":n,children:[N("button",{className:br.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[g(rT,{className:br.unseenLogsNotification,"data-show":o}),"App Logs",n?g(tT,{}):g(nT,{})]}),N("div",{className:br.logsContents,children:[i?g("p",{className:br.noLogsMsg,children:"No recent logs"}):e.map((a,s)=>g("p",{className:br.logLine,children:a},s)),i?null:g(wt,{variant:"icon",title:"clear logs",className:br.clearLogsButton,onClick:t,children:g(oT,{})})]})]})}function vT(e){const[t,n]=I.useState(!1),[r,o]=I.useState(!1),[i,a]=I.useState(null),[s,l]=I.useState(new Date),u=I.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),o(!1)},[t]);return I.useEffect(()=>{l(new Date)},[e]),I.useEffect(()=>{if(t||e.length===0){o(!1);return}if(i===null||i{u==="connected"&&(ia(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>ia(c,{path:"APP-PREVIEW-RESTART"})),m(()=>()=>ia(c,{path:"APP-PREVIEW-STOP"})),_w(c,w=>{if(!gT(w))return;const{path:S,payload:A}=w;switch(S){case"SHINY_READY":l(!1),a(!1),n(A);break;case"SHINY_LOGS":o(wT(A));break;case"SHINY_CRASH":l(A);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:w})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=I.useState(()=>()=>console.log("No app running to reset")),[p,m]=I.useState(()=>()=>console.log("No app running to stop")),y=I.useCallback(()=>{o([])},[]),h={appLogs:r,clearLogs:y,restartApp:f,stopApp:p};return i?Object.assign(h,{status:"no-preview",appLoc:null}):s?Object.assign(h,{status:"crashed",error:s,appLoc:null}):t?Object.assign(h,{status:"finished",appLoc:t,error:null}):Object.assign(h,{status:"loading",appLoc:null,error:null})}function wT(e){return Array.isArray(e)?e:[e]}function ST(){const[e,t]=I.useState(.2),n=xT();return I.useEffect(()=>{!n||t(bT(n.width))},[n]),e}function bT(e){const t=mS-Pw*2,n=e-kw*2;return t/n}const Pw=16,kw=55;function ET(){const e=I.useRef(null),[t,n]=I.useState(!1),r=I.useCallback(()=>{n(f=>!f)},[]),{status:o,appLoc:i,appLogs:a,clearLogs:s,restartApp:l}=yT(),u=ST(),c=I.useCallback(f=>{!e.current||!i||(e.current.src=i,OT(f.currentTarget))},[i]);return o==="no-preview"&&!Nk?null:N(Me,{children:[N("h3",{className:mt.title+" "+Q1.panelTitleHeader,children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),"App Preview"]}),g("div",{className:mt.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Pw}px`,"--expanded-inset-horizontal":`${kw}px`},children:o==="loading"?g(AT,{}):o==="crashed"?g(CT,{onClick:l}):N(Me,{children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),N("div",{className:mt.appContainer,children:[o==="no-preview"?g(eT,{}):g("iframe",{className:mt.previewFrame,src:i,title:"Application Preview",ref:e}),g(wt,{variant:"icon",className:mt.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?g(mk,{}):g(xx,{})})]}),g(mT,{appLogs:a,clearLogs:s})]})})]})}function CT({onClick:e}){return N("div",{className:mt.appContainer,children:[N("p",{children:["App preview crashed.",g("br",{})," Try and restart?"]}),N(wt,{className:mt.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",g(td,{})]})]})}function AT(){return g("div",{className:mt.loadingMessage,children:g("h2",{children:"Loading app preview..."})})}function xT(){const[e,t]=I.useState(null),n=I.useMemo(()=>Fp(()=>{const{innerWidth:r,innerHeight:o}=window;t({width:r,height:o})},500),[]);return I.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function OT(e){e.classList.add(mt.spin),e.addEventListener("animationend",()=>e.classList.remove(mt.spin),!1)}const _T=e=>g("svg",$(F({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:g("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class PT{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function kT(){const e=Va(c=>c.uiTree),t=vr(),[n,r]=I.useState(!1),[o,i]=I.useState(!1),a=I.useRef(new PT({comparisonFn:TT}));I.useEffect(()=>{if(!e||e===Zp)return;const c=a.current;c.addEntry(e),i(c.canGoBackwards()),r(c.canGoForwards())},[e]);const s=I.useCallback(c=>{t(_k({state:c}))},[t]),l=I.useCallback(()=>{console.log("Navigating backwards"),s(a.current.goBackwards())},[s]),u=I.useCallback(()=>{console.log("Navigating forwards"),s(a.current.goForwards())},[s]);return{goBackward:l,goForward:u,canGoBackward:o,canGoForward:n}}function TT(e,t){return typeof t=="undefined"?!1:e===t}const IT="_container_1d7pe_1",NT={container:IT};function DT(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=kT();return N("div",{className:NT.container+" undo-redo-buttons",children:[g(wt,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:g(PA,{height:"100%"})}),g(wt,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:g(_A,{height:"100%"})})]})}const RT="_elementsPalette_zecez_1",LT="_OptionItem_zecez_18",MT="_OptionIcon_zecez_27",FT="_OptionLabel_zecez_35",el={elementsPalette:RT,OptionItem:LT,OptionIcon:MT,OptionLabel:FT},og=["Inputs","Outputs","gridlayout","uncategorized"];function UT(e,t){var o,i;const n=og.indexOf(((o=en[e])==null?void 0:o.category)||"uncategorized"),r=og.indexOf(((i=en[t])==null?void 0:i.category)||"uncategorized");return nr?1:0}function BT({availableUi:e=en}){const t=j.exports.useMemo(()=>Object.keys(e).sort(UT),[e]);return g("div",{className:el.elementsPalette,children:t.map(n=>g(jT,{uiName:n},n))})}function jT({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r}=en[e],o={uiName:e,uiArguments:r},i=j.exports.useRef(null);return g1({ref:i,nodeInfo:{node:o}}),t===void 0?null:N("div",{ref:i,className:el.OptionItem,"data-ui-name":e,children:[g("img",{src:t,alt:n,className:el.OptionIcon}),g("label",{className:el.OptionLabel,children:n})]})}function Tw(e){return function(t){return typeof t===e}}var WT=Tw("function"),YT=function(e){return e===null},ig=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},ag=function(e){return!zT(e)&&!YT(e)&&(WT(e)||typeof e=="object")},zT=Tw("undefined"),nd=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function GT(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!vt(e[r],t[r]))return!1;return!0}function $T(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),o=e.byteLength;o--;)if(n.getUint8(o)!==r.getUint8(o))return!1;return!0}function HT(e,t){var n,r,o,i;if(e.size!==t.size)return!1;try{for(var a=nd(e.entries()),s=a.next();!s.done;s=a.next()){var l=s.value;if(!t.has(l[0]))return!1}}catch(f){n={error:f}}finally{try{s&&!s.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=nd(e.entries()),c=u.next();!c.done;c=u.next()){var l=c.value;if(!vt(l[1],t.get(l[0])))return!1}}catch(f){o={error:f}}finally{try{c&&!c.done&&(i=u.return)&&i.call(u)}finally{if(o)throw o.error}}return!0}function JT(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var o=nd(e.entries()),i=o.next();!i.done;i=o.next()){var a=i.value;if(!t.has(a[0]))return!1}}catch(s){n={error:s}}finally{try{i&&!i.done&&(r=o.return)&&r.call(o)}finally{if(n)throw n.error}}return!0}function vt(e,t){if(e===t)return!0;if(e&&ag(e)&&t&&ag(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return GT(e,t);if(e instanceof Map&&t instanceof Map)return HT(e,t);if(e instanceof Set&&t instanceof Set)return JT(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return $T(e,t);if(ig(e)&&ig(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var o=n.length;o--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[o]))return!1;for(var o=n.length;o--!==0;){var i=n[o];if(!(i==="_owner"&&e.$$typeof)&&!vt(e[i],t[i]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var VT=["innerHTML","ownerDocument","style","attributes","nodeValue"],QT=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],XT=["bigint","boolean","null","number","string","symbol","undefined"];function ku(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(KT(t))return t}function rn(e){return function(t){return ku(t)===e}}function KT(e){return QT.includes(e)}function ni(e){return function(t){return typeof t===e}}function qT(e){return XT.includes(e)}function P(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(P.array(e))return"Array";if(P.plainFunction(e))return"Function";var t=ku(e);return t||"Object"}P.array=Array.isArray;P.arrayOf=function(e,t){return!P.array(e)&&!P.function(t)?!1:e.every(function(n){return t(n)})};P.asyncGeneratorFunction=function(e){return ku(e)==="AsyncGeneratorFunction"};P.asyncFunction=rn("AsyncFunction");P.bigint=ni("bigint");P.boolean=function(e){return e===!0||e===!1};P.date=rn("Date");P.defined=function(e){return!P.undefined(e)};P.domElement=function(e){return P.object(e)&&!P.plainObject(e)&&e.nodeType===1&&P.string(e.nodeName)&&VT.every(function(t){return t in e})};P.empty=function(e){return P.string(e)&&e.length===0||P.array(e)&&e.length===0||P.object(e)&&!P.map(e)&&!P.set(e)&&Object.keys(e).length===0||P.set(e)&&e.size===0||P.map(e)&&e.size===0};P.error=rn("Error");P.function=ni("function");P.generator=function(e){return P.iterable(e)&&P.function(e.next)&&P.function(e.throw)};P.generatorFunction=rn("GeneratorFunction");P.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};P.iterable=function(e){return!P.nullOrUndefined(e)&&P.function(e[Symbol.iterator])};P.map=rn("Map");P.nan=function(e){return Number.isNaN(e)};P.null=function(e){return e===null};P.nullOrUndefined=function(e){return P.null(e)||P.undefined(e)};P.number=function(e){return ni("number")(e)&&!P.nan(e)};P.numericString=function(e){return P.string(e)&&e.length>0&&!Number.isNaN(Number(e))};P.object=function(e){return!P.nullOrUndefined(e)&&(P.function(e)||typeof e=="object")};P.oneOf=function(e,t){return P.array(e)?e.indexOf(t)>-1:!1};P.plainFunction=rn("Function");P.plainObject=function(e){if(ku(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};P.primitive=function(e){return P.null(e)||qT(typeof e)};P.promise=rn("Promise");P.propertyOf=function(e,t,n){if(!P.object(e)||!t)return!1;var r=e[t];return P.function(n)?n(r):P.defined(r)};P.regexp=rn("RegExp");P.set=rn("Set");P.string=ni("string");P.symbol=ni("symbol");P.undefined=ni("undefined");P.weakMap=rn("WeakMap");P.weakSet=rn("WeakSet");function ZT(){for(var e=[],t=0;tl);return P.undefined(r)||(u=u&&l===r),P.undefined(i)||(u=u&&s===i),u}function lg(e,t,n){var r=n.key,o=n.type,i=n.value,a=cn(e,r),s=cn(t,r),l=o==="added"?a:s,u=o==="added"?s:a;if(!P.nullOrUndefined(i)){if(P.defined(l)){if(P.array(l)||P.plainObject(l))return e6(l,u,i)}else return vt(u,i);return!1}return[a,s].every(P.array)?!u.every(eh(l)):[a,s].every(P.plainObject)?t6(Object.keys(l),Object.keys(u)):![a,s].every(function(c){return P.primitive(c)&&P.defined(c)})&&(o==="added"?!P.defined(a)&&P.defined(s):P.defined(a)&&!P.defined(s))}function ug(e,t,n){var r=n===void 0?{}:n,o=r.key,i=cn(e,o),a=cn(t,o);if(!Iw(i,a))throw new TypeError("Inputs have different types");if(!ZT(i,a))throw new TypeError("Inputs don't have length");return[i,a].every(P.plainObject)&&(i=Object.keys(i),a=Object.keys(a)),[i,a]}function cg(e){return function(t){var n=t[0],r=t[1];return P.array(e)?vt(e,r)||e.some(function(o){return vt(o,r)||P.array(r)&&eh(r)(o)}):P.plainObject(e)&&e[n]?!!e[n]&&vt(e[n],r):vt(e,r)}}function t6(e,t){return t.some(function(n){return!e.includes(n)})}function fg(e){return function(t){return P.array(e)?e.some(function(n){return vt(n,t)||P.array(t)&&eh(t)(n)}):vt(e,t)}}function Ci(e,t){return P.array(e)?e.some(function(n){return vt(n,t)}):vt(e,t)}function eh(e){return function(t){return e.some(function(n){return vt(n,t)})}}function Iw(){for(var e=[],t=0;t=0)return 1;return 0}();function R6(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function L6(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},D6))}}var M6=ns&&window.Promise,F6=M6?R6:L6;function Bw(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Hr(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function oh(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function rs(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Hr(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/(auto|scroll|overlay)/.test(n+o+r)?e:rs(oh(e))}function jw(e){return e&&e.referenceNode?e.referenceNode:e}var vg=ns&&!!(window.MSInputMethodContext&&document.documentMode),gg=ns&&/MSIE 10/.test(navigator.userAgent);function ri(e){return e===11?vg:e===10?gg:vg||gg}function Wo(e){if(!e)return document.documentElement;for(var t=ri(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Hr(n,"position")==="static"?Wo(n):n}function U6(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Wo(e.firstElementChild)===e}function rd(e){return e.parentNode!==null?rd(e.parentNode):e}function $l(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,o=n?t:e,i=document.createRange();i.setStart(r,0),i.setEnd(o,0);var a=i.commonAncestorContainer;if(e!==a&&t!==a||r.contains(o))return U6(a)?a:Wo(a);var s=rd(e);return s.host?$l(s.host,t):$l(e,rd(t).host)}function Yo(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var o=e.ownerDocument.documentElement,i=e.ownerDocument.scrollingElement||o;return i[n]}return e[n]}function B6(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Yo(t,"top"),o=Yo(t,"left"),i=n?-1:1;return e.top+=r*i,e.bottom+=r*i,e.left+=o*i,e.right+=o*i,e}function yg(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function wg(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],ri(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function Ww(e){var t=e.body,n=e.documentElement,r=ri(10)&&getComputedStyle(n);return{height:wg("Height",t,n,r),width:wg("Width",t,n,r)}}var j6=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},W6=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=ri(10),o=t.nodeName==="HTML",i=od(e),a=od(t),s=rs(e),l=Hr(t),u=parseFloat(l.borderTopWidth),c=parseFloat(l.borderLeftWidth);n&&o&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=pr({top:i.top-a.top-u,left:i.left-a.left-c,width:i.width,height:i.height});if(f.marginTop=0,f.marginLeft=0,!r&&o){var d=parseFloat(l.marginTop),p=parseFloat(l.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(s):t===s&&s.nodeName!=="BODY")&&(f=B6(f,t)),f}function Y6(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=ih(e,n),o=Math.max(n.clientWidth,window.innerWidth||0),i=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Yo(n),s=t?0:Yo(n,"left"),l={top:a-r.top+r.marginTop,left:s-r.left+r.marginLeft,width:o,height:i};return pr(l)}function Yw(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Hr(e,"position")==="fixed")return!0;var n=oh(e);return n?Yw(n):!1}function zw(e){if(!e||!e.parentElement||ri())return document.documentElement;for(var t=e.parentElement;t&&Hr(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function ah(e,t,n,r){var o=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,i={top:0,left:0},a=o?zw(e):$l(e,jw(t));if(r==="viewport")i=Y6(a,o);else{var s=void 0;r==="scrollParent"?(s=rs(oh(t)),s.nodeName==="BODY"&&(s=e.ownerDocument.documentElement)):r==="window"?s=e.ownerDocument.documentElement:s=r;var l=ih(s,a,o);if(s.nodeName==="HTML"&&!Yw(a)){var u=Ww(e.ownerDocument),c=u.height,f=u.width;i.top+=l.top-l.marginTop,i.bottom=c+l.top,i.left+=l.left-l.marginLeft,i.right=f+l.left}else i=l}n=n||0;var d=typeof n=="number";return i.left+=d?n:n.left||0,i.top+=d?n:n.top||0,i.right-=d?n:n.right||0,i.bottom-=d?n:n.bottom||0,i}function z6(e){var t=e.width,n=e.height;return t*n}function Gw(e,t,n,r,o){var i=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=ah(n,r,i,o),s={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},l=Object.keys(s).map(function(d){return Mt({key:d},s[d],{area:z6(s[d])})}).sort(function(d,p){return p.area-d.area}),u=l.filter(function(d){var p=d.width,m=d.height;return p>=n.clientWidth&&m>=n.clientHeight}),c=u.length>0?u[0].key:l[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function $w(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,o=r?zw(t):$l(t,jw(n));return ih(n,o,r)}function Hw(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),o=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),i={width:e.offsetWidth+o,height:e.offsetHeight+r};return i}function Hl(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function Jw(e,t,n){n=n.split("-")[0];var r=Hw(e),o={width:r.width,height:r.height},i=["right","left"].indexOf(n)!==-1,a=i?"top":"left",s=i?"left":"top",l=i?"height":"width",u=i?"width":"height";return o[a]=t[a]+t[l]/2-r[l]/2,n===s?o[s]=t[s]-r[u]:o[s]=t[Hl(s)],o}function os(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function G6(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(o){return o[t]===n});var r=os(e,function(o){return o[t]===n});return e.indexOf(r)}function Vw(e,t,n){var r=n===void 0?e:e.slice(0,G6(e,"name",n));return r.forEach(function(o){o.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var i=o.function||o.fn;o.enabled&&Bw(i)&&(t.offsets.popper=pr(t.offsets.popper),t.offsets.reference=pr(t.offsets.reference),t=i(t,o))}),t}function $6(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=$w(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=Gw(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=Jw(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=Vw(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function Qw(e,t){return e.some(function(n){var r=n.name,o=n.enabled;return o&&r===t})}function sh(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=s[f]+m-a[p]),e.offsets.popper=pr(e.offsets.popper);var y=s[f]+s[u]/2-m/2,h=Hr(e.instance.popper),v=parseFloat(h["margin"+c]),w=parseFloat(h["border"+c+"Width"]),S=y-e.offsets.popper[f]-v-w;return S=Math.max(Math.min(a[u]-m,S),0),e.arrowElement=r,e.offsets.arrow=(n={},zo(n,f,Math.round(S)),zo(n,d,""),n),e}function oI(e){return e==="end"?"start":e==="start"?"end":e}var Zw=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],Uc=Zw.slice(3);function Sg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=Uc.indexOf(e),r=Uc.slice(n+1).concat(Uc.slice(0,n));return t?r.reverse():r}var Bc={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function iI(e,t){if(Qw(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=ah(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],o=Hl(r),i=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case Bc.FLIP:a=[r,o];break;case Bc.CLOCKWISE:a=Sg(r);break;case Bc.COUNTERCLOCKWISE:a=Sg(r,!0);break;default:a=t.behavior}return a.forEach(function(s,l){if(r!==s||a.length===l+1)return e;r=e.placement.split("-")[0],o=Hl(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),y=f(u.top)f(n.bottom),v=r==="left"&&p||r==="right"&&m||r==="top"&&y||r==="bottom"&&h,w=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(w&&i==="start"&&p||w&&i==="end"&&m||!w&&i==="start"&&y||!w&&i==="end"&&h),A=!!t.flipVariationsByContent&&(w&&i==="start"&&m||w&&i==="end"&&p||!w&&i==="start"&&h||!w&&i==="end"&&y),T=S||A;(d||v||T)&&(e.flipped=!0,(d||v)&&(r=a[l+1]),T&&(i=oI(i)),e.placement=r+(i?"-"+i:""),e.offsets.popper=Mt({},e.offsets.popper,Jw(e.instance.popper,e.offsets.reference,e.placement)),e=Vw(e.instance.modifiers,e,"flip"))}),e}function aI(e){var t=e.offsets,n=t.popper,r=t.reference,o=e.placement.split("-")[0],i=Math.floor,a=["top","bottom"].indexOf(o)!==-1,s=a?"right":"bottom",l=a?"left":"top",u=a?"width":"height";return n[s]i(r[s])&&(e.offsets.popper[l]=i(r[s])),e}function sI(e,t,n,r){var o=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),i=+o[1],a=o[2];if(!i)return e;if(a.indexOf("%")===0){var s=void 0;switch(a){case"%p":s=n;break;case"%":case"%r":default:s=r}var l=pr(s);return l[t]/100*i}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*i}else return i}function lI(e,t,n,r){var o=[0,0],i=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),s=a.indexOf(os(a,function(c){return c.search(/,|\s/)!==-1}));a[s]&&a[s].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var l=/\s*,\s*|\s+/,u=s!==-1?[a.slice(0,s).concat([a[s].split(l)[0]]),[a[s].split(l)[1]].concat(a.slice(s+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!i:i)?"height":"width",p=!1;return c.reduce(function(m,y){return m[m.length-1]===""&&["+","-"].indexOf(y)!==-1?(m[m.length-1]=y,p=!0,m):p?(m[m.length-1]+=y,p=!1,m):m.concat(y)},[]).map(function(m){return sI(m,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){lh(d)&&(o[f]+=d*(c[p-1]==="-"?-1:1))})}),o}function uI(e,t){var n=t.offset,r=e.placement,o=e.offsets,i=o.popper,a=o.reference,s=r.split("-")[0],l=void 0;return lh(+n)?l=[+n,0]:l=lI(n,i,a,s),s==="left"?(i.top+=l[0],i.left-=l[1]):s==="right"?(i.top+=l[0],i.left+=l[1]):s==="top"?(i.left+=l[0],i.top-=l[1]):s==="bottom"&&(i.left+=l[0],i.top+=l[1]),e.popper=i,e}function cI(e,t){var n=t.boundariesElement||Wo(e.instance.popper);e.instance.reference===n&&(n=Wo(n));var r=sh("transform"),o=e.instance.popper.style,i=o.top,a=o.left,s=o[r];o.top="",o.left="",o[r]="";var l=ah(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);o.top=i,o.left=a,o[r]=s,t.boundaries=l;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var m=c[p];return c[p]l[p]&&!t.escapeWithReference&&(y=Math.min(c[m],l[p]-(p==="right"?c.width:c.height))),zo({},m,y)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=Mt({},c,f[p](d))}),e.offsets.popper=c,e}function fI(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var o=e.offsets,i=o.reference,a=o.popper,s=["bottom","top"].indexOf(n)!==-1,l=s?"left":"top",u=s?"width":"height",c={start:zo({},l,i[l]),end:zo({},l,i[l]+i[u]-a[u])};e.offsets.popper=Mt({},a,c[r])}return e}function dI(e){if(!qw(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=os(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};j6(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=F6(this.update.bind(this)),this.options=Mt({},e.Defaults,o),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(Mt({},e.Defaults.modifiers,o.modifiers)).forEach(function(a){r.options.modifiers[a]=Mt({},e.Defaults.modifiers[a]||{},o.modifiers?o.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return Mt({name:a},r.options.modifiers[a])}).sort(function(a,s){return a.order-s.order}),this.modifiers.forEach(function(a){a.enabled&&Bw(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var i=this.options.eventsEnabled;i&&this.enableEventListeners(),this.state.eventsEnabled=i}return W6(e,[{key:"update",value:function(){return $6.call(this)}},{key:"destroy",value:function(){return H6.call(this)}},{key:"enableEventListeners",value:function(){return V6.call(this)}},{key:"disableEventListeners",value:function(){return X6.call(this)}}]),e}();ju.Utils=(typeof window!="undefined"?window:global).PopperUtils;ju.placements=Zw;ju.Defaults=mI;const bg=ju;var eS={},tS={exports:{}};(function(e,t){(function(n,r){var o=r(n);e.exports=o})(Fg,function(n){var r=["N","E","A","D"];function o(b,E){b.super_=E,b.prototype=Object.create(E.prototype,{constructor:{value:b,enumerable:!1,writable:!0,configurable:!0}})}function i(b,E){Object.defineProperty(this,"kind",{value:b,enumerable:!0}),E&&E.length&&Object.defineProperty(this,"path",{value:E,enumerable:!0})}function a(b,E,x){a.super_.call(this,"E",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0}),Object.defineProperty(this,"rhs",{value:x,enumerable:!0})}o(a,i);function s(b,E){s.super_.call(this,"N",b),Object.defineProperty(this,"rhs",{value:E,enumerable:!0})}o(s,i);function l(b,E){l.super_.call(this,"D",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0})}o(l,i);function u(b,E,x){u.super_.call(this,"A",b),Object.defineProperty(this,"index",{value:E,enumerable:!0}),Object.defineProperty(this,"item",{value:x,enumerable:!0})}o(u,i);function c(b,E,x){var _=b.slice((x||E)+1||b.length);return b.length=E<0?b.length+E:E,b.push.apply(b,_),b}function f(b){var E=typeof b;return E!=="object"?E:b===Math?"math":b===null?"null":Array.isArray(b)?"array":Object.prototype.toString.call(b)==="[object Date]"?"date":typeof b.toString=="function"&&/^\/.*\//.test(b.toString())?"regexp":"object"}function d(b){var E=0;if(b.length===0)return E;for(var x=0;x0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,D),ue=ye!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,D);if(!le&&ue)x.push(new s(H,E));else if(!ue&&le)x.push(new l(H,b));else if(f(b)!==f(E))x.push(new a(H,b,E));else if(f(b)==="date"&&b-E!==0)x.push(new a(H,b,E));else if(he==="object"&&b!==null&&E!==null){for(ne=B.length-1;ne>-1;--ne)if(B[ne].lhs===b){J=!0;break}if(J)b!==E&&x.push(new a(H,b,E));else{if(B.push({lhs:b,rhs:E}),Array.isArray(b)){for(q&&(b.sort(function(Ue,rt){return p(Ue)-p(rt)}),E.sort(function(Ue,rt){return p(Ue)-p(rt)})),ne=E.length-1,R=b.length-1;ne>R;)x.push(new u(H,ne,new s(void 0,E[ne--])));for(;R>ne;)x.push(new u(H,R,new l(void 0,b[R--])));for(;ne>=0;--ne)m(b[ne],E[ne],x,_,H,ne,B,q)}else{var ze=Object.keys(b),Fe=Object.keys(E);for(ne=0;ne=0?(m(b[Y],E[Y],x,_,H,Y,B,q),Fe[J]=null):m(b[Y],void 0,x,_,H,Y,B,q);for(ne=0;ne -*/var vI={set:wI,get:gI,has:yI,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:SI};function gI(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,o){return r&&r[o]},e)}else return typeof t=="number"?e[t]:e;else return e}function yI(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a,s){return a==s.length-1?n.own?!!(o&&o.hasOwnProperty(i)):o!==null&&typeof o=="object"&&i in o:o&&o[i]},e)}else return typeof t=="number"?t in e:!1;else return!1}function wI(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a){const s=Number.isInteger(Number(r[a+1]));return o[i]=o[i]||(s?[]:{}),r.length==a+1&&(o[i]=n),o[i]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function SI(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var o=t.split("."),i=!1,a;return a=!!o.reduce(function(s,l){return i=i||s===n||!!s&&s[l]===n,s&&s[l]},e),r.validPath?i&&a:i}else return!1;else return!1}Object.defineProperty(eS,"__esModule",{value:!0});var bI=tS.exports,dt=vI;function EI(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(o)?o.indexOf(s)>=0:s===o;return l&&(i?u:!i)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var o=dt.get(e,n),i=dt.get(t,n),a=Array.isArray(r)?r.indexOf(o)<0:o!==r,s=Array.isArray(r)?r.indexOf(i)>=0:i===r;return a&&s},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return Eg(dt.get(e,n),dt.get(t,n))&&dt.get(e,n)dt.get(t,n)}}}var xI=eS.default=AI;function Cg(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Ee(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function nS(e,t){if(e==null)return{};var n=_I(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function bn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function rS(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:bn(e)}function ls(e){var t=OI();return function(){var r=Jl(e),o;if(t){var i=Jl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return rS(this,o)}}var PI={flip:{padding:20},preventOverflow:{padding:10}},ae={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},an=Dw.canUseDOM,Ai=nr.createPortal!==void 0;function jc(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ns(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd())}function kI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function TI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function II(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,o;o=function(a){n(a),TI(e,t,o)},kI(e,t,o,r)}function xg(){}var oS=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),an?(o.node=document.createElement("div"),r.id&&(o.node.id=r.id),r.zIndex&&(o.node.style.zIndex=r.zIndex),document.body.appendChild(o.node),o):rS(o)}return as(n,[{key:"componentDidMount",value:function(){!an||Ai||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!an||Ai||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!an||!this.node||(Ai||nr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!an)return null;var o=this.props,i=o.children,a=o.setRef;if(Ai)return nr.createPortal(i,this.node);var s=nr.unstable_renderSubtreeIntoContainer(this,i.length>1?g("div",{children:i}):i[0],this.node);return a(s),null}},{key:"renderReact16",value:function(){var o=this.props,i=o.hasChildren,a=o.placement,s=o.target;return i?this.renderPortal():s||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return Ai?this.renderReact16():null}}]),n}(I.Component);qe(oS,"propTypes",{children:M.exports.oneOfType([M.exports.element,M.exports.array]),hasChildren:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),placement:M.exports.string,setRef:M.exports.func.isRequired,target:M.exports.oneOfType([M.exports.object,M.exports.string]),zIndex:M.exports.number});var iS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"parentStyle",get:function(){var o=this.props,i=o.placement,a=o.styles,s=a.arrow.length,l={pointerEvents:"none",position:"absolute",width:"100%"};return i.startsWith("top")?(l.bottom=0,l.left=0,l.right=0,l.height=s):i.startsWith("bottom")?(l.left=0,l.right=0,l.top=0,l.height=s):i.startsWith("left")?(l.right=0,l.top=0,l.bottom=0):i.startsWith("right")&&(l.left=0,l.top=0),l}},{key:"render",value:function(){var o=this.props,i=o.placement,a=o.setArrowRef,s=o.styles,l=s.arrow,u=l.color,c=l.display,f=l.length,d=l.margin,p=l.position,m=l.spread,y={display:c,position:p},h,v=m,w=f;return i.startsWith("top")?(h="0,0 ".concat(v/2,",").concat(w," ").concat(v,",0"),y.bottom=0,y.marginLeft=d,y.marginRight=d):i.startsWith("bottom")?(h="".concat(v,",").concat(w," ").concat(v/2,",0 0,").concat(w),y.top=0,y.marginLeft=d,y.marginRight=d):i.startsWith("left")?(w=m,v=f,h="0,0 ".concat(v,",").concat(w/2," 0,").concat(w),y.right=0,y.marginTop=d,y.marginBottom=d):i.startsWith("right")&&(w=m,v=f,h="".concat(v,",").concat(w," ").concat(v,",0 0,").concat(w/2),y.left=0,y.marginTop=d,y.marginBottom=d),g("div",{className:"__floater__arrow",style:this.parentStyle,children:g("span",{ref:a,style:y,children:g("svg",{width:v,height:w,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:g("polygon",{points:h,fill:u})})})})}}]),n}(I.Component);qe(iS,"propTypes",{placement:M.exports.string.isRequired,setArrowRef:M.exports.func.isRequired,styles:M.exports.object.isRequired});var NI=["color","height","width"],aS=function(t){var n=t.handleClick,r=t.styles,o=r.color,i=r.height,a=r.width,s=nS(r,NI);return g("button",{"aria-label":"close",onClick:n,style:s,type:"button",children:g("svg",{width:"".concat(a,"px"),height:"".concat(i,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})})};aS.propTypes={handleClick:M.exports.func.isRequired,styles:M.exports.object.isRequired};var sS=function(t){var n=t.content,r=t.footer,o=t.handleClick,i=t.open,a=t.positionWrapper,s=t.showCloseButton,l=t.title,u=t.styles,c={content:I.isValidElement(n)?n:g("div",{className:"__floater__content",style:u.content,children:n})};return l&&(c.title=I.isValidElement(l)?l:g("div",{className:"__floater__title",style:u.title,children:l})),r&&(c.footer=I.isValidElement(r)?r:g("div",{className:"__floater__footer",style:u.footer,children:r})),(s||a)&&!P.boolean(i)&&(c.close=g(aS,{styles:u.close,handleClick:o})),N("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};sS.propTypes={content:M.exports.node.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,open:M.exports.bool,positionWrapper:M.exports.bool.isRequired,showCloseButton:M.exports.bool.isRequired,styles:M.exports.object.isRequired,title:M.exports.node};var lS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"style",get:function(){var o=this.props,i=o.disableAnimation,a=o.component,s=o.placement,l=o.hideArrow,u=o.status,c=o.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,m=c.floaterClosing,y=c.floaterOpening,h=c.floaterWithAnimation,v=c.floaterWithComponent,w={};return l||(s.startsWith("top")?w.padding="0 0 ".concat(f,"px"):s.startsWith("bottom")?w.padding="".concat(f,"px 0 0"):s.startsWith("left")?w.padding="0 ".concat(f,"px 0 0"):s.startsWith("right")&&(w.padding="0 0 0 ".concat(f,"px"))),[ae.OPENING,ae.OPEN].indexOf(u)!==-1&&(w=Ee(Ee({},w),y)),u===ae.CLOSING&&(w=Ee(Ee({},w),m)),u===ae.OPEN&&!i&&(w=Ee(Ee({},w),h)),s==="center"&&(w=Ee(Ee({},w),p)),a&&(w=Ee(Ee({},w),v)),Ee(Ee({},d),w)}},{key:"render",value:function(){var o=this.props,i=o.component,a=o.handleClick,s=o.hideArrow,l=o.setFloaterRef,u=o.status,c={},f=["__floater"];return i?I.isValidElement(i)?c.content=I.cloneElement(i,{closeFn:a}):c.content=i({closeFn:a}):c.content=g(sS,F({},this.props)),u===ae.OPEN&&f.push("__floater__open"),s||(c.arrow=g(iS,F({},this.props))),g("div",{ref:l,className:f.join(" "),style:this.style,children:N("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(I.Component);qe(lS,"propTypes",{component:M.exports.oneOfType([M.exports.func,M.exports.element]),content:M.exports.node,disableAnimation:M.exports.bool.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,hideArrow:M.exports.bool.isRequired,open:M.exports.bool,placement:M.exports.string.isRequired,positionWrapper:M.exports.bool.isRequired,setArrowRef:M.exports.func.isRequired,setFloaterRef:M.exports.func.isRequired,showCloseButton:M.exports.bool,status:M.exports.string.isRequired,styles:M.exports.object.isRequired,title:M.exports.node});var uS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"render",value:function(){var o=this.props,i=o.children,a=o.handleClick,s=o.handleMouseEnter,l=o.handleMouseLeave,u=o.setChildRef,c=o.setWrapperRef,f=o.style,d=o.styles,p;if(i)if(I.Children.count(i)===1)if(!I.isValidElement(i))p=g("span",{children:i});else{var m=P.function(i.type)?"innerRef":"ref";p=I.cloneElement(I.Children.only(i),qe({},m,u))}else p=i;return p?g("span",{ref:c,style:Ee(Ee({},d),f),onClick:a,onMouseEnter:s,onMouseLeave:l,children:p}):null}}]),n}(I.Component);qe(uS,"propTypes",{children:M.exports.node,handleClick:M.exports.func.isRequired,handleMouseEnter:M.exports.func.isRequired,handleMouseLeave:M.exports.func.isRequired,setChildRef:M.exports.func.isRequired,setWrapperRef:M.exports.func.isRequired,style:M.exports.object,styles:M.exports.object.isRequired});var DI={zIndex:100};function RI(e){var t=on(DI,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var LI=["arrow","flip","offset"],MI=["position","top","right","bottom","left"],uh=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),qe(bn(o),"setArrowRef",function(i){o.arrowRef=i}),qe(bn(o),"setChildRef",function(i){o.childRef=i}),qe(bn(o),"setFloaterRef",function(i){o.floaterRef||(o.floaterRef=i)}),qe(bn(o),"setWrapperRef",function(i){o.wrapperRef=i}),qe(bn(o),"handleTransitionEnd",function(){var i=o.state.status,a=o.props.callback;o.wrapperPopper&&o.wrapperPopper.instance.update(),o.setState({status:i===ae.OPENING?ae.OPEN:ae.IDLE},function(){var s=o.state.status;a(s===ae.OPEN?"open":"close",o.props)})}),qe(bn(o),"handleClick",function(){var i=o.props,a=i.event,s=i.open;if(!P.boolean(s)){var l=o.state,u=l.positionWrapper,c=l.status;(o.event==="click"||o.event==="hover"&&u)&&(Ns({title:"click",data:[{event:a,status:c===ae.OPEN?"closing":"opening"}],debug:o.debug}),o.toggle())}}),qe(bn(o),"handleMouseEnter",function(){var i=o.props,a=i.event,s=i.open;if(!(P.boolean(s)||jc())){var l=o.state.status;o.event==="hover"&&l===ae.IDLE&&(Ns({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:o.debug}),clearTimeout(o.eventDelayTimeout),o.toggle())}}),qe(bn(o),"handleMouseLeave",function(){var i=o.props,a=i.event,s=i.eventDelay,l=i.open;if(!(P.boolean(l)||jc())){var u=o.state,c=u.status,f=u.positionWrapper;o.event==="hover"&&(Ns({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:o.debug}),s?[ae.OPENING,ae.OPEN].indexOf(c)!==-1&&!f&&!o.eventDelayTimeout&&(o.eventDelayTimeout=setTimeout(function(){delete o.eventDelayTimeout,o.toggle()},s*1e3)):o.toggle(ae.IDLE))}}),o.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ae.INIT,statusWrapper:ae.INIT},o._isMounted=!1,an&&window.addEventListener("load",function(){o.popper&&o.popper.instance.update(),o.wrapperPopper&&o.wrapperPopper.instance.update()}),o}return as(n,[{key:"componentDidMount",value:function(){if(!!an){var o=this.state.positionWrapper,i=this.props,a=i.children,s=i.open,l=i.target;this._isMounted=!0,Ns({title:"init",data:{hasChildren:!!a,hasTarget:!!l,isControlled:P.boolean(s),positionWrapper:o,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&l&&P.boolean(s)}}},{key:"componentDidUpdate",value:function(o,i){if(!!an){var a=this.props,s=a.autoOpen,l=a.open,u=a.target,c=a.wrapperOptions,f=xI(i,this.state),d=f.changedFrom,p=f.changedTo;if(o.open!==l){var m;P.boolean(l)&&(m=l?ae.OPENING:ae.CLOSING),this.toggle(m)}(o.wrapperOptions.position!==c.position||o.target!==u)&&this.changeWrapperPosition(this.props),p("status",ae.IDLE)&&l?this.toggle(ae.OPEN):d("status",ae.INIT,ae.IDLE)&&s&&this.toggle(ae.OPEN),this.popper&&p("status",ae.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ae.OPENING)||p("status",ae.CLOSING))&&II(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!an||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var o=this,i=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,s=this.props,l=s.disableFlip,u=s.getPopper,c=s.hideArrow,f=s.offset,d=s.placement,p=s.wrapperOptions,m=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ae.IDLE});else if(i&&this.floaterRef){var y=this.options,h=y.arrow,v=y.flip,w=y.offset,S=nS(y,LI);new bg(i,this.floaterRef,{placement:d,modifiers:Ee({arrow:Ee({enabled:!c,element:this.arrowRef},h),flip:Ee({enabled:!l,behavior:m},v),offset:Ee({offset:"0, ".concat(f,"px")},w)},S),onCreate:function(C){o.popper=C,u(C,"floater"),o._isMounted&&o.setState({currentPlacement:C.placement,status:ae.IDLE}),d!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){o.popper=C;var O=o.state.currentPlacement;o._isMounted&&C.placement!==O&&o.setState({currentPlacement:C.placement})}})}if(a){var A=P.undefined(p.offset)?0:p.offset;new bg(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(A,"px")},flip:{enabled:!1}},onCreate:function(C){o.wrapperPopper=C,o._isMounted&&o.setState({statusWrapper:ae.IDLE}),u(C,"wrapper"),d!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(o){var i=o.target,a=o.wrapperOptions;this.setState({positionWrapper:a.position&&!!i})}},{key:"toggle",value:function(o){var i=this.state.status,a=i===ae.OPEN?ae.CLOSING:ae.OPENING;P.undefined(o)||(a=o),this.setState({status:a})}},{key:"debug",get:function(){var o=this.props.debug;return o||!!global.ReactFloaterDebug}},{key:"event",get:function(){var o=this.props,i=o.disableHoverToClick,a=o.event;return a==="hover"&&jc()&&!i?"click":a}},{key:"options",get:function(){var o=this.props.options;return on(PI,o||{})}},{key:"styles",get:function(){var o=this,i=this.state,a=i.status,s=i.positionWrapper,l=i.statusWrapper,u=this.props.styles,c=on(RI(u),u);if(s){var f;[ae.IDLE].indexOf(a)===-1||[ae.IDLE].indexOf(l)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Ee(Ee({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},s||(MI.forEach(function(p){o.wrapperStyles[p]=d[p]}),c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!an)return null;var o=this.props.target;return o?P.domElement(o)?o:document.querySelector(o):this.childRef||this.wrapperRef}},{key:"render",value:function(){var o=this.state,i=o.currentPlacement,a=o.positionWrapper,s=o.status,l=this.props,u=l.children,c=l.component,f=l.content,d=l.disableAnimation,p=l.footer,m=l.hideArrow,y=l.id,h=l.open,v=l.showCloseButton,w=l.style,S=l.target,A=l.title,T=g(uS,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:w,styles:this.styles.wrapper,children:u}),C={};return a?C.wrapperInPortal=T:C.wrapperAsChildren=T,N("span",{children:[N(oS,{hasChildren:!!u,id:y,placement:i,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[g(lS,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:m||i==="center",open:h,placement:i,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:v,status:s,styles:this.styles,title:A}),C.wrapperInPortal]}),C.wrapperAsChildren]})}}]),n}(I.Component);qe(uh,"propTypes",{autoOpen:M.exports.bool,callback:M.exports.func,children:M.exports.node,component:mg(M.exports.oneOfType([M.exports.func,M.exports.element]),function(e){return!e.content}),content:mg(M.exports.node,function(e){return!e.component}),debug:M.exports.bool,disableAnimation:M.exports.bool,disableFlip:M.exports.bool,disableHoverToClick:M.exports.bool,event:M.exports.oneOf(["hover","click"]),eventDelay:M.exports.number,footer:M.exports.node,getPopper:M.exports.func,hideArrow:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),offset:M.exports.number,open:M.exports.bool,options:M.exports.object,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:M.exports.bool,style:M.exports.object,styles:M.exports.object,target:M.exports.oneOfType([M.exports.object,M.exports.string]),title:M.exports.node,wrapperOptions:M.exports.shape({offset:M.exports.number,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:M.exports.bool})});qe(uh,"defaultProps",{autoOpen:!1,callback:xg,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:xg,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function Og(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function W(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function Ql(e,t){if(e==null)return{};var n=UI(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Pe(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function cS(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return Pe(e)}function Vr(e){var t=FI();return function(){var r=Vl(e),o;if(t){var i=Vl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return cS(this,o)}}var oe={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},it={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ee={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},re={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},Cn=Dw.canUseDOM,xi=Na.exports.createPortal!==void 0;function fS(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function Wc(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function Oi(e){var t=[],n=function r(o){if(typeof o=="string"||typeof o=="number")t.push(o);else if(Array.isArray(o))o.forEach(function(a){return r(a)});else if(o&&o.props){var i=o.props.children;Array.isArray(i)?i.forEach(function(a){return r(a)}):r(i)}};return n(e),t.join(" ").trim()}function Pg(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function BI(e,t){return!P.plainObject(e)||!P.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function jI(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(o,i,a,s){return i+i+a+a+s+s}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function kg(e){return e.disableBeacon||e.placement==="center"}function ld(e,t){var n,r=j.exports.isValidElement(e)||j.exports.isValidElement(t),o=P.undefined(e)||P.undefined(t);if(Wc(e)!==Wc(t)||r||o)return!1;if(P.domElement(e))return e.isSameNode(t);if(P.number(e))return e===t;if(P.function(e))return e.toString()===t.toString();for(var i in e)if(Pg(e,i)){if(typeof e[i]=="undefined"||typeof t[i]=="undefined")return!1;if(n=Wc(e[i]),["object","array"].indexOf(n)!==-1&&ld(e[i],t[i])||n==="function"&&ld(e[i],t[i]))continue;if(e[i]!==t[i])return!1}for(var a in t)if(Pg(t,a)&&typeof e[a]=="undefined")return!1;return!0}function Tg(){return["chrome","safari","firefox","opera"].indexOf(fS())===-1}function jr(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var WI={action:"",controlled:!1,index:0,lifecycle:ee.INIT,size:0,status:re.IDLE},Ig=["action","index","lifecycle","status"];function YI(e){var t=new Map,n=new Map,r=function(){function o(){var i=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},s=a.continuous,l=s===void 0?!1:s,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;Ln(this,o),V(this,"listener",void 0),V(this,"setSteps",function(d){var p=i.getState(),m=p.size,y=p.status,h={size:d.length,status:y};n.set("steps",d),y===re.WAITING&&!m&&d.length&&(h.status=re.RUNNING),i.setState(h)}),V(this,"addListener",function(d){i.listener=d}),V(this,"update",function(d){if(!BI(d,Ig))throw new Error("State is not valid. Valid keys: ".concat(Ig.join(", ")));i.setState(W({},i.getNextState(W(W(W({},i.getState()),d),{},{action:d.action||oe.UPDATE}),!0)))}),V(this,"start",function(d){var p=i.getState(),m=p.index,y=p.size;i.setState(W(W({},i.getNextState({action:oe.START,index:P.number(d)?d:m},!0)),{},{status:y?re.RUNNING:re.WAITING}))}),V(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.index,y=p.status;[re.FINISHED,re.SKIPPED].indexOf(y)===-1&&i.setState(W(W({},i.getNextState({action:oe.STOP,index:m+(d?1:0)})),{},{status:re.PAUSED}))}),V(this,"close",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.CLOSE,index:p+1})))}),V(this,"go",function(d){var p=i.getState(),m=p.controlled,y=p.status;if(!(m||y!==re.RUNNING)){var h=i.getSteps()[d];i.setState(W(W({},i.getNextState({action:oe.GO,index:d})),{},{status:h?y:re.FINISHED}))}}),V(this,"info",function(){return i.getState()}),V(this,"next",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(i.getNextState({action:oe.NEXT,index:p+1}))}),V(this,"open",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.UPDATE,lifecycle:ee.TOOLTIP})))}),V(this,"prev",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.PREV,index:p-1})))}),V(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.controlled;m||i.setState(W(W({},i.getNextState({action:oe.RESET,index:0})),{},{status:d?re.RUNNING:re.READY}))}),V(this,"skip",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState({action:oe.SKIP,lifecycle:ee.INIT,status:re.SKIPPED})}),this.setState({action:oe.INIT,controlled:P.number(u),continuous:l,index:P.number(u)?u:0,lifecycle:ee.INIT,status:f.length?re.READY:re.IDLE},!0),this.setSteps(f)}return Mn(o,[{key:"setState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=W(W({},l),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,m=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",m),s&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(l)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:W({},WI)}},{key:"getNextState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=l.action,c=l.controlled,f=l.index,d=l.size,p=l.status,m=P.number(a.index)?a.index:f,y=c&&!s?f:Math.min(Math.max(m,0),d);return{action:a.action||u,controlled:c,index:y,lifecycle:a.lifecycle||ee.INIT,size:a.size||d,status:y===d?re.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var s=JSON.stringify(a),l=JSON.stringify(this.getState());return s!==l}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),o}();return new r(e)}function aa(){return document.scrollingElement||document.createElement("body")}function dS(e){return e?e.getBoundingClientRect():{}}function zI(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function or(e){return typeof e=="string"?document.querySelector(e):e}function GI(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function Wu(e,t,n){var r=Lw(e);if(r.isSameNode(aa()))return n?document:aa();var o=r.scrollHeight>r.offsetHeight;return!o&&!t?(r.style.overflow="initial",aa()):r}function Yu(e,t){if(!e)return!1;var n=Wu(e,t);return!n.isSameNode(aa())}function $I(e){return e.offsetParent!==document.body}function Go(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:GI(e).position===t?!0:Go(e.parentNode,t)}function HI(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,o=n.visibility;if(r==="none"||o==="hidden")return!1}t=t.parentNode}return!0}function JI(e,t,n){var r=dS(e),o=Wu(e,n),i=Yu(e,n),a=0;o instanceof HTMLElement&&(a=o.scrollTop);var s=r.top+(!i&&!Go(e)?a:0);return Math.floor(s-t)}function ud(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?ud(e.offsetParent)+e.offsetTop:e.offsetTop:0}function VI(e,t,n){if(!e)return 0;var r=Lw(e),o=ud(e);return Yu(e,n)&&!$I(e)&&(o-=ud(r)),Math.floor(o-t)}function QI(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:aa(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,o){var i=t.scrollTop,a=e>i?e-i:i-e;i6.top(t,e,{duration:a<100?50:n},function(s){return s&&s.message!=="Element already at target scroll position"?o(s):r()})})}function XI(e){function t(r,o,i,a,s,l){var u=a||"<>",c=l||i;if(o[i]==null)return r?new Error("Required ".concat(s," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=on(KI,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return P.plainObject(e)?e.target?!0:(jr({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(jr({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function Dg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return P.array(e)?e.every(function(n){return pS(n,t)}):(jr({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var eN=Mn(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(Ln(this,e),V(this,"element",void 0),V(this,"options",void 0),V(this,"canBeTabbed",function(o){var i=o.tabIndex;(i===null||i<0)&&(i=void 0);var a=isNaN(i);return!a&&n.canHaveFocus(o)}),V(this,"canHaveFocus",function(o){var i=/input|select|textarea|button|object/,a=o.nodeName.toLowerCase(),s=i.test(a)&&!o.getAttribute("disabled")||a==="a"&&!!o.getAttribute("href");return s&&n.isVisible(o)}),V(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),V(this,"handleKeyDown",function(o){var i=n.options.keyCode,a=i===void 0?9:i;o.keyCode===a&&n.interceptTab(o)}),V(this,"interceptTab",function(o){var i=n.findValidTabElements();if(!!i.length){o.preventDefault();var a=o.shiftKey,s=i.indexOf(document.activeElement);s===-1||!a&&s+1===i.length?s=0:a&&s===0?s=i.length-1:s+=a?-1:1,i[s].focus()}}),V(this,"isHidden",function(o){var i=o.offsetWidth<=0&&o.offsetHeight<=0,a=window.getComputedStyle(o);return i&&!o.innerHTML?!0:i&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),V(this,"isVisible",function(o){for(var i=o;i;)if(i instanceof HTMLElement){if(i===document.body)break;if(n.isHidden(i))return!1;i=i.parentNode}return!0}),V(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),V(this,"checkFocus",function(o){document.activeElement!==o&&(o.focus(),window.requestAnimationFrame(function(){return n.checkFocus(o)}))}),V(this,"setFocus",function(){var o=n.options.selector;if(!!o){var i=n.element.querySelector(o);i&&window.requestAnimationFrame(function(){return n.checkFocus(i)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),tN=function(e){Jr(n,e);var t=Vr(n);function n(r){var o;if(Ln(this,n),o=t.call(this,r),V(Pe(o),"setBeaconRef",function(l){o.beacon=l}),!r.beaconComponent){var i=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),s=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(s)),i.appendChild(a)}return o}return Mn(n,[{key:"componentDidMount",value:function(){var o=this,i=this.props.shouldFocus;setTimeout(function(){P.domElement(o.beacon)&&i&&o.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var o=document.getElementById("joyride-beacon-animation");o&&o.parentNode.removeChild(o)}},{key:"render",value:function(){var o=this.props,i=o.beaconComponent,a=o.locale,s=o.onClickOrHover,l=o.styles,u={"aria-label":a.open,onClick:s,onMouseEnter:s,ref:this.setBeaconRef,title:a.open},c;if(i){var f=i;c=g(f,F({},u))}else c=N("button",$(F({className:"react-joyride__beacon",style:l.beacon,type:"button"},u),{children:[g("span",{style:l.beaconInner}),g("span",{style:l.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(I.Component),nN=function(t){var n=t.styles;return g("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},rN=["mixBlendMode","zIndex"],oN=function(e){Jr(n,e);var t=Vr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a=p&&y<=p+c,w=h>=f&&h<=f+m,S=w&&v;S!==l&&r.updateState({mouseOverSpotlight:S})}),V(Pe(r),"handleScroll",function(){var s=r.props.target,l=or(s);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Go(l,"sticky")&&r.updateState({})}),V(Pe(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return Mn(n,[{key:"componentDidMount",value:function(){var o=this.props;o.debug,o.disableScrolling;var i=o.disableScrollParentFix,a=o.target,s=or(a);this.scrollParent=Wu(s,i,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(o){var i=this,a=this.props,s=a.lifecycle,l=a.spotlightClicks,u=Gl(o,this.props),c=u.changed;c("lifecycle",ee.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=i.state.isScrolling;f||i.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(l&&s===ee.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):s!==ee.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var o=this.state.showSpotlight,i=this.props,a=i.disableScrollParentFix,s=i.spotlightClicks,l=i.spotlightPadding,u=i.styles,c=i.target,f=or(c),d=dS(f),p=Go(f),m=JI(f,l,a);return W(W({},Tg()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+l*2),left:Math.round(d.left-l),opacity:o?1:0,pointerEvents:s?"none":"auto",position:p?"fixed":"absolute",top:m,transition:"opacity 0.2s",width:Math.round(d.width+l*2)})}},{key:"updateState",value:function(o){!this._isMounted||this.setState(o)}},{key:"render",value:function(){var o=this.state,i=o.mouseOverSpotlight,a=o.showSpotlight,s=this.props,l=s.disableOverlay,u=s.disableOverlayClose,c=s.lifecycle,f=s.onClickOverlay,d=s.placement,p=s.styles;if(l||c!==ee.TOOLTIP)return null;var m=p.overlay;Tg()&&(m=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var y=W({cursor:u?"default":"pointer",height:zI(),pointerEvents:i?"none":"auto"},m),h=d!=="center"&&a&&g(nN,{styles:this.spotlightStyles});if(fS()==="safari"){y.mixBlendMode,y.zIndex;var v=Ql(y,rN);h=g("div",{style:W({},v),children:h}),delete y.backgroundColor}return g("div",{className:"react-joyride__overlay",style:y,onClick:f,children:h})}}]),n}(I.Component),iN=["styles"],aN=["color","height","width"],sN=function(t){var n=t.styles,r=Ql(t,iN),o=n.color,i=n.height,a=n.width,s=Ql(n,aN);return g("button",$(F({style:s,type:"button"},r),{children:g("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof i=="number"?"".concat(i,"px"):i,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})}))},lN=function(e){Jr(n,e);var t=Vr(n);function n(){return Ln(this,n),t.apply(this,arguments)}return Mn(n,[{key:"render",value:function(){var o=this.props,i=o.backProps,a=o.closeProps,s=o.continuous,l=o.index,u=o.isLastStep,c=o.primaryProps,f=o.size,d=o.skipProps,p=o.step,m=o.tooltipProps,y=p.content,h=p.hideBackButton,v=p.hideCloseButton,w=p.hideFooter,S=p.showProgress,A=p.showSkipButton,T=p.title,C=p.styles,O=p.locale,b=O.back,E=O.close,x=O.last,_=O.next,k=O.skip,D={primary:E};return s&&(D.primary=u?x:_,S&&(D.primary=N("span",{children:[D.primary," (",l+1,"/",f,")"]}))),A&&!u&&(D.skip=g("button",$(F({style:C.buttonSkip,type:"button","aria-live":"off"},d),{children:k}))),!h&&l>0&&(D.back=g("button",$(F({style:C.buttonBack,type:"button"},i),{children:b}))),D.close=!v&&g(sN,F({styles:C.buttonClose},a)),N("div",$(F({className:"react-joyride__tooltip",style:C.tooltip},m),{children:[N("div",{style:C.tooltipContainer,children:[T&&g("h4",{style:C.tooltipTitle,"aria-label":T,children:T}),g("div",{style:C.tooltipContent,children:y})]}),!w&&N("div",{style:C.tooltipFooter,children:[g("div",{style:C.tooltipFooterSpacer,children:D.skip}),D.back,g("button",$(F({style:C.buttonNext,type:"button"},c),{children:D.primary}))]}),D.close]}),"JoyrideTooltip")}}]),n}(I.Component),uN=["beaconComponent","tooltipComponent"],cN=function(e){Jr(n,e);var t=Vr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a0||a===oe.PREV),C=w("action")||w("index")||w("lifecycle")||w("status"),O=S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT),b=w("action",[oe.NEXT,oe.PREV,oe.SKIP,oe.CLOSE]);if(b&&(O||u)&&s(W(W({},A),{},{index:o.index,lifecycle:ee.COMPLETE,step:o.step,type:it.STEP_AFTER})),w("index")&&f>0&&d===ee.INIT&&m===re.RUNNING&&y.placement==="center"&&h({lifecycle:ee.READY}),C&&y){var E=or(y.target),x=!!E,_=x&&HI(E);_?(S("status",re.READY,re.RUNNING)||S("lifecycle",ee.INIT,ee.READY))&&s(W(W({},A),{},{step:y,type:it.STEP_BEFORE})):(console.warn(x?"Target not visible":"Target not mounted",y),s(W(W({},A),{},{type:it.TARGET_NOT_FOUND,step:y})),u||h({index:f+([oe.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ee.INIT,ee.READY)&&h({lifecycle:kg(y)||T?ee.TOOLTIP:ee.BEACON}),w("index")&&jr({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),w("lifecycle",ee.BEACON)&&s(W(W({},A),{},{step:y,type:it.BEACON})),w("lifecycle",ee.TOOLTIP)&&(s(W(W({},A),{},{step:y,type:it.TOOLTIP})),this.scope=new eN(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var o=this.props,i=o.step,a=o.lifecycle;return!!(kg(i)||a===ee.TOOLTIP)}},{key:"render",value:function(){var o=this.props,i=o.continuous,a=o.debug,s=o.helpers,l=o.index,u=o.lifecycle,c=o.nonce,f=o.shouldScroll,d=o.size,p=o.step,m=or(p.target);return!pS(p)||!P.domElement(m)?null:N("div",{className:"react-joyride__step",children:[g(fN,{id:"react-joyride-portal",children:g(oN,$(F({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),g(uh,$(F({component:g(cN,{continuous:i,helpers:s,index:l,isLastStep:l+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(l),isPositioned:p.isFixed||Go(m),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:g(tN,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(l))}}]),n}(I.Component),hS=function(e){Jr(n,e);var t=Vr(n);function n(r){var o;return Ln(this,n),o=t.call(this,r),V(Pe(o),"initStore",function(){var i=o.props,a=i.debug,s=i.getHelpers,l=i.run,u=i.stepIndex;o.store=new YI(W(W({},o.props),{},{controlled:l&&P.number(u)})),o.helpers=o.store.getHelpers();var c=o.store.addListener;return jr({title:"init",data:[{key:"props",value:o.props},{key:"state",value:o.state}],debug:a}),c(o.syncState),s(o.helpers),o.store.getState()}),V(Pe(o),"callback",function(i){var a=o.props.callback;P.function(a)&&a(i)}),V(Pe(o),"handleKeyboard",function(i){var a=o.state,s=a.index,l=a.lifecycle,u=o.props.steps,c=u[s],f=window.Event?i.which:i.keyCode;l===ee.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&o.store.close()}),V(Pe(o),"syncState",function(i){o.setState(i)}),V(Pe(o),"setPopper",function(i,a){a==="wrapper"?o.beaconPopper=i:o.tooltipPopper=i}),V(Pe(o),"shouldScroll",function(i,a,s,l,u,c,f){return!i&&(a!==0||s||l===ee.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!Go(c))&&f.lifecycle!==l&&[ee.BEACON,ee.TOOLTIP].indexOf(l)!==-1}),o.state=o.initStore(),o}return Mn(n,[{key:"componentDidMount",value:function(){if(!!Cn){var o=this.props,i=o.disableCloseOnEsc,a=o.debug,s=o.run,l=o.steps,u=this.store.start;Dg(l,a)&&s&&u(),i||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(o,i){if(!!Cn){var a=this.state,s=a.action,l=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,m=d.run,y=d.stepIndex,h=d.steps,v=o.steps,w=o.stepIndex,S=this.store,A=S.reset,T=S.setSteps,C=S.start,O=S.stop,b=S.update,E=Gl(o,this.props),x=E.changed,_=Gl(i,this.state),k=_.changed,D=_.changedFrom,B=Pi(h[u],this.props),q=!ld(v,h),H=P.number(y)&&x("stepIndex"),ce=or(B==null?void 0:B.target);if(q&&(Dg(h,p)?T(h):console.warn("Steps are not valid",h)),x("run")&&(m?C(y):O()),H){var he=w=0?C:0,l===re.RUNNING&&QI(C,T,y)}}}},{key:"render",value:function(){if(!Cn)return null;var o=this.state,i=o.index,a=o.status,s=this.props,l=s.continuous,u=s.debug,c=s.nonce,f=s.scrollToFirstStep,d=s.steps,p=Pi(d[i],this.props),m;return a===re.RUNNING&&p&&(m=g(dN,$(F({},this.state),{callback:this.callback,continuous:l,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(i!==0||f),step:p,update:this.store.update}))),g("div",{className:"react-joyride",children:m})}}]),n}(I.Component);V(hS,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const pN=N("div",{children:[g("p",{children:"You can see how the changes impact your app with the app preview."}),g("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),g("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),hN=N("div",{children:[g("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),g("p",{children:"You can click on elements to select them or drag them around to move them."}),g("p",{children:"Cards can be resized by dragging resize handles on the sides."}),g("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),g("p",{children:g("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),mN=N("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",g("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",g("span",{className:zf.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),vN=N("div",{children:[g("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),g("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),gN=[{target:".app-view",content:hN,disableBeacon:!0},{target:".elements-panel",content:mN,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:vN,placement:"left-start"},{target:".app-preview",content:pN,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function yN(){const[e,t]=j.exports.useState(0),[n,r]=j.exports.useState(!1),o=j.exports.useCallback(a=>{const{action:s,index:l,status:u,type:c}=a;console.log({action:s,index:l,status:u,type:c}),(c===it.STEP_AFTER||c===it.TARGET_NOT_FOUND)&&(s===oe.NEXT?t(l+1):s===oe.PREV?t(l-1):s===oe.CLOSE&&r(!1)),c===it.TOUR_END&&(s===oe.NEXT&&(r(!1),t(0)),s===oe.SKIP&&r(!1))},[]),i=j.exports.useCallback(()=>{r(!0)},[]);return N(Me,{children:[N(wt,{onClick:i,title:"Take a guided tour of app",variant:"transparent",children:[g(CA,{id:"tour",size:"24px"}),"Tour App"]}),g(hS,{callback:o,steps:gN,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:SN})]})}const Rg="#e07189",wN="#f6d5dc",SN={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:Rg},beaconOuter:{backgroundColor:wN,border:`2px solid ${Rg}`}},bN="_container_1ehu8_1",EN="_elementsPanel_1ehu8_28",CN="_propertiesPanel_1ehu8_33",AN="_editorHolder_1ehu8_47",xN="_titledPanel_1ehu8_59",ON="_panelTitleHeader_1ehu8_71",_N="_header_1ehu8_80",PN="_rightSide_1ehu8_88",kN="_divider_1ehu8_109",TN="_title_1ehu8_59",IN="_shinyLogo_1ehu8_120",pt={container:bN,elementsPanel:EN,propertiesPanel:CN,editorHolder:AN,titledPanel:xN,panelTitleHeader:ON,header:_N,rightSide:PN,divider:kN,title:TN,shinyLogo:IN},NN="_container_1fh41_1",DN="_node_1fh41_12",Lg={container:NN,node:DN};function RN({tree:e,path:t,onSelect:n}){const r=t.length;let o=[];for(let i=0;i<=r;i++){const a=rr(e,t.slice(0,i));if(a===void 0)return null;o.push(en[a.uiName].title)}return g("div",{className:Lg.container,children:o.map((i,a)=>g("div",{className:Lg.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:LN(i)},i+a))})}function LN(e){return e.replace(/[a-z]+::/,"")}const MN="_settingsPanel_zsgzt_1",FN="_currentElementAbout_zsgzt_10",UN="_settingsForm_zsgzt_17",BN="_settingsInputs_zsgzt_24",jN="_buttonsHolder_zsgzt_28",WN="_validationErrorMsg_zsgzt_45",ki={settingsPanel:MN,currentElementAbout:FN,settingsForm:UN,settingsInputs:BN,buttonsHolder:jN,validationErrorMsg:WN};function YN(e){const t=vr(),[n,r]=v1(),[o,i]=j.exports.useState(n!==null?rr(e,n):null),a=j.exports.useRef(!1),s=j.exports.useMemo(()=>Fp(u=>{!n||!a.current||t(Sw({path:n,node:u}))},250),[t,n]);return j.exports.useEffect(()=>{if(a.current=!1,n===null){i(null);return}rr(e,n)!==void 0&&i(rr(e,n))},[e,n]),j.exports.useEffect(()=>{!o||s(o)},[o,s]),{currentNode:o,updateArgumentsByName:({name:u,value:c})=>{i(f=>$(F({},f),{uiArguments:$(F({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function zN({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:o}=YN(e);if(r===null)return g("div",{children:"Select an element to edit properties"});if(t===null)return N("div",{children:["Error finding requested node at path ",r.join(".")]});const i=r.length===0,{uiName:a,uiArguments:s}=t,l=en[a].SettingsComponent;return N("div",{className:ki.settingsPanel+" properties-panel",children:[g("div",{className:ki.currentElementAbout,children:g(RN,{tree:e,path:r,onSelect:o})}),g("form",{className:ki.settingsForm,onSubmit:GN,children:g("div",{className:ki.settingsInputs,children:g(r2,{onChange:n,children:g(l,{settings:s})})})}),g("div",{className:ki.buttonsHolder,children:i?null:g(m1,{path:r})})]})}function GN(e){e.preventDefault()}function $N(e){return["INITIAL-DATA"].includes(e.path)}function HN(){const e=vr(),t=Va(r=>r.uiTree),n=j.exports.useCallback(r=>{e(Ok({initialState:r}))},[e]);return{tree:t,setTree:n}}function JN(){const{tree:e,setTree:t}=HN(),{status:n,ws:r}=Ow(),[o,i]=j.exports.useState("loading"),a=j.exports.useRef(null),s=Va(l=>l.uiTree);return j.exports.useEffect(()=>{n==="connected"&&(_w(r,l=>{!$N(l)||(a.current=l.payload,t(l.payload),i("connected"))}),ia(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(i("no-backend"),t(VN),console.log("Running in static mode"))},[t,n,r]),j.exports.useEffect(()=>{s===Zp||s===a.current||n==="connected"&&ia(r,{path:"STATE-UPDATE",payload:s})},[s,n,r]),{status:o,tree:e}}const VN={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},mS=236,QN={"--properties-panel-width":`${mS}px`};function XN(){const{status:e,tree:t}=JN();return e==="loading"?g(KN,{}):N(LA,{children:[N("div",{className:pt.container,style:QN,children:[N("div",{className:pt.header,children:[g(_T,{className:pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),g("h1",{className:pt.title,children:"Shiny UI Editor"}),N("div",{className:pt.rightSide,children:[g(yN,{}),g("div",{className:pt.divider}),g(DT,{})]})]}),N("div",{className:`${pt.elementsPanel} ${pt.titledPanel} elements-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Elements"}),g(BT,{})]}),g("div",{className:pt.editorHolder+" app-view",children:g(Ep,F({},t))}),N("div",{className:`${pt.propertiesPanel}`,children:[N("div",{className:`${pt.titledPanel} properties-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Properties"}),g(zN,{tree:t})]}),g("div",{className:`${pt.titledPanel} app-preview`,children:g(ET,{})})]})]}),g(qN,{})]})}function KN(){return g("h3",{children:"Loading initial state from server"})}function qN(){return Va(t=>t.connectedToServer)?null:g(X1,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:g("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const ZN=()=>g(Ik,{children:g(Mk,{children:g(XN,{})})}),e5="modulepreload",t5=function(e,t){return new URL(e,t).href},Mg={},n5=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(o=>{if(o=t5(o,r),o in Mg)return;Mg[o]=!0;const i=o.endsWith(".css"),a=i?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${o}"]${a}`))return;const s=document.createElement("link");if(s.rel=i?"stylesheet":e5,i||(s.as="script",s.crossOrigin=""),s.href=o,document.head.appendChild(s),i)return new Promise((l,u)=>{s.addEventListener("load",l),s.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${o}`)))})})).then(()=>t())},r5=e=>{e&&e instanceof Function&&n5(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:o,getTTFB:i})=>{t(e),n(e),r(e),o(e),i(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function o5(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}nr.render(g(j.exports.StrictMode,{children:g(ZN,{})}),document.getElementById("root"));o5();r5(); diff --git a/docs/articles/demo-app/assets/index.75aefe8b.js b/docs/articles/demo-app/assets/index.75aefe8b.js deleted file mode 100644 index aa3c5c2e2..000000000 --- a/docs/articles/demo-app/assets/index.75aefe8b.js +++ /dev/null @@ -1,171 +0,0 @@ -var AE=Object.defineProperty,kE=Object.defineProperties;var OE=Object.getOwnPropertyDescriptors;var ms=Object.getOwnPropertySymbols;var ng=Object.prototype.hasOwnProperty,rg=Object.prototype.propertyIsEnumerable;var ig=Math.pow,tg=(e,t,n)=>t in e?AE(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,U=(e,t)=>{for(var n in t||(t={}))ng.call(t,n)&&tg(e,n,t[n]);if(ms)for(var n of ms(t))rg.call(t,n)&&tg(e,n,t[n]);return e},Q=(e,t)=>kE(e,OE(t));var vn=(e,t)=>{var n={};for(var r in e)ng.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&ms)for(var r of ms(e))t.indexOf(r)<0&&rg.call(e,r)&&(n[r]=e[r]);return n};var og=(e,t,n)=>new Promise((r,i)=>{var o=s=>{try{l(n.next(s))}catch(u){i(u)}},a=s=>{try{l(n.throw(s))}catch(u){i(u)}},l=s=>s.done?r(s.value):Promise.resolve(s.value).then(o,a);l((n=n.apply(e,t)).next())});const PE=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const i of document.querySelectorAll('link[rel="modulepreload"]'))r(i);new MutationObserver(i=>{for(const o of i)if(o.type==="childList")for(const a of o.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(i){const o={};return i.integrity&&(o.integrity=i.integrity),i.referrerpolicy&&(o.referrerPolicy=i.referrerpolicy),i.crossorigin==="use-credentials"?o.credentials="include":i.crossorigin==="anonymous"?o.credentials="omit":o.credentials="same-origin",o}function r(i){if(i.ep)return;i.ep=!0;const o=n(i);fetch(i.href,o)}};PE();var c0=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Qp(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function f0(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var i=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,i.get?i:{enumerable:!0,get:function(){return e[r]}})}),n}var H={exports:{}},we={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var ag=Object.getOwnPropertySymbols,IE=Object.prototype.hasOwnProperty,TE=Object.prototype.propertyIsEnumerable;function _E(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function NE(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(o){return t[o]});if(r.join("")!=="0123456789")return!1;var i={};return"abcdefghijklmnopqrst".split("").forEach(function(o){i[o]=o}),Object.keys(Object.assign({},i)).join("")==="abcdefghijklmnopqrst"}catch(o){return!1}}var d0=NE()?Object.assign:function(e,t){for(var n,r=_E(e),i,o=1;o=y},i=function(){},e.unstable_forceFrameRate=function(x){0>x||125>>1,pe=x[fe];if(pe!==void 0&&0E(be,X))We!==void 0&&0>E(We,be)?(x[fe]=We,x[Ee]=X,fe=Ee):(x[fe]=be,x[he]=X,fe=he);else if(We!==void 0&&0>E(We,X))x[fe]=We,x[Ee]=X,fe=Ee;else break e}}return A}return null}function E(x,A){var X=x.sortIndex-A.sortIndex;return X!==0?X:x.id-A.id}var C=[],P=[],I=1,T=null,N=3,B=!1,K=!1,V=!1;function le(x){for(var A=w(P);A!==null;){if(A.callback===null)O(P);else if(A.startTime<=x)O(P),A.sortIndex=A.expirationTime,_(C,A);else break;A=w(P)}}function te(x){if(V=!1,le(x),!K)if(w(C)!==null)K=!0,t(se);else{var A=w(P);A!==null&&n(te,A.startTime-x)}}function se(x,A){K=!1,V&&(V=!1,r()),B=!0;var X=N;try{for(le(A),T=w(C);T!==null&&(!(T.expirationTime>A)||x&&!e.unstable_shouldYield());){var fe=T.callback;if(typeof fe=="function"){T.callback=null,N=T.priorityLevel;var pe=fe(T.expirationTime<=A);A=e.unstable_now(),typeof pe=="function"?T.callback=pe:T===w(C)&&O(C),le(A)}else O(C);T=w(C)}if(T!==null)var he=!0;else{var be=w(P);be!==null&&n(te,be.startTime-A),he=!1}return he}finally{T=null,N=X,B=!1}}var q=i;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(x){x.callback=null},e.unstable_continueExecution=function(){K||B||(K=!0,t(se))},e.unstable_getCurrentPriorityLevel=function(){return N},e.unstable_getFirstCallbackNode=function(){return w(C)},e.unstable_next=function(x){switch(N){case 1:case 2:case 3:var A=3;break;default:A=N}var X=N;N=A;try{return x()}finally{N=X}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=q,e.unstable_runWithPriority=function(x,A){switch(x){case 1:case 2:case 3:case 4:case 5:break;default:x=3}var X=N;N=x;try{return A()}finally{N=X}},e.unstable_scheduleCallback=function(x,A,X){var fe=e.unstable_now();switch(typeof X=="object"&&X!==null?(X=X.delay,X=typeof X=="number"&&0fe?(x.sortIndex=X,_(P,x),w(C)===null&&x===w(P)&&(V?r():V=!0,n(te,X-fe))):(x.sortIndex=pe,_(C,x),K||B||(K=!0,t(se))),x},e.unstable_wrapCallback=function(x){var A=N;return function(){var X=N;N=A;try{return x.apply(this,arguments)}finally{N=X}}}})(O0);(function(e){e.exports=O0})(k0);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var oc=H.exports,Be=d0,nt=k0.exports;function j(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function xt(e,t,n,r,i,o,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=i,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=o,this.removeEmptyString=a}var ut={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){ut[e]=new xt(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];ut[t]=new xt(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){ut[e]=new xt(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){ut[e]=new xt(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){ut[e]=new xt(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){ut[e]=new xt(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){ut[e]=new xt(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){ut[e]=new xt(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){ut[e]=new xt(e,5,!1,e.toLowerCase(),null,!1,!1)});var th=/[\-:]([a-z])/g;function nh(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(th,nh);ut[t]=new xt(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(th,nh);ut[t]=new xt(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(th,nh);ut[t]=new xt(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){ut[e]=new xt(e,1,!1,e.toLowerCase(),null,!1,!1)});ut.xlinkHref=new xt("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){ut[e]=new xt(e,1,!1,e.toLowerCase(),null,!0,!0)});function rh(e,t,n,r){var i=ut.hasOwnProperty(t)?ut[t]:null,o=i!==null?i.type===0:r?!1:!(!(2l||i[a]!==o[l])return` -`+i[a].replace(" at new "," at ");while(1<=a&&0<=l);break}}}finally{cf=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Aa(e):""}function WE(e){switch(e.tag){case 5:return Aa(e.type);case 16:return Aa("Lazy");case 13:return Aa("Suspense");case 19:return Aa("SuspenseList");case 0:case 2:case 15:return e=vs(e.type,!1),e;case 11:return e=vs(e.type.render,!1),e;case 22:return e=vs(e.type._render,!1),e;case 1:return e=vs(e.type,!0),e;default:return""}}function Qi(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case vr:return"Fragment";case si:return"Portal";case Fa:return"Profiler";case ih:return"StrictMode";case La:return"Suspense";case cu:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case ah:return(e.displayName||"Context")+".Consumer";case oh:return(e._context.displayName||"Context")+".Provider";case ac:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case lc:return Qi(e.type);case sh:return Qi(e._render);case lh:t=e._payload,e=e._init;try{return Qi(e(t))}catch(n){}}return null}function Mr(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function T0(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function YE(e){var t=T0(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var i=n.get,o=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return i.call(this)},set:function(a){r=""+a,o.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function ys(e){e._valueTracker||(e._valueTracker=YE(e))}function _0(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=T0(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function fu(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function wd(e,t){var n=t.checked;return Be({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function pg(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=Mr(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function N0(e,t){t=t.checked,t!=null&&rh(e,"checked",t,!1)}function bd(e,t){N0(e,t);var n=Mr(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Sd(e,t.type,n):t.hasOwnProperty("defaultValue")&&Sd(e,t.type,Mr(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function hg(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Sd(e,t,n){(t!=="number"||fu(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function HE(e){var t="";return oc.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function xd(e,t){return e=Be({children:void 0},t),(t=HE(t.children))&&(e.children=t),e}function Xi(e,t,n,r){if(e=e.options,t){t={};for(var i=0;i=n.length))throw Error(j(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:Mr(n)}}function D0(e,t){var n=Mr(t.value),r=Mr(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function gg(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Cd={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function R0(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Ad(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?R0(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ws,F0=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,i){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,i)})}:e}(function(e,t){if(e.namespaceURI!==Cd.svg||"innerHTML"in e)e.innerHTML=t;else{for(ws=ws||document.createElement("div"),ws.innerHTML=""+t.valueOf().toString()+"",t=ws.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function il(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Ma={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},$E=["Webkit","ms","Moz","O"];Object.keys(Ma).forEach(function(e){$E.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Ma[t]=Ma[e]})});function L0(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Ma.hasOwnProperty(e)&&Ma[e]?(""+t).trim():t+"px"}function M0(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,i=L0(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,i):e[n]=i}}var VE=Be({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function kd(e,t){if(t){if(VE[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(j(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(j(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(j(61))}if(t.style!=null&&typeof t.style!="object")throw Error(j(62))}}function Od(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function fh(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Pd=null,qi=null,Ki=null;function vg(e){if(e=Tl(e)){if(typeof Pd!="function")throw Error(j(280));var t=e.stateNode;t&&(t=pc(t),Pd(e.stateNode,e.type,t))}}function B0(e){qi?Ki?Ki.push(e):Ki=[e]:qi=e}function U0(){if(qi){var e=qi,t=Ki;if(Ki=qi=null,vg(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function uc(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-Br(t),e[t]=n}var Br=Math.clz32?Math.clz32:sC,aC=Math.log,lC=Math.LN2;function sC(e){return e===0?32:31-(aC(e)/lC|0)|0}var uC=nt.unstable_UserBlockingPriority,cC=nt.unstable_runWithPriority,Ws=!0;function fC(e,t,n,r){ui||ph();var i=yh,o=ui;ui=!0;try{z0(i,e,t,n,r)}finally{(ui=o)||hh()}}function dC(e,t,n,r){cC(uC,yh.bind(null,e,t,n,r))}function yh(e,t,n,r){if(Ws){var i;if((i=(t&4)===0)&&0=Ua),Og=String.fromCharCode(32),Pg=!1;function rw(e,t){switch(e){case"keyup":return FC.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function iw(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var Wi=!1;function MC(e,t){switch(e){case"compositionend":return iw(t);case"keypress":return t.which!==32?null:(Pg=!0,Og);case"textInput":return e=t.data,e===Og&&Pg?null:e;default:return null}}function BC(e,t){if(Wi)return e==="compositionend"||!Eh&&rw(e,t)?(e=tw(),Ys=bh=Sr=null,Wi=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Ng(n)}}function sw(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?sw(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Rg(){for(var e=window,t=fu();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=fu(e.document)}return t}function Dd(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var JC=ur&&"documentMode"in document&&11>=document.documentMode,Yi=null,Rd=null,ja=null,Fd=!1;function Fg(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;Fd||Yi==null||Yi!==fu(r)||(r=Yi,"selectionStart"in r&&Dd(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),ja&&cl(ja,r)||(ja=r,r=mu(Rd,"onSelect"),0$i||(e.current=Md[$i],Md[$i]=null,$i--)}function Ve(e,t){$i++,Md[$i]=e.current,e.current=t}var Ur={},vt=Vr(Ur),Dt=Vr(!1),gi=Ur;function mo(e,t){var n=e.type.contextTypes;if(!n)return Ur;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var i={},o;for(o in n)i[o]=t[o];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=i),i}function Rt(e){return e=e.childContextTypes,e!=null}function yu(){De(Dt),De(vt)}function Hg(e,t,n){if(vt.current!==Ur)throw Error(j(168));Ve(vt,t),Ve(Dt,n)}function gw(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var i in r)if(!(i in e))throw Error(j(108,Qi(t)||"Unknown",i));return Be({},n,r)}function $s(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||Ur,gi=vt.current,Ve(vt,e),Ve(Dt,Dt.current),!0}function $g(e,t,n){var r=e.stateNode;if(!r)throw Error(j(169));n?(e=gw(e,t,gi),r.__reactInternalMemoizedMergedChildContext=e,De(Dt),De(vt),Ve(vt,e)):De(Dt),Ve(Dt,n)}var Ah=null,pi=null,qC=nt.unstable_runWithPriority,kh=nt.unstable_scheduleCallback,Bd=nt.unstable_cancelCallback,KC=nt.unstable_shouldYield,Vg=nt.unstable_requestPaint,Ud=nt.unstable_now,ZC=nt.unstable_getCurrentPriorityLevel,hc=nt.unstable_ImmediatePriority,vw=nt.unstable_UserBlockingPriority,yw=nt.unstable_NormalPriority,ww=nt.unstable_LowPriority,bw=nt.unstable_IdlePriority,Ef={},eA=Vg!==void 0?Vg:function(){},Zn=null,Vs=null,Cf=!1,Gg=Ud(),mt=1e4>Gg?Ud:function(){return Ud()-Gg};function go(){switch(ZC()){case hc:return 99;case vw:return 98;case yw:return 97;case ww:return 96;case bw:return 95;default:throw Error(j(332))}}function Sw(e){switch(e){case 99:return hc;case 98:return vw;case 97:return yw;case 96:return ww;case 95:return bw;default:throw Error(j(332))}}function vi(e,t){return e=Sw(e),qC(e,t)}function dl(e,t,n){return e=Sw(e),kh(e,t,n)}function Qn(){if(Vs!==null){var e=Vs;Vs=null,Bd(e)}xw()}function xw(){if(!Cf&&Zn!==null){Cf=!0;var e=0;try{var t=Zn;vi(99,function(){for(;eO?(E=w,w=null):E=w.sibling;var C=d(v,w,y[O],S);if(C===null){w===null&&(w=E);break}e&&w&&C.alternate===null&&t(v,w),m=o(C,m,O),_===null?k=C:_.sibling=C,_=C,w=E}if(O===y.length)return n(v,w),k;if(w===null){for(;OO?(E=w,w=null):E=w.sibling;var P=d(v,w,C.value,S);if(P===null){w===null&&(w=E);break}e&&w&&P.alternate===null&&t(v,w),m=o(P,m,O),_===null?k=P:_.sibling=P,_=P,w=E}if(C.done)return n(v,w),k;if(w===null){for(;!C.done;O++,C=y.next())C=f(v,C.value,S),C!==null&&(m=o(C,m,O),_===null?k=C:_.sibling=C,_=C);return k}for(w=r(v,w);!C.done;O++,C=y.next())C=p(w,v,O,C.value,S),C!==null&&(e&&C.alternate!==null&&w.delete(C.key===null?O:C.key),m=o(C,m,O),_===null?k=C:_.sibling=C,_=C);return e&&w.forEach(function(I){return t(v,I)}),k}return function(v,m,y,S){var k=typeof y=="object"&&y!==null&&y.type===vr&&y.key===null;k&&(y=y.props.children);var _=typeof y=="object"&&y!==null;if(_)switch(y.$$typeof){case Ca:e:{for(_=y.key,k=m;k!==null;){if(k.key===_){switch(k.tag){case 7:if(y.type===vr){n(v,k.sibling),m=i(k,y.props.children),m.return=v,v=m;break e}break;default:if(k.elementType===y.type){n(v,k.sibling),m=i(k,y.props),m.ref=ra(v,k,y),m.return=v,v=m;break e}}n(v,k);break}else t(v,k);k=k.sibling}y.type===vr?(m=io(y.props.children,v.mode,S,y.key),m.return=v,v=m):(S=Xs(y.type,y.key,y.props,null,v.mode,S),S.ref=ra(v,m,y),S.return=v,v=S)}return a(v);case si:e:{for(k=y.key;m!==null;){if(m.key===k)if(m.tag===4&&m.stateNode.containerInfo===y.containerInfo&&m.stateNode.implementation===y.implementation){n(v,m.sibling),m=i(m,y.children||[]),m.return=v,v=m;break e}else{n(v,m);break}else t(v,m);m=m.sibling}m=Tf(y,v.mode,S),m.return=v,v=m}return a(v)}if(typeof y=="string"||typeof y=="number")return y=""+y,m!==null&&m.tag===6?(n(v,m.sibling),m=i(m,y),m.return=v,v=m):(n(v,m),m=If(y,v.mode,S),m.return=v,v=m),a(v);if(xs(y))return h(v,m,y,S);if(qo(y))return g(v,m,y,S);if(_&&Es(v,y),typeof y=="undefined"&&!k)switch(v.tag){case 1:case 22:case 0:case 11:case 15:throw Error(j(152,Qi(v.type)||"Component"))}return n(v,m)}}var Eu=Ow(!0),Pw=Ow(!1),_l={},Un=Vr(_l),hl=Vr(_l),ml=Vr(_l);function fi(e){if(e===_l)throw Error(j(174));return e}function jd(e,t){switch(Ve(ml,t),Ve(hl,e),Ve(Un,_l),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Ad(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Ad(t,e)}De(Un),Ve(Un,t)}function vo(){De(Un),De(hl),De(ml)}function Kg(e){fi(ml.current);var t=fi(Un.current),n=Ad(t,e.type);t!==n&&(Ve(hl,e),Ve(Un,n))}function Th(e){hl.current===e&&(De(Un),De(hl))}var $e=Vr(0);function Cu(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var nr=null,Er=null,zn=!1;function Iw(e,t){var n=en(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function Zg(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function Wd(e){if(zn){var t=Er;if(t){var n=t;if(!Zg(e,t)){if(t=Zi(n.nextSibling),!t||!Zg(e,t)){e.flags=e.flags&-1025|2,zn=!1,nr=e;return}Iw(nr,n)}nr=e,Er=Zi(t.firstChild)}else e.flags=e.flags&-1025|2,zn=!1,nr=e}}function ev(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;nr=e}function Cs(e){if(e!==nr)return!1;if(!zn)return ev(e),zn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!Ld(t,e.memoizedProps))for(t=Er;t;)Iw(e,t),t=Zi(t.nextSibling);if(ev(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(j(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){Er=Zi(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}Er=null}}else Er=nr?Zi(e.stateNode.nextSibling):null;return!0}function Af(){Er=nr=null,zn=!1}var to=[];function _h(){for(var e=0;eo))throw Error(j(301));o+=1,lt=dt=null,t.updateQueue=null,Wa.current=oA,e=n(r,i)}while(Ya)}if(Wa.current=Iu,t=dt!==null&&dt.next!==null,gl=0,lt=dt=Je=null,Au=!1,t)throw Error(j(300));return e}function di(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return lt===null?Je.memoizedState=lt=e:lt=lt.next=e,lt}function ki(){if(dt===null){var e=Je.alternate;e=e!==null?e.memoizedState:null}else e=dt.next;var t=lt===null?Je.memoizedState:lt.next;if(t!==null)lt=t,dt=e;else{if(e===null)throw Error(j(310));dt=e,e={memoizedState:dt.memoizedState,baseState:dt.baseState,baseQueue:dt.baseQueue,queue:dt.queue,next:null},lt===null?Je.memoizedState=lt=e:lt=lt.next=e}return lt}function Ln(e,t){return typeof t=="function"?t(e):t}function ia(e){var t=ki(),n=t.queue;if(n===null)throw Error(j(311));n.lastRenderedReducer=e;var r=dt,i=r.baseQueue,o=n.pending;if(o!==null){if(i!==null){var a=i.next;i.next=o.next,o.next=a}r.baseQueue=i=o,n.pending=null}if(i!==null){i=i.next,r=r.baseState;var l=a=o=null,s=i;do{var u=s.lane;if((gl&u)===u)l!==null&&(l=l.next={lane:0,action:s.action,eagerReducer:s.eagerReducer,eagerState:s.eagerState,next:null}),r=s.eagerReducer===e?s.eagerState:e(r,s.action);else{var c={lane:u,action:s.action,eagerReducer:s.eagerReducer,eagerState:s.eagerState,next:null};l===null?(a=l=c,o=r):l=l.next=c,Je.lanes|=u,Nl|=u}s=s.next}while(s!==null&&s!==i);l===null?o=r:l.next=a,Zt(r,t.memoizedState)||(An=!0),t.memoizedState=r,t.baseState=o,t.baseQueue=l,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function oa(e){var t=ki(),n=t.queue;if(n===null)throw Error(j(311));n.lastRenderedReducer=e;var r=n.dispatch,i=n.pending,o=t.memoizedState;if(i!==null){n.pending=null;var a=i=i.next;do o=e(o,a.action),a=a.next;while(a!==i);Zt(o,t.memoizedState)||(An=!0),t.memoizedState=o,t.baseQueue===null&&(t.baseState=o),n.lastRenderedState=o}return[o,r]}function tv(e,t,n){var r=t._getVersion;r=r(t._source);var i=t._workInProgressVersionPrimary;if(i!==null?e=i===r:(e=e.mutableReadLanes,(e=(gl&e)===e)&&(t._workInProgressVersionPrimary=r,to.push(t))),e)return n(t._source);throw to.push(t),Error(j(350))}function Tw(e,t,n,r){var i=St;if(i===null)throw Error(j(349));var o=t._getVersion,a=o(t._source),l=Wa.current,s=l.useState(function(){return tv(i,t,n)}),u=s[1],c=s[0];s=lt;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,h=f.source;f=f.subscribe;var g=Je;return e.memoizedState={refs:d,source:t,subscribe:r},l.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var v=o(t._source);if(!Zt(a,v)){v=n(t._source),Zt(c,v)||(u(v),v=_r(g),i.mutableReadLanes|=v&i.pendingLanes),v=i.mutableReadLanes,i.entangledLanes|=v;for(var m=i.entanglements,y=v;0n?98:n,function(){e(!0)}),vi(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[xr]=t,e[vu]=r,Uw(e,t,!1,!1),t.stateNode=e,a=Od(n,r),n){case"dialog":_e("cancel",e),_e("close",e),i=r;break;case"iframe":case"object":case"embed":_e("load",e),i=r;break;case"video":case"audio":for(i=0;iKd&&(t.flags|=64,o=!0,la(r,!1),t.lanes=33554432)}else{if(!o)if(e=Cu(a),e!==null){if(t.flags|=64,o=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),la(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!zn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*mt()-r.renderingStartTime>Kd&&n!==1073741824&&(t.flags|=64,o=!0,la(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=mt(),n.sibling=null,t=$e.current,Ve($e,o?t&1|2:t&1),n):null;case 23:case 24:return jh(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(j(156,t.tag))}function sA(e){switch(e.tag){case 1:Rt(e.type)&&yu();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(vo(),De(Dt),De(vt),_h(),t=e.flags,(t&64)!==0)throw Error(j(285));return e.flags=t&-4097|64,e;case 5:return Th(e),null;case 13:return De($e),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return De($e),null;case 4:return vo(),null;case 10:return Ph(e),null;case 23:case 24:return jh(),null;default:return null}}function Mh(e,t){try{var n="",r=t;do n+=WE(r),r=r.return;while(r);var i=n}catch(o){i=` -Error generating stack: `+o.message+` -`+o.stack}return{value:e,source:t,stack:i}}function Gd(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var uA=typeof WeakMap=="function"?WeakMap:Map;function Ww(e,t,n){n=Ir(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){_u||(_u=!0,Zd=r),Gd(e,t)},n}function Yw(e,t,n){n=Ir(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var i=t.value;n.payload=function(){return Gd(e,t),r(i)}}var o=e.stateNode;return o!==null&&typeof o.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(Mn===null?Mn=new Set([this]):Mn.add(this),Gd(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var cA=typeof WeakSet=="function"?WeakSet:Set;function hv(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){Dr(e,n)}else t.current=null}function fA(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Sn(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ch(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(j(163))}function dA(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var i=e;r=i.next,i=i.tag,(i&4)!==0&&(i&1)!==0&&(Kw(n,e),bA(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Sn(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&Qg(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}Qg(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&hw(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&G0(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(j(163))}function mv(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var i=n.memoizedProps.style;i=i!=null&&i.hasOwnProperty("display")?i.display:null,r.style.display=L0("display",i)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function gv(e,t){if(pi&&typeof pi.onCommitFiberUnmount=="function")try{pi.onCommitFiberUnmount(Ah,t)}catch(o){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,i=r.destroy;if(r=r.tag,i!==void 0)if((r&4)!==0)Kw(t,n);else{r=t;try{i()}catch(o){Dr(r,o)}}n=n.next}while(n!==e)}break;case 1:if(hv(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(o){Dr(t,o)}break;case 5:hv(t);break;case 4:Hw(e,t)}}function vv(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function yv(e){return e.tag===5||e.tag===3||e.tag===4}function wv(e){e:{for(var t=e.return;t!==null;){if(yv(t))break e;t=t.return}throw Error(j(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(j(161))}n.flags&16&&(il(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||yv(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Jd(e,n,t):Qd(e,n,t)}function Jd(e,t,n){var r=e.tag,i=r===5||r===6;if(i)e=i?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=gu));else if(r!==4&&(e=e.child,e!==null))for(Jd(e,t,n),e=e.sibling;e!==null;)Jd(e,t,n),e=e.sibling}function Qd(e,t,n){var r=e.tag,i=r===5||r===6;if(i)e=i?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(Qd(e,t,n),e=e.sibling;e!==null;)Qd(e,t,n),e=e.sibling}function Hw(e,t){for(var n=t,r=!1,i,o;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(j(160));switch(i=r.stateNode,r.tag){case 5:o=!1;break e;case 3:i=i.containerInfo,o=!0;break e;case 4:i=i.containerInfo,o=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,l=n,s=l;;)if(gv(a,s),s.child!==null&&s.tag!==4)s.child.return=s,s=s.child;else{if(s===l)break e;for(;s.sibling===null;){if(s.return===null||s.return===l)break e;s=s.return}s.sibling.return=s.return,s=s.sibling}o?(a=i,l=n.stateNode,a.nodeType===8?a.parentNode.removeChild(l):a.removeChild(l)):i.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){i=n.stateNode.containerInfo,o=!0,n.child.return=n,n=n.child;continue}}else if(gv(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function Pf(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var i=e!==null?e.memoizedProps:r;e=t.type;var o=t.updateQueue;if(t.updateQueue=null,o!==null){for(n[vu]=r,e==="input"&&r.type==="radio"&&r.name!=null&&N0(n,r),Od(e,i),t=Od(e,r),i=0;ii&&(i=a),n&=~o}if(n=i,n=mt()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*hA(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}st!==5&&(st=2),s=Mh(s,l),d=a;do{switch(d.tag){case 3:o=s,d.flags|=4096,t&=-t,d.lanes|=t;var _=Ww(d,o,t);Jg(d,_);break e;case 1:o=s;var w=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof w.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(Mn===null||!Mn.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var E=Yw(d,o,t);Jg(d,E);break e}}d=d.return}while(d!==null)}qw(n)}catch(C){t=C,Ze===n&&n!==null&&(Ze=n=n.return);continue}break}while(1)}function Qw(){var e=Tu.current;return Tu.current=Iu,e===null?Iu:e}function Pa(e,t){var n=ne;ne|=16;var r=Qw();St===e&>===t||ro(e,t);do try{gA();break}catch(i){Jw(e,i)}while(1);if(Oh(),ne=n,Tu.current=r,Ze!==null)throw Error(j(261));return St=null,gt=0,st}function gA(){for(;Ze!==null;)Xw(Ze)}function vA(){for(;Ze!==null&&!KC();)Xw(Ze)}function Xw(e){var t=Zw(e.alternate,e,yi);e.memoizedProps=e.pendingProps,t===null?qw(e):Ze=t,Bh.current=null}function qw(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=lA(n,t,yi),n!==null){Ze=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(yi&1073741824)!==0||(n.mode&4)===0){for(var r=0,i=n.child;i!==null;)r|=i.lanes|i.childLanes,i=i.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(l=a,a=_,_=l),l=Dg(y,_),o=Dg(y,a),l&&o&&(k.rangeCount!==1||k.anchorNode!==l.node||k.anchorOffset!==l.offset||k.focusNode!==o.node||k.focusOffset!==o.offset)&&(S=S.createRange(),S.setStart(l.node,l.offset),k.removeAllRanges(),_>a?(k.addRange(S),k.extend(o.node,o.offset)):(S.setEnd(o.node,o.offset),k.addRange(S)))))),S=[],k=y;k=k.parentNode;)k.nodeType===1&&S.push({element:k,left:k.scrollLeft,top:k.scrollTop});for(typeof y.focus=="function"&&y.focus(),y=0;ymt()-zh?ro(e,0):Uh|=n),ln(e,t)}function EA(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=go()===99?1:2:(tr===0&&(tr=Fo),t=Bi(62914560&~tr),t===0&&(t=4194304))),n=Ht(),e=vc(e,t),e!==null&&(uc(e,t,n),ln(e,n))}var Zw;Zw=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||Dt.current)An=!0;else if((n&r)!==0)An=(e.flags&16384)!==0;else{switch(An=!1,t.tag){case 3:lv(t),Af();break;case 5:Kg(t);break;case 1:Rt(t.type)&&$s(t);break;case 4:jd(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var i=t.type._context;Ve(wu,i._currentValue),i._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?sv(e,t,n):(Ve($e,$e.current&1),t=rr(e,t,n),t!==null?t.sibling:null);Ve($e,$e.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return pv(e,t,n);t.flags|=64}if(i=t.memoizedState,i!==null&&(i.rendering=null,i.tail=null,i.lastEffect=null),Ve($e,$e.current),r)break;return null;case 23:case 24:return t.lanes=0,kf(e,t,n)}return rr(e,t,n)}else An=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=mo(t,vt.current),eo(t,n),i=Dh(null,t,r,e,i,n),t.flags|=1,typeof i=="object"&&i!==null&&typeof i.render=="function"&&i.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,Rt(r)){var o=!0;$s(t)}else o=!1;t.memoizedState=i.state!==null&&i.state!==void 0?i.state:null,Ih(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&xu(t,r,a,e),i.updater=mc,t.stateNode=i,i._reactInternals=t,zd(t,r,e,n),t=$d(null,t,r,!0,o,n)}else t.tag=0,Tt(null,t,i,n),t=t.child;return t;case 16:i=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=i._init,i=o(i._payload),t.type=i,o=t.tag=AA(i),e=Sn(i,e),o){case 0:t=Hd(null,t,i,e,n);break e;case 1:t=av(null,t,i,e,n);break e;case 11:t=iv(null,t,i,e,n);break e;case 14:t=ov(null,t,i,Sn(i.type,e),r,n);break e}throw Error(j(306,i,""))}return t;case 0:return r=t.type,i=t.pendingProps,i=t.elementType===r?i:Sn(r,i),Hd(e,t,r,i,n);case 1:return r=t.type,i=t.pendingProps,i=t.elementType===r?i:Sn(r,i),av(e,t,r,i,n);case 3:if(lv(t),r=t.updateQueue,e===null||r===null)throw Error(j(282));if(r=t.pendingProps,i=t.memoizedState,i=i!==null?i.element:null,Cw(e,t),pl(t,r,null,n),r=t.memoizedState.element,r===i)Af(),t=rr(e,t,n);else{if(i=t.stateNode,(o=i.hydrate)&&(Er=Zi(t.stateNode.containerInfo.firstChild),nr=t,o=zn=!0),o){if(e=i.mutableSourceEagerHydrationData,e!=null)for(i=0;i1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Xh(e)?2:qh(e)?3:0}function oo(e,t){return Bo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function h2(e,t){return Bo(e)===2?e.get(t):e[t]}function vb(e,t,n){var r=Bo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function yb(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Xh(e){return b2&&e instanceof Map}function qh(e){return S2&&e instanceof Set}function ri(e){return e.o||e.t}function Kh(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=bb(e);delete t[Le];for(var n=ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=m2),Object.freeze(e),t&&wi(e,function(n,r){return Zh(r,!0)},!0)),e}function m2(){En(2)}function em(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function ar(e){var t=sp[e];return t||En(18,e),t}function g2(e,t){sp[e]||(sp[e]=t)}function op(){return vl}function Nf(e,t){t&&(ar("Patches"),e.u=[],e.s=[],e.v=t)}function Du(e){ap(e),e.p.forEach(v2),e.p=null}function ap(e){e===vl&&(vl=e.l)}function Av(e){return vl={p:[],l:vl,h:e,m:!0,_:0}}function v2(e){var t=e[Le];t.i===0||t.i===1?t.j():t.O=!0}function Df(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||ar("ES5").S(t,e,r),r?(n[Le].P&&(Du(t),En(4)),Hr(e)&&(e=Ru(t,e),t.l||Fu(t,e)),t.u&&ar("Patches").M(n[Le],e,t.u,t.s)):e=Ru(t,n,[]),Du(t),t.u&&t.v(t.u,t.s),e!==wb?e:void 0}function Ru(e,t,n){if(em(t))return t;var r=t[Le];if(!r)return wi(t,function(o,a){return kv(e,r,t,o,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Fu(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var i=r.i===4||r.i===5?r.o=Kh(r.k):r.o;wi(r.i===3?new Set(i):i,function(o,a){return kv(e,r,i,o,a,n)}),Fu(e,i,!1),n&&e.u&&ar("Patches").R(r,n,e.u,e.s)}return r.o}function kv(e,t,n,r,i,o){if(Yr(i)){var a=Ru(e,i,o&&t&&t.i!==3&&!oo(t.D,r)?o.concat(r):void 0);if(vb(n,r,a),!Yr(a))return;e.m=!1}if(Hr(i)&&!em(i)){if(!e.h.F&&e._<1)return;Ru(e,i),t&&t.A.l||Fu(e,i)}}function Fu(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&Zh(t,n)}function Rf(e,t){var n=e[Le];return(n?ri(n):e)[t]}function Ov(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function yr(e){e.P||(e.P=!0,e.l&&yr(e.l))}function Ff(e){e.o||(e.o=Kh(e.t))}function lp(e,t,n){var r=Xh(t)?ar("MapSet").N(t,n):qh(t)?ar("MapSet").T(t,n):e.g?function(i,o){var a=Array.isArray(i),l={i:a?1:0,A:o?o.A:op(),P:!1,I:!1,D:{},l:o,t:i,k:null,o:null,j:null,C:!1},s=l,u=lo;a&&(s=[l],u=qs);var c=Proxy.revocable(s,u),f=c.revoke,d=c.proxy;return l.k=d,l.j=f,d}(t,n):ar("ES5").J(t,n);return(n?n.A:op()).p.push(r),r}function y2(e){return Yr(e)||En(22,e),function t(n){if(!Hr(n))return n;var r,i=n[Le],o=Bo(n);if(i){if(!i.P&&(i.i<4||!ar("ES5").K(i)))return i.t;i.I=!0,r=Pv(n,o),i.I=!1}else r=Pv(n,o);return wi(r,function(a,l){i&&h2(i.t,a)===l||vb(r,a,t(l))}),o===3?new Set(r):r}(e)}function Pv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Kh(e)}function w2(){function e(o,a){var l=i[o];return l?l.enumerable=a:i[o]=l={configurable:!0,enumerable:a,get:function(){var s=this[Le];return lo.get(s,o)},set:function(s){var u=this[Le];lo.set(u,o,s)}},l}function t(o){for(var a=o.length-1;a>=0;a--){var l=o[a][Le];if(!l.P)switch(l.i){case 5:r(l)&&yr(l);break;case 4:n(l)&&yr(l)}}}function n(o){for(var a=o.t,l=o.k,s=ao(l),u=s.length-1;u>=0;u--){var c=s[u];if(c!==Le){var f=a[c];if(f===void 0&&!oo(a,c))return!0;var d=l[c],p=d&&d[Le];if(p?p.t!==f:!yb(d,f))return!0}}var h=!!a[Le];return s.length!==ao(a).length+(h?0:1)}function r(o){var a=o.k;if(a.length!==o.t.length)return!0;var l=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!l||l.get)}var i={};g2("ES5",{J:function(o,a){var l=Array.isArray(o),s=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?g-1:0),m=1;m1?u-1:0),f=1;f=0;i--){var o=r[i];if(o.path.length===0&&o.op==="replace"){n=o.value;break}}i>-1&&(r=r.slice(i+1));var a=ar("Patches").$;return Yr(n)?a(n,r):this.produce(n,function(l){return a(l,r)})},e}(),$t=new E2,C2=$t.produce;$t.produceWithPatches.bind($t);$t.setAutoFreeze.bind($t);$t.setUseProxies.bind($t);$t.applyPatches.bind($t);$t.createDraft.bind($t);$t.finishDraft.bind($t);const Ks=C2;function A2(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Nv(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Dv(e){for(var t=1;t0&&o[o.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!o||u[1]>o[0]&&u[1]0)for(var S=p.getState(),k=Array.from(n.values()),_=0,w=k;_!1}}),uk=()=>{const e=Jr();return R.useCallback(()=>{e(ck())},[e])},{DISCONNECTED_FROM_SERVER:ck}=Nb.actions,fk=Nb.reducer;function Vl(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(o)),i=Object.keys(t).filter(o=>!n.includes(o));if(!Vl(r,i))return!1;for(let o of r)if(e[o]!==t[o])return!1;return!0}function Db(e,t,n){return n===0?!0:Vl(e.slice(0,n),t.slice(0,n))}function pk(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:Db(e,t,n)}const Rb=nm({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:Fb,RESET_SELECTION:CM,STEP_BACK_SELECTION:hk}=Rb.actions,mk=Rb.reducer;function Cn(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:am(e)?2:lm(e)?3:0}function cp(e,t){return Uo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function gk(e,t){return Uo(e)===2?e.get(t):e[t]}function Lb(e,t,n){var r=Uo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function vk(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function am(e){return Sk&&e instanceof Map}function lm(e){return xk&&e instanceof Set}function ii(e){return e.o||e.t}function sm(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Ck(e);delete t[Vt];for(var n=dm(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=yk),Object.freeze(e),t&&bl(e,function(n,r){return um(r,!0)},!0)),e}function yk(){Cn(2)}function cm(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function jn(e){var t=Ak[e];return t||Cn(18,e),t}function zv(){return Sl}function Mf(e,t){t&&(jn("Patches"),e.u=[],e.s=[],e.v=t)}function Uu(e){fp(e),e.p.forEach(wk),e.p=null}function fp(e){e===Sl&&(Sl=e.l)}function jv(e){return Sl={p:[],l:Sl,h:e,m:!0,_:0}}function wk(e){var t=e[Vt];t.i===0||t.i===1?t.j():t.O=!0}function Bf(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||jn("ES5").S(t,e,r),r?(n[Vt].P&&(Uu(t),Cn(4)),bi(e)&&(e=zu(t,e),t.l||ju(t,e)),t.u&&jn("Patches").M(n[Vt].t,e,t.u,t.s)):e=zu(t,n,[]),Uu(t),t.u&&t.v(t.u,t.s),e!==Mb?e:void 0}function zu(e,t,n){if(cm(t))return t;var r=t[Vt];if(!r)return bl(t,function(o,a){return Wv(e,r,t,o,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return ju(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var i=r.i===4||r.i===5?r.o=sm(r.k):r.o;bl(r.i===3?new Set(i):i,function(o,a){return Wv(e,r,i,o,a,n)}),ju(e,i,!1),n&&e.u&&jn("Patches").R(r,n,e.u,e.s)}return r.o}function Wv(e,t,n,r,i,o){if(wo(i)){var a=zu(e,i,o&&t&&t.i!==3&&!cp(t.D,r)?o.concat(r):void 0);if(Lb(n,r,a),!wo(a))return;e.m=!1}if(bi(i)&&!cm(i)){if(!e.h.F&&e._<1)return;zu(e,i),t&&t.A.l||ju(e,i)}}function ju(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&um(t,n)}function Uf(e,t){var n=e[Vt];return(n?ii(n):e)[t]}function Yv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function dp(e){e.P||(e.P=!0,e.l&&dp(e.l))}function zf(e){e.o||(e.o=sm(e.t))}function pp(e,t,n){var r=am(t)?jn("MapSet").N(t,n):lm(t)?jn("MapSet").T(t,n):e.g?function(i,o){var a=Array.isArray(i),l={i:a?1:0,A:o?o.A:zv(),P:!1,I:!1,D:{},l:o,t:i,k:null,o:null,j:null,C:!1},s=l,u=hp;a&&(s=[l],u=Ia);var c=Proxy.revocable(s,u),f=c.revoke,d=c.proxy;return l.k=d,l.j=f,d}(t,n):jn("ES5").J(t,n);return(n?n.A:zv()).p.push(r),r}function bk(e){return wo(e)||Cn(22,e),function t(n){if(!bi(n))return n;var r,i=n[Vt],o=Uo(n);if(i){if(!i.P&&(i.i<4||!jn("ES5").K(i)))return i.t;i.I=!0,r=Hv(n,o),i.I=!1}else r=Hv(n,o);return bl(r,function(a,l){i&&gk(i.t,a)===l||Lb(r,a,t(l))}),o===3?new Set(r):r}(e)}function Hv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return sm(e)}var $v,Sl,fm=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",Sk=typeof Map!="undefined",xk=typeof Set!="undefined",Vv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",Mb=fm?Symbol.for("immer-nothing"):(($v={})["immer-nothing"]=!0,$v),Gv=fm?Symbol.for("immer-draftable"):"__$immer_draftable",Vt=fm?Symbol.for("immer-state"):"__$immer_state",Ek=""+Object.prototype.constructor,dm=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,Ck=Object.getOwnPropertyDescriptors||function(e){var t={};return dm(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},Ak={},hp={get:function(e,t){if(t===Vt)return e;var n=ii(e);if(!cp(n,t))return function(i,o,a){var l,s=Yv(o,a);return s?"value"in s?s.value:(l=s.get)===null||l===void 0?void 0:l.call(i.k):void 0}(e,n,t);var r=n[t];return e.I||!bi(r)?r:r===Uf(e.t,t)?(zf(e),e.o[t]=pp(e.A.h,r,e)):r},has:function(e,t){return t in ii(e)},ownKeys:function(e){return Reflect.ownKeys(ii(e))},set:function(e,t,n){var r=Yv(ii(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var i=Uf(ii(e),t),o=i==null?void 0:i[Vt];if(o&&o.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(vk(n,i)&&(n!==void 0||cp(e.t,t)))return!0;zf(e),dp(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Uf(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,zf(e),dp(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=ii(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){Cn(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){Cn(12)}},Ia={};bl(hp,function(e,t){Ia[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Ia.deleteProperty=function(e,t){return Ia.set.call(this,e,t,void 0)},Ia.set=function(e,t,n){return hp.set.call(this,e[0],t,n,e[0])};var kk=function(){function e(n){var r=this;this.g=Vv,this.F=!0,this.produce=function(i,o,a){if(typeof i=="function"&&typeof o!="function"){var l=o;o=i;var s=r;return function(g){var v=this;g===void 0&&(g=l);for(var m=arguments.length,y=Array(m>1?m-1:0),S=1;S1?c-1:0),d=1;d=0;i--){var o=r[i];if(o.path.length===0&&o.op==="replace"){n=o.value;break}}i>-1&&(r=r.slice(i+1));var a=jn("Patches").$;return wo(n)?a(n,r):this.produce(n,function(l){return a(l,r)})},e}(),Gt=new kk,Ok=Gt.produce;Gt.produceWithPatches.bind(Gt);Gt.setAutoFreeze.bind(Gt);Gt.setUseProxies.bind(Gt);Gt.applyPatches.bind(Gt);Gt.createDraft.bind(Gt);Gt.finishDraft.bind(Gt);const zo=Ok,Pk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function Ik(e){const t=Jr();return H.exports.useCallback(()=>{e!==null&&t(_x({path:e}))},[t,e])}const Tk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",_k="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",Nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",mp="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",Bb="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",Ub="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",Dk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",Rk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",Fk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",Lk="_icon_1467k_1",Mk={icon:Lk},Bk={undo:Fk,redo:Dk,tour:Rk,alignTop:Nk,alignBottom:_k,alignCenter:Tk,alignSpread:mp,alignTextCenter:mp,alignTextLeft:Bb,alignTextRight:Ub};function Uk({id:e,alt:t=e,size:n}){return b("img",{src:Bk[e],alt:t,className:Mk.icon,style:n?{height:n}:{}})}var zb={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},Jv=H.exports.createContext&&H.exports.createContext(zb),Si=globalThis&&globalThis.__assign||function(){return Si=Object.assign||function(e){for(var t,n=1,r=arguments.length;nb("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:b("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),pm=e=>M("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[b("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),b("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),b("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),Hk=e=>b("svg",Q(U({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:b("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),$k="_button_1dliw_1",Vk="_regular_1dliw_26",Gk="_icon_1dliw_34",Jk="_transparent_1dliw_42",jf={button:$k,regular:Vk,delete:"_delete_1dliw_30",icon:Gk,transparent:Jk},Ft=i=>{var o=i,{children:e,variant:t="regular",className:n}=o,r=vn(o,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(l=>jf[l]).join(" "):jf[t]:"";return b("button",Q(U({className:jf.button+" "+a+(n?" "+n:"")},r),{children:e}))},Qk="_deleteButton_1en02_1",Xk={deleteButton:Qk};function Wb({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=Ik(e);return M(Ft,{className:Xk.deleteButton,onClick:i=>{i.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[b(pm,{}),t?null:"Delete Element"]})}function Yb(){const e=Jr(),t=Hl(r=>r.selectedPath),n=H.exports.useCallback(r=>{e(Fb({path:r}))},[e]);return[t,n]}const hm=R.createContext([null,e=>{}]),qk=({children:e})=>{const t=R.useState(null);return b(hm.Provider,{value:t,children:e})};function Kk(){return R.useContext(hm)}function Hb({ref:e,nodeInfo:t,immovable:n=!1}){const r=R.useRef(!1),[,i]=R.useContext(hm),o=R.useCallback(()=>{r.current===!1||n||(i(null),r.current=!1,document.body.removeEventListener("dragover",Qv),document.body.removeEventListener("drop",o))},[n,i]),a=R.useCallback(l=>{l.stopPropagation(),i(t),r.current=!0,document.body.addEventListener("dragover",Qv),document.body.addEventListener("drop",o)},[o,t,i]);R.useEffect(()=>{var s;if(((s=t.currentPath)==null?void 0:s.length)===0||n)return;const l=e.current;if(!!l)return l.setAttribute("draggable","true"),l.addEventListener("dragstart",a),l.addEventListener("dragend",o),()=>{l.removeEventListener("dragstart",a),l.removeEventListener("dragend",o)}},[o,n,t.currentPath,a,e])}function Qv(e){e.preventDefault()}const Zk="_leaf_1yzht_1",eO="_selectedOverlay_1yzht_5",tO="_container_1yzht_15",Xv={leaf:Zk,selectedOverlay:eO,container:tO};function nO({ref:e,path:t}){R.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const mm=r=>{var i=r,{path:e=[],canMove:t=!0}=i,n=vn(i,["path","canMove"]);const o=R.useRef(null),{uiName:a,uiArguments:l,uiChildren:s}=n,[u,c]=Yb(),f=u?Vl(e,u):!1,d=kn[a],p=g=>{g.stopPropagation(),c(e)};if(Hb({ref:o,nodeInfo:{node:n,currentPath:e},immovable:!t}),nO({ref:o,path:e}),d.acceptsChildren===!0){const g=d.UiComponent;return b(g,{uiArguments:l,uiChildren:s!=null?s:[],compRef:o,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?b("div",{className:Xv.selectedOverlay}):null})}const h=d.UiComponent;return b(h,{uiArguments:l,compRef:o,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?b("div",{className:Xv.selectedOverlay}):null})},gm=R.forwardRef((i,r)=>{var o=i,{className:e="",children:t}=o,n=vn(o,["className","children"]);const a=e+" card";return b("div",Q(U({ref:r,className:a},n),{children:t}))}),rO=R.forwardRef((r,n)=>{var i=r,{className:e=""}=i,t=vn(i,["className"]);const o=e+" card-header";return b("div",U({ref:n,className:o},t))}),iO="_container_rm196_1",oO="_withTitle_rm196_13",aO="_panelTitle_rm196_22",lO="_contentHolder_rm196_27",sO="_dropWatcher_rm196_67",uO="_lastDropWatcher_rm196_75",cO="_firstDropWatcher_rm196_78",fO="_middleDropWatcher_rm196_89",dO="_onlyDropWatcher_rm196_93",pO="_hoveringOverSwap_rm196_98",hO="_availableToSwap_rm196_99",mO="_pulse_rm196_1",gO="_emptyGridCard_rm196_143",vO="_emptyMessage_rm196_160",Wt={container:iO,withTitle:oO,panelTitle:aO,contentHolder:lO,dropWatcher:sO,lastDropWatcher:uO,firstDropWatcher:cO,middleDropWatcher:fO,onlyDropWatcher:dO,hoveringOverSwap:pO,availableToSwap:hO,pulse:mO,emptyGridCard:gO,emptyMessage:vO},yO="_canAcceptDrop_1oxcd_1",wO="_pulse_1oxcd_1",bO="_hoveringOver_1oxcd_32",gp={canAcceptDrop:yO,pulse:wO,hoveringOver:bO};function vm({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:i=gp.canAcceptDrop,hoveringOverClass:o=gp.hoveringOver}){const[a,l]=Kk(),{addCanAcceptDropHighlight:s,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=SO({watcherRef:e,canAcceptDropClass:i,hoveringOverClass:o}),d=a?t(a):!1,p=R.useCallback(v=>{v.preventDefault(),v.stopPropagation(),u(),r==null||r()},[u,r]),h=R.useCallback(v=>{v.preventDefault(),c()},[c]),g=R.useCallback(v=>{if(v.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),l(null)},[d,a,n,c,l]);R.useEffect(()=>{const v=e.current;if(!!v)return d&&(s(),v.addEventListener("dragenter",p),v.addEventListener("dragleave",h),v.addEventListener("dragover",p),v.addEventListener("drop",g)),()=>{f(),v.removeEventListener("dragenter",p),v.removeEventListener("dragleave",h),v.removeEventListener("dragover",p),v.removeEventListener("drop",g)}},[s,d,h,p,g,f,e])}function SO({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=R.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),i=R.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),o=R.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=R.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:i,removeHoveredOverHighlight:o,removeAllHighlights:a}}function xO({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Nx(),i=R.useCallback(({node:a,currentPath:l})=>qv(a)!==null&&$R({fromPath:l,toPath:[...n,t]}),[t,n]),o=R.useCallback(({node:a,currentPath:l})=>{const s=qv(a);if(!s)throw new Error("No node to place...");r({node:s,currentPath:l,parentPath:n,positionInChildren:t})},[t,n,r]);vm({watcherRef:e,getCanAcceptDrop:i,onDrop:o})}function qv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function ym(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const i=n-1;return Vl(e.slice(0,i),t.slice(0,i))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function EO(e){return Bt({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function Kv(e){return Bt({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function Zv(e){return Bt({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function $b(e){return Bt({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}const Wu=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+o*r)};function ey(e){let t=1/0,n=-1/0;for(let o of e)on&&(n=o);const r=n-t,i=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===i-1}}function Vb(e,t){return[...new Array(t)].fill(e)}function CO(e,t){return e.filter(n=>!t.includes(n))}function vp(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function xl(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function AO(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const i=r[t];return r[t]=void 0,r=xl(r,n,i),r.filter(o=>typeof o!="undefined")}function kO(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const i=e[r-1];return[...e].splice(0,r-1).join(t)+n+i}var Fc=Gb;function Gb(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],i={}.toString.call(r).slice(8,-1);i=="Array"||i=="Object"?t[n]=Gb(r):i=="Date"?t[n]=new Date(r.getTime()):i=="RegExp"?t[n]=RegExp(r.source,OO(r)):t[n]=r}return t}function OO(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Gl(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function PO(e,t={}){const n=new Set;for(let r of e)for(let i of r)t.ignore&&t.ignore.includes(i)||n.add(i);return[...n]}function IO(e,{index:t,arr:n,dir:r}){const i=Fc(e);switch(r){case"rows":return xl(i,t,n);case"cols":return i.map((o,a)=>xl(o,t,n[a]))}}function TO(e,{index:t,dir:n}){const r=Fc(e);switch(n){case"rows":return vp(r,t);case"cols":return r.map((i,o)=>vp(i,t))}}const Hn=".";function wm(e){const t=new Map;return _O(e).forEach(({itemRows:n,itemCols:r},i)=>{if(i===Hn)return;const o=ey(n),a=ey(r);t.set(i,{colStart:a.minVal,rowStart:o.minVal,colSpan:a.span+1,rowSpan:o.span+1,isValid:o.isSequence&&a.isSequence})}),t}function _O(e){var i;const t=new Map,{numRows:n,numCols:r}=Gl(e);for(let o=0;o1,c=r>1,f=[];return(ty({colRange:s,rowIndex:e-1,layoutAreas:i})||u)&&f.push("up"),(ty({colRange:s,rowIndex:o+1,layoutAreas:i})||u)&&f.push("down"),(ny({rowRange:l,colIndex:n-1,layoutAreas:i})||c)&&f.push("left"),(ny({rowRange:l,colIndex:a+1,layoutAreas:i})||c)&&f.push("right"),f}function ty({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===Hn)}function ny({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===Hn)}const DO="_marker_rkm38_1",RO="_dragger_rkm38_30",FO="_move_rkm38_50",ry={marker:DO,dragger:RO,move:FO};function El({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function LO(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=El(e)),"colSpan"in t&&(t=El(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function MO({row:e,col:t}){return`row${e}-col${t}`}function BO({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:i,colStart:o,colEnd:a}=El(t),l=n.length,s=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:i,growExtent:1};u=r-1,c=1,f=i;break;case"left":if(o===1)return{shrinkExtent:a,growExtent:1};u=o-1,c=1,f=a;break;case"down":if(i===l)return{shrinkExtent:r,growExtent:l};u=i+1,c=l,f=r;break;case"right":if(a===s)return{shrinkExtent:o,growExtent:s};u=a+1,c=s,f=o;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[h,g]=d?[o,a]:[r,i],v=(S,k)=>{const[_,w]=d?[S,k]:[k,S];return n[_-1][w-1]!==Hn},m=Wu(h,g),y=Wu(u,c);for(let S of y)for(let k of m)if(v(S,k))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function Jb(e,t,n){const r=t=r&&e<=i}function UO({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=yp(t.getPropertyValue("gap")),o=yp(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],l=zO(t,e),s=l.length,u=[];for(let c=0;cJb(o,s,u));if(a===void 0)return;const l=WO[n];return i[l]=a.index,i}const WO={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function YO({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const i=El(t),o=R.useRef(null),a=R.useCallback(u=>{const c=e.current,f=o.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=jO({mousePos:u,dragState:f});d&&oy(c,d)},[e]),l=R.useCallback(()=>{const u=e.current,c=o.current;if(!u||!c)return;const f=c.gridItemExtent;LO(f,i)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),iy("on")},[i,a,r,e]);return R.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),h=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:g,growExtent:v}=BO({dragDirection:u,gridLocation:t,layoutAreas:n});o.current={dragHandle:u,gridItemExtent:El(t),tractExtents:UO({dir:h,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:m})=>Jb(m,g,v))},oy(e.current,o.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",l,{once:!0}),iy("off")},[l,t,n,a,e])}function iy(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function oy(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:i}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(i+1))}function HO({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const i=R.useRef(null),o=YO({overlayRef:i,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=R.useMemo(()=>NO({gridLocation:t,layoutAreas:n}),[t,n]),l=R.useMemo(()=>{let s=[];for(let u of a)s.push(b("div",{className:ry.dragger+" "+u,onMouseDown:c=>{$O(c),o(u)},children:VO[u]},u));return s},[a,o]);return R.useEffect(()=>{var s;(s=i.current)==null||s.style.setProperty("--grid-area",e)},[e]),b("div",{ref:i,className:ry.marker+" grid-area-overlay",children:l})}function $O(e){e.preventDefault(),e.stopPropagation()}const VO={up:b(Zv,{}),down:b(Zv,{}),left:b(Kv,{}),right:b(Kv,{})};function GO({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=R.useRef(null);return vm({watcherRef:r,onDrop:i=>{n(Q(U({},i),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),b("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function JO(e,t){const{numRows:n,numCols:r}=Gl(e),i=[];for(let o=0;o{const o=r==="rows"?"cols":"rows",a=Qb(i);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const l=wm(i.areas);let s=Vb(Hn,a[o].length);l.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=bp(u,r);if(f<=t&&d>t){const h=bp(u,o);for(let g=h.itemStart-1;g1}function KO(e,{index:t,dir:n}){let r=[];return e.forEach((i,o)=>{const{itemStart:a,itemEnd:l}=bp(i,n);a===t&&a===l&&r.push(o)}),r}const ZO="_ResizableGrid_i4cq9_1",eP={ResizableGrid:ZO,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function Zb(e){var i,o;const t=((i=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:i[0])||"px",n=(o=e.match(/^[\d|\.]*/g))==null?void 0:o[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function wr(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const tP="_container_jk9tt_8",nP="_label_jk9tt_26",rP="_mainInput_jk9tt_59",lr={container:tP,label:nP,mainInput:rP},eS=R.createContext(null);function Oi(e){const t=R.useContext(eS);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const iP=({onChange:e,children:t})=>b(eS.Provider,{value:e,children:t});function oP({name:e,isDisabled:t,defaultValue:n}){const r=Oi(),i=`Click to ${t?"set":"unset"} ${e} property`;return b("input",{"aria-label":i,type:"checkbox",checked:!t,title:i,onChange:o=>{r({name:e,value:o.target.checked?n:void 0})}})}function bm({name:e,label:t,optional:n,isDisabled:r,defaultValue:i,mainInput:o,width_setting:a="full"}){return M("label",{className:lr.container,"data-disabled":r,"data-width-setting":a,children:[M("div",{className:lr.label,children:[n?b(oP,{name:e,isDisabled:r,defaultValue:i}):null,t!=null?t:e,":"]}),b("div",{className:lr.mainInput,children:o})]})}const aP="_numericInput_n1lnu_1",lP={numericInput:aP};function Sm({value:e,ariaLabel:t,onChange:n,min:r,max:i,disabled:o=!1}){var l;const a=R.useCallback((s=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+s*c;r&&(f=Math.max(f,r)),i&&(f=Math.min(f,i)),n(f)},[i,r,n,e]);return b("input",{className:lP.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:o,value:(l=e==null?void 0:e.toString())!=null?l:"",onChange:s=>n(Number(s.target.value)),min:r,onKeyDown:s=>{(s.key==="ArrowUp"||s.key==="ArrowDown")&&(s.preventDefault(),a(s.key==="ArrowUp"?1:-1,s.shiftKey))}})}function Cr({name:e,label:t,value:n,min:r=0,max:i,onChange:o,optional:a=!1,defaultValue:l=1,disabled:s=n===void 0}){const u=Oi(o);return b(bm,{name:e,label:t,optional:a,isDisabled:s,defaultValue:l,width_setting:"fit",mainInput:b(Sm,{ariaLabel:t!=null?t:e,disabled:s,value:n,onChange:c=>u({name:e,value:c}),min:r,max:i})})}var xm=sP;function sP(e,t,n){var r=null,i=null,o=function(){r&&(clearTimeout(r),i=null,r=null)},a=function(){var s=i;o(),s&&s()},l=function(){if(!t)return e.apply(this,arguments);var s=this,u=arguments,c=n&&!r;if(o(),i=function(){e.apply(s,u)},r=setTimeout(function(){if(r=null,!c){var f=i;return i=null,f()}},t),c)return i()};return l.cancel=o,l.flush=a,l}const ly=["http","https","mailto","tel"];function uP(e){const t=(e||"").trim(),n=t.charAt(0);if(n==="#"||n==="/")return t;const r=t.indexOf(":");if(r===-1)return t;let i=-1;for(;++ii||(i=t.indexOf("#"),i!==-1&&r>i)?t:"javascript:void(0)"}/*! - * Determine if an object is a Buffer - * - * @author Feross Aboukhadijeh - * @license MIT - */var Em=function(t){return t!=null&&t.constructor!=null&&typeof t.constructor.isBuffer=="function"&&t.constructor.isBuffer(t)};function co(e){return!e||typeof e!="object"?"":"position"in e||"type"in e?sy(e.position):"start"in e||"end"in e?sy(e):"line"in e||"column"in e?Sp(e):""}function Sp(e){return uy(e&&e.line)+":"+uy(e&&e.column)}function sy(e){return Sp(e&&e.start)+"-"+Sp(e&&e.end)}function uy(e){return e&&typeof e=="number"?e:1}class dn extends Error{constructor(t,n,r){const i=[null,null];let o={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof n=="string"&&(r=n,n=void 0),typeof r=="string"){const a=r.indexOf(":");a===-1?i[1]=r:(i[0]=r.slice(0,a),i[1]=r.slice(a+1))}n&&("type"in n||"position"in n?n.position&&(o=n.position):"start"in n||"end"in n?o=n:("line"in n||"column"in n)&&(o.start=n)),this.name=co(n)||"1:1",this.message=typeof t=="object"?t.message:t,this.stack=typeof t=="object"?t.stack:"",this.reason=this.message,this.fatal,this.line=o.start.line,this.column=o.start.column,this.source=i[0],this.ruleId=i[1],this.position=o,this.actual,this.expected,this.file,this.url,this.note}}dn.prototype.file="";dn.prototype.name="";dn.prototype.reason="";dn.prototype.message="";dn.prototype.stack="";dn.prototype.fatal=null;dn.prototype.column=null;dn.prototype.line=null;dn.prototype.source=null;dn.prototype.ruleId=null;dn.prototype.position=null;const Tn={basename:cP,dirname:fP,extname:dP,join:pP,sep:"/"};function cP(e,t){if(t!==void 0&&typeof t!="string")throw new TypeError('"ext" argument must be a string');Jl(e);let n=0,r=-1,i=e.length,o;if(t===void 0||t.length===0||t.length>e.length){for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else r<0&&(o=!0,r=i+1);return r<0?"":e.slice(n,r)}if(t===e)return"";let a=-1,l=t.length-1;for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else a<0&&(o=!0,a=i+1),l>-1&&(e.charCodeAt(i)===t.charCodeAt(l--)?l<0&&(r=i):(l=-1,r=a));return n===r?r=a:r<0&&(r=e.length),e.slice(n,r)}function fP(e){if(Jl(e),e.length===0)return".";let t=-1,n=e.length,r;for(;--n;)if(e.charCodeAt(n)===47){if(r){t=n;break}}else r||(r=!0);return t<0?e.charCodeAt(0)===47?"/":".":t===1&&e.charCodeAt(0)===47?"//":e.slice(0,t)}function dP(e){Jl(e);let t=e.length,n=-1,r=0,i=-1,o=0,a;for(;t--;){const l=e.charCodeAt(t);if(l===47){if(a){r=t+1;break}continue}n<0&&(a=!0,n=t+1),l===46?i<0?i=t:o!==1&&(o=1):i>-1&&(o=-1)}return i<0||n<0||o===0||o===1&&i===n-1&&i===r+1?"":e.slice(i,n)}function pP(...e){let t=-1,n;for(;++t0&&e.charCodeAt(e.length-1)===47&&(n+="/"),t?"/"+n:n}function mP(e,t){let n="",r=0,i=-1,o=0,a=-1,l,s;for(;++a<=e.length;){if(a2){if(s=n.lastIndexOf("/"),s!==n.length-1){s<0?(n="",r=0):(n=n.slice(0,s),r=n.length-1-n.lastIndexOf("/")),i=a,o=0;continue}}else if(n.length>0){n="",r=0,i=a,o=0;continue}}t&&(n=n.length>0?n+"/..":"..",r=2)}else n.length>0?n+="/"+e.slice(i+1,a):n=e.slice(i+1,a),r=a-i-1;i=a,o=0}else l===46&&o>-1?o++:o=-1}return n}function Jl(e){if(typeof e!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(e))}const gP={cwd:vP};function vP(){return"/"}function xp(e){return e!==null&&typeof e=="object"&&e.href&&e.origin}function yP(e){if(typeof e=="string")e=new URL(e);else if(!xp(e)){const t=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+e+"`");throw t.code="ERR_INVALID_ARG_TYPE",t}if(e.protocol!=="file:"){const t=new TypeError("The URL must be of scheme file");throw t.code="ERR_INVALID_URL_SCHEME",t}return wP(e)}function wP(e){if(e.hostname!==""){const r=new TypeError('File URL host must be "localhost" or empty on darwin');throw r.code="ERR_INVALID_FILE_URL_HOST",r}const t=e.pathname;let n=-1;for(;++na.length;let s;l&&a.push(i);try{s=e.apply(this,a)}catch(u){const c=u;if(l&&n)throw c;return i(c)}l||(s instanceof Promise?s.then(o,i):s instanceof Error?i(s):o(s))}function i(a,...l){n||(n=!0,t(a,...l))}function o(a){i(null,a)}}class pn extends Error{constructor(t,n,r){const i=[null,null];let o={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof n=="string"&&(r=n,n=void 0),typeof r=="string"){const a=r.indexOf(":");a===-1?i[1]=r:(i[0]=r.slice(0,a),i[1]=r.slice(a+1))}n&&("type"in n||"position"in n?n.position&&(o=n.position):"start"in n||"end"in n?o=n:("line"in n||"column"in n)&&(o.start=n)),this.name=co(n)||"1:1",this.message=typeof t=="object"?t.message:t,this.stack=typeof t=="object"?t.stack:"",this.reason=this.message,this.fatal,this.line=o.start.line,this.column=o.start.column,this.source=i[0],this.ruleId=i[1],this.position=o,this.actual,this.expected,this.file,this.url,this.note}}pn.prototype.file="";pn.prototype.name="";pn.prototype.reason="";pn.prototype.message="";pn.prototype.stack="";pn.prototype.fatal=null;pn.prototype.column=null;pn.prototype.line=null;pn.prototype.source=null;pn.prototype.ruleId=null;pn.prototype.position=null;const _n={basename:EP,dirname:CP,extname:AP,join:kP,sep:"/"};function EP(e,t){if(t!==void 0&&typeof t!="string")throw new TypeError('"ext" argument must be a string');Ql(e);let n=0,r=-1,i=e.length,o;if(t===void 0||t.length===0||t.length>e.length){for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else r<0&&(o=!0,r=i+1);return r<0?"":e.slice(n,r)}if(t===e)return"";let a=-1,l=t.length-1;for(;i--;)if(e.charCodeAt(i)===47){if(o){n=i+1;break}}else a<0&&(o=!0,a=i+1),l>-1&&(e.charCodeAt(i)===t.charCodeAt(l--)?l<0&&(r=i):(l=-1,r=a));return n===r?r=a:r<0&&(r=e.length),e.slice(n,r)}function CP(e){if(Ql(e),e.length===0)return".";let t=-1,n=e.length,r;for(;--n;)if(e.charCodeAt(n)===47){if(r){t=n;break}}else r||(r=!0);return t<0?e.charCodeAt(0)===47?"/":".":t===1&&e.charCodeAt(0)===47?"//":e.slice(0,t)}function AP(e){Ql(e);let t=e.length,n=-1,r=0,i=-1,o=0,a;for(;t--;){const l=e.charCodeAt(t);if(l===47){if(a){r=t+1;break}continue}n<0&&(a=!0,n=t+1),l===46?i<0?i=t:o!==1&&(o=1):i>-1&&(o=-1)}return i<0||n<0||o===0||o===1&&i===n-1&&i===r+1?"":e.slice(i,n)}function kP(...e){let t=-1,n;for(;++t0&&e.charCodeAt(e.length-1)===47&&(n+="/"),t?"/"+n:n}function PP(e,t){let n="",r=0,i=-1,o=0,a=-1,l,s;for(;++a<=e.length;){if(a2){if(s=n.lastIndexOf("/"),s!==n.length-1){s<0?(n="",r=0):(n=n.slice(0,s),r=n.length-1-n.lastIndexOf("/")),i=a,o=0;continue}}else if(n.length>0){n="",r=0,i=a,o=0;continue}}t&&(n=n.length>0?n+"/..":"..",r=2)}else n.length>0?n+="/"+e.slice(i+1,a):n=e.slice(i+1,a),r=a-i-1;i=a,o=0}else l===46&&o>-1?o++:o=-1}return n}function Ql(e){if(typeof e!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(e))}const IP={cwd:TP};function TP(){return"/"}function Cp(e){return e!==null&&typeof e=="object"&&e.href&&e.origin}function _P(e){if(typeof e=="string")e=new URL(e);else if(!Cp(e)){const t=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+e+"`");throw t.code="ERR_INVALID_ARG_TYPE",t}if(e.protocol!=="file:"){const t=new TypeError("The URL must be of scheme file");throw t.code="ERR_INVALID_URL_SCHEME",t}return NP(e)}function NP(e){if(e.hostname!==""){const r=new TypeError('File URL host must be "localhost" or empty on darwin');throw r.code="ERR_INVALID_FILE_URL_HOST",r}const t=e.pathname;let n=-1;for(;++n{if(w||!O||!E)_(w);else{const C=o.stringify(O,E);C==null||(MP(C)?E.value=C:E.result=C),_(w,E)}});function _(w,O){w||!O?S(w):y?y(O):v(null,O)}}}function h(g){let v;o.freeze(),Jf("processSync",o.Parser),Qf("processSync",o.Compiler);const m=ua(g);return o.process(m,y),xy("processSync","process",v),m;function y(S){v=!0,fy(S)}}}function by(e,t){return typeof e=="function"&&e.prototype&&(FP(e.prototype)||t in e.prototype)}function FP(e){let t;for(t in e)if(nS.call(e,t))return!0;return!1}function Jf(e,t){if(typeof t!="function")throw new TypeError("Cannot `"+e+"` without `Parser`")}function Qf(e,t){if(typeof t!="function")throw new TypeError("Cannot `"+e+"` without `Compiler`")}function Xf(e,t){if(t)throw new Error("Cannot call `"+e+"` on a frozen processor.\nCreate a new processor first, by calling it: use `processor()` instead of `processor`.")}function Sy(e){if(!Ep(e)||typeof e.type!="string")throw new TypeError("Expected node, got `"+e+"`")}function xy(e,t,n){if(!n)throw new Error("`"+e+"` finished async. Use `"+t+"` instead")}function ua(e){return LP(e)?e:new DP(e)}function LP(e){return Boolean(e&&typeof e=="object"&&"message"in e&&"messages"in e)}function MP(e){return typeof e=="string"||Em(e)}function BP(e,t){var{includeImageAlt:n=!0}=t||{};return iS(e,n)}function iS(e,t){return e&&typeof e=="object"&&(e.value||(t?e.alt:"")||"children"in e&&Ey(e.children,t)||Array.isArray(e)&&Ey(e,t))||""}function Ey(e,t){for(var n=[],r=-1;++ri?0:i+t:t=t>i?i:t,n=n>0?n:0,r.length<1e4)a=Array.from(r),a.unshift(t,n),[].splice.apply(e,a);else for(n&&[].splice.apply(e,[t,n]);o0?($n(e,e.length,0,t),e):t}const Cy={}.hasOwnProperty;function UP(e){const t={};let n=-1;for(;++na))return;const O=t.events.length;let E=O,C,P;for(;E--;)if(t.events[E][0]==="exit"&&t.events[E][1].type==="chunkFlow"){if(C){P=t.events[E][1].end;break}C=!0}for(m(r),w=O;wS;){const _=n[k];t.containerState=_[1],_[0].exit.call(t,e)}n.length=S}function y(){i.write([null]),o=void 0,i=void 0,t.containerState._closeFlow=void 0}}function qP(e,t,n){return ke(e,e.attempt(this.parser.constructs.document,t,n),"linePrefix",this.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function Oy(e){if(e===null||rn(e)||$P(e))return 1;if(VP(e))return 2}function Cm(e,t,n){const r=[];let i=-1;for(;++i1&&e[n][1].end.offset-e[n][1].start.offset>1?2:1;const f=Object.assign({},e[r][1].end),d=Object.assign({},e[n][1].start);Py(f,-s),Py(d,s),a={type:s>1?"strongSequence":"emphasisSequence",start:f,end:Object.assign({},e[r][1].end)},l={type:s>1?"strongSequence":"emphasisSequence",start:Object.assign({},e[n][1].start),end:d},o={type:s>1?"strongText":"emphasisText",start:Object.assign({},e[r][1].end),end:Object.assign({},e[n][1].start)},i={type:s>1?"strong":"emphasis",start:Object.assign({},a.start),end:Object.assign({},l.end)},e[r][1].end=Object.assign({},a.start),e[n][1].start=Object.assign({},l.end),u=[],e[r][1].end.offset-e[r][1].start.offset&&(u=Kt(u,[["enter",e[r][1],t],["exit",e[r][1],t]])),u=Kt(u,[["enter",i,t],["enter",a,t],["exit",a,t],["enter",o,t]]),u=Kt(u,Cm(t.parser.constructs.insideSpan.null,e.slice(r+1,n),t)),u=Kt(u,[["exit",o,t],["enter",l,t],["exit",l,t],["exit",i,t]]),e[n][1].end.offset-e[n][1].start.offset?(c=2,u=Kt(u,[["enter",e[n][1],t],["exit",e[n][1],t]])):c=0,$n(e,r-1,n-r+3,u),n=r+u.length-c-2;break}}for(n=-1;++n=4?a(u):n(u)}function a(u){return u===null?s(u):re(u)?e.attempt(u3,a,s)(u):(e.enter("codeFlowValue"),l(u))}function l(u){return u===null||re(u)?(e.exit("codeFlowValue"),a(u)):(e.consume(u),l)}function s(u){return e.exit("codeIndented"),t(u)}}function f3(e,t,n){const r=this;return i;function i(a){return r.parser.lazy[r.now().line]?n(a):re(a)?(e.enter("lineEnding"),e.consume(a),e.exit("lineEnding"),i):ke(e,o,"linePrefix",4+1)(a)}function o(a){const l=r.events[r.events.length-1];return l&&l[1].type==="linePrefix"&&l[2].sliceSerialize(l[1],!0).length>=4?t(a):re(a)?i(a):n(a)}}const d3={name:"codeText",tokenize:m3,resolve:p3,previous:h3};function p3(e){let t=e.length-4,n=3,r,i;if((e[n][1].type==="lineEnding"||e[n][1].type==="space")&&(e[t][1].type==="lineEnding"||e[t][1].type==="space")){for(r=n;++r=4?t(a):e.interrupt(r.parser.constructs.flow,n,t)(a)}}function uS(e,t,n,r,i,o,a,l,s){const u=s||Number.POSITIVE_INFINITY;let c=0;return f;function f(m){return m===60?(e.enter(r),e.enter(i),e.enter(o),e.consume(m),e.exit(o),d):m===null||m===41||kp(m)?n(m):(e.enter(r),e.enter(a),e.enter(l),e.enter("chunkString",{contentType:"string"}),g(m))}function d(m){return m===62?(e.enter(o),e.consume(m),e.exit(o),e.exit(i),e.exit(r),t):(e.enter(l),e.enter("chunkString",{contentType:"string"}),p(m))}function p(m){return m===62?(e.exit("chunkString"),e.exit(l),d(m)):m===null||m===60||re(m)?n(m):(e.consume(m),m===92?h:p)}function h(m){return m===60||m===62||m===92?(e.consume(m),p):p(m)}function g(m){return m===40?++c>u?n(m):(e.consume(m),g):m===41?c--?(e.consume(m),g):(e.exit("chunkString"),e.exit(l),e.exit(a),e.exit(r),t(m)):m===null||rn(m)?c?n(m):(e.exit("chunkString"),e.exit(l),e.exit(a),e.exit(r),t(m)):kp(m)?n(m):(e.consume(m),m===92?v:g)}function v(m){return m===40||m===41||m===92?(e.consume(m),g):g(m)}}function cS(e,t,n,r,i,o){const a=this;let l=0,s;return u;function u(p){return e.enter(r),e.enter(i),e.consume(p),e.exit(i),e.enter(o),c}function c(p){return p===null||p===91||p===93&&!s||p===94&&!l&&"_hiddenFootnoteSupport"in a.parser.constructs||l>999?n(p):p===93?(e.exit(o),e.enter(i),e.consume(p),e.exit(i),e.exit(r),t):re(p)?(e.enter("lineEnding"),e.consume(p),e.exit("lineEnding"),c):(e.enter("chunkString",{contentType:"string"}),f(p))}function f(p){return p===null||p===91||p===93||re(p)||l++>999?(e.exit("chunkString"),c(p)):(e.consume(p),s=s||!qe(p),p===92?d:f)}function d(p){return p===91||p===92||p===93?(e.consume(p),l++,f):f(p)}}function fS(e,t,n,r,i,o){let a;return l;function l(d){return e.enter(r),e.enter(i),e.consume(d),e.exit(i),a=d===40?41:d,s}function s(d){return d===a?(e.enter(i),e.consume(d),e.exit(i),e.exit(r),t):(e.enter(o),u(d))}function u(d){return d===a?(e.exit(o),s(a)):d===null?n(d):re(d)?(e.enter("lineEnding"),e.consume(d),e.exit("lineEnding"),ke(e,u,"linePrefix")):(e.enter("chunkString",{contentType:"string"}),c(d))}function c(d){return d===a||d===null||re(d)?(e.exit("chunkString"),u(d)):(e.consume(d),d===92?f:c)}function f(d){return d===a||d===92?(e.consume(d),c):c(d)}}function Ga(e,t){let n;return r;function r(i){return re(i)?(e.enter("lineEnding"),e.consume(i),e.exit("lineEnding"),n=!0,r):qe(i)?ke(e,r,n?"linePrefix":"lineSuffix")(i):t(i)}}function fo(e){return e.replace(/[\t\n\r ]+/g," ").replace(/^ | $/g,"").toLowerCase().toUpperCase()}const x3={name:"definition",tokenize:C3},E3={tokenize:A3,partial:!0};function C3(e,t,n){const r=this;let i;return o;function o(s){return e.enter("definition"),cS.call(r,e,a,n,"definitionLabel","definitionLabelMarker","definitionLabelString")(s)}function a(s){return i=fo(r.sliceSerialize(r.events[r.events.length-1][1]).slice(1,-1)),s===58?(e.enter("definitionMarker"),e.consume(s),e.exit("definitionMarker"),Ga(e,uS(e,e.attempt(E3,ke(e,l,"whitespace"),ke(e,l,"whitespace")),n,"definitionDestination","definitionDestinationLiteral","definitionDestinationLiteralMarker","definitionDestinationRaw","definitionDestinationString"))):n(s)}function l(s){return s===null||re(s)?(e.exit("definition"),r.parser.defined.includes(i)||r.parser.defined.push(i),t(s)):n(s)}}function A3(e,t,n){return r;function r(a){return rn(a)?Ga(e,i)(a):n(a)}function i(a){return a===34||a===39||a===40?fS(e,ke(e,o,"whitespace"),n,"definitionTitle","definitionTitleMarker","definitionTitleString")(a):n(a)}function o(a){return a===null||re(a)?t(a):n(a)}}const k3={name:"hardBreakEscape",tokenize:O3};function O3(e,t,n){return r;function r(o){return e.enter("hardBreakEscape"),e.enter("escapeMarker"),e.consume(o),i}function i(o){return re(o)?(e.exit("escapeMarker"),e.exit("hardBreakEscape"),t(o)):n(o)}}const P3={name:"headingAtx",tokenize:T3,resolve:I3};function I3(e,t){let n=e.length-2,r=3,i,o;return e[r][1].type==="whitespace"&&(r+=2),n-2>r&&e[n][1].type==="whitespace"&&(n-=2),e[n][1].type==="atxHeadingSequence"&&(r===n-1||n-4>r&&e[n-2][1].type==="whitespace")&&(n-=r+1===n?2:4),n>r&&(i={type:"atxHeadingText",start:e[r][1].start,end:e[n][1].end},o={type:"chunkText",start:e[r][1].start,end:e[n][1].end,contentType:"text"},$n(e,r,n-r+1,[["enter",i,t],["enter",o,t],["exit",o,t],["exit",i,t]])),e}function T3(e,t,n){const r=this;let i=0;return o;function o(c){return e.enter("atxHeading"),e.enter("atxHeadingSequence"),a(c)}function a(c){return c===35&&i++<6?(e.consume(c),a):c===null||rn(c)?(e.exit("atxHeadingSequence"),r.interrupt?t(c):l(c)):n(c)}function l(c){return c===35?(e.enter("atxHeadingSequence"),s(c)):c===null||re(c)?(e.exit("atxHeading"),t(c)):qe(c)?ke(e,l,"whitespace")(c):(e.enter("atxHeadingText"),u(c))}function s(c){return c===35?(e.consume(c),s):(e.exit("atxHeadingSequence"),l(c))}function u(c){return c===null||c===35||rn(c)?(e.exit("atxHeadingText"),l(c)):(e.consume(c),u)}}const _3=["address","article","aside","base","basefont","blockquote","body","caption","center","col","colgroup","dd","details","dialog","dir","div","dl","dt","fieldset","figcaption","figure","footer","form","frame","frameset","h1","h2","h3","h4","h5","h6","head","header","hr","html","iframe","legend","li","link","main","menu","menuitem","nav","noframes","ol","optgroup","option","p","param","section","summary","table","tbody","td","tfoot","th","thead","title","tr","track","ul"],_y=["pre","script","style","textarea"],N3={name:"htmlFlow",tokenize:F3,resolveTo:R3,concrete:!0},D3={tokenize:L3,partial:!0};function R3(e){let t=e.length;for(;t--&&!(e[t][0]==="enter"&&e[t][1].type==="htmlFlow"););return t>1&&e[t-2][1].type==="linePrefix"&&(e[t][1].start=e[t-2][1].start,e[t+1][1].start=e[t-2][1].start,e.splice(t-2,2)),e}function F3(e,t,n){const r=this;let i,o,a,l,s;return u;function u(A){return e.enter("htmlFlow"),e.enter("htmlFlowData"),e.consume(A),c}function c(A){return A===33?(e.consume(A),f):A===47?(e.consume(A),h):A===63?(e.consume(A),i=3,r.interrupt?t:se):Nn(A)?(e.consume(A),a=String.fromCharCode(A),o=!0,g):n(A)}function f(A){return A===45?(e.consume(A),i=2,d):A===91?(e.consume(A),i=5,a="CDATA[",l=0,p):Nn(A)?(e.consume(A),i=4,r.interrupt?t:se):n(A)}function d(A){return A===45?(e.consume(A),r.interrupt?t:se):n(A)}function p(A){return A===a.charCodeAt(l++)?(e.consume(A),l===a.length?r.interrupt?t:I:p):n(A)}function h(A){return Nn(A)?(e.consume(A),a=String.fromCharCode(A),g):n(A)}function g(A){return A===null||A===47||A===62||rn(A)?A!==47&&o&&_y.includes(a.toLowerCase())?(i=1,r.interrupt?t(A):I(A)):_3.includes(a.toLowerCase())?(i=6,A===47?(e.consume(A),v):r.interrupt?t(A):I(A)):(i=7,r.interrupt&&!r.parser.lazy[r.now().line]?n(A):o?y(A):m(A)):A===45||Yt(A)?(e.consume(A),a+=String.fromCharCode(A),g):n(A)}function v(A){return A===62?(e.consume(A),r.interrupt?t:I):n(A)}function m(A){return qe(A)?(e.consume(A),m):C(A)}function y(A){return A===47?(e.consume(A),C):A===58||A===95||Nn(A)?(e.consume(A),S):qe(A)?(e.consume(A),y):C(A)}function S(A){return A===45||A===46||A===58||A===95||Yt(A)?(e.consume(A),S):k(A)}function k(A){return A===61?(e.consume(A),_):qe(A)?(e.consume(A),k):y(A)}function _(A){return A===null||A===60||A===61||A===62||A===96?n(A):A===34||A===39?(e.consume(A),s=A,w):qe(A)?(e.consume(A),_):(s=null,O(A))}function w(A){return A===null||re(A)?n(A):A===s?(e.consume(A),E):(e.consume(A),w)}function O(A){return A===null||A===34||A===39||A===60||A===61||A===62||A===96||rn(A)?k(A):(e.consume(A),O)}function E(A){return A===47||A===62||qe(A)?y(A):n(A)}function C(A){return A===62?(e.consume(A),P):n(A)}function P(A){return qe(A)?(e.consume(A),P):A===null||re(A)?I(A):n(A)}function I(A){return A===45&&i===2?(e.consume(A),K):A===60&&i===1?(e.consume(A),V):A===62&&i===4?(e.consume(A),q):A===63&&i===3?(e.consume(A),se):A===93&&i===5?(e.consume(A),te):re(A)&&(i===6||i===7)?e.check(D3,q,T)(A):A===null||re(A)?T(A):(e.consume(A),I)}function T(A){return e.exit("htmlFlowData"),N(A)}function N(A){return A===null?x(A):re(A)?e.attempt({tokenize:B,partial:!0},N,x)(A):(e.enter("htmlFlowData"),I(A))}function B(A,X,fe){return pe;function pe(be){return A.enter("lineEnding"),A.consume(be),A.exit("lineEnding"),he}function he(be){return r.parser.lazy[r.now().line]?fe(be):X(be)}}function K(A){return A===45?(e.consume(A),se):I(A)}function V(A){return A===47?(e.consume(A),a="",le):I(A)}function le(A){return A===62&&_y.includes(a.toLowerCase())?(e.consume(A),q):Nn(A)&&a.length<8?(e.consume(A),a+=String.fromCharCode(A),le):I(A)}function te(A){return A===93?(e.consume(A),se):I(A)}function se(A){return A===62?(e.consume(A),q):A===45&&i===2?(e.consume(A),se):I(A)}function q(A){return A===null||re(A)?(e.exit("htmlFlowData"),x(A)):(e.consume(A),q)}function x(A){return e.exit("htmlFlow"),t(A)}}function L3(e,t,n){return r;function r(i){return e.exit("htmlFlowData"),e.enter("lineEndingBlank"),e.consume(i),e.exit("lineEndingBlank"),e.attempt(Lc,t,n)}}const M3={name:"htmlText",tokenize:B3};function B3(e,t,n){const r=this;let i,o,a,l;return s;function s(x){return e.enter("htmlText"),e.enter("htmlTextData"),e.consume(x),u}function u(x){return x===33?(e.consume(x),c):x===47?(e.consume(x),O):x===63?(e.consume(x),_):Nn(x)?(e.consume(x),P):n(x)}function c(x){return x===45?(e.consume(x),f):x===91?(e.consume(x),o="CDATA[",a=0,v):Nn(x)?(e.consume(x),k):n(x)}function f(x){return x===45?(e.consume(x),d):n(x)}function d(x){return x===null||x===62?n(x):x===45?(e.consume(x),p):h(x)}function p(x){return x===null||x===62?n(x):h(x)}function h(x){return x===null?n(x):x===45?(e.consume(x),g):re(x)?(l=h,te(x)):(e.consume(x),h)}function g(x){return x===45?(e.consume(x),q):h(x)}function v(x){return x===o.charCodeAt(a++)?(e.consume(x),a===o.length?m:v):n(x)}function m(x){return x===null?n(x):x===93?(e.consume(x),y):re(x)?(l=m,te(x)):(e.consume(x),m)}function y(x){return x===93?(e.consume(x),S):m(x)}function S(x){return x===62?q(x):x===93?(e.consume(x),S):m(x)}function k(x){return x===null||x===62?q(x):re(x)?(l=k,te(x)):(e.consume(x),k)}function _(x){return x===null?n(x):x===63?(e.consume(x),w):re(x)?(l=_,te(x)):(e.consume(x),_)}function w(x){return x===62?q(x):_(x)}function O(x){return Nn(x)?(e.consume(x),E):n(x)}function E(x){return x===45||Yt(x)?(e.consume(x),E):C(x)}function C(x){return re(x)?(l=C,te(x)):qe(x)?(e.consume(x),C):q(x)}function P(x){return x===45||Yt(x)?(e.consume(x),P):x===47||x===62||rn(x)?I(x):n(x)}function I(x){return x===47?(e.consume(x),q):x===58||x===95||Nn(x)?(e.consume(x),T):re(x)?(l=I,te(x)):qe(x)?(e.consume(x),I):q(x)}function T(x){return x===45||x===46||x===58||x===95||Yt(x)?(e.consume(x),T):N(x)}function N(x){return x===61?(e.consume(x),B):re(x)?(l=N,te(x)):qe(x)?(e.consume(x),N):I(x)}function B(x){return x===null||x===60||x===61||x===62||x===96?n(x):x===34||x===39?(e.consume(x),i=x,K):re(x)?(l=B,te(x)):qe(x)?(e.consume(x),B):(e.consume(x),i=void 0,le)}function K(x){return x===i?(e.consume(x),V):x===null?n(x):re(x)?(l=K,te(x)):(e.consume(x),K)}function V(x){return x===62||x===47||rn(x)?I(x):n(x)}function le(x){return x===null||x===34||x===39||x===60||x===61||x===96?n(x):x===62||rn(x)?I(x):(e.consume(x),le)}function te(x){return e.exit("htmlTextData"),e.enter("lineEnding"),e.consume(x),e.exit("lineEnding"),ke(e,se,"linePrefix",r.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function se(x){return e.enter("htmlTextData"),l(x)}function q(x){return x===62?(e.consume(x),e.exit("htmlTextData"),e.exit("htmlText"),t):n(x)}}const km={name:"labelEnd",tokenize:H3,resolveTo:Y3,resolveAll:W3},U3={tokenize:$3},z3={tokenize:V3},j3={tokenize:G3};function W3(e){let t=-1,n;for(;++t-1&&(a[0]=a[0].slice(r)),o>0&&a.push(e[i].slice(0,o))),a}function v4(e,t){let n=-1;const r=[];let i;for(;++n13&&n<32||n>126&&n<160||n>55295&&n<57344||n>64975&&n<65008||(n&65535)===65535||(n&65535)===65534||n>1114111?"\uFFFD":String.fromCharCode(n)}const _4=/\\([!-/:-@[-`{-~])|&(#(?:\d{1,7}|x[\da-f]{1,6})|[\da-z]{1,31});/gi;function N4(e){return e.replace(_4,D4)}function D4(e,t,n){if(t)return t;if(n.charCodeAt(0)===35){const i=n.charCodeAt(1),o=i===120||i===88;return hS(n.slice(o?2:1),o?16:10)}return Am(n)||e}const Pp={}.hasOwnProperty,R4=function(e,t,n){return typeof t!="string"&&(n=t,t=void 0),F4(n)(T4(P4(n).document().write(I4()(e,t,!0))))};function F4(e={}){const t=mS({transforms:[],canContainEols:["emphasis","fragment","heading","paragraph","strong"],enter:{autolink:s(Kr),autolinkProtocol:T,autolinkEmail:T,atxHeading:s(Vo),blockQuote:s(rf),characterEscape:T,characterReference:T,codeFenced:s($o),codeFencedFenceInfo:u,codeFencedFenceMeta:u,codeIndented:s($o,u),codeText:s(of,u),codeTextData:T,data:T,codeFlowValue:T,definition:s(af),definitionDestinationString:u,definitionLabelString:u,definitionTitleString:u,emphasis:s(ss),hardBreakEscape:s(us),hardBreakTrailing:s(us),htmlFlow:s(cs,u),htmlFlowData:T,htmlText:s(cs,u),htmlTextData:T,image:s(Xn),label:u,link:s(Kr),listItem:s(fs),listItemValue:g,listOrdered:s(Go,h),listUnordered:s(Go),paragraph:s(Jo),reference:he,referenceString:u,resourceDestinationString:u,resourceTitleString:u,setextHeading:s(Vo),strong:s(ds),thematicBreak:s(hs)},exit:{atxHeading:f(),atxHeadingSequence:E,autolink:f(),autolinkEmail:qr,autolinkProtocol:gn,blockQuote:f(),characterEscapeValue:N,characterReferenceMarkerHexadecimal:Ee,characterReferenceMarkerNumeric:Ee,characterReferenceValue:We,codeFenced:f(S),codeFencedFence:y,codeFencedFenceInfo:v,codeFencedFenceMeta:m,codeFlowValue:N,codeIndented:f(k),codeText:f(te),codeTextData:N,data:N,definition:f(),definitionDestinationString:O,definitionLabelString:_,definitionTitleString:w,emphasis:f(),hardBreakEscape:f(K),hardBreakTrailing:f(K),htmlFlow:f(V),htmlFlowData:N,htmlText:f(le),htmlTextData:N,image:f(q),label:A,labelText:x,lineEnding:B,link:f(se),listItem:f(),listOrdered:f(),listUnordered:f(),paragraph:f(),referenceString:be,resourceDestinationString:X,resourceTitleString:fe,resource:pe,setextHeading:f(I),setextHeadingLineSequence:P,setextHeadingText:C,strong:f(),thematicBreak:f()}},e.mdastExtensions||[]),n={};return r;function r(L){let Y={type:"root",children:[]};const oe=[Y],Ce=[],Xt=[],Qo={stack:oe,tokenStack:Ce,config:t,enter:c,exit:d,buffer:u,resume:p,setData:o,getData:a};let Te=-1;for(;++Te0){const it=Ce[Ce.length-1];(it[1]||Ry).call(Qo,void 0,it[0])}for(Y.position={start:l(L.length>0?L[0][1].start:{line:1,column:1,offset:0}),end:l(L.length>0?L[L.length-2][1].end:{line:1,column:1,offset:0})},Te=-1;++Te{const r=this.data("settings");return R4(n,Object.assign({},r,e,{extensions:this.data("micromarkExtensions")||[],mdastExtensions:this.data("fromMarkdownExtensions")||[]}))}})}var et=function(e,t,n){var r={type:String(e)};return n==null&&(typeof t=="string"||Array.isArray(t))?n=t:Object.assign(r,t),Array.isArray(n)?r.children=n:n!=null&&(r.value=String(n)),r};const tu={}.hasOwnProperty;function B4(e,t){const n=t.data||{};return"value"in t&&!(tu.call(n,"hName")||tu.call(n,"hProperties")||tu.call(n,"hChildren"))?e.augment(t,et("text",t.value)):e(t,"div",yt(e,t))}function gS(e,t,n){const r=t&&t.type;let i;if(!r)throw new Error("Expected node, got `"+t+"`");return tu.call(e.handlers,r)?i=e.handlers[r]:e.passThrough&&e.passThrough.includes(r)?i=U4:i=e.unknownHandler,(typeof i=="function"?i:B4)(e,t,n)}function U4(e,t){return"children"in t?Q(U({},t),{children:yt(e,t)}):t}function yt(e,t){const n=[];if("children"in t){const r=t.children;let i=-1;for(;++i":""))+")"})),d;function d(){let p=[],h,g,v;if((!t||i(l,s,u[u.length-1]||null))&&(p=G4(n(l,u)),p[0]===Fy))return p;if(l.children&&p[0]!==$4)for(g=(r?l.children.length:-1)+o,v=u.concat(l);g>-1&&g-1?r.offset:null}}}function J4(e){return!e||!e.position||!e.position.start||!e.position.start.line||!e.position.start.column||!e.position.end||!e.position.end.line||!e.position.end.column}const Ly={}.hasOwnProperty;function Q4(e){const t=Object.create(null);if(!e||!e.type)throw new Error("mdast-util-definitions expected node");return yS(e,"definition",r=>{const i=My(r.identifier);i&&!Ly.call(t,i)&&(t[i]=r)}),n;function n(r){const i=My(r);return i&&Ly.call(t,i)?t[i]:null}}function My(e){return String(e||"").toUpperCase()}const X4={'"':"quot","&":"amp","<":"lt",">":"gt"};function q4(e){return e.replace(/["&<>]/g,t);function t(n){return"&"+X4[n]+";"}}function xS(e,t){const n=q4(K4(e||""));if(!t)return n;const r=n.indexOf(":"),i=n.indexOf("?"),o=n.indexOf("#"),a=n.indexOf("/");return r<0||a>-1&&r>a||i>-1&&r>i||o>-1&&r>o||t.test(n.slice(0,r))?n:""}function K4(e){const t=[];let n=-1,r=0,i=0;for(;++n55295&&o<57344){const l=e.charCodeAt(n+1);o<56320&&l>56319&&l<57344?(a=String.fromCharCode(o,l),i=1):a="\uFFFD"}else a=String.fromCharCode(o);a&&(t.push(e.slice(r,n),encodeURIComponent(a)),r=n+i+1,a=""),i&&(n+=i,i=0)}return t.join("")+e.slice(r)}function ir(e,t){const n=[];let r=-1;for(t&&n.push(et("text",` -`));++r0&&n.push(et("text",` -`)),n}function Z4(e){let t=-1;const n=[];for(;++t1?"-"+l:""),dataFootnoteBackref:!0,className:["data-footnote-backref"],ariaLabel:e.footnoteBackLabel},children:[{type:"text",value:"\u21A9"}]};l>1&&f.children.push({type:"element",tagName:"sup",children:[{type:"text",value:String(l)}]}),s.length>0&&s.push({type:"text",value:" "}),s.push(f)}const u=i[i.length-1];if(u&&u.type==="element"&&u.tagName==="p"){const f=u.children[u.children.length-1];f&&f.type==="text"?f.value+=" ":u.children.push({type:"text",value:" "}),u.children.push(...s)}else i.push(...s);const c={type:"element",tagName:"li",properties:{id:e.clobberPrefix+"fn-"+a},children:ir(i,!0)};r.position&&(c.position=r.position),n.push(c)}return n.length===0?null:{type:"element",tagName:"section",properties:{dataFootnotes:!0,className:["footnotes"]},children:[{type:"element",tagName:e.footnoteLabelTagName,properties:JSON.parse(JSON.stringify(e.footnoteLabelProperties)),children:[et("text",e.footnoteLabel)]},{type:"text",value:` -`},{type:"element",tagName:"ol",properties:{},children:ir(n,!0)},{type:"text",value:` -`}]}}function eI(e,t){return e(t,"blockquote",ir(yt(e,t),!0))}function tI(e,t){return[e(t,"br"),et("text",` -`)]}function nI(e,t){const n=t.value?t.value+` -`:"",r=t.lang&&t.lang.match(/^[^ \t]+(?=[ \t]|$)/),i={};r&&(i.className=["language-"+r]);const o=e(t,"code",i,[et("text",n)]);return t.meta&&(o.data={meta:t.meta}),e(t.position,"pre",[o])}function rI(e,t){return e(t,"del",yt(e,t))}function iI(e,t){return e(t,"em",yt(e,t))}function ES(e,t){const n=String(t.identifier),r=xS(n.toLowerCase()),i=e.footnoteOrder.indexOf(n);let o;i===-1?(e.footnoteOrder.push(n),e.footnoteCounts[n]=1,o=e.footnoteOrder.length):(e.footnoteCounts[n]++,o=i+1);const a=e.footnoteCounts[n];return e(t,"sup",[e(t.position,"a",{href:"#"+e.clobberPrefix+"fn-"+r,id:e.clobberPrefix+"fnref-"+r+(a>1?"-"+a:""),dataFootnoteRef:!0,ariaDescribedBy:"footnote-label"},[et("text",String(o))])])}function oI(e,t){const n=e.footnoteById;let r=1;for(;r in n;)r++;const i=String(r);return n[i]={type:"footnoteDefinition",identifier:i,children:[{type:"paragraph",children:t.children}],position:t.position},ES(e,{type:"footnoteReference",identifier:i,position:t.position})}function aI(e,t){return e(t,"h"+t.depth,yt(e,t))}function lI(e,t){return e.dangerous?e.augment(t,et("raw",t.value)):null}var By={};function sI(e){var t,n,r=By[e];if(r)return r;for(r=By[e]=[],t=0;t<128;t++)n=String.fromCharCode(t),/^[0-9a-z]$/i.test(n)?r.push(n):r.push("%"+("0"+t.toString(16).toUpperCase()).slice(-2));for(t=0;t=55296&&o<=57343){if(o>=55296&&o<=56319&&r+1=56320&&a<=57343)){s+=encodeURIComponent(e[r]+e[r+1]),r++;continue}s+="%EF%BF%BD";continue}s+=encodeURIComponent(e[r])}return s}Bc.defaultChars=";/?:@&=+$,-_.!~*'()#";Bc.componentChars="-_.!~*'()";var Uc=Bc;function CS(e,t){const n=t.referenceType;let r="]";if(n==="collapsed"?r+="[]":n==="full"&&(r+="["+(t.label||t.identifier)+"]"),t.type==="imageReference")return et("text","!["+t.alt+r);const i=yt(e,t),o=i[0];o&&o.type==="text"?o.value="["+o.value:i.unshift(et("text","["));const a=i[i.length-1];return a&&a.type==="text"?a.value+=r:i.push(et("text",r)),i}function uI(e,t){const n=e.definition(t.identifier);if(!n)return CS(e,t);const r={src:Uc(n.url||""),alt:t.alt};return n.title!==null&&n.title!==void 0&&(r.title=n.title),e(t,"img",r)}function cI(e,t){const n={src:Uc(t.url),alt:t.alt};return t.title!==null&&t.title!==void 0&&(n.title=t.title),e(t,"img",n)}function fI(e,t){return e(t,"code",[et("text",t.value.replace(/\r?\n|\r/g," "))])}function dI(e,t){const n=e.definition(t.identifier);if(!n)return CS(e,t);const r={href:Uc(n.url||"")};return n.title!==null&&n.title!==void 0&&(r.title=n.title),e(t,"a",r,yt(e,t))}function pI(e,t){const n={href:Uc(t.url)};return t.title!==null&&t.title!==void 0&&(n.title=t.title),e(t,"a",n,yt(e,t))}function hI(e,t,n){const r=yt(e,t),i=n?mI(n):AS(t),o={},a=[];if(typeof t.checked=="boolean"){let u;r[0]&&r[0].type==="element"&&r[0].tagName==="p"?u=r[0]:(u=e(null,"p",[]),r.unshift(u)),u.children.length>0&&u.children.unshift(et("text"," ")),u.children.unshift(e(null,"input",{type:"checkbox",checked:t.checked,disabled:!0})),o.className=["task-list-item"]}let l=-1;for(;++l1:t}function gI(e,t){const n={},r=t.ordered?"ol":"ul",i=yt(e,t);let o=-1;for(typeof t.start=="number"&&t.start!==1&&(n.start=t.start);++o0,!0),r[0]),i=r.index+r[0].length,r=n.exec(t);return o.push(jy(t.slice(i),i>0,!1)),o.join("")}function jy(e,t,n){let r=0,i=e.length;if(t){let o=e.codePointAt(r);for(;o===Uy||o===zy;)r++,o=e.codePointAt(r)}if(n){let o=e.codePointAt(i-1);for(;o===Uy||o===zy;)i--,o=e.codePointAt(i-1)}return i>r?e.slice(r,i):""}function xI(e,t){return e.augment(t,et("text",SI(String(t.value))))}function EI(e,t){return e(t,"hr")}const CI={blockquote:eI,break:tI,code:nI,delete:rI,emphasis:iI,footnoteReference:ES,footnote:oI,heading:aI,html:lI,imageReference:uI,image:cI,inlineCode:fI,linkReference:dI,link:pI,listItem:hI,list:gI,paragraph:vI,root:yI,strong:wI,table:bI,text:xI,thematicBreak:EI,toml:Ps,yaml:Ps,definition:Ps,footnoteDefinition:Ps};function Ps(){return null}const AI={}.hasOwnProperty;function kI(e,t){const n=t||{},r=n.allowDangerousHtml||!1,i={};return a.dangerous=r,a.clobberPrefix=n.clobberPrefix===void 0||n.clobberPrefix===null?"user-content-":n.clobberPrefix,a.footnoteLabel=n.footnoteLabel||"Footnotes",a.footnoteLabelTagName=n.footnoteLabelTagName||"h2",a.footnoteLabelProperties=n.footnoteLabelProperties||{id:"footnote-label",className:["sr-only"]},a.footnoteBackLabel=n.footnoteBackLabel||"Back to content",a.definition=Q4(e),a.footnoteById=i,a.footnoteOrder=[],a.footnoteCounts={},a.augment=o,a.handlers=U(U({},CI),n.handlers),a.unknownHandler=n.unknownHandler,a.passThrough=n.passThrough,yS(e,"footnoteDefinition",l=>{const s=String(l.identifier).toUpperCase();AI.call(i,s)||(i[s]=l)}),a;function o(l,s){if(l&&"data"in l&&l.data){const u=l.data;u.hName&&(s.type!=="element"&&(s={type:"element",tagName:"",properties:{},children:[]}),s.tagName=u.hName),s.type==="element"&&u.hProperties&&(s.properties=U(U({},s.properties),u.hProperties)),"children"in s&&s.children&&u.hChildren&&(s.children=u.hChildren)}if(l){const u="type"in l?l:{position:l};J4(u)||(s.position={start:wS(u),end:bS(u)})}return s}function a(l,s,u,c){return Array.isArray(u)&&(c=u,u={}),o(l,{type:"element",tagName:s,properties:u||{},children:c||[]})}}function kS(e,t){const n=kI(e,t),r=gS(n,e,null),i=Z4(n);return i&&r.children.push(et("text",` -`),i),Array.isArray(r)?{type:"root",children:r}:r}const OI=function(e,t){return e&&"run"in e?II(e,t):TI(e||t)},PI=OI;function II(e,t){return(n,r,i)=>{e.run(kS(n,t),r,o=>{i(o)})}}function TI(e){return t=>kS(t,e)}class Xl{constructor(t,n,r){this.property=t,this.normal=n,r&&(this.space=r)}}Xl.prototype.property={};Xl.prototype.normal={};Xl.prototype.space=null;function OS(e,t){const n={},r={};let i=-1;for(;++i4&&n.slice(0,4)==="data"&&FI.test(t)){if(t.charAt(4)==="-"){const o=t.slice(5).replace(Yy,UI);r="data"+o.charAt(0).toUpperCase()+o.slice(1)}else{const o=t.slice(4);if(!Yy.test(o)){let a=o.replace(LI,BI);a.charAt(0)!=="-"&&(a="-"+a),t="data"+a}}i=Om}return new i(r,t)}function BI(e){return"-"+e.toLowerCase()}function UI(e){return e.charAt(1).toUpperCase()}const Hy={classId:"classID",dataType:"datatype",itemId:"itemID",strokeDashArray:"strokeDasharray",strokeDashOffset:"strokeDashoffset",strokeLineCap:"strokeLinecap",strokeLineJoin:"strokeLinejoin",strokeMiterLimit:"strokeMiterlimit",typeOf:"typeof",xLinkActuate:"xlinkActuate",xLinkArcRole:"xlinkArcrole",xLinkHref:"xlinkHref",xLinkRole:"xlinkRole",xLinkShow:"xlinkShow",xLinkTitle:"xlinkTitle",xLinkType:"xlinkType",xmlnsXLink:"xmlnsXlink"},zI=OS([TS,IS,DS,RS,DI],"html"),jI=OS([TS,IS,DS,RS,RI],"svg"),FS=function(e){if(e==null)return $I;if(typeof e=="string")return HI(e);if(typeof e=="object")return Array.isArray(e)?WI(e):YI(e);if(typeof e=="function")return zc(e);throw new Error("Expected function, string, or object as test")};function WI(e){const t=[];let n=-1;for(;++n":""))+")"})),d;function d(){let p=[],h,g,v;if((!t||i(l,s,u[u.length-1]||null))&&(p=QI(n(l,u)),p[0]===$y))return p;if(l.children&&p[0]!==GI)for(g=(r?l.children.length:-1)+o,v=u.concat(l);g>-1&&g{XI(t,"element",(n,r,i)=>{const o=i;let a;if(e.allowedElements?a=!e.allowedElements.includes(n.tagName):e.disallowedElements&&(a=e.disallowedElements.includes(n.tagName)),!a&&e.allowElement&&typeof r=="number"&&(a=!e.allowElement(n,r,o)),a&&typeof r=="number")return e.unwrapDisallowed&&n.children?o.children.splice(r,1,...n.children):o.children.splice(r,1),r})}}var LS={exports:{}},xe={};/** - * @license React - * react-is.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Pm=Symbol.for("react.element"),Im=Symbol.for("react.portal"),jc=Symbol.for("react.fragment"),Wc=Symbol.for("react.strict_mode"),Yc=Symbol.for("react.profiler"),Hc=Symbol.for("react.provider"),$c=Symbol.for("react.context"),KI=Symbol.for("react.server_context"),Vc=Symbol.for("react.forward_ref"),Gc=Symbol.for("react.suspense"),Jc=Symbol.for("react.suspense_list"),Qc=Symbol.for("react.memo"),Xc=Symbol.for("react.lazy"),ZI=Symbol.for("react.offscreen"),MS;MS=Symbol.for("react.module.reference");function mn(e){if(typeof e=="object"&&e!==null){var t=e.$$typeof;switch(t){case Pm:switch(e=e.type,e){case jc:case Yc:case Wc:case Gc:case Jc:return e;default:switch(e=e&&e.$$typeof,e){case KI:case $c:case Vc:case Xc:case Qc:case Hc:return e;default:return t}}case Im:return t}}}xe.ContextConsumer=$c;xe.ContextProvider=Hc;xe.Element=Pm;xe.ForwardRef=Vc;xe.Fragment=jc;xe.Lazy=Xc;xe.Memo=Qc;xe.Portal=Im;xe.Profiler=Yc;xe.StrictMode=Wc;xe.Suspense=Gc;xe.SuspenseList=Jc;xe.isAsyncMode=function(){return!1};xe.isConcurrentMode=function(){return!1};xe.isContextConsumer=function(e){return mn(e)===$c};xe.isContextProvider=function(e){return mn(e)===Hc};xe.isElement=function(e){return typeof e=="object"&&e!==null&&e.$$typeof===Pm};xe.isForwardRef=function(e){return mn(e)===Vc};xe.isFragment=function(e){return mn(e)===jc};xe.isLazy=function(e){return mn(e)===Xc};xe.isMemo=function(e){return mn(e)===Qc};xe.isPortal=function(e){return mn(e)===Im};xe.isProfiler=function(e){return mn(e)===Yc};xe.isStrictMode=function(e){return mn(e)===Wc};xe.isSuspense=function(e){return mn(e)===Gc};xe.isSuspenseList=function(e){return mn(e)===Jc};xe.isValidElementType=function(e){return typeof e=="string"||typeof e=="function"||e===jc||e===Yc||e===Wc||e===Gc||e===Jc||e===ZI||typeof e=="object"&&e!==null&&(e.$$typeof===Xc||e.$$typeof===Qc||e.$$typeof===Hc||e.$$typeof===$c||e.$$typeof===Vc||e.$$typeof===MS||e.getModuleId!==void 0)};xe.typeOf=mn;(function(e){e.exports=xe})(LS);const eT=Qp(LS.exports);function tT(e){var t=e&&typeof e=="object"&&e.type==="text"?e.value||"":e;return typeof t=="string"&&t.replace(/[ \t\n\f\r]/g,"")===""}function nT(e){return e.join(" ").trim()}function rT(e,t){var n=t||{};return e[e.length-1]===""&&(e=e.concat("")),e.join((n.padRight?" ":"")+","+(n.padLeft===!1?"":" ")).trim()}var Vy=/\/\*[^*]*\*+([^/*][^*]*\*+)*\//g,iT=/\n/g,oT=/^\s*/,aT=/^(\*?[-#/*\\\w]+(\[[0-9a-z_-]+\])?)\s*/,lT=/^:\s*/,sT=/^((?:'(?:\\'|.)*?'|"(?:\\"|.)*?"|\([^)]*?\)|[^};])+)/,uT=/^[;\s]*/,cT=/^\s+|\s+$/g,fT=` -`,Gy="/",Jy="*",li="",dT="comment",pT="declaration",hT=function(e,t){if(typeof e!="string")throw new TypeError("First argument must be a string");if(!e)return[];t=t||{};var n=1,r=1;function i(h){var g=h.match(iT);g&&(n+=g.length);var v=h.lastIndexOf(fT);r=~v?h.length-v:r+h.length}function o(){var h={line:n,column:r};return function(g){return g.position=new a(h),u(),g}}function a(h){this.start=h,this.end={line:n,column:r},this.source=t.source}a.prototype.content=e;function l(h){var g=new Error(t.source+":"+n+":"+r+": "+h);if(g.reason=h,g.filename=t.source,g.line=n,g.column=r,g.source=e,!t.silent)throw g}function s(h){var g=h.exec(e);if(!!g){var v=g[0];return i(v),e=e.slice(v.length),g}}function u(){s(oT)}function c(h){var g;for(h=h||[];g=f();)g!==!1&&h.push(g);return h}function f(){var h=o();if(!(Gy!=e.charAt(0)||Jy!=e.charAt(1))){for(var g=2;li!=e.charAt(g)&&(Jy!=e.charAt(g)||Gy!=e.charAt(g+1));)++g;if(g+=2,li===e.charAt(g-1))return l("End of comment missing");var v=e.slice(2,g-2);return r+=2,i(v),e=e.slice(g),r+=2,h({type:dT,comment:v})}}function d(){var h=o(),g=s(aT);if(!!g){if(f(),!s(lT))return l("property missing ':'");var v=s(sT),m=h({type:pT,property:Qy(g[0].replace(Vy,li)),value:v?Qy(v[0].replace(Vy,li)):li});return s(uT),m}}function p(){var h=[];c(h);for(var g;g=d();)g!==!1&&(h.push(g),c(h));return h}return u(),p()};function Qy(e){return e?e.replace(cT,li):li}var mT=hT;function gT(e,t){var n=null;if(!e||typeof e!="string")return n;for(var r,i=mT(e),o=typeof t=="function",a,l,s=0,u=i.length;s0?R.createElement(d,l,c):R.createElement(d,l)}function bT(e){let t=-1;for(;++tString(t)).join("")}const Xy={}.hasOwnProperty,AT="https://github.com/remarkjs/react-markdown/blob/main/changelog.md",Is={plugins:{to:"plugins",id:"change-plugins-to-remarkplugins"},renderers:{to:"components",id:"change-renderers-to-components"},astPlugins:{id:"remove-buggy-html-in-markdown-parser"},allowDangerousHtml:{id:"remove-buggy-html-in-markdown-parser"},escapeHtml:{id:"remove-buggy-html-in-markdown-parser"},source:{to:"children",id:"change-source-to-children"},allowNode:{to:"allowElement",id:"replace-allownode-allowedtypes-and-disallowedtypes"},allowedTypes:{to:"allowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},disallowedTypes:{to:"disallowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},includeNodeIndex:{to:"includeElementIndex",id:"change-includenodeindex-to-includeelementindex"}};function Tm(e){for(const o in Is)if(Xy.call(Is,o)&&Xy.call(e,o)){const a=Is[o];console.warn(`[react-markdown] Warning: please ${a.to?`use \`${a.to}\` instead of`:"remove"} \`${o}\` (see <${AT}#${a.id}> for more info)`),delete Is[o]}const t=RP().use(M4).use(e.remarkPlugins||[]).use(PI,Q(U({},e.remarkRehypeOptions),{allowDangerousHtml:!0})).use(e.rehypePlugins||[]).use(qI,e),n=new bP;typeof e.children=="string"?n.value=e.children:e.children!==void 0&&e.children!==null&&console.warn(`[react-markdown] Warning: please pass a string as \`children\` (not: \`${e.children}\`)`);const r=t.runSync(t.parse(n),n);if(r.type!=="root")throw new TypeError("Expected a `root` node");let i=b(Ke,{children:BS({options:e,schema:zI,listDepth:0},r)});return e.className&&(i=b("div",{className:e.className,children:i})),i}Tm.defaultProps={transformLinkUri:uP};Tm.propTypes={children:F.exports.string,className:F.exports.string,allowElement:F.exports.func,allowedElements:F.exports.arrayOf(F.exports.string),disallowedElements:F.exports.arrayOf(F.exports.string),unwrapDisallowed:F.exports.bool,remarkPlugins:F.exports.arrayOf(F.exports.oneOfType([F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.oneOfType([F.exports.bool,F.exports.string,F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.any)]))])),rehypePlugins:F.exports.arrayOf(F.exports.oneOfType([F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.oneOfType([F.exports.bool,F.exports.string,F.exports.object,F.exports.func,F.exports.arrayOf(F.exports.any)]))])),sourcePos:F.exports.bool,rawSourcePos:F.exports.bool,skipHtml:F.exports.bool,includeElementIndex:F.exports.bool,transformLinkUri:F.exports.oneOfType([F.exports.func,F.exports.bool]),linkTarget:F.exports.oneOfType([F.exports.func,F.exports.string]),transformImageUri:F.exports.func,components:F.exports.object};var qy=function(t){return t.reduce(function(n,r){var i=r[0],o=r[1];return n[i]=o,n},{})},Ky=typeof window!="undefined"&&window.document&&window.document.createElement?H.exports.useLayoutEffect:H.exports.useEffect,Lt="top",sn="bottom",un="right",Mt="left",_m="auto",ql=[Lt,sn,un,Mt],bo="start",Cl="end",kT="clippingParents",US="viewport",ca="popper",OT="reference",Zy=ql.reduce(function(e,t){return e.concat([t+"-"+bo,t+"-"+Cl])},[]),zS=[].concat(ql,[_m]).reduce(function(e,t){return e.concat([t,t+"-"+bo,t+"-"+Cl])},[]),PT="beforeRead",IT="read",TT="afterRead",_T="beforeMain",NT="main",DT="afterMain",RT="beforeWrite",FT="write",LT="afterWrite",MT=[PT,IT,TT,_T,NT,DT,RT,FT,LT];function Vn(e){return e?(e.nodeName||"").toLowerCase():null}function Pn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function So(e){var t=Pn(e).Element;return e instanceof t||e instanceof Element}function on(e){var t=Pn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function jS(e){if(typeof ShadowRoot=="undefined")return!1;var t=Pn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function BT(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},i=t.attributes[n]||{},o=t.elements[n];!on(o)||!Vn(o)||(Object.assign(o.style,r),Object.keys(i).forEach(function(a){var l=i[a];l===!1?o.removeAttribute(a):o.setAttribute(a,l===!0?"":l)}))})}function UT(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var i=t.elements[r],o=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),l=a.reduce(function(s,u){return s[u]="",s},{});!on(i)||!Vn(i)||(Object.assign(i.style,l),Object.keys(o).forEach(function(s){i.removeAttribute(s)}))})}}const zT={name:"applyStyles",enabled:!0,phase:"write",fn:BT,effect:UT,requires:["computeStyles"]};function Wn(e){return e.split("-")[0]}var hi=Math.max,Yu=Math.min,xo=Math.round;function Eo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,i=1;if(on(e)&&t){var o=e.offsetHeight,a=e.offsetWidth;a>0&&(r=xo(n.width)/a||1),o>0&&(i=xo(n.height)/o||1)}return{width:n.width/r,height:n.height/i,top:n.top/i,right:n.right/r,bottom:n.bottom/i,left:n.left/r,x:n.left/r,y:n.top/i}}function Nm(e){var t=Eo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function WS(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&jS(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function cr(e){return Pn(e).getComputedStyle(e)}function jT(e){return["table","td","th"].indexOf(Vn(e))>=0}function Xr(e){return((So(e)?e.ownerDocument:e.document)||window.document).documentElement}function qc(e){return Vn(e)==="html"?e:e.assignedSlot||e.parentNode||(jS(e)?e.host:null)||Xr(e)}function e1(e){return!on(e)||cr(e).position==="fixed"?null:e.offsetParent}function WT(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&on(e)){var r=cr(e);if(r.position==="fixed")return null}for(var i=qc(e);on(i)&&["html","body"].indexOf(Vn(i))<0;){var o=cr(i);if(o.transform!=="none"||o.perspective!=="none"||o.contain==="paint"||["transform","perspective"].indexOf(o.willChange)!==-1||t&&o.willChange==="filter"||t&&o.filter&&o.filter!=="none")return i;i=i.parentNode}return null}function Kl(e){for(var t=Pn(e),n=e1(e);n&&jT(n)&&cr(n).position==="static";)n=e1(n);return n&&(Vn(n)==="html"||Vn(n)==="body"&&cr(n).position==="static")?t:n||WT(e)||t}function Dm(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function Ja(e,t,n){return hi(e,Yu(t,n))}function YT(e,t,n){var r=Ja(e,t,n);return r>n?n:r}function YS(){return{top:0,right:0,bottom:0,left:0}}function HS(e){return Object.assign({},YS(),e)}function $S(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var HT=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,HS(typeof t!="number"?t:$S(t,ql))};function $T(e){var t,n=e.state,r=e.name,i=e.options,o=n.elements.arrow,a=n.modifiersData.popperOffsets,l=Wn(n.placement),s=Dm(l),u=[Mt,un].indexOf(l)>=0,c=u?"height":"width";if(!(!o||!a)){var f=HT(i.padding,n),d=Nm(o),p=s==="y"?Lt:Mt,h=s==="y"?sn:un,g=n.rects.reference[c]+n.rects.reference[s]-a[s]-n.rects.popper[c],v=a[s]-n.rects.reference[s],m=Kl(o),y=m?s==="y"?m.clientHeight||0:m.clientWidth||0:0,S=g/2-v/2,k=f[p],_=y-d[c]-f[h],w=y/2-d[c]/2+S,O=Ja(k,w,_),E=s;n.modifiersData[r]=(t={},t[E]=O,t.centerOffset=O-w,t)}}function VT(e){var t=e.state,n=e.options,r=n.element,i=r===void 0?"[data-popper-arrow]":r;i!=null&&(typeof i=="string"&&(i=t.elements.popper.querySelector(i),!i)||!WS(t.elements.popper,i)||(t.elements.arrow=i))}const GT={name:"arrow",enabled:!0,phase:"main",fn:$T,effect:VT,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Co(e){return e.split("-")[1]}var JT={top:"auto",right:"auto",bottom:"auto",left:"auto"};function QT(e){var t=e.x,n=e.y,r=window,i=r.devicePixelRatio||1;return{x:xo(t*i)/i||0,y:xo(n*i)/i||0}}function t1(e){var t,n=e.popper,r=e.popperRect,i=e.placement,o=e.variation,a=e.offsets,l=e.position,s=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,h=a.y,g=h===void 0?0:h,v=typeof c=="function"?c({x:p,y:g}):{x:p,y:g};p=v.x,g=v.y;var m=a.hasOwnProperty("x"),y=a.hasOwnProperty("y"),S=Mt,k=Lt,_=window;if(u){var w=Kl(n),O="clientHeight",E="clientWidth";if(w===Pn(n)&&(w=Xr(n),cr(w).position!=="static"&&l==="absolute"&&(O="scrollHeight",E="scrollWidth")),w=w,i===Lt||(i===Mt||i===un)&&o===Cl){k=sn;var C=f&&_.visualViewport?_.visualViewport.height:w[O];g-=C-r.height,g*=s?1:-1}if(i===Mt||(i===Lt||i===sn)&&o===Cl){S=un;var P=f&&_.visualViewport?_.visualViewport.width:w[E];p-=P-r.width,p*=s?1:-1}}var I=Object.assign({position:l},u&&JT),T=c===!0?QT({x:p,y:g}):{x:p,y:g};if(p=T.x,g=T.y,s){var N;return Object.assign({},I,(N={},N[k]=y?"0":"",N[S]=m?"0":"",N.transform=(_.devicePixelRatio||1)<=1?"translate("+p+"px, "+g+"px)":"translate3d("+p+"px, "+g+"px, 0)",N))}return Object.assign({},I,(t={},t[k]=y?g+"px":"",t[S]=m?p+"px":"",t.transform="",t))}function XT(e){var t=e.state,n=e.options,r=n.gpuAcceleration,i=r===void 0?!0:r,o=n.adaptive,a=o===void 0?!0:o,l=n.roundOffsets,s=l===void 0?!0:l,u={placement:Wn(t.placement),variation:Co(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:i,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,t1(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:s})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,t1(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:s})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const qT={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:XT,data:{}};var Ts={passive:!0};function KT(e){var t=e.state,n=e.instance,r=e.options,i=r.scroll,o=i===void 0?!0:i,a=r.resize,l=a===void 0?!0:a,s=Pn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return o&&u.forEach(function(c){c.addEventListener("scroll",n.update,Ts)}),l&&s.addEventListener("resize",n.update,Ts),function(){o&&u.forEach(function(c){c.removeEventListener("scroll",n.update,Ts)}),l&&s.removeEventListener("resize",n.update,Ts)}}const ZT={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:KT,data:{}};var e_={left:"right",right:"left",bottom:"top",top:"bottom"};function nu(e){return e.replace(/left|right|bottom|top/g,function(t){return e_[t]})}var t_={start:"end",end:"start"};function n1(e){return e.replace(/start|end/g,function(t){return t_[t]})}function Rm(e){var t=Pn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Fm(e){return Eo(Xr(e)).left+Rm(e).scrollLeft}function n_(e){var t=Pn(e),n=Xr(e),r=t.visualViewport,i=n.clientWidth,o=n.clientHeight,a=0,l=0;return r&&(i=r.width,o=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,l=r.offsetTop)),{width:i,height:o,x:a+Fm(e),y:l}}function r_(e){var t,n=Xr(e),r=Rm(e),i=(t=e.ownerDocument)==null?void 0:t.body,o=hi(n.scrollWidth,n.clientWidth,i?i.scrollWidth:0,i?i.clientWidth:0),a=hi(n.scrollHeight,n.clientHeight,i?i.scrollHeight:0,i?i.clientHeight:0),l=-r.scrollLeft+Fm(e),s=-r.scrollTop;return cr(i||n).direction==="rtl"&&(l+=hi(n.clientWidth,i?i.clientWidth:0)-o),{width:o,height:a,x:l,y:s}}function Lm(e){var t=cr(e),n=t.overflow,r=t.overflowX,i=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+i+r)}function VS(e){return["html","body","#document"].indexOf(Vn(e))>=0?e.ownerDocument.body:on(e)&&Lm(e)?e:VS(qc(e))}function Qa(e,t){var n;t===void 0&&(t=[]);var r=VS(e),i=r===((n=e.ownerDocument)==null?void 0:n.body),o=Pn(r),a=i?[o].concat(o.visualViewport||[],Lm(r)?r:[]):r,l=t.concat(a);return i?l:l.concat(Qa(qc(a)))}function Np(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function i_(e){var t=Eo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function r1(e,t){return t===US?Np(n_(e)):So(t)?i_(t):Np(r_(Xr(e)))}function o_(e){var t=Qa(qc(e)),n=["absolute","fixed"].indexOf(cr(e).position)>=0,r=n&&on(e)?Kl(e):e;return So(r)?t.filter(function(i){return So(i)&&WS(i,r)&&Vn(i)!=="body"}):[]}function a_(e,t,n){var r=t==="clippingParents"?o_(e):[].concat(t),i=[].concat(r,[n]),o=i[0],a=i.reduce(function(l,s){var u=r1(e,s);return l.top=hi(u.top,l.top),l.right=Yu(u.right,l.right),l.bottom=Yu(u.bottom,l.bottom),l.left=hi(u.left,l.left),l},r1(e,o));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function GS(e){var t=e.reference,n=e.element,r=e.placement,i=r?Wn(r):null,o=r?Co(r):null,a=t.x+t.width/2-n.width/2,l=t.y+t.height/2-n.height/2,s;switch(i){case Lt:s={x:a,y:t.y-n.height};break;case sn:s={x:a,y:t.y+t.height};break;case un:s={x:t.x+t.width,y:l};break;case Mt:s={x:t.x-n.width,y:l};break;default:s={x:t.x,y:t.y}}var u=i?Dm(i):null;if(u!=null){var c=u==="y"?"height":"width";switch(o){case bo:s[u]=s[u]-(t[c]/2-n[c]/2);break;case Cl:s[u]=s[u]+(t[c]/2-n[c]/2);break}}return s}function Al(e,t){t===void 0&&(t={});var n=t,r=n.placement,i=r===void 0?e.placement:r,o=n.boundary,a=o===void 0?kT:o,l=n.rootBoundary,s=l===void 0?US:l,u=n.elementContext,c=u===void 0?ca:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,h=p===void 0?0:p,g=HS(typeof h!="number"?h:$S(h,ql)),v=c===ca?OT:ca,m=e.rects.popper,y=e.elements[d?v:c],S=a_(So(y)?y:y.contextElement||Xr(e.elements.popper),a,s),k=Eo(e.elements.reference),_=GS({reference:k,element:m,strategy:"absolute",placement:i}),w=Np(Object.assign({},m,_)),O=c===ca?w:k,E={top:S.top-O.top+g.top,bottom:O.bottom-S.bottom+g.bottom,left:S.left-O.left+g.left,right:O.right-S.right+g.right},C=e.modifiersData.offset;if(c===ca&&C){var P=C[i];Object.keys(E).forEach(function(I){var T=[un,sn].indexOf(I)>=0?1:-1,N=[Lt,sn].indexOf(I)>=0?"y":"x";E[I]+=P[N]*T})}return E}function l_(e,t){t===void 0&&(t={});var n=t,r=n.placement,i=n.boundary,o=n.rootBoundary,a=n.padding,l=n.flipVariations,s=n.allowedAutoPlacements,u=s===void 0?zS:s,c=Co(r),f=c?l?Zy:Zy.filter(function(h){return Co(h)===c}):ql,d=f.filter(function(h){return u.indexOf(h)>=0});d.length===0&&(d=f);var p=d.reduce(function(h,g){return h[g]=Al(e,{placement:g,boundary:i,rootBoundary:o,padding:a})[Wn(g)],h},{});return Object.keys(p).sort(function(h,g){return p[h]-p[g]})}function s_(e){if(Wn(e)===_m)return[];var t=nu(e);return[n1(e),t,n1(t)]}function u_(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var i=n.mainAxis,o=i===void 0?!0:i,a=n.altAxis,l=a===void 0?!0:a,s=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,h=p===void 0?!0:p,g=n.allowedAutoPlacements,v=t.options.placement,m=Wn(v),y=m===v,S=s||(y||!h?[nu(v)]:s_(v)),k=[v].concat(S).reduce(function(fe,pe){return fe.concat(Wn(pe)===_m?l_(t,{placement:pe,boundary:c,rootBoundary:f,padding:u,flipVariations:h,allowedAutoPlacements:g}):pe)},[]),_=t.rects.reference,w=t.rects.popper,O=new Map,E=!0,C=k[0],P=0;P=0,K=B?"width":"height",V=Al(t,{placement:I,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),le=B?N?un:Mt:N?sn:Lt;_[K]>w[K]&&(le=nu(le));var te=nu(le),se=[];if(o&&se.push(V[T]<=0),l&&se.push(V[le]<=0,V[te]<=0),se.every(function(fe){return fe})){C=I,E=!1;break}O.set(I,se)}if(E)for(var q=h?3:1,x=function(pe){var he=k.find(function(be){var Ee=O.get(be);if(Ee)return Ee.slice(0,pe).every(function(We){return We})});if(he)return C=he,"break"},A=q;A>0;A--){var X=x(A);if(X==="break")break}t.placement!==C&&(t.modifiersData[r]._skip=!0,t.placement=C,t.reset=!0)}}const c_={name:"flip",enabled:!0,phase:"main",fn:u_,requiresIfExists:["offset"],data:{_skip:!1}};function i1(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function o1(e){return[Lt,un,sn,Mt].some(function(t){return e[t]>=0})}function f_(e){var t=e.state,n=e.name,r=t.rects.reference,i=t.rects.popper,o=t.modifiersData.preventOverflow,a=Al(t,{elementContext:"reference"}),l=Al(t,{altBoundary:!0}),s=i1(a,r),u=i1(l,i,o),c=o1(s),f=o1(u);t.modifiersData[n]={referenceClippingOffsets:s,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const d_={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:f_};function p_(e,t,n){var r=Wn(e),i=[Mt,Lt].indexOf(r)>=0?-1:1,o=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=o[0],l=o[1];return a=a||0,l=(l||0)*i,[Mt,un].indexOf(r)>=0?{x:l,y:a}:{x:a,y:l}}function h_(e){var t=e.state,n=e.options,r=e.name,i=n.offset,o=i===void 0?[0,0]:i,a=zS.reduce(function(c,f){return c[f]=p_(f,t.rects,o),c},{}),l=a[t.placement],s=l.x,u=l.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=s,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const m_={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:h_};function g_(e){var t=e.state,n=e.name;t.modifiersData[n]=GS({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const v_={name:"popperOffsets",enabled:!0,phase:"read",fn:g_,data:{}};function y_(e){return e==="x"?"y":"x"}function w_(e){var t=e.state,n=e.options,r=e.name,i=n.mainAxis,o=i===void 0?!0:i,a=n.altAxis,l=a===void 0?!1:a,s=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,h=n.tetherOffset,g=h===void 0?0:h,v=Al(t,{boundary:s,rootBoundary:u,padding:f,altBoundary:c}),m=Wn(t.placement),y=Co(t.placement),S=!y,k=Dm(m),_=y_(k),w=t.modifiersData.popperOffsets,O=t.rects.reference,E=t.rects.popper,C=typeof g=="function"?g(Object.assign({},t.rects,{placement:t.placement})):g,P=typeof C=="number"?{mainAxis:C,altAxis:C}:Object.assign({mainAxis:0,altAxis:0},C),I=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,T={x:0,y:0};if(!!w){if(o){var N,B=k==="y"?Lt:Mt,K=k==="y"?sn:un,V=k==="y"?"height":"width",le=w[k],te=le+v[B],se=le-v[K],q=p?-E[V]/2:0,x=y===bo?O[V]:E[V],A=y===bo?-E[V]:-O[V],X=t.elements.arrow,fe=p&&X?Nm(X):{width:0,height:0},pe=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:YS(),he=pe[B],be=pe[K],Ee=Ja(0,O[V],fe[V]),We=S?O[V]/2-q-Ee-he-P.mainAxis:x-Ee-he-P.mainAxis,gn=S?-O[V]/2+q+Ee+be+P.mainAxis:A+Ee+be+P.mainAxis,qr=t.elements.arrow&&Kl(t.elements.arrow),rf=qr?k==="y"?qr.clientTop||0:qr.clientLeft||0:0,$o=(N=I==null?void 0:I[k])!=null?N:0,of=le+We-$o-rf,af=le+gn-$o,ss=Ja(p?Yu(te,of):te,le,p?hi(se,af):se);w[k]=ss,T[k]=ss-le}if(l){var Vo,us=k==="x"?Lt:Mt,cs=k==="x"?sn:un,Xn=w[_],Kr=_==="y"?"height":"width",Go=Xn+v[us],fs=Xn-v[cs],Jo=[Lt,Mt].indexOf(m)!==-1,ds=(Vo=I==null?void 0:I[_])!=null?Vo:0,ps=Jo?Go:Xn-O[Kr]-E[Kr]-ds+P.altAxis,hs=Jo?Xn+O[Kr]+E[Kr]-ds-P.altAxis:fs,L=p&&Jo?YT(ps,Xn,hs):Ja(p?ps:Go,Xn,p?hs:fs);w[_]=L,T[_]=L-Xn}t.modifiersData[r]=T}}const b_={name:"preventOverflow",enabled:!0,phase:"main",fn:w_,requiresIfExists:["offset"]};function S_(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function x_(e){return e===Pn(e)||!on(e)?Rm(e):S_(e)}function E_(e){var t=e.getBoundingClientRect(),n=xo(t.width)/e.offsetWidth||1,r=xo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function C_(e,t,n){n===void 0&&(n=!1);var r=on(t),i=on(t)&&E_(t),o=Xr(t),a=Eo(e,i),l={scrollLeft:0,scrollTop:0},s={x:0,y:0};return(r||!r&&!n)&&((Vn(t)!=="body"||Lm(o))&&(l=x_(t)),on(t)?(s=Eo(t,!0),s.x+=t.clientLeft,s.y+=t.clientTop):o&&(s.x=Fm(o))),{x:a.left+l.scrollLeft-s.x,y:a.top+l.scrollTop-s.y,width:a.width,height:a.height}}function A_(e){var t=new Map,n=new Set,r=[];e.forEach(function(o){t.set(o.name,o)});function i(o){n.add(o.name);var a=[].concat(o.requires||[],o.requiresIfExists||[]);a.forEach(function(l){if(!n.has(l)){var s=t.get(l);s&&i(s)}}),r.push(o)}return e.forEach(function(o){n.has(o.name)||i(o)}),r}function k_(e){var t=A_(e);return MT.reduce(function(n,r){return n.concat(t.filter(function(i){return i.phase===r}))},[])}function O_(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function P_(e){var t=e.reduce(function(n,r){var i=n[r.name];return n[r.name]=i?Object.assign({},i,r,{options:Object.assign({},i.options,r.options),data:Object.assign({},i.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var a1={placement:"bottom",modifiers:[],strategy:"absolute"};function l1(){for(var e=arguments.length,t=new Array(e),n=0;n{const[l,s]=R.useState(null),[u,c]=R.useState(null),[f,d]=R.useState(null),{styles:p,attributes:h,update:g}=B_(l,u,{placement:e,modifiers:[{name:"arrow",options:{element:f}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),v=R.useMemo(()=>Q(U({},p.popper),{backgroundColor:i}),[i,p.popper]),m=R.useMemo(()=>{let S;function k(){S=setTimeout(()=>{g==null||g(),u==null||u.setAttribute("data-show","")},o)}function _(){clearTimeout(S),u==null||u.removeAttribute("data-show")}return{[t==="hover"?"onMouseEnter":"onClick"]:()=>k(),onMouseLeave:()=>_(),onPointerDown:()=>_()}},[o,u,t,g]),y=typeof n!="string"?n:r?b(Tm,{className:_s.popoverMarkdown,children:n}):b("div",{className:_s.textContent,children:n});return M(Ke,{children:[R.cloneElement(a,Q(U({},m),{ref:s})),M("div",Q(U({ref:c,className:_s.popover,style:v},h.popper),{children:[y,b("div",{ref:d,className:_s.popperArrow,style:p.arrow})]}))]})},Mm=l=>{var s=l,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:i,openDelayMs:o=0}=s,a=vn(s,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);return b(JS,{placement:t,showOn:n,popoverContent:r,bgColor:i,openDelayMs:o,triggerEl:b("button",Q(U({},a),{children:e}))})},Y_="_infoIcon_15ri6_1",H_="_container_15ri6_10",$_="_header_15ri6_15",V_="_info_15ri6_1",G_="_unit_15ri6_27",J_="_description_15ri6_31",Ui={infoIcon:Y_,container:H_,header:$_,info:V_,unit:G_,description:J_},QS=({units:e})=>b(Mm,{className:Ui.infoIcon,popoverContent:b(Q_,{units:e}),openDelayMs:500,placement:"auto",children:b(Wk,{})});function Q_({units:e}){return M("div",{className:Ui.container,children:[b("div",{className:Ui.header,children:"CSS size options"}),b("div",{className:Ui.info,children:e.map(t=>M(R.Fragment,{children:[b("div",{className:Ui.unit,children:t}),b("div",{className:Ui.description,children:X_[t]})]},t))})]})}const X_={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},q_="_wrapper_13r28_1",K_="_unitSelector_13r28_10",Hu={wrapper:q_,unitSelector:K_};function Z_(e){const[t,n]=H.exports.useState(Zb(e)),r=H.exports.useCallback(o=>{if(o===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:o})},[t.unit]),i=H.exports.useCallback(o=>{n(a=>{const l=a.unit;return o==="auto"?{unit:o,count:null}:l==="auto"?{unit:o,count:XS[o]}:{unit:o,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:i}}const XS={fr:1,px:10,rem:1,"%":100};function e6({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:i,updateCount:o,updateUnit:a}=Z_(e!=null?e:"auto"),l=R.useMemo(()=>xm(u=>{t(u)},500),[t]);if(R.useEffect(()=>{const u=wr(i);if(e!==u)return l(wr(i)),()=>l.cancel()},[i,l,e]),e===void 0&&!r)return null;const s=r||i.count===null;return M("div",{className:Hu.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(wr(i))},children:[b(Sm,{ariaLabel:"value-count",value:s?void 0:i.count,disabled:s,onChange:o,min:0}),b("select",{className:Hu.unitSelector,"aria-label":"value-unit",name:"value-unit",value:i.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>b("option",{value:u,children:u},u))}),b(QS,{units:n})]})}function Gn(l){var s=l,{name:e,label:t,onChange:n,optional:r,value:i,defaultValue:o="10px"}=s,a=vn(s,["name","label","onChange","optional","value","defaultValue"]);const u=Oi(n),c=i===void 0;return b(bm,{name:e,label:t,optional:r,isDisabled:c,defaultValue:o,width_setting:"fit",mainInput:b(e6,Q(U({value:i!=null?i:o},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function t6({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:i}=Zb(e),o=R.useCallback(s=>{if(s===void 0){if(i!=="auto")throw new Error("Undefined count with auto units");t(wr({unit:i,count:null}));return}if(i==="auto"){console.error("How did you change the count of an auto unit?");return}t(wr({unit:i,count:s}))},[t,i]),a=R.useCallback(s=>{if(s==="auto"){t(wr({unit:s,count:null}));return}if(i==="auto"){t(wr({unit:s,count:XS[s]}));return}t(wr({unit:s,count:r}))},[r,t,i]),l=r===null;return M("div",{className:Hu.wrapper,"aria-label":"Css Unit Input",children:[b(Sm,{ariaLabel:"value-count",value:l?void 0:r,disabled:l,onChange:o,min:0}),b("select",{className:Hu.unitSelector,"aria-label":"value-unit",name:"value-unit",value:i,onChange:s=>a(s.target.value),children:n.map(s=>b("option",{value:s,children:s},s))}),b(QS,{units:n})]})}const n6="_tractInfoDisplay_9993b_1",r6="_sizeWidget_9993b_61",i6="_hoverListener_9993b_88",o6="_buttons_9993b_108",a6="_tractAddButton_9993b_121",l6="_deleteButton_9993b_122",Gi={tractInfoDisplay:n6,sizeWidget:r6,hoverListener:i6,buttons:o6,tractAddButton:a6,deleteButton:l6},s6=["fr","px"];function u6({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:i}){const o=H.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=H.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),l=H.exports.useCallback(()=>a(t),[a,t]),s=H.exports.useCallback(()=>a(t+1),[a,t]),u=H.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return M("div",{className:Gi.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[b("div",{className:Gi.hoverListener}),M("div",{className:Gi.sizeWidget,onClick:f6,children:[M("div",{className:Gi.buttons,children:[b(s1,{dir:e,onClick:l}),b(c6,{onClick:u,deletionConflicts:i}),b(s1,{dir:e,onClick:s})]}),b(t6,{value:n,units:s6,onChange:o})]})]})}const qS=200;function c6({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return b(Mm,{className:Gi.deleteButton,onClick:KS(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:qS,children:b(pm,{})})}function s1({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return b(Mm,{className:Gi.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:KS(t),openDelayMs:qS,children:b($b,{})})}function KS(e){return function(t){t.currentTarget.blur(),e==null||e()}}function u1({dir:e,sizes:t,areas:n,onUpdate:r}){const i=H.exports.useCallback(({dir:o,index:a})=>Kb(n,{dir:o,index:a+1}),[n]);return b(Ke,{children:t.map((o,a)=>b(u6,{index:a,dir:e,size:o,onUpdate:r,deletionConflicts:i({dir:e,index:a})},e+a))})}function f6(e){e.stopPropagation()}const d6="_columnSizer_3i83d_1",p6="_rowSizer_3i83d_2",c1={columnSizer:d6,rowSizer:p6};function f1({dir:e,index:t,onStartDrag:n}){return b("div",{className:e==="rows"?c1.rowSizer:c1.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function h6(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const $u=40,m6=.15,ZS=e=>t=>Math.round(t/e)*e,g6=5,Bm=ZS(g6),v6=.01,y6=ZS(v6),d1=e=>Number(e.toFixed(4));function w6(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const i=y6(e*t),o=n.count+i,a=r.count-i;return(i<0?o/a:a/o)=o.length?null:o[u];if(c==="auto"||f==="auto"){const h=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=h[s],o[s]=c),f==="auto"&&(f=h[u],o[u]=f),r.style[i]=h.join(" ")}const d=E6(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=Q(U({dir:t,mouseStart:tx(e,t),originalSizes:o,currentSizes:[...o],beforeIndex:s,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=C6({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function k6({mousePosition:e,drag:t,container:n}){const i=tx(e,t.dir)-t.mouseStart,o=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=S6(i,t);break;case"after-pixel":a=x6(i,t);break;case"both-pixel":a=b6(i,t);break;case"both-relative":a=w6(i,t);break}a!=="no-change"&&(a.beforeSize&&(o[t.beforeIndex]=a.beforeSize),a.afterSize&&(o[t.afterIndex]=a.afterSize),t.currentSizes=o,t.dir==="cols"?n.style.gridTemplateColumns=o.join(" "):n.style.gridTemplateRows=o.join(" "))}function O6(e){return e.match(/[0-9|.]+px/)!==null}function ex(e){return e.match(/[0-9|.]+fr/)!==null}function Vu(e){if(ex(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(O6(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function tx(e,t){return t==="rows"?e.clientY:e.clientX}function P6(e){return e.some(t=>ex(t))}function I6(e){return e.some(t=>t==="auto")}function p1(e,t){const n=Math.abs(t-e)+1,r=ee+o*r)}function T6({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(i=>`"${i.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function h1(e){return e.split(" ")}function _6(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function N6(e){const t=h1(e.style.gridTemplateRows),n=h1(e.style.gridTemplateColumns),r=_6(e.style.gridTemplateAreas),i=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:i}}function D6({containerRef:e,onDragEnd:t}){return R.useCallback(({e:r,dir:i,index:o})=>{const a=h6(e,"How are you dragging on an element without a container?");r.preventDefault();const l=A6({mousePosition:r,dir:i,index:o,container:a}),{beforeIndex:s,afterIndex:u}=l,c=m1(a,{dir:i,index:s,size:l.currentSizes[s]}),f=m1(a,{dir:i,index:u,size:l.currentSizes[u]});R6(a,l.dir,{move:d=>{k6({mousePosition:d,drag:l,container:a}),c.update(l.currentSizes[s]),f.update(l.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(N6(a))}})},[e,t])}function m1(e,{dir:t,index:n,size:r}){const i=document.createElement("div"),o=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(i.style,o,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,i.appendChild(a),e.appendChild(i),{remove:()=>i.remove(),update:l=>{a.innerHTML=l}}}function R6(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const i=()=>{o(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",i),r.addEventListener("mouseleave",i);function o(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",i),r.removeEventListener("mouseleave",i),r.remove()}}const F6="1fr";function L6(i){var o=i,{className:e,children:t,onNewLayout:n}=o,r=vn(o,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:l}=r,s=H.exports.useRef(null),u=T6(r),c=p1(2,l.length),f=p1(2,a.length),d=D6({containerRef:s,onDragEnd:n}),p=[eP.ResizableGrid];e&&p.push(e);const h=H.exports.useCallback(v=>{switch(v.type){case"ADD":return Xb(r,{afterIndex:v.index,dir:v.dir,size:F6});case"RESIZE":return M6(r,v);case"DELETE":return qb(r,v)}},[r]),g=H.exports.useCallback(v=>n(h(v)),[h,n]);return M("div",{className:p.join(" "),ref:s,style:u,children:[c.map(v=>b(f1,{dir:"cols",index:v,onStartDrag:d},"cols"+v)),f.map(v=>b(f1,{dir:"rows",index:v,onStartDrag:d},"rows"+v)),t,b(u1,{dir:"cols",sizes:l,areas:r.areas,onUpdate:g}),b(u1,{dir:"rows",sizes:a,areas:r.areas,onUpdate:g})]})}function M6(e,{dir:t,index:n,size:r}){return zo(e,i=>{i[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function B6(e,r){var i=r,{name:t}=i,n=vn(i,["name"]);const{rowStart:o,colStart:a}=n,l="rowEnd"in n?n.rowEnd:o+n.rowSpan-1,s="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Fc(e.areas);for(let c=0;c=o-1&&c=a-1&&d{for(let i of n)U6(r,i)})}function z6(e,t){return nx(e,t)}function j6(e,t,n){return zo(e,({areas:r})=>{const{numRows:i,numCols:o}=Gl(r);for(let a=0;a{const o=n==="rows"?"row_sizes":"col_sizes";i[o][t-1]=r})}function Y6(e,{item_a:t,item_b:n}){return t===n?e:zo(e,r=>{const{n_rows:i,n_cols:o}=H6(r.areas);let a=!1,l=!1;for(let s=0;s{a.current&&r&&setTimeout(()=>{var l;return(l=a==null?void 0:a.current)==null?void 0:l.focus()},1)},[r]),b("input",{ref:a,className:J6.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:o,onChange:l=>n(l.target.value),disabled:i})}function Ae({name:e,label:t,value:n,placeholder:r,onChange:i,autoFocus:o=!1,optional:a=!1,defaultValue:l="my-text"}){const s=Oi(i),u=n===void 0,c=R.useRef(null);return R.useEffect(()=>{c.current&&o&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[o]),b(bm,{name:e,label:t,optional:a,isDisabled:u,defaultValue:l,width_setting:"full",mainInput:b(Q6,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>s({name:e,value:f}),autoFocus:o,disabled:u})})}const X6="_container_17s66_1",q6="_elementsPanel_17s66_28",K6="_propertiesPanel_17s66_37",Z6="_editorHolder_17s66_52",e5="_titledPanel_17s66_65",t5="_panelTitleHeader_17s66_77",n5="_header_17s66_86",r5="_rightSide_17s66_94",i5="_divider_17s66_115",o5="_title_17s66_65",a5="_shinyLogo_17s66_126",rx={container:X6,elementsPanel:q6,propertiesPanel:K6,editorHolder:Z6,titledPanel:e5,panelTitleHeader:t5,header:n5,rightSide:r5,divider:i5,title:o5,shinyLogo:a5},l5="_portalHolder_18ua3_1",s5="_portalModal_18ua3_11",u5="_title_18ua3_21",c5="_body_18ua3_25",f5="_portalForm_18ua3_30",d5="_portalFormInputs_18ua3_35",p5="_portalFormFooter_18ua3_42",h5="_validationMsg_18ua3_48",m5="_infoText_18ua3_53",Ns={portalHolder:l5,portalModal:s5,title:u5,body:c5,portalForm:f5,portalFormInputs:d5,portalFormFooter:p5,validationMsg:h5,infoText:m5},g5=({children:e,el:t="div"})=>{const[n]=H.exports.useState(document.createElement(t));return H.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Pl.exports.createPortal(e,n)},ix=({children:e,title:t,label:n,onConfirm:r,onCancel:i})=>b(g5,{children:b("div",{className:Ns.portalHolder,onClick:()=>i(),onKeyDown:o=>{o.key==="Escape"&&i()},children:M("div",{className:Ns.portalModal,onClick:o=>o.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?b("div",{className:Ns.title+" "+rx.panelTitleHeader,children:t}):null,b("div",{className:Ns.body,children:e})]})})}),v5="_portalHolder_18ua3_1",y5="_portalModal_18ua3_11",w5="_title_18ua3_21",b5="_body_18ua3_25",S5="_portalForm_18ua3_30",x5="_portalFormInputs_18ua3_35",E5="_portalFormFooter_18ua3_42",C5="_validationMsg_18ua3_48",A5="_infoText_18ua3_53",fa={portalHolder:v5,portalModal:y5,title:w5,body:b5,portalForm:S5,portalFormInputs:x5,portalFormFooter:E5,validationMsg:C5,infoText:A5};function k5({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[i,o]=R.useState(r),[a,l]=R.useState(null),s=R.useCallback(c=>{c&&c.preventDefault();const f=O5({name:i,existingAreaNames:n});if(f){l(f);return}t(i)},[n,i,t]),u=R.useCallback(({value:c})=>{l(null),o(c!=null?c:r)},[r]);return M(ix,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(i),onCancel:e,children:[b("form",{className:fa.portalForm,onSubmit:s,children:M("div",{className:fa.portalFormInputs,children:[b("span",{className:fa.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),b(Ae,{label:"Name of new grid area",name:"New-Item-Name",value:i,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?b("div",{className:fa.validationMsg,children:a}):null]})}),M("div",{className:fa.portalFormFooter,children:[b(Ft,{variant:"delete",onClick:e,children:"Cancel"}),b(Ft,{onClick:()=>s(),children:"Done"})]})]})}function O5({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const P5="_container_1hvsg_1",I5={container:P5},ox=R.createContext(null),T5=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:i,compRef:o})=>{const a=Jr(),l=Nx(),{onClick:s}=r,{uniqueAreas:u}=XO(e),_=e,{areas:c}=_,f=vn(_,["areas"]),d=w=>{a(Tx({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:U(U({},f),w)}}))},p=R.useMemo(()=>wm(c),[c]),[h,g]=R.useState(null),v=w=>{const{node:O,currentPath:E,pos:C}=w,P=E!==void 0,I=wp.includes(O.uiName);if(P&&I&&"area"in O.uiArguments&&O.uiArguments.area){const T=O.uiArguments.area;m({type:"MOVE_ITEM",name:T,pos:C});return}g(w)},m=w=>{d(Um(e,w))},y=u.map(w=>b(HO,{area:w,areas:c,gridLocation:p.get(w),onNewPos:O=>m({type:"MOVE_ITEM",name:w,pos:O})},w)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},k=(w,{node:O,currentPath:E,pos:C})=>{if(wp.includes(O.uiName)){const P=Q(U({},O.uiArguments),{area:w});O.uiArguments=P}else O={uiName:"gridlayout::grid_card",uiArguments:{area:w},uiChildren:[O]};l({parentPath:[],node:O,currentPath:E}),m({type:"ADD_ITEM",name:w,pos:C}),g(null)};return M(ox.Provider,{value:m,children:[b("div",{ref:o,style:S,className:I5.container,onClick:s,draggable:!1,onDragStart:()=>{},children:M(L6,Q(U({},e),{onNewLayout:d,children:[QO(c).map(({row:w,col:O})=>b(GO,{gridRow:w,gridColumn:O,onDroppedNode:v},MO({row:w,col:O}))),t==null?void 0:t.map((w,O)=>b(mm,U({path:[...i.path,O]},w),i.path.join(".")+O)),n,y]}))}),h?b(k5,{info:h,onCancel:()=>g(null),onDone:w=>k(w,h),existingAreaNames:u}):null]})};function _5(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function N5(){return R.useContext(ox)}function zm({containerRef:e,path:t,area:n}){const r=N5(),i=R.useCallback(({node:a,currentPath:l})=>l===void 0||!wp.includes(a.uiName)?!1:ym(l,t),[t]),o=R.useCallback(a=>{var s;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const l=(s=a.node.uiArguments.area)!=null?s:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:l})},[n,r]);vm({watcherRef:e,getCanAcceptDrop:i,onDrop:o,canAcceptDropClass:Wt.availableToSwap,hoveringOverClass:Wt.hoveringOverSwap})}const D5=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:i},children:o,eventHandlers:a,compRef:l})=>{const s=r.length>0;return zm({containerRef:l,area:e,path:i}),M(gm,{className:Wt.container+" "+(n?Wt.withTitle:""),ref:l,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?b(rO,{className:Wt.panelTitle,children:n}):null,M("div",{className:Wt.contentHolder,"data-alignment":"top",children:[b(g1,{index:0,parentPath:i,numChildren:r.length}),s?r==null?void 0:r.map((u,c)=>M(R.Fragment,{children:[b(mm,U({path:[...i,c]},u)),b(g1,{index:c+1,numChildren:r.length,parentPath:i})]},i.join(".")+c)):b(F5,{path:i})]}),o]})};function g1({index:e,numChildren:t,parentPath:n}){const r=R.useRef(null);xO({watcherRef:r,positionInChildren:e,parentPath:n});const i=R5(e,t);return b("div",{ref:r,className:Wt.dropWatcher+" "+i,"aria-label":"drop watcher"})}function R5(e,t){return e===0&&t===0?Wt.onlyDropWatcher:e===0?Wt.firstDropWatcher:e===t?Wt.lastDropWatcher:Wt.middleDropWatcher}function F5({path:e}){return M("div",{className:Wt.emptyGridCard,children:[b("span",{className:Wt.emptyMessage,children:"Empty grid card"}),b(Wb,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const L5=({settings:e})=>{var t;return M(Ke,{children:[b(Ae,{name:"area",label:"Name of grid area",value:e.area}),b(Ae,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),b(Gn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},M5={area:"default-area",item_gap:"12px"},B5={title:"Grid Card",UiComponent:D5,SettingsComponent:L5,acceptsChildren:!0,defaultSettings:M5,iconSrc:Pk,category:"gridlayout",description:"The standard element for placing elements on the grid in a simple card container."},ax="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function U5(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const lx=({type:e,name:t,className:n})=>M("code",{className:n,children:[M("span",{style:{opacity:.55},children:[e,"$"]}),b("span",{children:t})]}),z5="_container_1rlbk_1",j5="_plotPlaceholder_1rlbk_5",W5="_label_1rlbk_19",Dp={container:z5,plotPlaceholder:j5,label:W5};function sx({outputId:e}){const t=H.exports.useRef(null),n=Y5(t),r=n===null?100:Math.min(n.width,n.height);return M("div",{ref:t,className:Dp.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[b(lx,{className:Dp.label,type:"output",name:e}),b(U5,{size:`calc(${r}px - 80px)`})]})}function Y5(e){const[t,n]=H.exports.useState(null);return H.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(i=>{if(!e.current)return;const{offsetHeight:o,offsetWidth:a}=e.current;n({width:a,height:o})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const H5="_gridCardPlot_1a94v_1",$5={gridCardPlot:H5},V5=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:i,compRef:o})=>(zm({containerRef:o,area:t,path:r}),M(gm,Q(U({ref:o,style:{gridArea:t},className:$5.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},i),{children:[b(sx,{outputId:e!=null?e:t}),n]}))),G5=({settings:{area:e,outputId:t}})=>M(Ke,{children:[b(Ae,{name:"area",label:"Name of grid area",value:e}),b(Ae,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),J5={title:"Grid Plot Card",UiComponent:V5,SettingsComponent:G5,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:ax,category:"gridlayout",description:"A wrapper for `shiny::plotOutput()` that uses `gridlayout`-friendly sizing defaults. \n For when you want to have a grid area filled entirely with a single plot."},Q5="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",X5="_textPanel_525i2_1",q5={textPanel:X5},K5=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:i},eventHandlers:o,compRef:a})=>(zm({containerRef:a,area:t,path:i}),M(gm,Q(U({ref:a,className:q5.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},o),{children:[b("h1",{children:e}),r]}))),Z5="_checkboxInput_12wa8_1",eN="_checkboxLabel_12wa8_10",v1={checkboxInput:Z5,checkboxLabel:eN};function ux({name:e,label:t,value:n,onChange:r,disabled:i,noLabel:o}){const a=Oi(r),l=o?void 0:t!=null?t:e,s=`${e}-checkbox-input`,u=M(Ke,{children:[b("input",{className:v1.checkboxInput,id:s,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:i,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),b("label",{className:v1.checkboxLabel,htmlFor:s,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return l!==void 0?M("div",{className:lr.container,children:[M("label",{className:lr.label,children:[l,":"]}),u]}):u}const tN="_radioContainer_1regb_1",nN="_option_1regb_15",rN="_radioInput_1regb_22",iN="_radioLabel_1regb_26",oN="_icon_1regb_41",da={radioContainer:tN,option:nN,radioInput:rN,radioLabel:iN,icon:oN};function aN({name:e,label:t,options:n,currentSelection:r,onChange:i,optionsPerColumn:o}){const a=Object.keys(n),l=Oi(i),s=H.exports.useMemo(()=>({gridTemplateColumns:o?`repeat(${o}, 1fr)`:void 0}),[o]);return M("div",{className:lr.container,"data-full-width":"true",children:[M("label",{htmlFor:e,className:lr.label,children:[t!=null?t:e,":"]}),b("fieldset",{className:da.radioContainer,id:e,style:s,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return M("div",{className:da.option,children:[b("input",{className:da.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>l({name:e,value:u}),checked:u===r}),b("label",{className:da.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?b("img",{src:c,alt:f,className:da.icon}):c})]},u)})})]})}const lN={start:{icon:Bb,label:"left"},center:{icon:mp,label:"center"},end:{icon:Ub,label:"right"}},sN=({settings:e})=>{var t;return M(Ke,{children:[b(Ae,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),b(Ae,{name:"content",label:"Panel content",value:e.content}),b(aN,{name:"alignment",label:"Text Alignment",options:lN,currentSelection:e.alignment,optionsPerColumn:3}),b(ux,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},uN={title:"Grid Text Card",UiComponent:K5,SettingsComponent:sN,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:Q5,category:"gridlayout",description:"A grid card that contains just text that is vertically centered within the panel. Useful for app titles or displaying text-based statistics."},cN=({settings:e})=>b(Ke,{children:b(Gn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function jm(e){return e.uiChildren!==void 0}function Fr(e,t){let n=e,r;for(r of t){if(!jm(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function fN(e,{path:t,node:n}){var l;const r=cx({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:i}=r,o=_5(i.uiChildren)[t[0]],a=(l=n.uiArguments.area)!=null?l:Hn;o!==a&&(i.uiArguments=Um(i.uiArguments,{type:"RENAME_ITEM",oldName:o,newName:a}))}function dN(e,{path:t}){const n=cx({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:i}=n,o=i.uiArguments.area;if(!o){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Um(r.uiArguments,{type:"REMOVE_ITEM",name:o})}function cx({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=Fr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const pN={title:"Grid Page",UiComponent:T5,SettingsComponent:cN,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:fN,DELETE_NODE:dN},category:"gridlayout"},hN="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",mN=({settings:e})=>{const{inputId:t,label:n}=e;return M(Ke,{children:[b(Ae,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),b(Ae,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},gN="_container_tyghz_1",vN={container:gN},yN=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:i="My Action Button",width:o}=e;return M("div",Q(U({className:vN.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[b(Ft,{style:o?{width:o}:void 0,children:i}),t]}))},wN={title:"Action Button",UiComponent:yN,SettingsComponent:mN,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:hN,category:"Inputs",description:"Creates an action button whose value is initially zero, and increments by one each time it is pressed."},bN="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",SN="_categoryDivider_8d7ls_1",xN={categoryDivider:SN};function Wo({category:e}){return b("div",{className:xN.categoryDivider,children:b("span",{children:e?`${e}:`:null})})}function EN(e){return Bt({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var fx={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function y1(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Jn(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function kN(e,t){if(e==null)return{};var n=AN(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function ON(e){return PN(e)||IN(e)||TN(e)||_N()}function PN(e){if(Array.isArray(e))return Rp(e)}function IN(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function TN(e,t){if(!!e){if(typeof e=="string")return Rp(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Rp(e,t)}}function Rp(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function DN(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function xn(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Gu(e,t):Gu(e,t))||r&&e===n)return e;if(e===n)break}while(e=DN(e))}return null}var b1=/\s+/g;function ze(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(b1," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(b1," ")}}function J(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function mi(e,t){var n="";if(typeof e=="string")n=e;else do{var r=J(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var i=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return i&&new i(n)}function mx(e,t,n){if(e){var r=e.getElementsByTagName(t),i=0,o=r.length;if(n)for(;i=o:a=i<=o,!a)return r;if(r===Yn())break;r=Ar(r,!1)}return!1}function Ao(e,t,n,r){for(var i=0,o=0,a=e.children;o2&&arguments[2]!==void 0?arguments[2]:{},i=r.evt,o=kN(r,zN);es.pluginEvent.bind(ee)(t,n,Jn({dragEl:W,parentEl:Ye,ghostEl:ae,rootEl:Re,nextEl:oi,lastDownEl:ou,cloneEl:Ue,cloneHidden:br,dragStarted:_a,putSortable:at,activeSortable:ee.active,originalEvent:i,oldIndex:Ji,oldDraggableIndex:Ka,newIndex:jt,newDraggableIndex:gr,hideGhostForTarget:Sx,unhideGhostForTarget:xx,cloneNowHidden:function(){br=!0},cloneNowShown:function(){br=!1},dispatchSortableEvent:function(l){wt({sortable:n,name:l,originalEvent:i})}},o))};function wt(e){Ta(Jn({putSortable:at,cloneEl:Ue,targetEl:W,rootEl:Re,oldIndex:Ji,oldDraggableIndex:Ka,newIndex:jt,newDraggableIndex:gr},e))}var W,Ye,ae,Re,oi,ou,Ue,br,Ji,jt,Ka,gr,Ds,at,zi=!1,Ju=!1,Qu=[],Zr,wn,id,od,C1,A1,_a,Fi,Za,el=!1,Rs=!1,au,ct,ad=[],Fp=!1,Xu=[],Kc=typeof document!="undefined",Fs=dx,k1=Zl||dr?"cssFloat":"float",jN=Kc&&!px&&!dx&&"draggable"in document.createElement("div"),yx=function(){if(!!Kc){if(dr)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),wx=function(t,n){var r=J(t),i=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),o=Ao(t,0,n),a=Ao(t,1,n),l=o&&J(o),s=a&&J(a),u=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Me(o).width,c=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Me(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(o&&l.float&&l.float!=="none"){var f=l.float==="left"?"left":"right";return a&&(s.clear==="both"||s.clear===f)?"vertical":"horizontal"}return o&&(l.display==="block"||l.display==="flex"||l.display==="table"||l.display==="grid"||u>=i&&r[k1]==="none"||a&&r[k1]==="none"&&u+c>i)?"vertical":"horizontal"},WN=function(t,n,r){var i=r?t.left:t.top,o=r?t.right:t.bottom,a=r?t.width:t.height,l=r?n.left:n.top,s=r?n.right:n.bottom,u=r?n.width:n.height;return i===l||o===s||i+a/2===l+u/2},YN=function(t,n){var r;return Qu.some(function(i){var o=i[ht].options.emptyInsertThreshold;if(!(!o||Wm(i))){var a=Me(i),l=t>=a.left-o&&t<=a.right+o,s=n>=a.top-o&&n<=a.bottom+o;if(l&&s)return r=i}}),r},bx=function(t){function n(o,a){return function(l,s,u,c){var f=l.options.group.name&&s.options.group.name&&l.options.group.name===s.options.group.name;if(o==null&&(a||f))return!0;if(o==null||o===!1)return!1;if(a&&o==="clone")return o;if(typeof o=="function")return n(o(l,s,u,c),a)(l,s,u,c);var d=(a?l:s).options.group.name;return o===!0||typeof o=="string"&&o===d||o.join&&o.indexOf(d)>-1}}var r={},i=t.group;(!i||iu(i)!="object")&&(i={name:i}),r.name=i.name,r.checkPull=n(i.pull,!0),r.checkPut=n(i.put),r.revertClone=i.revertClone,t.group=r},Sx=function(){!yx&&ae&&J(ae,"display","none")},xx=function(){!yx&&ae&&J(ae,"display","")};Kc&&!px&&document.addEventListener("click",function(e){if(Ju)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Ju=!1,!1},!0);var ei=function(t){if(W){t=t.touches?t.touches[0]:t;var n=YN(t.clientX,t.clientY);if(n){var r={};for(var i in t)t.hasOwnProperty(i)&&(r[i]=t[i]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[ht]._onDragOver(r)}}},HN=function(t){W&&W.parentNode[ht]._isOutsideThisEl(t.target)};function ee(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=cn({},t),e[ht]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return wx(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,l){a.setData("Text",l.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:ee.supportPointer!==!1&&"PointerEvent"in window&&!Xa,emptyInsertThreshold:5};es.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);bx(t);for(var i in this)i.charAt(0)==="_"&&typeof this[i]=="function"&&(this[i]=this[i].bind(this));this.nativeDraggable=t.forceFallback?!1:jN,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ve(e,"pointerdown",this._onTapStart):(ve(e,"mousedown",this._onTapStart),ve(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ve(e,"dragover",this),ve(e,"dragenter",this)),Qu.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),cn(this,MN())}ee.prototype={constructor:ee,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Fi=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,W):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,i=this.options,o=i.preventOnFilter,a=t.type,l=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,s=(l||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||s,c=i.filter;if(KN(r),!W&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||i.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&Xa&&s&&s.tagName.toUpperCase()==="SELECT")&&(s=xn(s,i.draggable,r,!1),!(s&&s.animated)&&ou!==s)){if(Ji=He(s),Ka=He(s,i.draggable),typeof c=="function"){if(c.call(this,t,s,this)){wt({sortable:n,rootEl:u,name:"filter",targetEl:s,toEl:r,fromEl:r}),Ct("filter",n,{evt:t}),o&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=xn(u,f.trim(),r,!1),f)return wt({sortable:n,rootEl:f,name:"filter",targetEl:s,fromEl:r,toEl:r}),Ct("filter",n,{evt:t}),!0}),c)){o&&t.cancelable&&t.preventDefault();return}i.handle&&!xn(u,i.handle,r,!1)||this._prepareDragStart(t,l,s)}}},_prepareDragStart:function(t,n,r){var i=this,o=i.el,a=i.options,l=o.ownerDocument,s;if(r&&!W&&r.parentNode===o){var u=Me(r);if(Re=o,W=r,Ye=W.parentNode,oi=W.nextSibling,ou=r,Ds=a.group,ee.dragged=W,Zr={target:W,clientX:(n||t).clientX,clientY:(n||t).clientY},C1=Zr.clientX-u.left,A1=Zr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,W.style["will-change"]="all",s=function(){if(Ct("delayEnded",i,{evt:t}),ee.eventCanceled){i._onDrop();return}i._disableDelayedDragEvents(),!w1&&i.nativeDraggable&&(W.draggable=!0),i._triggerDragStart(t,n),wt({sortable:i,name:"choose",originalEvent:t}),ze(W,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){mx(W,c.trim(),ld)}),ve(l,"dragover",ei),ve(l,"mousemove",ei),ve(l,"touchmove",ei),ve(l,"mouseup",i._onDrop),ve(l,"touchend",i._onDrop),ve(l,"touchcancel",i._onDrop),w1&&this.nativeDraggable&&(this.options.touchStartThreshold=4,W.draggable=!0),Ct("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(Zl||dr))){if(ee.eventCanceled){this._onDrop();return}ve(l,"mouseup",i._disableDelayedDrag),ve(l,"touchend",i._disableDelayedDrag),ve(l,"touchcancel",i._disableDelayedDrag),ve(l,"mousemove",i._delayedDragTouchMoveHandler),ve(l,"touchmove",i._delayedDragTouchMoveHandler),a.supportPointer&&ve(l,"pointermove",i._delayedDragTouchMoveHandler),i._dragStartTimer=setTimeout(s,a.delay)}else s()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){W&&ld(W),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;de(t,"mouseup",this._disableDelayedDrag),de(t,"touchend",this._disableDelayedDrag),de(t,"touchcancel",this._disableDelayedDrag),de(t,"mousemove",this._delayedDragTouchMoveHandler),de(t,"touchmove",this._delayedDragTouchMoveHandler),de(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ve(document,"pointermove",this._onTouchMove):n?ve(document,"touchmove",this._onTouchMove):ve(document,"mousemove",this._onTouchMove):(ve(W,"dragend",this),ve(Re,"dragstart",this._onDragStart));try{document.selection?lu(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(zi=!1,Re&&W){Ct("dragStarted",this,{evt:n}),this.nativeDraggable&&ve(document,"dragover",HN);var r=this.options;!t&&ze(W,r.dragClass,!1),ze(W,r.ghostClass,!0),ee.active=this,t&&this._appendGhost(),wt({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(wn){this._lastX=wn.clientX,this._lastY=wn.clientY,Sx();for(var t=document.elementFromPoint(wn.clientX,wn.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(wn.clientX,wn.clientY),t!==n);)n=t;if(W.parentNode[ht]._isOutsideThisEl(t),n)do{if(n[ht]){var r=void 0;if(r=n[ht]._onDragOver({clientX:wn.clientX,clientY:wn.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);xx()}},_onTouchMove:function(t){if(Zr){var n=this.options,r=n.fallbackTolerance,i=n.fallbackOffset,o=t.touches?t.touches[0]:t,a=ae&&mi(ae,!0),l=ae&&a&&a.a,s=ae&&a&&a.d,u=Fs&&ct&&x1(ct),c=(o.clientX-Zr.clientX+i.x)/(l||1)+(u?u[0]-ad[0]:0)/(l||1),f=(o.clientY-Zr.clientY+i.y)/(s||1)+(u?u[1]-ad[1]:0)/(s||1);if(!ee.active&&!zi){if(r&&Math.max(Math.abs(o.clientX-this._lastX),Math.abs(o.clientY-this._lastY))=0&&(wt({rootEl:Ye,name:"add",toEl:Ye,fromEl:Re,originalEvent:t}),wt({sortable:this,name:"remove",toEl:Ye,originalEvent:t}),wt({rootEl:Ye,name:"sort",toEl:Ye,fromEl:Re,originalEvent:t}),wt({sortable:this,name:"sort",toEl:Ye,originalEvent:t})),at&&at.save()):jt!==Ji&&jt>=0&&(wt({sortable:this,name:"update",toEl:Ye,originalEvent:t}),wt({sortable:this,name:"sort",toEl:Ye,originalEvent:t})),ee.active&&((jt==null||jt===-1)&&(jt=Ji,gr=Ka),wt({sortable:this,name:"end",toEl:Ye,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){Ct("nulling",this),Re=W=Ye=ae=oi=Ue=ou=br=Zr=wn=_a=jt=gr=Ji=Ka=Fi=Za=at=Ds=ee.dragged=ee.ghost=ee.clone=ee.active=null,Xu.forEach(function(t){t.checked=!0}),Xu.length=id=od=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":W&&(this._onDragOver(t),$N(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,i=0,o=r.length,a=this.options;ir.right+i||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+i}function QN(e,t,n,r,i,o,a,l){var s=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(l&&auc+u*o/2:sf-au)return-Za}else if(s>c+u*(1-i)/2&&sf-u*o/2)?s>c+u/2?1:-1:0}function XN(e){return He(W)1&&(ie.forEach(function(l){o.addAnimationState({target:l,rect:At?Me(l):a}),nd(l),l.fromRect=a,r.removeAnimationState(l)}),At=!1,rD(!this.options.removeCloneOnHide,i))},dragOverCompleted:function(n){var r=n.sortable,i=n.isOwner,o=n.insertion,a=n.activeSortable,l=n.parentEl,s=n.putSortable,u=this.options;if(o){if(i&&a._hideClone(),ha=!1,u.animation&&ie.length>1&&(At||!i&&!a.options.sort&&!s)){var c=Me(Pe,!1,!0,!0);ie.forEach(function(d){d!==Pe&&(E1(d,c),l.appendChild(d))}),At=!0}if(!i)if(At||Bs(),ie.length>1){var f=Ms;a._showClone(r),a.options.animation&&!Ms&&f&&zt.forEach(function(d){a.addAnimationState({target:d,rect:ma}),d.fromRect=ma,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,i=n.isOwner,o=n.activeSortable;if(ie.forEach(function(l){l.thisAnimationDuration=null}),o.options.animation&&!i&&o.multiDrag.isMultiDrag){ma=cn({},r);var a=mi(Pe,!0);ma.top-=a.f,ma.left-=a.e}},dragOverAnimationComplete:function(){At&&(At=!1,Bs())},drop:function(n){var r=n.originalEvent,i=n.rootEl,o=n.parentEl,a=n.sortable,l=n.dispatchSortableEvent,s=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=o.children;if(!Li)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),ze(Pe,f.selectedClass,!~ie.indexOf(Pe)),~ie.indexOf(Pe))ie.splice(ie.indexOf(Pe),1),pa=null,Ta({sortable:a,rootEl:i,name:"deselect",targetEl:Pe,originalEvent:r});else{if(ie.push(Pe),Ta({sortable:a,rootEl:i,name:"select",targetEl:Pe,originalEvent:r}),r.shiftKey&&pa&&a.el.contains(pa)){var p=He(pa),h=He(Pe);if(~p&&~h&&p!==h){var g,v;for(h>p?(v=p,g=h):(v=h,g=p+1);v1){var m=Me(Pe),y=He(Pe,":not(."+this.options.selectedClass+")");if(!ha&&f.animation&&(Pe.thisAnimationDuration=null),c.captureAnimationState(),!ha&&(f.animation&&(Pe.fromRect=m,ie.forEach(function(k){if(k.thisAnimationDuration=null,k!==Pe){var _=At?Me(k):m;k.fromRect=_,c.addAnimationState({target:k,rect:_})}})),Bs(),ie.forEach(function(k){d[y]?o.insertBefore(k,d[y]):o.appendChild(k),y++}),s===He(Pe))){var S=!1;ie.forEach(function(k){if(k.sortableIndex!==He(k)){S=!0;return}}),S&&l("update")}ie.forEach(function(k){nd(k)}),c.animateAll()}bn=c}(i===o||u&&u.lastPutMode!=="clone")&&zt.forEach(function(k){k.parentNode&&k.parentNode.removeChild(k)})}},nullingGlobal:function(){this.isMultiDrag=Li=!1,zt.length=0},destroyGlobal:function(){this._deselectMultiDrag(),de(document,"pointerup",this._deselectMultiDrag),de(document,"mouseup",this._deselectMultiDrag),de(document,"touchend",this._deselectMultiDrag),de(document,"keydown",this._checkKeyDown),de(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof Li!="undefined"&&Li)&&bn===this.sortable&&!(n&&xn(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;ie.length;){var r=ie[0];ze(r,this.options.selectedClass,!1),ie.shift(),Ta({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},cn(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[ht];!r||!r.options.multiDrag||~ie.indexOf(n)||(bn&&bn!==r&&(bn.multiDrag._deselectMultiDrag(),bn=r),ze(n,r.options.selectedClass,!0),ie.push(n))},deselect:function(n){var r=n.parentNode[ht],i=ie.indexOf(n);!r||!r.options.multiDrag||!~i||(ze(n,r.options.selectedClass,!1),ie.splice(i,1))}},eventProperties:function(){var n=this,r=[],i=[];return ie.forEach(function(o){r.push({multiDragElement:o,index:o.sortableIndex});var a;At&&o!==Pe?a=-1:At?a=He(o,":not(."+n.options.selectedClass+")"):a=He(o),i.push({multiDragElement:o,index:a})}),{items:ON(ie),clones:[].concat(zt),oldIndicies:r,newIndicies:i}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function rD(e,t){ie.forEach(function(n,r){var i=t.children[n.sortableIndex+(e?Number(r):0)];i?t.insertBefore(n,i):t.appendChild(n)})}function P1(e,t){zt.forEach(function(n,r){var i=t.children[n.sortableIndex+(e?Number(r):0)];i?t.insertBefore(n,i):t.appendChild(n)})}function Bs(){ie.forEach(function(e){e!==Pe&&e.parentNode&&e.parentNode.removeChild(e)})}ee.mount(new ZN);ee.mount($m,Hm);const iD=Object.freeze(Object.defineProperty({__proto__:null,default:ee,MultiDrag:nD,Sortable:ee,Swap:eD},Symbol.toStringTag,{value:"Module"})),oD=f0(iD);var Cx={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],i=0;i$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>k);function s(w){w.parentElement!==null&&w.parentElement.removeChild(w)}function u(w,O,E){const C=w.children[E]||null;w.insertBefore(O,C)}function c(w){w.forEach(O=>s(O.element))}function f(w){w.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(w,O){const E=v(w),C={parentElement:w.from};let P=[];switch(E){case"normal":P=[{element:w.item,newIndex:w.newIndex,oldIndex:w.oldIndex,parentElement:w.from}];break;case"swap":const N=U({element:w.item,oldIndex:w.oldIndex,newIndex:w.newIndex},C),B=U({element:w.swapItem,oldIndex:w.newIndex,newIndex:w.oldIndex},C);P=[N,B];break;case"multidrag":P=w.oldIndicies.map((K,V)=>U({element:K.multiDragElement,oldIndex:K.index,newIndex:w.newIndicies[V].index},C));break}return m(P,O)}function p(w,O){const E=h(w,O);return g(w,E)}function h(w,O){const E=[...O];return w.concat().reverse().forEach(C=>E.splice(C.oldIndex,1)),E}function g(w,O,E,C){const P=[...O];return w.forEach(I=>{const T=C&&E&&C(I.item,E);P.splice(I.newIndex,0,T||I.item)}),P}function v(w){return w.oldIndicies&&w.oldIndicies.length>0?"multidrag":w.swapItem?"swap":"normal"}function m(w,O){return w.map(C=>Q(U({},C),{item:O[C.oldIndex]})).sort((C,P)=>C.oldIndex-P.oldIndex)}function y(w){const gn=w,{list:O,setList:E,children:C,tag:P,style:I,className:T,clone:N,onAdd:B,onChange:K,onChoose:V,onClone:le,onEnd:te,onFilter:se,onRemove:q,onSort:x,onStart:A,onUnchoose:X,onUpdate:fe,onMove:pe,onSpill:he,onSelect:be,onDeselect:Ee}=gn;return vn(gn,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class k extends r.Component{constructor(O){super(O),this.ref=r.createRef();const E=[...O.list].map(C=>Object.assign(C,{chosen:!1,selected:!1}));O.setList(E,this.sortable,S),o(i)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();o(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:E,className:C,id:P}=this.props,I={style:E,className:C,id:P},T=!O||O===null?"div":O;return r.createElement(T,U({ref:this.ref},I),this.getChildren())}getChildren(){const{children:O,dataIdAttr:E,selectedClass:C="sortable-selected",chosenClass:P="sortable-chosen",dragClass:I="sortable-drag",fallbackClass:T="sortable-falback",ghostClass:N="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:K="sortable-filter",list:V}=this.props;if(!O||O==null)return null;const le=E||"data-id";return r.Children.map(O,(te,se)=>{if(te===void 0)return;const q=V[se]||{},{className:x}=te.props,A=typeof K=="string"&&{[K.replace(".","")]:!!q.filtered},X=o(n)(x,U({[C]:q.selected,[P]:q.chosen},A));return r.cloneElement(te,{[le]:te.key,className:X})})}get sortable(){const O=this.ref.current;if(O===null)return null;const E=Object.keys(O).find(C=>C.includes("Sortable"));return E?O[E]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],E=["onChange","onClone","onFilter","onSort"],C=y(this.props);O.forEach(I=>C[I]=this.prepareOnHandlerPropAndDOM(I)),E.forEach(I=>C[I]=this.prepareOnHandlerProp(I));const P=(I,T)=>{const{onMove:N}=this.props,B=I.willInsertAfter||-1;if(!N)return B;const K=N(I,T,this.sortable,S);return typeof K=="undefined"?!1:K};return Q(U({},C),{onMove:P})}prepareOnHandlerPropAndDOM(O){return E=>{this.callOnHandlerProp(E,O),this[O](E)}}prepareOnHandlerProp(O){return E=>{this.callOnHandlerProp(E,O)}}callOnHandlerProp(O,E){const C=this.props[E];C&&C(O,this.sortable,S)}onAdd(O){const{list:E,setList:C,clone:P}=this.props,I=[...S.dragging.props.list],T=d(O,I);c(T);const N=g(T,E,O,P).map(B=>Object.assign(B,{selected:!1}));C(N,this.sortable,S)}onRemove(O){const{list:E,setList:C}=this.props,P=v(O),I=d(O,E);f(I);let T=[...E];if(O.pullMode!=="clone")T=h(I,T);else{let N=I;switch(P){case"multidrag":N=I.map((B,K)=>Q(U({},B),{element:O.clones[K]}));break;case"normal":N=I.map(B=>Q(U({},B),{element:O.clone}));break;case"swap":default:o(i)(!0,`mode "${P}" cannot clone. Please remove "props.clone" from when using the "${P}" plugin`)}c(N),I.forEach(B=>{const K=B.oldIndex,V=this.props.clone(B.item,O);T.splice(K,1,V)})}T=T.map(N=>Object.assign(N,{selected:!1})),C(T,this.sortable,S)}onUpdate(O){const{list:E,setList:C}=this.props,P=d(O,E);c(P),f(P);const I=p(P,E);return C(I,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:E,setList:C}=this.props,P=E.map((I,T)=>{let N=I;return T===O.oldIndex&&(N=Object.assign(I,{chosen:!0})),N});C(P,this.sortable,S)}onUnchoose(O){const{list:E,setList:C}=this.props,P=E.map((I,T)=>{let N=I;return T===O.oldIndex&&(N=Object.assign(N,{chosen:!1})),N});C(P,this.sortable,S)}onSpill(O){const{removeOnSpill:E,revertOnSpill:C}=this.props;E&&!C&&s(O.item)}onSelect(O){const{list:E,setList:C}=this.props,P=E.map(I=>Object.assign(I,{selected:!1}));O.newIndicies.forEach(I=>{const T=I.index;if(T===-1){console.log(`"${O.type}" had indice of "${I.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}P[T].selected=!0}),C(P,this.sortable,S)}onDeselect(O){const{list:E,setList:C}=this.props,P=E.map(I=>Object.assign(I,{selected:!1}));O.newIndicies.forEach(I=>{const T=I.index;T!==-1&&(P[T].selected=!0)}),C(P,this.sortable,S)}}k.defaultProps={clone:w=>w};var _={};l(e.exports,_)})(fx);const cD="_container_xt7ji_1",fD="_list_xt7ji_6",dD="_item_xt7ji_15",pD="_keyField_xt7ji_29",hD="_valueField_xt7ji_34",mD="_header_xt7ji_39",gD="_dragHandle_xt7ji_45",vD="_deleteButton_xt7ji_55",yD="_addItemButton_xt7ji_65",wD="_separator_xt7ji_72",kt={container:cD,list:fD,item:dD,keyField:pD,valueField:hD,header:mD,dragHandle:gD,deleteButton:vD,addItemButton:yD,separator:wD};function Vm({name:e,label:t,value:n,onChange:r,optional:i=!1,newItemValue:o={key:"myKey",value:"myValue"}}){const[a,l]=R.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),s=Oi(r);R.useEffect(()=>{const f=bD(a);dk(f,n!=null?n:{})||s({name:e,value:f})},[e,s,a,n]);const u=R.useCallback(f=>{l(d=>d.filter(({id:p})=>p!==f))},[]),c=R.useCallback(()=>{l(f=>[...f,U({id:-1},o)].map((d,p)=>Q(U({},d),{id:p})))},[o]);return M("div",{className:kt.container,children:[b(Wo,{category:e!=null?e:t}),M("div",{className:kt.list,children:[M("div",{className:kt.item+" "+kt.header,children:[b("span",{className:kt.keyField,children:"Key"}),b("span",{className:kt.valueField,children:"Value"})]}),b(fx.exports.ReactSortable,{list:a,setList:l,handle:`.${kt.dragHandle}`,children:a.map((f,d)=>M("div",{className:kt.item,children:[b("div",{className:kt.dragHandle,title:"Reorder list",children:b(EN,{})}),b("input",{className:kt.keyField,type:"text",value:f.key,onChange:p=>{const h=[...a];h[d]=Q(U({},f),{key:p.target.value}),l(h)}}),b("span",{className:kt.separator,children:":"}),b("input",{className:kt.valueField,type:"text",value:f.value,onChange:p=>{const h=[...a];h[d]=Q(U({},f),{value:p.target.value}),l(h)}}),b(Ft,{className:kt.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:b(pm,{})})]},f.id))}),b(Ft,{className:kt.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:b($b,{})})]})]})}function bD(e){return e.reduce((n,{key:r,value:i})=>(n[r]=i,n),{})}const SD=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(Vm,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),xD="_container_162lp_1",ED="_checkbox_162lp_14",fd={container:xD,checkbox:ED},CD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices;return M("div",Q(U({ref:r,className:fd.container,style:{width:t.width}},n),{children:[b("label",{children:t.label}),b("div",{children:Object.keys(i).map((o,a)=>b("div",{className:fd.radio,children:M("label",{className:fd.checkbox,children:[b("input",{type:"checkbox",name:i[o],value:i[o],defaultChecked:a===0}),b("span",{children:o})]})},o))}),e]}))},AD={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},kD={title:"Checkbox Group",UiComponent:CD,SettingsComponent:SD,acceptsChildren:!1,defaultSettings:AD,iconSrc:bN,category:"Inputs",description:"Create a group of checkboxes that can be used to toggle multiple choices independently. The server will receive the input as a character vector of the selected values."},OD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",PD=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(ux,{label:"Starting value",name:"value",value:e.value}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),ID="_container_1x0tz_1",TD="_label_1x0tz_10",I1={container:ID,label:TD},_D=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var s;const i=(s=t.width)!=null?s:"auto",o=U({},t),[a,l]=H.exports.useState(o.value);return H.exports.useEffect(()=>{l(o.value)},[o.value]),M("div",Q(U({className:I1.container+" shiny::checkbox",style:{width:i},"aria-label":"shiny::checkbox",ref:r},n),{children:[M("label",{htmlFor:o.inputId,children:[b("input",{id:o.inputId,type:"checkbox",checked:a,onChange:u=>l(u.target.checked)}),b("span",{className:I1.label,children:o.label})]}),e]}))},ND={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},DD={title:"Checkbox Input",UiComponent:_D,SettingsComponent:PD,acceptsChildren:!1,defaultSettings:ND,iconSrc:OD,category:"Inputs",description:"Create a checkbox that can be used to specify logical values."},RD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",FD="_wrappedSection_1dn9g_1",LD="_sectionContainer_1dn9g_9",Ku={wrappedSection:FD,sectionContainer:LD},Ax=({name:e,children:t})=>M("div",{className:Ku.sectionContainer,children:[b(Wo,{category:e}),b("div",{className:Ku.wrappedSection,children:t})]}),MD=({name:e,children:t})=>M("div",{className:Ku.sectionContainer,children:[b(Wo,{category:e}),b("div",{className:Ku.inputSection,children:t})]}),BD=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),M(Ax,{name:"Values",children:[b(Cr,{name:"value",value:e.value}),b(Cr,{name:"min",value:e.min,optional:!0,defaultValue:0}),b(Cr,{name:"max",value:e.max,optional:!0,defaultValue:10}),b(Cr,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),b(Wo,{}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),UD="_container_yicbr_1",zD={container:UD},jD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var s;const i=U({},t),o=(s=i.width)!=null?s:"200px",[a,l]=H.exports.useState(i.value);return H.exports.useEffect(()=>{l(i.value)},[i.value]),M("div",Q(U({className:zD.container+" shiny::numericInput",style:{width:o},"aria-label":"shiny::numericInput",ref:r},n),{children:[b("span",{children:i.label}),b("input",{type:"number",value:a,onChange:u=>l(Number(u.target.value)),min:i.min,max:i.max,step:i.step}),e]}))},WD={inputId:"myNumericInput",label:"Numeric Input",value:10},YD={title:"Numeric Input",UiComponent:jD,SettingsComponent:BD,acceptsChildren:!1,defaultSettings:WD,iconSrc:RD,category:"Inputs",description:"An input control for entry of numeric values"},HD=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>M(Ke,{children:[b(Ae,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),b(Gn,{name:"width",units:["px","%"],value:t}),b(Gn,{name:"height",units:["px","%"],value:n})]}),$D=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:i,compRef:o})=>M("div",Q(U({className:Dp.container,ref:o,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},i),{children:[b(sx,{outputId:e}),r]})),VD={title:"Plot Output",UiComponent:$D,SettingsComponent:HD,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:ax,category:"Outputs",description:"Render a `renderPlot()` within an application page."},GD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",JD=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(Vm,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),QD="_container_sgn7c_1",T1={container:QD},XD=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices,o=Object.keys(i),a=Object.values(i),[l,s]=R.useState(a[0]);return R.useEffect(()=>{a.includes(l)||s(a[0])},[l,a]),M("div",Q(U({ref:r,className:T1.container,style:{width:t.width}},n),{children:[b("label",{children:t.label}),b("div",{children:a.map((u,c)=>b("div",{className:T1.radio,children:M("label",{children:[b("input",{type:"radio",name:t.inputId,value:u,onChange:f=>s(f.target.value),checked:u===l}),b("span",{children:o[c]})]})},u))}),e]}))},qD={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},KD={title:"Radio Buttons",UiComponent:XD,SettingsComponent:JD,acceptsChildren:!1,defaultSettings:qD,iconSrc:GD,category:"Inputs",description:"Create a set of radio buttons used to select an item from a list."},ZD="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",eR=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),b(Vm,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),tR="_container_1e5dd_1",nR={container:tR},rR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=t.choices,o=t.inputId;return M("div",Q(U({ref:r,className:nR.container},n),{children:[b("label",{htmlFor:o,children:t.label}),b("select",{id:o,children:Object.keys(i).map((a,l)=>b("option",{value:i[a],children:a},a))}),e]}))},iR={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},oR={title:"Select Input",UiComponent:rR,SettingsComponent:eR,acceptsChildren:!1,defaultSettings:iR,iconSrc:ZD,category:"Inputs",description:"Create a select list that can be used to choose a single or multiple items from a list of values."},aR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",lR=({settings:e})=>{const t=U({},e);return M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:t.inputId}),b(Ae,{name:"label",value:t.label}),M(Ax,{name:"Values",children:[b(Cr,{name:"min",value:t.min}),b(Cr,{name:"max",value:t.max}),b(Cr,{name:"value",label:"start",value:t.value}),b(Cr,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),b(Wo,{}),b(Gn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},sR="_container_1f2js_1",uR="_sliderWrapper_1f2js_11",cR="_sliderInput_1f2js_16",dd={container:sR,sliderWrapper:uR,sliderInput:cR},fR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i=U({},t),{width:o="200px"}=i,[a,l]=H.exports.useState(i.value);return M("div",Q(U({className:dd.container+" shiny::sliderInput",style:{width:o},"aria-label":"shiny::sliderInput",ref:r},n),{children:[b("div",{children:i.label}),b("div",{className:dd.sliderWrapper,children:b("input",{type:"range",min:i.min,max:i.max,value:a,onChange:s=>l(Number(s.target.value)),className:"slider "+dd.sliderInput,"aria-label":"slider input","data-min":i.min,"data-max":i.max,draggable:!0,onDragStartCapture:s=>{s.stopPropagation(),s.preventDefault()}})}),M("div",{children:[b(lx,{type:"input",name:i.inputId})," = ",a]}),e]}))},dR={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},pR={title:"Slider Input",UiComponent:fR,SettingsComponent:lR,acceptsChildren:!1,defaultSettings:dR,iconSrc:aR,category:"Inputs",description:"Constructs a slider widget to select a number from a range. _(Dates and date-times not currently supported.)_"},hR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",mR=({settings:e})=>M(Ke,{children:[b(Ae,{name:"inputId",label:"Input ID",value:e.inputId}),b(Ae,{name:"label",value:e.label}),M(MD,{name:"Values",children:[b(Ae,{name:"value",value:e.value}),b(Ae,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),b(Gn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),gR="_container_yicbr_1",vR={container:gR},yR=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const i="200px",o="auto",a=U({},t),[l,s]=H.exports.useState(a.value);return H.exports.useEffect(()=>{s(a.value)},[a.value]),M("div",Q(U({className:vR.container+" shiny::textInput",style:{height:o,width:i},"aria-label":"shiny::textInput",ref:r},n),{children:[b("label",{htmlFor:a.inputId,children:a.label}),b("input",{id:a.inputId,type:"text",value:l,onChange:u=>s(u.target.value),placeholder:a.placeholder}),e]}))},wR={inputId:"myTextInput",label:"Text Input",value:""},bR={title:"Text Input",UiComponent:yR,SettingsComponent:mR,acceptsChildren:!1,defaultSettings:wR,iconSrc:hR,category:"Inputs",description:"Create an input control for entry of unstructured text values."},SR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",xR=({settings:e})=>b(Ae,{label:"Output ID",name:"outputId",value:e.outputId}),ER="_container_1i6yi_1",CR={container:ER},AR=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>M("div",Q(U({className:CR.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",M("code",{children:["output$",e.outputId]}),t]})),kR={title:"Text Output",UiComponent:AR,SettingsComponent:xR,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:SR,category:"Outputs",description:` - Render a reactive output variable as text within an application page. - Usually paired with \`renderText()\`. - `},OR="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",PR=({settings:e})=>{var t;return b(Ae,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},IR="_container_1xnzo_1",TR={container:IR},_R=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:i="shiny-ui-output"}=e;return M("div",Q(U({className:TR.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[M("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",i,"!"]}),t]}))},NR={title:"Dynamic UI Output",UiComponent:_R,SettingsComponent:PR,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:OR,category:"Outputs",description:` - Render a reactive output variable as HTML within an application page. - The text will be included within an HTML \`div\` tag, and is presumed to - contain HTML content which should not be escaped. - `};function DR(e){return Bt({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function RR(e){return Bt({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function FR(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const LR="_container_p6wnj_1",MR="_infoMsg_p6wnj_14",BR="_codeHolder_p6wnj_19",Up={container:LR,infoMsg:MR,codeHolder:BR},UR=({settings:e})=>M("div",{children:[b("div",{className:lr.container,children:M("span",{className:Up.infoMsg,children:[b(DR,{}),"Unknown function call. Can't modify with visual editor."]})}),b(Wo,{category:"Code"}),b("div",{className:lr.container,children:b("pre",{className:Up.codeHolder,children:FR(e.text)})})]}),zR=20,jR=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const i=e.text.slice(0,zR).replaceAll(/\s$/g,"")+"...";return M("div",Q(U({className:Up.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[M("div",{children:["unknown ui output: ",b("code",{children:i})]}),t]}))},WR={title:"Unknown UI Function",UiComponent:jR,SettingsComponent:UR,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},kn={"shiny::actionButton":wN,"shiny::numericInput":YD,"shiny::sliderInput":pR,"shiny::textInput":bR,"shiny::checkboxInput":DD,"shiny::checkboxGroupInput":kD,"shiny::selectInput":oR,"shiny::radioButtons":KD,"shiny::plotOutput":VD,"shiny::textOutput":kR,"shiny::uiOutput":NR,"gridlayout::grid_page":pN,"gridlayout::grid_card":B5,"gridlayout::grid_card_text":uN,"gridlayout::grid_card_plot":J5,unknownUiFunction:WR};function kx(e,t){return Db(e,t,Math.min(e.length,t.length))}function Ox(e,{path:t}){var i;for(let o of Object.values(kn)){const a=(i=o==null?void 0:o.stateUpdateSubscribers)==null?void 0:i.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=YR(e,t);if(!jm(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function YR(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const i=n.length===0?e:Fr(e,n);if(!jm(i))throw new Error("Somehow trying to enter a leaf node");return{parentNode:i,indexToNode:r}}function HR(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:i}){const o=Fr(e,t);if(!kn[o.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(o.uiChildren)||(o.uiChildren=[]);const a=r==="last"?o.uiChildren.length:r;if(i!==void 0){const l=[...t,a];if(kx(i,l))throw new Error("Invalid move request");if(ym(i,l)){const s=i[i.length-1];o.uiChildren=AO(o.uiChildren,s,a);return}Ox(e,{path:i})}o.uiChildren=xl(o.uiChildren,a,n)}function $R({fromPath:e,toPath:t}){if(e==null)return!0;if(kx(e,t))return!1;if(ym(e,t)){const n=e.length,r=e[n-1],i=t[n-1];if(r===i||r===i-1)return!1}return!0}function VR(e,{path:t,node:n}){var i;for(let o of Object.values(kn)){const a=(i=o==null?void 0:o.stateUpdateSubscribers)==null?void 0:i.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=Fr(e,t);Object.assign(r,n)}const Gm={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},Px=nm({name:"uiTree",initialState:Gm,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>Ix(t.payload.initialState),UPDATE_NODE:(e,t)=>{VR(e,t.payload)},PLACE_NODE:(e,t)=>{HR(e,t.payload)},DELETE_NODE:(e,t)=>{Ox(e,t.payload)}}});function Ix(e){const t=kn[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return CO(r,n).length>0&&(e.uiArguments=U(U({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(o=>Ix(o)),e}const{UPDATE_NODE:Tx,PLACE_NODE:GR,DELETE_NODE:_x,INIT_STATE:JR,SET_FULL_STATE:QR}=Px.actions;function Nx(){const e=Jr();return R.useCallback(n=>{e(GR(n))},[e])}const XR=Px.reducer,Dx=sk();Dx.startListening({actionCreator:_x,effect:(e,t)=>og(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Vl(n,r)&&t.dispatch(hk()),r.lengtho)return;const a=[...r];a[n.length-1]=o-1,t.dispatch(Fb({path:a}))})});const qR=Dx.middleware,KR=j2({reducer:{uiTree:XR,selectedPath:mk,connectedToServer:fk},middleware:e=>e().concat(qR)}),ZR=({children:e})=>b(HA,{store:KR,children:e}),eF=!1;function tF(){const e=window.location.host+window.location.pathname;return(window.location.protocol==="https:"?"wss:":"ws:")+"//"+e}const uu={ws:null,msg:null},Rx=Q(U({},uu),{status:"connecting"});function nF(e,t){switch(t.type){case"CONNECTED":return Q(U({},uu),{status:"connected",ws:t.ws});case"FAILED":return Q(U({},uu),{status:"failed-to-open"});case"CLOSED":return Q(U({},uu),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function rF(){const[e,t]=R.useReducer(nF,Rx),n=R.useRef(!1);return R.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=tF(),i=new WebSocket(r);return i.onerror=o=>{console.error("Error with httpuv websocket connection",o)},i.onopen=o=>{n.current=!0,t({type:"CONNECTED",ws:i})},i.onclose=o=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>i.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const Fx=R.createContext(Rx),iF=({children:e})=>{const t=rF();return b(Fx.Provider,{value:t,children:e})};function Lx(){return R.useContext(Fx)}function oF(e){return JSON.parse(e.data)}function Mx(e,t){e.addEventListener("message",n=>{t(oF(n))})}function zp(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const aF="_appViewerHolder_wu0cb_1",lF="_title_wu0cb_55",sF="_appContainer_wu0cb_89",uF="_previewFrame_wu0cb_109",cF="_expandButton_wu0cb_134",fF="_reloadButton_wu0cb_135",dF="_spin_wu0cb_160",pF="_restartButton_wu0cb_198",hF="_loadingMessage_wu0cb_225",mF="_error_wu0cb_236",_t={appViewerHolder:aF,title:lF,appContainer:sF,previewFrame:uF,expandButton:cF,reloadButton:fF,spin:dF,restartButton:pF,loadingMessage:hF,error:mF},gF="_fakeApp_t3dh1_1",vF="_fakeDashboard_t3dh1_7",yF="_header_t3dh1_22",wF="_sidebar_t3dh1_31",bF="_top_t3dh1_35",SF="_bottom_t3dh1_39",ga={fakeApp:gF,fakeDashboard:vF,header:yF,sidebar:wF,top:bF,bottom:SF},xF=()=>b("div",{className:_t.appContainer,children:M("div",{className:ga.fakeDashboard+" "+_t.previewFrame,children:[b("div",{className:ga.header,children:b("h1",{children:"App preview not available"})}),b("div",{className:ga.sidebar}),b("div",{className:ga.top}),b("div",{className:ga.bottom})]})});function EF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function CF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function AF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function kF(e){return Bt({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const OF="_logs_xjp5l_2",PF="_logsContents_xjp5l_25",IF="_expandTab_xjp5l_29",TF="_clearLogsButton_xjp5l_69",_F="_logLine_xjp5l_75",NF="_noLogsMsg_xjp5l_81",DF="_expandedLogs_xjp5l_93",RF="_expandLogsButton_xjp5l_101",FF="_unseenLogsNotification_xjp5l_108",LF="_slidein_xjp5l_1",ti={logs:OF,logsContents:PF,expandTab:IF,clearLogsButton:TF,logLine:_F,noLogsMsg:NF,expandedLogs:DF,expandLogsButton:RF,unseenLogsNotification:FF,slidein:LF};function MF({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:i}=BF(e),o=e.length===0;return M("div",{className:ti.logs,"data-expanded":n,children:[M("button",{className:ti.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[b(AF,{className:ti.unseenLogsNotification,"data-show":i}),"App Logs",n?b(EF,{}):b(CF,{})]}),M("div",{className:ti.logsContents,children:[o?b("p",{className:ti.noLogsMsg,children:"No recent logs"}):e.map((a,l)=>b("p",{className:ti.logLine,children:a},l)),o?null:b(Ft,{variant:"icon",title:"clear logs",className:ti.clearLogsButton,onClick:t,children:b(kF,{})})]})]})}function BF(e){const[t,n]=R.useState(!1),[r,i]=R.useState(!1),[o,a]=R.useState(null),[l,s]=R.useState(new Date),u=R.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),i(!1)},[t]);return R.useEffect(()=>{s(new Date)},[e]),R.useEffect(()=>{if(t||e.length===0){i(!1);return}if(o===null||o{u==="connected"&&(tl(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>tl(c,{path:"APP-PREVIEW-RESTART"})),h(()=>()=>tl(c,{path:"APP-PREVIEW-STOP"})),Mx(c,y=>{if(!UF(y))return;const{path:S,payload:k}=y;switch(S){case"SHINY_READY":s(!1),a(!1),n(k);break;case"SHINY_LOGS":i(jF(k));break;case"SHINY_CRASH":s(k);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:y})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=R.useState(()=>()=>console.log("No app running to reset")),[p,h]=R.useState(()=>()=>console.log("No app running to stop")),g=R.useCallback(()=>{i([])},[]),v={appLogs:r,clearLogs:g,restartApp:f,stopApp:p};return o?Object.assign(v,{status:"no-preview",appLoc:null}):l?Object.assign(v,{status:"crashed",error:l,appLoc:null}):t?Object.assign(v,{status:"finished",appLoc:t,error:null}):Object.assign(v,{status:"loading",appLoc:null,error:null})}function jF(e){return Array.isArray(e)?e:[e]}function WF(){const[e,t]=R.useState(.2),n=GF();return R.useEffect(()=>{!n||t(YF(n.width))},[n]),e}function YF(e){const t=CE-Bx*2,n=e-Ux*2;return t/n}const Bx=16,Ux=55;function HF(){const e=R.useRef(null),[t,n]=R.useState(!1),r=R.useCallback(()=>{n(f=>!f)},[]),{status:i,appLoc:o,appLogs:a,clearLogs:l,restartApp:s}=zF(),u=WF(),c=R.useCallback(f=>{!e.current||!o||(e.current.src=o,JF(f.currentTarget))},[o]);return i==="no-preview"&&!eF?null:M(Ke,{children:[M("h3",{className:_t.title+" "+rx.panelTitleHeader,children:[b(Ft,{variant:["transparent","icon"],className:_t.reloadButton,title:"Reload app session",onClick:c,children:b(zp,{})}),"App Preview"]}),b("div",{className:_t.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Bx}px`,"--expanded-inset-horizontal":`${Ux}px`},children:i==="loading"?b(VF,{}):i==="crashed"?b($F,{onClick:s}):M(Ke,{children:[b(Ft,{variant:["transparent","icon"],className:_t.reloadButton,title:"Reload app session",onClick:c,children:b(zp,{})}),M("div",{className:_t.appContainer,children:[i==="no-preview"?b(xF,{}):b("iframe",{className:_t.previewFrame,src:o,title:"Application Preview",ref:e}),b(Ft,{variant:"icon",className:_t.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?b(RR,{}):b(EO,{})})]}),b(MF,{appLogs:a,clearLogs:l})]})})]})}function $F({onClick:e}){return M("div",{className:_t.appContainer,children:[M("p",{children:["App preview crashed.",b("br",{})," Try and restart?"]}),M(Ft,{className:_t.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",b(zp,{})]})]})}function VF(){return b("div",{className:_t.loadingMessage,children:b("h2",{children:"Loading app preview..."})})}function GF(){const[e,t]=R.useState(null),n=R.useMemo(()=>xm(()=>{const{innerWidth:r,innerHeight:i}=window;t({width:r,height:i})},500),[]);return R.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function JF(e){e.classList.add(_t.spin),e.addEventListener("animationend",()=>e.classList.remove(_t.spin),!1)}const QF=e=>b("svg",Q(U({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:b("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class XF{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function qF(){const e=Hl(c=>c.uiTree),t=Jr(),[n,r]=R.useState(!1),[i,o]=R.useState(!1),a=R.useRef(new XF({comparisonFn:KF}));R.useEffect(()=>{if(!e||e===Gm)return;const c=a.current;c.addEntry(e),o(c.canGoBackwards()),r(c.canGoForwards())},[e]);const l=R.useCallback(c=>{t(QR({state:c}))},[t]),s=R.useCallback(()=>{console.log("Navigating backwards"),l(a.current.goBackwards())},[l]),u=R.useCallback(()=>{console.log("Navigating forwards"),l(a.current.goForwards())},[l]);return{goBackward:s,goForward:u,canGoBackward:i,canGoForward:n}}function KF(e,t){return typeof t=="undefined"?!1:e===t}const ZF="_container_1d7pe_1",eL={container:ZF};function tL(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=qF();return M("div",{className:eL.container+" undo-redo-buttons",children:[b(Ft,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:b(Hk,{height:"100%"})}),b(Ft,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:b(Yk,{height:"100%"})})]})}const nL="_elementsPalette_qmlez_1",rL="_OptionContainer_qmlez_18",iL="_OptionItem_qmlez_24",oL="_OptionIcon_qmlez_33",aL="_OptionLabel_qmlez_41",Ra={elementsPalette:nL,OptionContainer:rL,OptionItem:iL,OptionIcon:oL,OptionLabel:aL};function lL({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r,description:i=n}=kn[e],o={uiName:e,uiArguments:r},a=H.exports.useRef(null);return Hb({ref:a,nodeInfo:{node:o}}),t===void 0?null:b(JS,{popoverContent:i,contentIsMd:!0,openDelayMs:500,triggerEl:b("div",{className:Ra.OptionContainer,children:M("div",{ref:a,className:Ra.OptionItem,"data-ui-name":e,children:[b("img",{src:t,alt:n,className:Ra.OptionIcon}),b("label",{className:Ra.OptionLabel,children:n})]})})})}const _1=["Inputs","Outputs","gridlayout","uncategorized"];function sL(e,t){var i,o;const n=_1.indexOf(((i=kn[e])==null?void 0:i.category)||"uncategorized"),r=_1.indexOf(((o=kn[t])==null?void 0:o.category)||"uncategorized");return nr?1:0}function uL({availableUi:e=kn}){const t=H.exports.useMemo(()=>Object.keys(e).sort(sL),[e]);return b("div",{className:Ra.elementsPalette,children:t.map(n=>b(lL,{uiName:n},n))})}function zx(e){return function(t){return typeof t===e}}var cL=zx("function"),fL=function(e){return e===null},N1=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},D1=function(e){return!dL(e)&&!fL(e)&&(cL(e)||typeof e=="object")},dL=zx("undefined"),jp=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function pL(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!Nt(e[r],t[r]))return!1;return!0}function hL(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),i=e.byteLength;i--;)if(n.getUint8(i)!==r.getUint8(i))return!1;return!0}function mL(e,t){var n,r,i,o;if(e.size!==t.size)return!1;try{for(var a=jp(e.entries()),l=a.next();!l.done;l=a.next()){var s=l.value;if(!t.has(s[0]))return!1}}catch(f){n={error:f}}finally{try{l&&!l.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=jp(e.entries()),c=u.next();!c.done;c=u.next()){var s=c.value;if(!Nt(s[1],t.get(s[0])))return!1}}catch(f){i={error:f}}finally{try{c&&!c.done&&(o=u.return)&&o.call(u)}finally{if(i)throw i.error}}return!0}function gL(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var i=jp(e.entries()),o=i.next();!o.done;o=i.next()){var a=o.value;if(!t.has(a[0]))return!1}}catch(l){n={error:l}}finally{try{o&&!o.done&&(r=i.return)&&r.call(i)}finally{if(n)throw n.error}}return!0}function Nt(e,t){if(e===t)return!0;if(e&&D1(e)&&t&&D1(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return pL(e,t);if(e instanceof Map&&t instanceof Map)return mL(e,t);if(e instanceof Set&&t instanceof Set)return gL(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return hL(e,t);if(N1(e)&&N1(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var i=n.length;i--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[i]))return!1;for(var i=n.length;i--!==0;){var o=n[i];if(!(o==="_owner"&&e.$$typeof)&&!Nt(e[o],t[o]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var vL=["innerHTML","ownerDocument","style","attributes","nodeValue"],yL=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],wL=["bigint","boolean","null","number","string","symbol","undefined"];function Zc(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(bL(t))return t}function In(e){return function(t){return Zc(t)===e}}function bL(e){return yL.includes(e)}function Yo(e){return function(t){return typeof t===e}}function SL(e){return wL.includes(e)}function D(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(D.array(e))return"Array";if(D.plainFunction(e))return"Function";var t=Zc(e);return t||"Object"}D.array=Array.isArray;D.arrayOf=function(e,t){return!D.array(e)&&!D.function(t)?!1:e.every(function(n){return t(n)})};D.asyncGeneratorFunction=function(e){return Zc(e)==="AsyncGeneratorFunction"};D.asyncFunction=In("AsyncFunction");D.bigint=Yo("bigint");D.boolean=function(e){return e===!0||e===!1};D.date=In("Date");D.defined=function(e){return!D.undefined(e)};D.domElement=function(e){return D.object(e)&&!D.plainObject(e)&&e.nodeType===1&&D.string(e.nodeName)&&vL.every(function(t){return t in e})};D.empty=function(e){return D.string(e)&&e.length===0||D.array(e)&&e.length===0||D.object(e)&&!D.map(e)&&!D.set(e)&&Object.keys(e).length===0||D.set(e)&&e.size===0||D.map(e)&&e.size===0};D.error=In("Error");D.function=Yo("function");D.generator=function(e){return D.iterable(e)&&D.function(e.next)&&D.function(e.throw)};D.generatorFunction=In("GeneratorFunction");D.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};D.iterable=function(e){return!D.nullOrUndefined(e)&&D.function(e[Symbol.iterator])};D.map=In("Map");D.nan=function(e){return Number.isNaN(e)};D.null=function(e){return e===null};D.nullOrUndefined=function(e){return D.null(e)||D.undefined(e)};D.number=function(e){return Yo("number")(e)&&!D.nan(e)};D.numericString=function(e){return D.string(e)&&e.length>0&&!Number.isNaN(Number(e))};D.object=function(e){return!D.nullOrUndefined(e)&&(D.function(e)||typeof e=="object")};D.oneOf=function(e,t){return D.array(e)?e.indexOf(t)>-1:!1};D.plainFunction=In("Function");D.plainObject=function(e){if(Zc(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};D.primitive=function(e){return D.null(e)||SL(typeof e)};D.promise=In("Promise");D.propertyOf=function(e,t,n){if(!D.object(e)||!t)return!1;var r=e[t];return D.function(n)?n(r):D.defined(r)};D.regexp=In("RegExp");D.set=In("Set");D.string=Yo("string");D.symbol=Yo("symbol");D.undefined=Yo("undefined");D.weakMap=In("WeakMap");D.weakSet=In("WeakSet");function xL(){for(var e=[],t=0;ts);return D.undefined(r)||(u=u&&s===r),D.undefined(o)||(u=u&&l===o),u}function F1(e,t,n){var r=n.key,i=n.type,o=n.value,a=Bn(e,r),l=Bn(t,r),s=i==="added"?a:l,u=i==="added"?l:a;if(!D.nullOrUndefined(o)){if(D.defined(s)){if(D.array(s)||D.plainObject(s))return EL(s,u,o)}else return Nt(u,o);return!1}return[a,l].every(D.array)?!u.every(Jm(s)):[a,l].every(D.plainObject)?CL(Object.keys(s),Object.keys(u)):![a,l].every(function(c){return D.primitive(c)&&D.defined(c)})&&(i==="added"?!D.defined(a)&&D.defined(l):D.defined(a)&&!D.defined(l))}function L1(e,t,n){var r=n===void 0?{}:n,i=r.key,o=Bn(e,i),a=Bn(t,i);if(!jx(o,a))throw new TypeError("Inputs have different types");if(!xL(o,a))throw new TypeError("Inputs don't have length");return[o,a].every(D.plainObject)&&(o=Object.keys(o),a=Object.keys(a)),[o,a]}function M1(e){return function(t){var n=t[0],r=t[1];return D.array(e)?Nt(e,r)||e.some(function(i){return Nt(i,r)||D.array(r)&&Jm(r)(i)}):D.plainObject(e)&&e[n]?!!e[n]&&Nt(e[n],r):Nt(e,r)}}function CL(e,t){return t.some(function(n){return!e.includes(n)})}function B1(e){return function(t){return D.array(e)?e.some(function(n){return Nt(n,t)||D.array(t)&&Jm(t)(n)}):Nt(e,t)}}function va(e,t){return D.array(e)?e.some(function(n){return Nt(n,t)}):Nt(e,t)}function Jm(e){return function(t){return e.some(function(n){return Nt(n,t)})}}function jx(){for(var e=[],t=0;t=0)return 1;return 0}();function KL(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function ZL(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},qL))}}var e8=ts&&window.Promise,t8=e8?KL:ZL;function Jx(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Ii(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function Qm(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function ns(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Ii(e),n=t.overflow,r=t.overflowX,i=t.overflowY;return/(auto|scroll|overlay)/.test(n+i+r)?e:ns(Qm(e))}function Qx(e){return e&&e.referenceNode?e.referenceNode:e}var Y1=ts&&!!(window.MSInputMethodContext&&document.documentMode),H1=ts&&/MSIE 10/.test(navigator.userAgent);function Ho(e){return e===11?Y1:e===10?H1:Y1||H1}function Oo(e){if(!e)return document.documentElement;for(var t=Ho(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Ii(n,"position")==="static"?Oo(n):n}function n8(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Oo(e.firstElementChild)===e}function Wp(e){return e.parentNode!==null?Wp(e.parentNode):e}function ec(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,i=n?t:e,o=document.createRange();o.setStart(r,0),o.setEnd(i,0);var a=o.commonAncestorContainer;if(e!==a&&t!==a||r.contains(i))return n8(a)?a:Oo(a);var l=Wp(e);return l.host?ec(l.host,t):ec(e,Wp(t).host)}function Po(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var i=e.ownerDocument.documentElement,o=e.ownerDocument.scrollingElement||i;return o[n]}return e[n]}function r8(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Po(t,"top"),i=Po(t,"left"),o=n?-1:1;return e.top+=r*o,e.bottom+=r*o,e.left+=i*o,e.right+=i*o,e}function $1(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function V1(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],Ho(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function Xx(e){var t=e.body,n=e.documentElement,r=Ho(10)&&getComputedStyle(n);return{height:V1("Height",t,n,r),width:V1("Width",t,n,r)}}var i8=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},o8=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=Ho(10),i=t.nodeName==="HTML",o=Yp(e),a=Yp(t),l=ns(e),s=Ii(t),u=parseFloat(s.borderTopWidth),c=parseFloat(s.borderLeftWidth);n&&i&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=$r({top:o.top-a.top-u,left:o.left-a.left-c,width:o.width,height:o.height});if(f.marginTop=0,f.marginLeft=0,!r&&i){var d=parseFloat(s.marginTop),p=parseFloat(s.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(l):t===l&&l.nodeName!=="BODY")&&(f=r8(f,t)),f}function a8(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=Xm(e,n),i=Math.max(n.clientWidth,window.innerWidth||0),o=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Po(n),l=t?0:Po(n,"left"),s={top:a-r.top+r.marginTop,left:l-r.left+r.marginLeft,width:i,height:o};return $r(s)}function qx(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Ii(e,"position")==="fixed")return!0;var n=Qm(e);return n?qx(n):!1}function Kx(e){if(!e||!e.parentElement||Ho())return document.documentElement;for(var t=e.parentElement;t&&Ii(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function qm(e,t,n,r){var i=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,o={top:0,left:0},a=i?Kx(e):ec(e,Qx(t));if(r==="viewport")o=a8(a,i);else{var l=void 0;r==="scrollParent"?(l=ns(Qm(t)),l.nodeName==="BODY"&&(l=e.ownerDocument.documentElement)):r==="window"?l=e.ownerDocument.documentElement:l=r;var s=Xm(l,a,i);if(l.nodeName==="HTML"&&!qx(a)){var u=Xx(e.ownerDocument),c=u.height,f=u.width;o.top+=s.top-s.marginTop,o.bottom=c+s.top,o.left+=s.left-s.marginLeft,o.right=f+s.left}else o=s}n=n||0;var d=typeof n=="number";return o.left+=d?n:n.left||0,o.top+=d?n:n.top||0,o.right-=d?n:n.right||0,o.bottom-=d?n:n.bottom||0,o}function l8(e){var t=e.width,n=e.height;return t*n}function Zx(e,t,n,r,i){var o=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=qm(n,r,o,i),l={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},s=Object.keys(l).map(function(d){return tn({key:d},l[d],{area:l8(l[d])})}).sort(function(d,p){return p.area-d.area}),u=s.filter(function(d){var p=d.width,h=d.height;return p>=n.clientWidth&&h>=n.clientHeight}),c=u.length>0?u[0].key:s[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function eE(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,i=r?Kx(t):ec(t,Qx(n));return Xm(n,i,r)}function tE(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),i=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),o={width:e.offsetWidth+i,height:e.offsetHeight+r};return o}function tc(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function nE(e,t,n){n=n.split("-")[0];var r=tE(e),i={width:r.width,height:r.height},o=["right","left"].indexOf(n)!==-1,a=o?"top":"left",l=o?"left":"top",s=o?"height":"width",u=o?"width":"height";return i[a]=t[a]+t[s]/2-r[s]/2,n===l?i[l]=t[l]-r[u]:i[l]=t[tc(l)],i}function rs(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function s8(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(i){return i[t]===n});var r=rs(e,function(i){return i[t]===n});return e.indexOf(r)}function rE(e,t,n){var r=n===void 0?e:e.slice(0,s8(e,"name",n));return r.forEach(function(i){i.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var o=i.function||i.fn;i.enabled&&Jx(o)&&(t.offsets.popper=$r(t.offsets.popper),t.offsets.reference=$r(t.offsets.reference),t=o(t,i))}),t}function u8(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=eE(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=Zx(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=nE(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=rE(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function iE(e,t){return e.some(function(n){var r=n.name,i=n.enabled;return i&&r===t})}function Km(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=l[f]+h-a[p]),e.offsets.popper=$r(e.offsets.popper);var g=l[f]+l[u]/2-h/2,v=Ii(e.instance.popper),m=parseFloat(v["margin"+c]),y=parseFloat(v["border"+c+"Width"]),S=g-e.offsets.popper[f]-m-y;return S=Math.max(Math.min(a[u]-h,S),0),e.arrowElement=r,e.offsets.arrow=(n={},Io(n,f,Math.round(S)),Io(n,d,""),n),e}function x8(e){return e==="end"?"start":e==="start"?"end":e}var sE=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],pd=sE.slice(3);function G1(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=pd.indexOf(e),r=pd.slice(n+1).concat(pd.slice(0,n));return t?r.reverse():r}var hd={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function E8(e,t){if(iE(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=qm(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],i=tc(r),o=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case hd.FLIP:a=[r,i];break;case hd.CLOCKWISE:a=G1(r);break;case hd.COUNTERCLOCKWISE:a=G1(r,!0);break;default:a=t.behavior}return a.forEach(function(l,s){if(r!==l||a.length===s+1)return e;r=e.placement.split("-")[0],i=tc(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),g=f(u.top)f(n.bottom),m=r==="left"&&p||r==="right"&&h||r==="top"&&g||r==="bottom"&&v,y=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(y&&o==="start"&&p||y&&o==="end"&&h||!y&&o==="start"&&g||!y&&o==="end"&&v),k=!!t.flipVariationsByContent&&(y&&o==="start"&&h||y&&o==="end"&&p||!y&&o==="start"&&v||!y&&o==="end"&&g),_=S||k;(d||m||_)&&(e.flipped=!0,(d||m)&&(r=a[s+1]),_&&(o=x8(o)),e.placement=r+(o?"-"+o:""),e.offsets.popper=tn({},e.offsets.popper,nE(e.instance.popper,e.offsets.reference,e.placement)),e=rE(e.instance.modifiers,e,"flip"))}),e}function C8(e){var t=e.offsets,n=t.popper,r=t.reference,i=e.placement.split("-")[0],o=Math.floor,a=["top","bottom"].indexOf(i)!==-1,l=a?"right":"bottom",s=a?"left":"top",u=a?"width":"height";return n[l]o(r[l])&&(e.offsets.popper[s]=o(r[l])),e}function A8(e,t,n,r){var i=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),o=+i[1],a=i[2];if(!o)return e;if(a.indexOf("%")===0){var l=void 0;switch(a){case"%p":l=n;break;case"%":case"%r":default:l=r}var s=$r(l);return s[t]/100*o}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*o}else return o}function k8(e,t,n,r){var i=[0,0],o=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),l=a.indexOf(rs(a,function(c){return c.search(/,|\s/)!==-1}));a[l]&&a[l].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var s=/\s*,\s*|\s+/,u=l!==-1?[a.slice(0,l).concat([a[l].split(s)[0]]),[a[l].split(s)[1]].concat(a.slice(l+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!o:o)?"height":"width",p=!1;return c.reduce(function(h,g){return h[h.length-1]===""&&["+","-"].indexOf(g)!==-1?(h[h.length-1]=g,p=!0,h):p?(h[h.length-1]+=g,p=!1,h):h.concat(g)},[]).map(function(h){return A8(h,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){Zm(d)&&(i[f]+=d*(c[p-1]==="-"?-1:1))})}),i}function O8(e,t){var n=t.offset,r=e.placement,i=e.offsets,o=i.popper,a=i.reference,l=r.split("-")[0],s=void 0;return Zm(+n)?s=[+n,0]:s=k8(n,o,a,l),l==="left"?(o.top+=s[0],o.left-=s[1]):l==="right"?(o.top+=s[0],o.left+=s[1]):l==="top"?(o.left+=s[0],o.top-=s[1]):l==="bottom"&&(o.left+=s[0],o.top+=s[1]),e.popper=o,e}function P8(e,t){var n=t.boundariesElement||Oo(e.instance.popper);e.instance.reference===n&&(n=Oo(n));var r=Km("transform"),i=e.instance.popper.style,o=i.top,a=i.left,l=i[r];i.top="",i.left="",i[r]="";var s=qm(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);i.top=o,i.left=a,i[r]=l,t.boundaries=s;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var h=c[p];return c[p]s[p]&&!t.escapeWithReference&&(g=Math.min(c[h],s[p]-(p==="right"?c.width:c.height))),Io({},h,g)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=tn({},c,f[p](d))}),e.offsets.popper=c,e}function I8(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var i=e.offsets,o=i.reference,a=i.popper,l=["bottom","top"].indexOf(n)!==-1,s=l?"left":"top",u=l?"width":"height",c={start:Io({},s,o[s]),end:Io({},s,o[s]+o[u]-a[u])};e.offsets.popper=tn({},a,c[r])}return e}function T8(e){if(!lE(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=rs(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};i8(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=t8(this.update.bind(this)),this.options=tn({},e.Defaults,i),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(tn({},e.Defaults.modifiers,i.modifiers)).forEach(function(a){r.options.modifiers[a]=tn({},e.Defaults.modifiers[a]||{},i.modifiers?i.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return tn({name:a},r.options.modifiers[a])}).sort(function(a,l){return a.order-l.order}),this.modifiers.forEach(function(a){a.enabled&&Jx(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var o=this.options.eventsEnabled;o&&this.enableEventListeners(),this.state.eventsEnabled=o}return o8(e,[{key:"update",value:function(){return u8.call(this)}},{key:"destroy",value:function(){return c8.call(this)}},{key:"enableEventListeners",value:function(){return d8.call(this)}},{key:"disableEventListeners",value:function(){return h8.call(this)}}]),e}();ef.Utils=(typeof window!="undefined"?window:global).PopperUtils;ef.placements=sE;ef.Defaults=D8;const J1=ef;var uE={},cE={exports:{}};(function(e,t){(function(n,r){var i=r(n);e.exports=i})(c0,function(n){var r=["N","E","A","D"];function i(E,C){E.super_=C,E.prototype=Object.create(C.prototype,{constructor:{value:E,enumerable:!1,writable:!0,configurable:!0}})}function o(E,C){Object.defineProperty(this,"kind",{value:E,enumerable:!0}),C&&C.length&&Object.defineProperty(this,"path",{value:C,enumerable:!0})}function a(E,C,P){a.super_.call(this,"E",E),Object.defineProperty(this,"lhs",{value:C,enumerable:!0}),Object.defineProperty(this,"rhs",{value:P,enumerable:!0})}i(a,o);function l(E,C){l.super_.call(this,"N",E),Object.defineProperty(this,"rhs",{value:C,enumerable:!0})}i(l,o);function s(E,C){s.super_.call(this,"D",E),Object.defineProperty(this,"lhs",{value:C,enumerable:!0})}i(s,o);function u(E,C,P){u.super_.call(this,"A",E),Object.defineProperty(this,"index",{value:C,enumerable:!0}),Object.defineProperty(this,"item",{value:P,enumerable:!0})}i(u,o);function c(E,C,P){var I=E.slice((P||C)+1||E.length);return E.length=C<0?E.length+C:C,E.push.apply(E,I),E}function f(E){var C=typeof E;return C!=="object"?C:E===Math?"math":E===null?"null":Array.isArray(E)?"array":Object.prototype.toString.call(E)==="[object Date]"?"date":typeof E.toString=="function"&&/^\/.*\//.test(E.toString())?"regexp":"object"}function d(E){var C=0;if(E.length===0)return C;for(var P=0;P0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,N),pe=se!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,N);if(!fe&&pe)P.push(new l(V,C));else if(!pe&&fe)P.push(new s(V,E));else if(f(E)!==f(C))P.push(new a(V,E,C));else if(f(E)==="date"&&E-C!==0)P.push(new a(V,E,C));else if(te==="object"&&E!==null&&C!==null){for(q=B.length-1;q>-1;--q)if(B[q].lhs===E){X=!0;break}if(X)E!==C&&P.push(new a(V,E,C));else{if(B.push({lhs:E,rhs:C}),Array.isArray(E)){for(K&&(E.sort(function(Ee,We){return p(Ee)-p(We)}),C.sort(function(Ee,We){return p(Ee)-p(We)})),q=C.length-1,x=E.length-1;q>x;)P.push(new u(V,q,new l(void 0,C[q--])));for(;x>q;)P.push(new u(V,x,new s(void 0,E[x--])));for(;q>=0;--q)h(E[q],C[q],P,I,V,q,B,K)}else{var he=Object.keys(E),be=Object.keys(C);for(q=0;q=0?(h(E[A],C[A],P,I,V,A,B,K),be[X]=null):h(E[A],void 0,P,I,V,A,B,K);for(q=0;q -*/var R8={set:M8,get:F8,has:L8,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:B8};function F8(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,i){return r&&r[i]},e)}else return typeof t=="number"?e[t]:e;else return e}function L8(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(i,o,a,l){return a==l.length-1?n.own?!!(i&&i.hasOwnProperty(o)):i!==null&&typeof i=="object"&&o in i:i&&i[o]},e)}else return typeof t=="number"?t in e:!1;else return!1}function M8(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(i,o,a){const l=Number.isInteger(Number(r[a+1]));return i[o]=i[o]||(l?[]:{}),r.length==a+1&&(i[o]=n),i[o]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function B8(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var i=t.split("."),o=!1,a;return a=!!i.reduce(function(l,s){return o=o||l===n||!!l&&l[s]===n,l&&l[s]},e),r.validPath?o&&a:o}else return!1;else return!1}Object.defineProperty(uE,"__esModule",{value:!0});var U8=cE.exports,Ot=R8;function z8(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(i)?i.indexOf(l)>=0:l===i;return s&&(o?u:!o)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var i=Ot.get(e,n),o=Ot.get(t,n),a=Array.isArray(r)?r.indexOf(i)<0:i!==r,l=Array.isArray(r)?r.indexOf(o)>=0:o===r;return a&&l},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return Q1(Ot.get(e,n),Ot.get(t,n))&&Ot.get(e,n)Ot.get(t,n)}}}var Y8=uE.default=W8;function X1(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function Fe(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function fE(e,t){if(e==null)return{};var n=$8(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Kn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function dE(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:Kn(e)}function ls(e){var t=H8();return function(){var r=nc(e),i;if(t){var o=nc(this).constructor;i=Reflect.construct(r,arguments,o)}else i=r.apply(this,arguments);return dE(this,i)}}var V8={flip:{padding:20},preventOverflow:{padding:10}},ye={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},Rn=Yx.canUseDOM,ya=Rr.createPortal!==void 0;function md(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Us(e){var t=e.title,n=e.data,r=e.warn,i=r===void 0?!1:r,o=e.debug,a=o===void 0?!1:o,l=i?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(s){D.plainObject(s)&&s.key?l.apply(console,[s.key,s.value]):l.apply(console,[s])}):l.apply(console,[n]),console.groupEnd())}function G8(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function J8(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function Q8(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,i;i=function(a){n(a),J8(e,t,i)},G8(e,t,i,r)}function K1(){}var pE=function(e){as(n,e);var t=ls(n);function n(r){var i;return is(this,n),i=t.call(this,r),Rn?(i.node=document.createElement("div"),r.id&&(i.node.id=r.id),r.zIndex&&(i.node.style.zIndex=r.zIndex),document.body.appendChild(i.node),i):dE(i)}return os(n,[{key:"componentDidMount",value:function(){!Rn||ya||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!Rn||ya||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!Rn||!this.node||(ya||Rr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!Rn)return null;var i=this.props,o=i.children,a=i.setRef;if(ya)return Rr.createPortal(o,this.node);var l=Rr.unstable_renderSubtreeIntoContainer(this,o.length>1?b("div",{children:o}):o[0],this.node);return a(l),null}},{key:"renderReact16",value:function(){var i=this.props,o=i.hasChildren,a=i.placement,l=i.target;return o?this.renderPortal():l||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return ya?this.renderReact16():null}}]),n}(R.Component);pt(pE,"propTypes",{children:F.exports.oneOfType([F.exports.element,F.exports.array]),hasChildren:F.exports.bool,id:F.exports.oneOfType([F.exports.string,F.exports.number]),placement:F.exports.string,setRef:F.exports.func.isRequired,target:F.exports.oneOfType([F.exports.object,F.exports.string]),zIndex:F.exports.number});var hE=function(e){as(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return os(n,[{key:"parentStyle",get:function(){var i=this.props,o=i.placement,a=i.styles,l=a.arrow.length,s={pointerEvents:"none",position:"absolute",width:"100%"};return o.startsWith("top")?(s.bottom=0,s.left=0,s.right=0,s.height=l):o.startsWith("bottom")?(s.left=0,s.right=0,s.top=0,s.height=l):o.startsWith("left")?(s.right=0,s.top=0,s.bottom=0):o.startsWith("right")&&(s.left=0,s.top=0),s}},{key:"render",value:function(){var i=this.props,o=i.placement,a=i.setArrowRef,l=i.styles,s=l.arrow,u=s.color,c=s.display,f=s.length,d=s.margin,p=s.position,h=s.spread,g={display:c,position:p},v,m=h,y=f;return o.startsWith("top")?(v="0,0 ".concat(m/2,",").concat(y," ").concat(m,",0"),g.bottom=0,g.marginLeft=d,g.marginRight=d):o.startsWith("bottom")?(v="".concat(m,",").concat(y," ").concat(m/2,",0 0,").concat(y),g.top=0,g.marginLeft=d,g.marginRight=d):o.startsWith("left")?(y=h,m=f,v="0,0 ".concat(m,",").concat(y/2," 0,").concat(y),g.right=0,g.marginTop=d,g.marginBottom=d):o.startsWith("right")&&(y=h,m=f,v="".concat(m,",").concat(y," ").concat(m,",0 0,").concat(y/2),g.left=0,g.marginTop=d,g.marginBottom=d),b("div",{className:"__floater__arrow",style:this.parentStyle,children:b("span",{ref:a,style:g,children:b("svg",{width:m,height:y,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:b("polygon",{points:v,fill:u})})})})}}]),n}(R.Component);pt(hE,"propTypes",{placement:F.exports.string.isRequired,setArrowRef:F.exports.func.isRequired,styles:F.exports.object.isRequired});var X8=["color","height","width"],mE=function(t){var n=t.handleClick,r=t.styles,i=r.color,o=r.height,a=r.width,l=fE(r,X8);return b("button",{"aria-label":"close",onClick:n,style:l,type:"button",children:b("svg",{width:"".concat(a,"px"),height:"".concat(o,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:b("g",{children:b("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:i})})})})};mE.propTypes={handleClick:F.exports.func.isRequired,styles:F.exports.object.isRequired};var gE=function(t){var n=t.content,r=t.footer,i=t.handleClick,o=t.open,a=t.positionWrapper,l=t.showCloseButton,s=t.title,u=t.styles,c={content:R.isValidElement(n)?n:b("div",{className:"__floater__content",style:u.content,children:n})};return s&&(c.title=R.isValidElement(s)?s:b("div",{className:"__floater__title",style:u.title,children:s})),r&&(c.footer=R.isValidElement(r)?r:b("div",{className:"__floater__footer",style:u.footer,children:r})),(l||a)&&!D.boolean(o)&&(c.close=b(mE,{styles:u.close,handleClick:i})),M("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};gE.propTypes={content:F.exports.node.isRequired,footer:F.exports.node,handleClick:F.exports.func.isRequired,open:F.exports.bool,positionWrapper:F.exports.bool.isRequired,showCloseButton:F.exports.bool.isRequired,styles:F.exports.object.isRequired,title:F.exports.node};var vE=function(e){as(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return os(n,[{key:"style",get:function(){var i=this.props,o=i.disableAnimation,a=i.component,l=i.placement,s=i.hideArrow,u=i.status,c=i.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,h=c.floaterClosing,g=c.floaterOpening,v=c.floaterWithAnimation,m=c.floaterWithComponent,y={};return s||(l.startsWith("top")?y.padding="0 0 ".concat(f,"px"):l.startsWith("bottom")?y.padding="".concat(f,"px 0 0"):l.startsWith("left")?y.padding="0 ".concat(f,"px 0 0"):l.startsWith("right")&&(y.padding="0 0 0 ".concat(f,"px"))),[ye.OPENING,ye.OPEN].indexOf(u)!==-1&&(y=Fe(Fe({},y),g)),u===ye.CLOSING&&(y=Fe(Fe({},y),h)),u===ye.OPEN&&!o&&(y=Fe(Fe({},y),v)),l==="center"&&(y=Fe(Fe({},y),p)),a&&(y=Fe(Fe({},y),m)),Fe(Fe({},d),y)}},{key:"render",value:function(){var i=this.props,o=i.component,a=i.handleClick,l=i.hideArrow,s=i.setFloaterRef,u=i.status,c={},f=["__floater"];return o?R.isValidElement(o)?c.content=R.cloneElement(o,{closeFn:a}):c.content=o({closeFn:a}):c.content=b(gE,U({},this.props)),u===ye.OPEN&&f.push("__floater__open"),l||(c.arrow=b(hE,U({},this.props))),b("div",{ref:s,className:f.join(" "),style:this.style,children:M("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(R.Component);pt(vE,"propTypes",{component:F.exports.oneOfType([F.exports.func,F.exports.element]),content:F.exports.node,disableAnimation:F.exports.bool.isRequired,footer:F.exports.node,handleClick:F.exports.func.isRequired,hideArrow:F.exports.bool.isRequired,open:F.exports.bool,placement:F.exports.string.isRequired,positionWrapper:F.exports.bool.isRequired,setArrowRef:F.exports.func.isRequired,setFloaterRef:F.exports.func.isRequired,showCloseButton:F.exports.bool,status:F.exports.string.isRequired,styles:F.exports.object.isRequired,title:F.exports.node});var yE=function(e){as(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return os(n,[{key:"render",value:function(){var i=this.props,o=i.children,a=i.handleClick,l=i.handleMouseEnter,s=i.handleMouseLeave,u=i.setChildRef,c=i.setWrapperRef,f=i.style,d=i.styles,p;if(o)if(R.Children.count(o)===1)if(!R.isValidElement(o))p=b("span",{children:o});else{var h=D.function(o.type)?"innerRef":"ref";p=R.cloneElement(R.Children.only(o),pt({},h,u))}else p=o;return p?b("span",{ref:c,style:Fe(Fe({},d),f),onClick:a,onMouseEnter:l,onMouseLeave:s,children:p}):null}}]),n}(R.Component);pt(yE,"propTypes",{children:F.exports.node,handleClick:F.exports.func.isRequired,handleMouseEnter:F.exports.func.isRequired,handleMouseLeave:F.exports.func.isRequired,setChildRef:F.exports.func.isRequired,setWrapperRef:F.exports.func.isRequired,style:F.exports.object,styles:F.exports.object.isRequired});var q8={zIndex:100};function K8(e){var t=Dn(q8,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var Z8=["arrow","flip","offset"],e7=["position","top","right","bottom","left"],eg=function(e){as(n,e);var t=ls(n);function n(r){var i;return is(this,n),i=t.call(this,r),pt(Kn(i),"setArrowRef",function(o){i.arrowRef=o}),pt(Kn(i),"setChildRef",function(o){i.childRef=o}),pt(Kn(i),"setFloaterRef",function(o){i.floaterRef||(i.floaterRef=o)}),pt(Kn(i),"setWrapperRef",function(o){i.wrapperRef=o}),pt(Kn(i),"handleTransitionEnd",function(){var o=i.state.status,a=i.props.callback;i.wrapperPopper&&i.wrapperPopper.instance.update(),i.setState({status:o===ye.OPENING?ye.OPEN:ye.IDLE},function(){var l=i.state.status;a(l===ye.OPEN?"open":"close",i.props)})}),pt(Kn(i),"handleClick",function(){var o=i.props,a=o.event,l=o.open;if(!D.boolean(l)){var s=i.state,u=s.positionWrapper,c=s.status;(i.event==="click"||i.event==="hover"&&u)&&(Us({title:"click",data:[{event:a,status:c===ye.OPEN?"closing":"opening"}],debug:i.debug}),i.toggle())}}),pt(Kn(i),"handleMouseEnter",function(){var o=i.props,a=o.event,l=o.open;if(!(D.boolean(l)||md())){var s=i.state.status;i.event==="hover"&&s===ye.IDLE&&(Us({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:i.debug}),clearTimeout(i.eventDelayTimeout),i.toggle())}}),pt(Kn(i),"handleMouseLeave",function(){var o=i.props,a=o.event,l=o.eventDelay,s=o.open;if(!(D.boolean(s)||md())){var u=i.state,c=u.status,f=u.positionWrapper;i.event==="hover"&&(Us({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:i.debug}),l?[ye.OPENING,ye.OPEN].indexOf(c)!==-1&&!f&&!i.eventDelayTimeout&&(i.eventDelayTimeout=setTimeout(function(){delete i.eventDelayTimeout,i.toggle()},l*1e3)):i.toggle(ye.IDLE))}}),i.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ye.INIT,statusWrapper:ye.INIT},i._isMounted=!1,Rn&&window.addEventListener("load",function(){i.popper&&i.popper.instance.update(),i.wrapperPopper&&i.wrapperPopper.instance.update()}),i}return os(n,[{key:"componentDidMount",value:function(){if(!!Rn){var i=this.state.positionWrapper,o=this.props,a=o.children,l=o.open,s=o.target;this._isMounted=!0,Us({title:"init",data:{hasChildren:!!a,hasTarget:!!s,isControlled:D.boolean(l),positionWrapper:i,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&s&&D.boolean(l)}}},{key:"componentDidUpdate",value:function(i,o){if(!!Rn){var a=this.props,l=a.autoOpen,s=a.open,u=a.target,c=a.wrapperOptions,f=Y8(o,this.state),d=f.changedFrom,p=f.changedTo;if(i.open!==s){var h;D.boolean(s)&&(h=s?ye.OPENING:ye.CLOSING),this.toggle(h)}(i.wrapperOptions.position!==c.position||i.target!==u)&&this.changeWrapperPosition(this.props),p("status",ye.IDLE)&&s?this.toggle(ye.OPEN):d("status",ye.INIT,ye.IDLE)&&l&&this.toggle(ye.OPEN),this.popper&&p("status",ye.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ye.OPENING)||p("status",ye.CLOSING))&&Q8(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!Rn||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var i=this,o=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,l=this.props,s=l.disableFlip,u=l.getPopper,c=l.hideArrow,f=l.offset,d=l.placement,p=l.wrapperOptions,h=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ye.IDLE});else if(o&&this.floaterRef){var g=this.options,v=g.arrow,m=g.flip,y=g.offset,S=fE(g,Z8);new J1(o,this.floaterRef,{placement:d,modifiers:Fe({arrow:Fe({enabled:!c,element:this.arrowRef},v),flip:Fe({enabled:!s,behavior:h},m),offset:Fe({offset:"0, ".concat(f,"px")},y)},S),onCreate:function(w){i.popper=w,u(w,"floater"),i._isMounted&&i.setState({currentPlacement:w.placement,status:ye.IDLE}),d!==w.placement&&setTimeout(function(){w.instance.update()},1)},onUpdate:function(w){i.popper=w;var O=i.state.currentPlacement;i._isMounted&&w.placement!==O&&i.setState({currentPlacement:w.placement})}})}if(a){var k=D.undefined(p.offset)?0:p.offset;new J1(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(k,"px")},flip:{enabled:!1}},onCreate:function(w){i.wrapperPopper=w,i._isMounted&&i.setState({statusWrapper:ye.IDLE}),u(w,"wrapper"),d!==w.placement&&setTimeout(function(){w.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(i){var o=i.target,a=i.wrapperOptions;this.setState({positionWrapper:a.position&&!!o})}},{key:"toggle",value:function(i){var o=this.state.status,a=o===ye.OPEN?ye.CLOSING:ye.OPENING;D.undefined(i)||(a=i),this.setState({status:a})}},{key:"debug",get:function(){var i=this.props.debug;return i||!!global.ReactFloaterDebug}},{key:"event",get:function(){var i=this.props,o=i.disableHoverToClick,a=i.event;return a==="hover"&&md()&&!o?"click":a}},{key:"options",get:function(){var i=this.props.options;return Dn(V8,i||{})}},{key:"styles",get:function(){var i=this,o=this.state,a=o.status,l=o.positionWrapper,s=o.statusWrapper,u=this.props.styles,c=Dn(K8(u),u);if(l){var f;[ye.IDLE].indexOf(a)===-1||[ye.IDLE].indexOf(s)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Fe(Fe({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Fe(Fe({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},l||(e7.forEach(function(p){i.wrapperStyles[p]=d[p]}),c.wrapper=Fe(Fe({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!Rn)return null;var i=this.props.target;return i?D.domElement(i)?i:document.querySelector(i):this.childRef||this.wrapperRef}},{key:"render",value:function(){var i=this.state,o=i.currentPlacement,a=i.positionWrapper,l=i.status,s=this.props,u=s.children,c=s.component,f=s.content,d=s.disableAnimation,p=s.footer,h=s.hideArrow,g=s.id,v=s.open,m=s.showCloseButton,y=s.style,S=s.target,k=s.title,_=b(yE,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:y,styles:this.styles.wrapper,children:u}),w={};return a?w.wrapperInPortal=_:w.wrapperAsChildren=_,M("span",{children:[M(pE,{hasChildren:!!u,id:g,placement:o,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[b(vE,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:h||o==="center",open:v,placement:o,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:m,status:l,styles:this.styles,title:k}),w.wrapperInPortal]}),w.wrapperAsChildren]})}}]),n}(R.Component);pt(eg,"propTypes",{autoOpen:F.exports.bool,callback:F.exports.func,children:F.exports.node,component:W1(F.exports.oneOfType([F.exports.func,F.exports.element]),function(e){return!e.content}),content:W1(F.exports.node,function(e){return!e.component}),debug:F.exports.bool,disableAnimation:F.exports.bool,disableFlip:F.exports.bool,disableHoverToClick:F.exports.bool,event:F.exports.oneOf(["hover","click"]),eventDelay:F.exports.number,footer:F.exports.node,getPopper:F.exports.func,hideArrow:F.exports.bool,id:F.exports.oneOfType([F.exports.string,F.exports.number]),offset:F.exports.number,open:F.exports.bool,options:F.exports.object,placement:F.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:F.exports.bool,style:F.exports.object,styles:F.exports.object,target:F.exports.oneOfType([F.exports.object,F.exports.string]),title:F.exports.node,wrapperOptions:F.exports.shape({offset:F.exports.number,placement:F.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:F.exports.bool})});pt(eg,"defaultProps",{autoOpen:!1,callback:K1,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:K1,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function Z1(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(i){return Object.getOwnPropertyDescriptor(e,i).enumerable})),n.push.apply(n,r)}return n}function $(e){for(var t=1;t=0)&&(n[i]=e[i]);return n}function ic(e,t){if(e==null)return{};var n=n7(e,t),r,i;if(Object.getOwnPropertySymbols){var o=Object.getOwnPropertySymbols(e);for(i=0;i=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function je(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function wE(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return je(e)}function _i(e){var t=t7();return function(){var r=rc(e),i;if(t){var o=rc(this).constructor;i=Reflect.construct(r,arguments,o)}else i=r.apply(this,arguments);return wE(this,i)}}var ge={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},bt={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ce={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},me={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},er=Yx.canUseDOM,wa=Pl.exports.createPortal!==void 0;function bE(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function gd(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function ba(e){var t=[],n=function r(i){if(typeof i=="string"||typeof i=="number")t.push(i);else if(Array.isArray(i))i.forEach(function(a){return r(a)});else if(i&&i.props){var o=i.props.children;Array.isArray(o)?o.forEach(function(a){return r(a)}):r(o)}};return n(e),t.join(" ").trim()}function t0(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function r7(e,t){return!D.plainObject(e)||!D.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function i7(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(i,o,a,l){return o+o+a+a+l+l}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function n0(e){return e.disableBeacon||e.placement==="center"}function Gp(e,t){var n,r=H.exports.isValidElement(e)||H.exports.isValidElement(t),i=D.undefined(e)||D.undefined(t);if(gd(e)!==gd(t)||r||i)return!1;if(D.domElement(e))return e.isSameNode(t);if(D.number(e))return e===t;if(D.function(e))return e.toString()===t.toString();for(var o in e)if(t0(e,o)){if(typeof e[o]=="undefined"||typeof t[o]=="undefined")return!1;if(n=gd(e[o]),["object","array"].indexOf(n)!==-1&&Gp(e[o],t[o])||n==="function"&&Gp(e[o],t[o]))continue;if(e[o]!==t[o])return!1}for(var a in t)if(t0(t,a)&&typeof e[a]=="undefined")return!1;return!0}function r0(){return["chrome","safari","firefox","opera"].indexOf(bE())===-1}function xi(e){var t=e.title,n=e.data,r=e.warn,i=r===void 0?!1:r,o=e.debug,a=o===void 0?!1:o,l=i?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(s){D.plainObject(s)&&s.key?l.apply(console,[s.key,s.value]):l.apply(console,[s])}):l.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var o7={action:"",controlled:!1,index:0,lifecycle:ce.INIT,size:0,status:me.IDLE},i0=["action","index","lifecycle","status"];function a7(e){var t=new Map,n=new Map,r=function(){function i(){var o=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},l=a.continuous,s=l===void 0?!1:l,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;pr(this,i),Z(this,"listener",void 0),Z(this,"setSteps",function(d){var p=o.getState(),h=p.size,g=p.status,v={size:d.length,status:g};n.set("steps",d),g===me.WAITING&&!h&&d.length&&(v.status=me.RUNNING),o.setState(v)}),Z(this,"addListener",function(d){o.listener=d}),Z(this,"update",function(d){if(!r7(d,i0))throw new Error("State is not valid. Valid keys: ".concat(i0.join(", ")));o.setState($({},o.getNextState($($($({},o.getState()),d),{},{action:d.action||ge.UPDATE}),!0)))}),Z(this,"start",function(d){var p=o.getState(),h=p.index,g=p.size;o.setState($($({},o.getNextState({action:ge.START,index:D.number(d)?d:h},!0)),{},{status:g?me.RUNNING:me.WAITING}))}),Z(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=o.getState(),h=p.index,g=p.status;[me.FINISHED,me.SKIPPED].indexOf(g)===-1&&o.setState($($({},o.getNextState({action:ge.STOP,index:h+(d?1:0)})),{},{status:me.PAUSED}))}),Z(this,"close",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState($({},o.getNextState({action:ge.CLOSE,index:p+1})))}),Z(this,"go",function(d){var p=o.getState(),h=p.controlled,g=p.status;if(!(h||g!==me.RUNNING)){var v=o.getSteps()[d];o.setState($($({},o.getNextState({action:ge.GO,index:d})),{},{status:v?g:me.FINISHED}))}}),Z(this,"info",function(){return o.getState()}),Z(this,"next",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState(o.getNextState({action:ge.NEXT,index:p+1}))}),Z(this,"open",function(){var d=o.getState(),p=d.status;p===me.RUNNING&&o.setState($({},o.getNextState({action:ge.UPDATE,lifecycle:ce.TOOLTIP})))}),Z(this,"prev",function(){var d=o.getState(),p=d.index,h=d.status;h===me.RUNNING&&o.setState($({},o.getNextState({action:ge.PREV,index:p-1})))}),Z(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=o.getState(),h=p.controlled;h||o.setState($($({},o.getNextState({action:ge.RESET,index:0})),{},{status:d?me.RUNNING:me.READY}))}),Z(this,"skip",function(){var d=o.getState(),p=d.status;p===me.RUNNING&&o.setState({action:ge.SKIP,lifecycle:ce.INIT,status:me.SKIPPED})}),this.setState({action:ge.INIT,controlled:D.number(u),continuous:s,index:D.number(u)?u:0,lifecycle:ce.INIT,status:f.length?me.READY:me.IDLE},!0),this.setSteps(f)}return hr(i,[{key:"setState",value:function(a){var l=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,s=this.getState(),u=$($({},s),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,h=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",h),l&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(s)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:$({},o7)}},{key:"getNextState",value:function(a){var l=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,s=this.getState(),u=s.action,c=s.controlled,f=s.index,d=s.size,p=s.status,h=D.number(a.index)?a.index:f,g=c&&!l?f:Math.min(Math.max(h,0),d);return{action:a.action||u,controlled:c,index:g,lifecycle:a.lifecycle||ce.INIT,size:a.size||d,status:g===d?me.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var l=JSON.stringify(a),s=JSON.stringify(this.getState());return l!==s}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),i}();return new r(e)}function nl(){return document.scrollingElement||document.createElement("body")}function SE(e){return e?e.getBoundingClientRect():{}}function l7(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function Lr(e){return typeof e=="string"?document.querySelector(e):e}function s7(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function tf(e,t,n){var r=$x(e);if(r.isSameNode(nl()))return n?document:nl();var i=r.scrollHeight>r.offsetHeight;return!i&&!t?(r.style.overflow="initial",nl()):r}function nf(e,t){if(!e)return!1;var n=tf(e,t);return!n.isSameNode(nl())}function u7(e){return e.offsetParent!==document.body}function To(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:s7(e).position===t?!0:To(e.parentNode,t)}function c7(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,i=n.visibility;if(r==="none"||i==="hidden")return!1}t=t.parentNode}return!0}function f7(e,t,n){var r=SE(e),i=tf(e,n),o=nf(e,n),a=0;i instanceof HTMLElement&&(a=i.scrollTop);var l=r.top+(!o&&!To(e)?a:0);return Math.floor(l-t)}function Jp(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?Jp(e.offsetParent)+e.offsetTop:e.offsetTop:0}function d7(e,t,n){if(!e)return 0;var r=$x(e),i=Jp(e);return nf(e,n)&&!u7(e)&&(i-=Jp(r)),Math.floor(i-t)}function p7(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:nl(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,i){var o=t.scrollTop,a=e>o?e-o:o-e;PL.top(t,e,{duration:a<100?50:n},function(l){return l&&l.message!=="Element already at target scroll position"?i(l):r()})})}function h7(e){function t(r,i,o,a,l,s){var u=a||"<>",c=s||o;if(i[o]==null)return r?new Error("Required ".concat(l," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=Dn(m7,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return D.plainObject(e)?e.target?!0:(xi({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(xi({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function a0(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return D.array(e)?e.every(function(n){return xE(n,t)}):(xi({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var y7=hr(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(pr(this,e),Z(this,"element",void 0),Z(this,"options",void 0),Z(this,"canBeTabbed",function(i){var o=i.tabIndex;(o===null||o<0)&&(o=void 0);var a=isNaN(o);return!a&&n.canHaveFocus(i)}),Z(this,"canHaveFocus",function(i){var o=/input|select|textarea|button|object/,a=i.nodeName.toLowerCase(),l=o.test(a)&&!i.getAttribute("disabled")||a==="a"&&!!i.getAttribute("href");return l&&n.isVisible(i)}),Z(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),Z(this,"handleKeyDown",function(i){var o=n.options.keyCode,a=o===void 0?9:o;i.keyCode===a&&n.interceptTab(i)}),Z(this,"interceptTab",function(i){var o=n.findValidTabElements();if(!!o.length){i.preventDefault();var a=i.shiftKey,l=o.indexOf(document.activeElement);l===-1||!a&&l+1===o.length?l=0:a&&l===0?l=o.length-1:l+=a?-1:1,o[l].focus()}}),Z(this,"isHidden",function(i){var o=i.offsetWidth<=0&&i.offsetHeight<=0,a=window.getComputedStyle(i);return o&&!i.innerHTML?!0:o&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),Z(this,"isVisible",function(i){for(var o=i;o;)if(o instanceof HTMLElement){if(o===document.body)break;if(n.isHidden(o))return!1;o=o.parentNode}return!0}),Z(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),Z(this,"checkFocus",function(i){document.activeElement!==i&&(i.focus(),window.requestAnimationFrame(function(){return n.checkFocus(i)}))}),Z(this,"setFocus",function(){var i=n.options.selector;if(!!i){var o=n.element.querySelector(i);o&&window.requestAnimationFrame(function(){return n.checkFocus(o)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),w7=function(e){Ti(n,e);var t=_i(n);function n(r){var i;if(pr(this,n),i=t.call(this,r),Z(je(i),"setBeaconRef",function(s){i.beacon=s}),!r.beaconComponent){var o=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),l=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(l)),o.appendChild(a)}return i}return hr(n,[{key:"componentDidMount",value:function(){var i=this,o=this.props.shouldFocus;setTimeout(function(){D.domElement(i.beacon)&&o&&i.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var i=document.getElementById("joyride-beacon-animation");i&&i.parentNode.removeChild(i)}},{key:"render",value:function(){var i=this.props,o=i.beaconComponent,a=i.locale,l=i.onClickOrHover,s=i.styles,u={"aria-label":a.open,onClick:l,onMouseEnter:l,ref:this.setBeaconRef,title:a.open},c;if(o){var f=o;c=b(f,U({},u))}else c=M("button",Q(U({className:"react-joyride__beacon",style:s.beacon,type:"button"},u),{children:[b("span",{style:s.beaconInner}),b("span",{style:s.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(R.Component),b7=function(t){var n=t.styles;return b("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},S7=["mixBlendMode","zIndex"],x7=function(e){Ti(n,e);var t=_i(n);function n(){var r;pr(this,n);for(var i=arguments.length,o=new Array(i),a=0;a=p&&g<=p+c,y=v>=f&&v<=f+h,S=y&&m;S!==s&&r.updateState({mouseOverSpotlight:S})}),Z(je(r),"handleScroll",function(){var l=r.props.target,s=Lr(l);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else To(s,"sticky")&&r.updateState({})}),Z(je(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return hr(n,[{key:"componentDidMount",value:function(){var i=this.props;i.debug,i.disableScrolling;var o=i.disableScrollParentFix,a=i.target,l=Lr(a);this.scrollParent=tf(l,o,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(i){var o=this,a=this.props,l=a.lifecycle,s=a.spotlightClicks,u=Zu(i,this.props),c=u.changed;c("lifecycle",ce.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=o.state.isScrolling;f||o.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(s&&l===ce.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):l!==ce.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var i=this.state.showSpotlight,o=this.props,a=o.disableScrollParentFix,l=o.spotlightClicks,s=o.spotlightPadding,u=o.styles,c=o.target,f=Lr(c),d=SE(f),p=To(f),h=f7(f,s,a);return $($({},r0()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+s*2),left:Math.round(d.left-s),opacity:i?1:0,pointerEvents:l?"none":"auto",position:p?"fixed":"absolute",top:h,transition:"opacity 0.2s",width:Math.round(d.width+s*2)})}},{key:"updateState",value:function(i){!this._isMounted||this.setState(i)}},{key:"render",value:function(){var i=this.state,o=i.mouseOverSpotlight,a=i.showSpotlight,l=this.props,s=l.disableOverlay,u=l.disableOverlayClose,c=l.lifecycle,f=l.onClickOverlay,d=l.placement,p=l.styles;if(s||c!==ce.TOOLTIP)return null;var h=p.overlay;r0()&&(h=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var g=$({cursor:u?"default":"pointer",height:l7(),pointerEvents:o?"none":"auto"},h),v=d!=="center"&&a&&b(b7,{styles:this.spotlightStyles});if(bE()==="safari"){g.mixBlendMode,g.zIndex;var m=ic(g,S7);v=b("div",{style:$({},m),children:v}),delete g.backgroundColor}return b("div",{className:"react-joyride__overlay",style:g,onClick:f,children:v})}}]),n}(R.Component),E7=["styles"],C7=["color","height","width"],A7=function(t){var n=t.styles,r=ic(t,E7),i=n.color,o=n.height,a=n.width,l=ic(n,C7);return b("button",Q(U({style:l,type:"button"},r),{children:b("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof o=="number"?"".concat(o,"px"):o,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:b("g",{children:b("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:i})})})}))},k7=function(e){Ti(n,e);var t=_i(n);function n(){return pr(this,n),t.apply(this,arguments)}return hr(n,[{key:"render",value:function(){var i=this.props,o=i.backProps,a=i.closeProps,l=i.continuous,s=i.index,u=i.isLastStep,c=i.primaryProps,f=i.size,d=i.skipProps,p=i.step,h=i.tooltipProps,g=p.content,v=p.hideBackButton,m=p.hideCloseButton,y=p.hideFooter,S=p.showProgress,k=p.showSkipButton,_=p.title,w=p.styles,O=p.locale,E=O.back,C=O.close,P=O.last,I=O.next,T=O.skip,N={primary:C};return l&&(N.primary=u?P:I,S&&(N.primary=M("span",{children:[N.primary," (",s+1,"/",f,")"]}))),k&&!u&&(N.skip=b("button",Q(U({style:w.buttonSkip,type:"button","aria-live":"off"},d),{children:T}))),!v&&s>0&&(N.back=b("button",Q(U({style:w.buttonBack,type:"button"},o),{children:E}))),N.close=!m&&b(A7,U({styles:w.buttonClose},a)),M("div",Q(U({className:"react-joyride__tooltip",style:w.tooltip},h),{children:[M("div",{style:w.tooltipContainer,children:[_&&b("h4",{style:w.tooltipTitle,"aria-label":_,children:_}),b("div",{style:w.tooltipContent,children:g})]}),!y&&M("div",{style:w.tooltipFooter,children:[b("div",{style:w.tooltipFooterSpacer,children:N.skip}),N.back,b("button",Q(U({style:w.buttonNext,type:"button"},c),{children:N.primary}))]}),N.close]}),"JoyrideTooltip")}}]),n}(R.Component),O7=["beaconComponent","tooltipComponent"],P7=function(e){Ti(n,e);var t=_i(n);function n(){var r;pr(this,n);for(var i=arguments.length,o=new Array(i),a=0;a0||a===ge.PREV),w=y("action")||y("index")||y("lifecycle")||y("status"),O=S("lifecycle",[ce.TOOLTIP,ce.INIT],ce.INIT),E=y("action",[ge.NEXT,ge.PREV,ge.SKIP,ge.CLOSE]);if(E&&(O||u)&&l($($({},k),{},{index:i.index,lifecycle:ce.COMPLETE,step:i.step,type:bt.STEP_AFTER})),y("index")&&f>0&&d===ce.INIT&&h===me.RUNNING&&g.placement==="center"&&v({lifecycle:ce.READY}),w&&g){var C=Lr(g.target),P=!!C,I=P&&c7(C);I?(S("status",me.READY,me.RUNNING)||S("lifecycle",ce.INIT,ce.READY))&&l($($({},k),{},{step:g,type:bt.STEP_BEFORE})):(console.warn(P?"Target not visible":"Target not mounted",g),l($($({},k),{},{type:bt.TARGET_NOT_FOUND,step:g})),u||v({index:f+([ge.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ce.INIT,ce.READY)&&v({lifecycle:n0(g)||_?ce.TOOLTIP:ce.BEACON}),y("index")&&xi({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),y("lifecycle",ce.BEACON)&&l($($({},k),{},{step:g,type:bt.BEACON})),y("lifecycle",ce.TOOLTIP)&&(l($($({},k),{},{step:g,type:bt.TOOLTIP})),this.scope=new y7(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ce.TOOLTIP,ce.INIT],ce.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var i=this.props,o=i.step,a=i.lifecycle;return!!(n0(o)||a===ce.TOOLTIP)}},{key:"render",value:function(){var i=this.props,o=i.continuous,a=i.debug,l=i.helpers,s=i.index,u=i.lifecycle,c=i.nonce,f=i.shouldScroll,d=i.size,p=i.step,h=Lr(p.target);return!xE(p)||!D.domElement(h)?null:M("div",{className:"react-joyride__step",children:[b(I7,{id:"react-joyride-portal",children:b(x7,Q(U({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),b(eg,Q(U({component:b(P7,{continuous:o,helpers:l,index:s,isLastStep:s+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(s),isPositioned:p.isFixed||To(h),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:b(w7,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(s))}}]),n}(R.Component),EE=function(e){Ti(n,e);var t=_i(n);function n(r){var i;return pr(this,n),i=t.call(this,r),Z(je(i),"initStore",function(){var o=i.props,a=o.debug,l=o.getHelpers,s=o.run,u=o.stepIndex;i.store=new a7($($({},i.props),{},{controlled:s&&D.number(u)})),i.helpers=i.store.getHelpers();var c=i.store.addListener;return xi({title:"init",data:[{key:"props",value:i.props},{key:"state",value:i.state}],debug:a}),c(i.syncState),l(i.helpers),i.store.getState()}),Z(je(i),"callback",function(o){var a=i.props.callback;D.function(a)&&a(o)}),Z(je(i),"handleKeyboard",function(o){var a=i.state,l=a.index,s=a.lifecycle,u=i.props.steps,c=u[l],f=window.Event?o.which:o.keyCode;s===ce.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&i.store.close()}),Z(je(i),"syncState",function(o){i.setState(o)}),Z(je(i),"setPopper",function(o,a){a==="wrapper"?i.beaconPopper=o:i.tooltipPopper=o}),Z(je(i),"shouldScroll",function(o,a,l,s,u,c,f){return!o&&(a!==0||l||s===ce.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!To(c))&&f.lifecycle!==s&&[ce.BEACON,ce.TOOLTIP].indexOf(s)!==-1}),i.state=i.initStore(),i}return hr(n,[{key:"componentDidMount",value:function(){if(!!er){var i=this.props,o=i.disableCloseOnEsc,a=i.debug,l=i.run,s=i.steps,u=this.store.start;a0(s,a)&&l&&u(),o||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(i,o){if(!!er){var a=this.state,l=a.action,s=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,h=d.run,g=d.stepIndex,v=d.steps,m=i.steps,y=i.stepIndex,S=this.store,k=S.reset,_=S.setSteps,w=S.start,O=S.stop,E=S.update,C=Zu(i,this.props),P=C.changed,I=Zu(o,this.state),T=I.changed,N=I.changedFrom,B=xa(v[u],this.props),K=!Gp(m,v),V=D.number(g)&&P("stepIndex"),le=Lr(B==null?void 0:B.target);if(K&&(a0(v,p)?_(v):console.warn("Steps are not valid",v)),P("run")&&(h?w(g):O()),V){var te=y=0?w:0,s===me.RUNNING&&p7(w,_,g)}}}},{key:"render",value:function(){if(!er)return null;var i=this.state,o=i.index,a=i.status,l=this.props,s=l.continuous,u=l.debug,c=l.nonce,f=l.scrollToFirstStep,d=l.steps,p=xa(d[o],this.props),h;return a===me.RUNNING&&p&&(h=b(T7,Q(U({},this.state),{callback:this.callback,continuous:s,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(o!==0||f),step:p,update:this.store.update}))),b("div",{className:"react-joyride",children:h})}}]),n}(R.Component);Z(EE,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const _7=M("div",{children:[b("p",{children:"You can see how the changes impact your app with the app preview."}),b("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),b("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),N7=M("div",{children:[b("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),b("p",{children:"You can click on elements to select them or drag them around to move them."}),b("p",{children:"Cards can be resized by dragging resize handles on the sides."}),b("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),b("p",{children:b("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),D7=M("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",b("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",b("span",{className:gp.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),R7=M("div",{children:[b("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),b("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),F7=[{target:".app-view",content:N7,disableBeacon:!0},{target:".elements-panel",content:D7,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:R7,placement:"left-start"},{target:".app-preview",content:_7,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function L7(){const[e,t]=H.exports.useState(0),[n,r]=H.exports.useState(!1),i=H.exports.useCallback(a=>{const{action:l,index:s,status:u,type:c}=a;console.log({action:l,index:s,status:u,type:c}),(c===bt.STEP_AFTER||c===bt.TARGET_NOT_FOUND)&&(l===ge.NEXT?t(s+1):l===ge.PREV?t(s-1):l===ge.CLOSE&&r(!1)),c===bt.TOUR_END&&(l===ge.NEXT&&(r(!1),t(0)),l===ge.SKIP&&r(!1))},[]),o=H.exports.useCallback(()=>{r(!0)},[]);return M(Ke,{children:[M(Ft,{onClick:o,title:"Take a guided tour of app",variant:"transparent",children:[b(Uk,{id:"tour",size:"24px"}),"Tour App"]}),b(EE,{callback:i,steps:F7,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:B7})]})}const l0="#e07189",M7="#f6d5dc",B7={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:l0},beaconOuter:{backgroundColor:M7,border:`2px solid ${l0}`}},U7="_container_17s66_1",z7="_elementsPanel_17s66_28",j7="_propertiesPanel_17s66_37",W7="_editorHolder_17s66_52",Y7="_titledPanel_17s66_65",H7="_panelTitleHeader_17s66_77",$7="_header_17s66_86",V7="_rightSide_17s66_94",G7="_divider_17s66_115",J7="_title_17s66_65",Q7="_shinyLogo_17s66_126",Pt={container:U7,elementsPanel:z7,propertiesPanel:j7,editorHolder:W7,titledPanel:Y7,panelTitleHeader:H7,header:$7,rightSide:V7,divider:G7,title:J7,shinyLogo:Q7},X7="_container_1fh41_1",q7="_node_1fh41_12",s0={container:X7,node:q7};function K7({tree:e,path:t,onSelect:n}){const r=t.length;let i=[];for(let o=0;o<=r;o++){const a=Fr(e,t.slice(0,o));if(a===void 0)return null;i.push(kn[a.uiName].title)}return b("div",{className:s0.container,children:i.map((o,a)=>b("div",{className:s0.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:Z7(o)},o+a))})}function Z7(e){return e.replace(/[a-z]+::/,"")}const eM="_settingsPanel_zsgzt_1",tM="_currentElementAbout_zsgzt_10",nM="_settingsForm_zsgzt_17",rM="_settingsInputs_zsgzt_24",iM="_buttonsHolder_zsgzt_28",oM="_validationErrorMsg_zsgzt_45",Ea={settingsPanel:eM,currentElementAbout:tM,settingsForm:nM,settingsInputs:rM,buttonsHolder:iM,validationErrorMsg:oM};function aM(e){const t=Jr(),[n,r]=Yb(),[i,o]=H.exports.useState(n!==null?Fr(e,n):null),a=H.exports.useRef(!1),l=H.exports.useMemo(()=>xm(u=>{!n||!a.current||t(Tx({path:n,node:u}))},250),[t,n]);return H.exports.useEffect(()=>{if(a.current=!1,n===null){o(null);return}Fr(e,n)!==void 0&&o(Fr(e,n))},[e,n]),H.exports.useEffect(()=>{!i||l(i)},[i,l]),{currentNode:i,updateArgumentsByName:({name:u,value:c})=>{o(f=>Q(U({},f),{uiArguments:Q(U({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function lM({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:i}=aM(e);if(r===null)return b("div",{children:"Select an element to edit properties"});if(t===null)return M("div",{children:["Error finding requested node at path ",r.join(".")]});const o=r.length===0,{uiName:a,uiArguments:l}=t,s=kn[a].SettingsComponent;return M("div",{className:Ea.settingsPanel+" properties-panel",children:[b("div",{className:Ea.currentElementAbout,children:b(K7,{tree:e,path:r,onSelect:i})}),b("form",{className:Ea.settingsForm,onSubmit:sM,children:b("div",{className:Ea.settingsInputs,children:b(iP,{onChange:n,children:b(s,{settings:l})})})}),b("div",{className:Ea.buttonsHolder,children:o?null:b(Wb,{path:r})})]})}function sM(e){e.preventDefault()}function uM(e){return["INITIAL-DATA"].includes(e.path)}function cM(){const e=Jr(),t=Hl(r=>r.uiTree),n=H.exports.useCallback(r=>{e(JR({initialState:r}))},[e]);return{tree:t,setTree:n}}function fM(){const{tree:e,setTree:t}=cM(),{status:n,ws:r}=Lx(),[i,o]=H.exports.useState("loading"),a=H.exports.useRef(null),l=Hl(s=>s.uiTree);return H.exports.useEffect(()=>{n==="connected"&&(Mx(r,s=>{!uM(s)||(a.current=s.payload,t(s.payload),o("connected"))}),tl(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(o("no-backend"),t(dM),console.log("Running in static mode"))},[t,n,r]),H.exports.useEffect(()=>{l===Gm||l===a.current||n==="connected"&&tl(r,{path:"STATE-UPDATE",payload:l})},[l,n,r]),{status:i,tree:e}}const dM={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},CE=236,pM={"--properties-panel-width":`${CE}px`};function hM(){const{status:e,tree:t}=fM();return e==="loading"?b(mM,{}):M(qk,{children:[M("div",{className:Pt.container,style:pM,children:[M("div",{className:Pt.header,children:[b(QF,{className:Pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),b("h1",{className:Pt.title,children:"Shiny UI Editor"}),M("div",{className:Pt.rightSide,children:[b(L7,{}),b("div",{className:Pt.divider}),b(tL,{})]})]}),M("div",{className:`${Pt.elementsPanel} ${Pt.titledPanel} elements-panel`,children:[b("h3",{className:Pt.panelTitleHeader,children:"Elements"}),b(uL,{})]}),b("div",{className:Pt.editorHolder+" app-view",children:b(mm,U({},t))}),M("div",{className:`${Pt.propertiesPanel}`,children:[M("div",{className:`${Pt.titledPanel} properties-panel`,children:[b("h3",{className:Pt.panelTitleHeader,children:"Properties"}),b(lM,{tree:t})]}),b("div",{className:`${Pt.titledPanel} app-preview`,children:b(HF,{})})]})]}),b(gM,{})]})}function mM(){return b("h3",{children:"Loading initial state from server"})}function gM(){return Hl(t=>t.connectedToServer)?null:b(ix,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:b("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const vM=()=>b(ZR,{children:b(iF,{children:b(hM,{})})}),yM="modulepreload",wM=function(e,t){return new URL(e,t).href},u0={},bM=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(i=>{if(i=wM(i,r),i in u0)return;u0[i]=!0;const o=i.endsWith(".css"),a=o?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${i}"]${a}`))return;const l=document.createElement("link");if(l.rel=o?"stylesheet":yM,o||(l.as="script",l.crossOrigin=""),l.href=i,document.head.appendChild(l),o)return new Promise((s,u)=>{l.addEventListener("load",s),l.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${i}`)))})})).then(()=>t())},SM=e=>{e&&e instanceof Function&&bM(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:i,getTTFB:o})=>{t(e),n(e),r(e),i(e),o(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function xM(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}Rr.render(b(H.exports.StrictMode,{children:b(vM,{})}),document.getElementById("root"));xM();SM(); diff --git a/docs/articles/demo-app/assets/index.80c504ee.js b/docs/articles/demo-app/assets/index.80c504ee.js deleted file mode 100644 index dae6bf402..000000000 --- a/docs/articles/demo-app/assets/index.80c504ee.js +++ /dev/null @@ -1,145 +0,0 @@ -var bS=Object.defineProperty,ES=Object.defineProperties;var CS=Object.getOwnPropertyDescriptors;var fs=Object.getOwnPropertySymbols;var Sh=Object.prototype.hasOwnProperty,bh=Object.prototype.propertyIsEnumerable;var wh=(e,t,n)=>t in e?bS(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,F=(e,t)=>{for(var n in t||(t={}))Sh.call(t,n)&&wh(e,n,t[n]);if(fs)for(var n of fs(t))bh.call(t,n)&&wh(e,n,t[n]);return e},$=(e,t)=>ES(e,CS(t));var $t=(e,t)=>{var n={};for(var r in e)Sh.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&fs)for(var r of fs(e))t.indexOf(r)<0&&bh.call(e,r)&&(n[r]=e[r]);return n};var Eh=(e,t,n)=>new Promise((r,o)=>{var i=l=>{try{s(n.next(l))}catch(u){o(u)}},a=l=>{try{s(n.throw(l))}catch(u){o(u)}},s=l=>l.done?r(l.value):Promise.resolve(l.value).then(i,a);s((n=n.apply(e,t)).next())});const AS=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const o of document.querySelectorAll('link[rel="modulepreload"]'))r(o);new MutationObserver(o=>{for(const i of o)if(i.type==="childList")for(const a of i.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(o){const i={};return o.integrity&&(i.integrity=o.integrity),o.referrerpolicy&&(i.referrerPolicy=o.referrerpolicy),o.crossorigin==="use-credentials"?i.credentials="include":o.crossorigin==="anonymous"?i.credentials="omit":i.credentials="same-origin",i}function r(o){if(o.ep)return;o.ep=!0;const i=n(o);fetch(o.href,i)}};AS();var Fg=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Ug(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function Bg(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var o=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,o.get?o:{enumerable:!0,get:function(){return e[r]}})}),n}var j={exports:{}},se={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var Ch=Object.getOwnPropertySymbols,xS=Object.prototype.hasOwnProperty,OS=Object.prototype.propertyIsEnumerable;function _S(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function PS(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(i){return t[i]});if(r.join("")!=="0123456789")return!1;var o={};return"abcdefghijklmnopqrst".split("").forEach(function(i){o[i]=i}),Object.keys(Object.assign({},o)).join("")==="abcdefghijklmnopqrst"}catch(i){return!1}}var jg=PS()?Object.assign:function(e,t){for(var n,r=_S(e),o,i=1;i=w},o=function(){},e.unstable_forceFrameRate=function(R){0>R||125>>1,ue=R[le];if(ue!==void 0&&0b(Fe,V))rt!==void 0&&0>b(rt,Fe)?(R[le]=rt,R[Ue]=V,le=Ue):(R[le]=Fe,R[ze]=V,le=ze);else if(rt!==void 0&&0>b(rt,V))R[le]=rt,R[Ue]=V,le=Ue;else break e}}return Y}return null}function b(R,Y){var V=R.sortIndex-Y.sortIndex;return V!==0?V:R.id-Y.id}var E=[],x=[],_=1,k=null,D=3,B=!1,q=!1,H=!1;function ce(R){for(var Y=C(x);Y!==null;){if(Y.callback===null)O(x);else if(Y.startTime<=R)O(x),Y.sortIndex=Y.expirationTime,T(E,Y);else break;Y=C(x)}}function he(R){if(H=!1,ce(R),!q)if(C(E)!==null)q=!0,t(ye);else{var Y=C(x);Y!==null&&n(he,Y.startTime-R)}}function ye(R,Y){q=!1,H&&(H=!1,r()),B=!0;var V=D;try{for(ce(Y),k=C(E);k!==null&&(!(k.expirationTime>Y)||R&&!e.unstable_shouldYield());){var le=k.callback;if(typeof le=="function"){k.callback=null,D=k.priorityLevel;var ue=le(k.expirationTime<=Y);Y=e.unstable_now(),typeof ue=="function"?k.callback=ue:k===C(E)&&O(E),ce(Y)}else O(E);k=C(E)}if(k!==null)var ze=!0;else{var Fe=C(x);Fe!==null&&n(he,Fe.startTime-Y),ze=!1}return ze}finally{k=null,D=V,B=!1}}var ne=o;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(R){R.callback=null},e.unstable_continueExecution=function(){q||B||(q=!0,t(ye))},e.unstable_getCurrentPriorityLevel=function(){return D},e.unstable_getFirstCallbackNode=function(){return C(E)},e.unstable_next=function(R){switch(D){case 1:case 2:case 3:var Y=3;break;default:Y=D}var V=D;D=Y;try{return R()}finally{D=V}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=ne,e.unstable_runWithPriority=function(R,Y){switch(R){case 1:case 2:case 3:case 4:case 5:break;default:R=3}var V=D;D=R;try{return Y()}finally{D=V}},e.unstable_scheduleCallback=function(R,Y,V){var le=e.unstable_now();switch(typeof V=="object"&&V!==null?(V=V.delay,V=typeof V=="number"&&0le?(R.sortIndex=V,T(x,R),C(E)===null&&R===C(x)&&(H?r():H=!0,n(he,V-le))):(R.sortIndex=ue,T(E,R),q||B||(q=!0,t(ye))),R},e.unstable_wrapCallback=function(R){var Y=D;return function(){var V=D;D=Y;try{return R.apply(this,arguments)}finally{D=V}}}})(ty);(function(e){e.exports=ty})(ey);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Xl=j.exports,xe=jg,je=ey.exports;function L(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function st(e,t,n,r,o,i,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=o,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=i,this.removeEmptyString=a}var Je={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){Je[e]=new st(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];Je[t]=new st(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){Je[e]=new st(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){Je[e]=new st(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){Je[e]=new st(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){Je[e]=new st(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){Je[e]=new st(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){Je[e]=new st(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){Je[e]=new st(e,5,!1,e.toLowerCase(),null,!1,!1)});var md=/[\-:]([a-z])/g;function vd(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!1,!1)});Je.xlinkHref=new st("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!0,!0)});function gd(e,t,n,r){var o=Je.hasOwnProperty(t)?Je[t]:null,i=o!==null?o.type===0:r?!1:!(!(2s||o[a]!==i[s])return` -`+o[a].replace(" at new "," at ");while(1<=a&&0<=s);break}}}finally{Vu=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Ii(e):""}function US(e){switch(e.tag){case 5:return Ii(e.type);case 16:return Ii("Lazy");case 13:return Ii("Suspense");case 19:return Ii("SuspenseList");case 0:case 2:case 15:return e=ps(e.type,!1),e;case 11:return e=ps(e.type.render,!1),e;case 22:return e=ps(e.type._render,!1),e;case 1:return e=ps(e.type,!0),e;default:return""}}function po(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case Bn:return"Fragment";case Or:return"Portal";case ji:return"Profiler";case yd:return"StrictMode";case Wi:return"Suspense";case tl:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case Sd:return(e.displayName||"Context")+".Consumer";case wd:return(e._context.displayName||"Context")+".Provider";case Kl:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case ql:return po(e.type);case Ed:return po(e._render);case bd:t=e._payload,e=e._init;try{return po(e(t))}catch(n){}}return null}function ir(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function oy(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function BS(e){var t=oy(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var o=n.get,i=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return o.call(this)},set:function(a){r=""+a,i.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function hs(e){e._valueTracker||(e._valueTracker=BS(e))}function iy(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=oy(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function nl(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function Gc(e,t){var n=t.checked;return xe({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function Th(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=ir(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function ay(e,t){t=t.checked,t!=null&&gd(e,"checked",t,!1)}function $c(e,t){ay(e,t);var n=ir(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Hc(e,t.type,n):t.hasOwnProperty("defaultValue")&&Hc(e,t.type,ir(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function Ih(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Hc(e,t,n){(t!=="number"||nl(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function jS(e){var t="";return Xl.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function Vc(e,t){return e=xe({children:void 0},t),(t=jS(t.children))&&(e.children=t),e}function ho(e,t,n,r){if(e=e.options,t){t={};for(var o=0;o=n.length))throw Error(L(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:ir(n)}}function sy(e,t){var n=ir(t.value),r=ir(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function Dh(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Qc={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function ly(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Xc(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?ly(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ms,uy=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,o){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,o)})}:e}(function(e,t){if(e.namespaceURI!==Qc.svg||"innerHTML"in e)e.innerHTML=t;else{for(ms=ms||document.createElement("div"),ms.innerHTML=""+t.valueOf().toString()+"",t=ms.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function la(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Yi={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},WS=["Webkit","ms","Moz","O"];Object.keys(Yi).forEach(function(e){WS.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Yi[t]=Yi[e]})});function cy(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Yi.hasOwnProperty(e)&&Yi[e]?(""+t).trim():t+"px"}function fy(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,o=cy(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,o):e[n]=o}}var YS=xe({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Kc(e,t){if(t){if(YS[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(L(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(L(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(L(61))}if(t.style!=null&&typeof t.style!="object")throw Error(L(62))}}function qc(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function xd(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Zc=null,mo=null,vo=null;function Rh(e){if(e=Ra(e)){if(typeof Zc!="function")throw Error(L(280));var t=e.stateNode;t&&(t=ou(t),Zc(e.stateNode,e.type,t))}}function dy(e){mo?vo?vo.push(e):vo=[e]:mo=e}function py(){if(mo){var e=mo,t=vo;if(vo=mo=null,Rh(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function eu(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-ar(t),e[t]=n}var ar=Math.clz32?Math.clz32:ob,nb=Math.log,rb=Math.LN2;function ob(e){return e===0?32:31-(nb(e)/rb|0)|0}var ib=je.unstable_UserBlockingPriority,ab=je.unstable_runWithPriority,Ls=!0;function sb(e,t,n,r){_r||_d();var o=Nd,i=_r;_r=!0;try{hy(o,e,t,n,r)}finally{(_r=i)||Pd()}}function lb(e,t,n,r){ab(ib,Nd.bind(null,e,t,n,r))}function Nd(e,t,n,r){if(Ls){var o;if((o=(t&4)===0)&&0=Gi),Gh=String.fromCharCode(32),$h=!1;function Iy(e,t){switch(e){case"keyup":return Ib.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function Ny(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var io=!1;function Db(e,t){switch(e){case"compositionend":return Ny(t);case"keypress":return t.which!==32?null:($h=!0,Gh);case"textInput":return e=t.data,e===Gh&&$h?null:e;default:return null}}function Rb(e,t){if(io)return e==="compositionend"||!Fd&&Iy(e,t)?(e=ky(),Ms=Rd=zn=null,io=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Qh(n)}}function My(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?My(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Kh(){for(var e=window,t=nl();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=nl(e.document)}return t}function of(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var Gb=In&&"documentMode"in document&&11>=document.documentMode,ao=null,af=null,Hi=null,sf=!1;function qh(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;sf||ao==null||ao!==nl(r)||(r=ao,"selectionStart"in r&&of(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),Hi&&ha(Hi,r)||(Hi=r,r=al(af,"onSelect"),0lo||(e.current=uf[lo],uf[lo]=null,lo--)}function Ne(e,t){lo++,uf[lo]=e.current,e.current=t}var sr={},nt=hr(sr),gt=hr(!1),Rr=sr;function ko(e,t){var n=e.type.contextTypes;if(!n)return sr;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var o={},i;for(i in n)o[i]=t[i];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=o),o}function yt(e){return e=e.childContextTypes,e!=null}function ul(){Se(gt),Se(nt)}function sm(e,t,n){if(nt.current!==sr)throw Error(L(168));Ne(nt,t),Ne(gt,n)}function Gy(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var o in r)if(!(o in e))throw Error(L(108,po(t)||"Unknown",o));return xe({},n,r)}function Us(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||sr,Rr=nt.current,Ne(nt,e),Ne(gt,gt.current),!0}function lm(e,t,n){var r=e.stateNode;if(!r)throw Error(L(169));n?(e=Gy(e,t,Rr),r.__reactInternalMemoizedMergedChildContext=e,Se(gt),Se(nt),Ne(nt,e)):Se(gt),Ne(gt,n)}var Bd=null,Ir=null,Vb=je.unstable_runWithPriority,jd=je.unstable_scheduleCallback,cf=je.unstable_cancelCallback,Jb=je.unstable_shouldYield,um=je.unstable_requestPaint,ff=je.unstable_now,Qb=je.unstable_getCurrentPriorityLevel,iu=je.unstable_ImmediatePriority,$y=je.unstable_UserBlockingPriority,Hy=je.unstable_NormalPriority,Vy=je.unstable_LowPriority,Jy=je.unstable_IdlePriority,ac={},Xb=um!==void 0?um:function(){},En=null,Bs=null,sc=!1,cm=ff(),et=1e4>cm?ff:function(){return ff()-cm};function To(){switch(Qb()){case iu:return 99;case $y:return 98;case Hy:return 97;case Vy:return 96;case Jy:return 95;default:throw Error(L(332))}}function Qy(e){switch(e){case 99:return iu;case 98:return $y;case 97:return Hy;case 96:return Vy;case 95:return Jy;default:throw Error(L(332))}}function Lr(e,t){return e=Qy(e),Vb(e,t)}function va(e,t,n){return e=Qy(e),jd(e,t,n)}function Sn(){if(Bs!==null){var e=Bs;Bs=null,cf(e)}Xy()}function Xy(){if(!sc&&En!==null){sc=!0;var e=0;try{var t=En;Lr(99,function(){for(;eO?(b=C,C=null):b=C.sibling;var E=d(h,C,w[O],S);if(E===null){C===null&&(C=b);break}e&&C&&E.alternate===null&&t(h,C),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E,C=b}if(O===w.length)return n(h,C),A;if(C===null){for(;OO?(b=C,C=null):b=C.sibling;var x=d(h,C,E.value,S);if(x===null){C===null&&(C=b);break}e&&C&&x.alternate===null&&t(h,C),v=i(x,v,O),T===null?A=x:T.sibling=x,T=x,C=b}if(E.done)return n(h,C),A;if(C===null){for(;!E.done;O++,E=w.next())E=f(h,E.value,S),E!==null&&(v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return A}for(C=r(h,C);!E.done;O++,E=w.next())E=p(C,h,O,E.value,S),E!==null&&(e&&E.alternate!==null&&C.delete(E.key===null?O:E.key),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return e&&C.forEach(function(_){return t(h,_)}),A}return function(h,v,w,S){var A=typeof w=="object"&&w!==null&&w.type===Bn&&w.key===null;A&&(w=w.props.children);var T=typeof w=="object"&&w!==null;if(T)switch(w.$$typeof){case Ti:e:{for(T=w.key,A=v;A!==null;){if(A.key===T){switch(A.tag){case 7:if(w.type===Bn){n(h,A.sibling),v=o(A,w.props.children),v.return=h,h=v;break e}break;default:if(A.elementType===w.type){n(h,A.sibling),v=o(A,w.props),v.ref=ci(h,A,w),v.return=h,h=v;break e}}n(h,A);break}else t(h,A);A=A.sibling}w.type===Bn?(v=Eo(w.props.children,h.mode,S,w.key),v.return=h,h=v):(S=zs(w.type,w.key,w.props,null,h.mode,S),S.ref=ci(h,v,w),S.return=h,h=S)}return a(h);case Or:e:{for(A=w.key;v!==null;){if(v.key===A)if(v.tag===4&&v.stateNode.containerInfo===w.containerInfo&&v.stateNode.implementation===w.implementation){n(h,v.sibling),v=o(v,w.children||[]),v.return=h,h=v;break e}else{n(h,v);break}else t(h,v);v=v.sibling}v=pc(w,h.mode,S),v.return=h,h=v}return a(h)}if(typeof w=="string"||typeof w=="number")return w=""+w,v!==null&&v.tag===6?(n(h,v.sibling),v=o(v,w),v.return=h,h=v):(n(h,v),v=dc(w,h.mode,S),v.return=h,h=v),a(h);if(ys(w))return m(h,v,w,S);if(oi(w))return y(h,v,w,S);if(T&&ws(h,w),typeof w=="undefined"&&!A)switch(h.tag){case 1:case 22:case 0:case 11:case 15:throw Error(L(152,po(h.type)||"Component"))}return n(h,v)}}var hl=t0(!0),n0=t0(!1),La={},fn=hr(La),ya=hr(La),wa=hr(La);function kr(e){if(e===La)throw Error(L(174));return e}function pf(e,t){switch(Ne(wa,t),Ne(ya,e),Ne(fn,La),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Xc(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Xc(t,e)}Se(fn),Ne(fn,t)}function Io(){Se(fn),Se(ya),Se(wa)}function mm(e){kr(wa.current);var t=kr(fn.current),n=Xc(t,e.type);t!==n&&(Ne(ya,e),Ne(fn,n))}function Gd(e){ya.current===e&&(Se(fn),Se(ya))}var Ie=hr(0);function ml(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var xn=null,$n=null,dn=!1;function r0(e,t){var n=Lt(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function vm(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function hf(e){if(dn){var t=$n;if(t){var n=t;if(!vm(e,t)){if(t=go(n.nextSibling),!t||!vm(e,t)){e.flags=e.flags&-1025|2,dn=!1,xn=e;return}r0(xn,n)}xn=e,$n=go(t.firstChild)}else e.flags=e.flags&-1025|2,dn=!1,xn=e}}function gm(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;xn=e}function Ss(e){if(e!==xn)return!1;if(!dn)return gm(e),dn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!lf(t,e.memoizedProps))for(t=$n;t;)r0(e,t),t=go(t.nextSibling);if(gm(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(L(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){$n=go(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}$n=null}}else $n=xn?go(e.stateNode.nextSibling):null;return!0}function lc(){$n=xn=null,dn=!1}var wo=[];function $d(){for(var e=0;ei))throw Error(L(301));i+=1,He=Ke=null,t.updateQueue=null,Vi.current=tE,e=n(r,o)}while(Ji)}if(Vi.current=Sl,t=Ke!==null&&Ke.next!==null,Sa=0,He=Ke=De=null,vl=!1,t)throw Error(L(300));return e}function Tr(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return He===null?De.memoizedState=He=e:He=He.next=e,He}function Gr(){if(Ke===null){var e=De.alternate;e=e!==null?e.memoizedState:null}else e=Ke.next;var t=He===null?De.memoizedState:He.next;if(t!==null)He=t,Ke=e;else{if(e===null)throw Error(L(310));Ke=e,e={memoizedState:Ke.memoizedState,baseState:Ke.baseState,baseQueue:Ke.baseQueue,queue:Ke.queue,next:null},He===null?De.memoizedState=He=e:He=He.next=e}return He}function ln(e,t){return typeof t=="function"?t(e):t}function fi(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=Ke,o=r.baseQueue,i=n.pending;if(i!==null){if(o!==null){var a=o.next;o.next=i.next,i.next=a}r.baseQueue=o=i,n.pending=null}if(o!==null){o=o.next,r=r.baseState;var s=a=i=null,l=o;do{var u=l.lane;if((Sa&u)===u)s!==null&&(s=s.next={lane:0,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null}),r=l.eagerReducer===e?l.eagerState:e(r,l.action);else{var c={lane:u,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null};s===null?(a=s=c,i=r):s=s.next=c,De.lanes|=u,Ma|=u}l=l.next}while(l!==null&&l!==o);s===null?i=r:s.next=a,Rt(r,t.memoizedState)||(Zt=!0),t.memoizedState=r,t.baseState=i,t.baseQueue=s,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function di(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=n.dispatch,o=n.pending,i=t.memoizedState;if(o!==null){n.pending=null;var a=o=o.next;do i=e(i,a.action),a=a.next;while(a!==o);Rt(i,t.memoizedState)||(Zt=!0),t.memoizedState=i,t.baseQueue===null&&(t.baseState=i),n.lastRenderedState=i}return[i,r]}function ym(e,t,n){var r=t._getVersion;r=r(t._source);var o=t._workInProgressVersionPrimary;if(o!==null?e=o===r:(e=e.mutableReadLanes,(e=(Sa&e)===e)&&(t._workInProgressVersionPrimary=r,wo.push(t))),e)return n(t._source);throw wo.push(t),Error(L(350))}function o0(e,t,n,r){var o=at;if(o===null)throw Error(L(349));var i=t._getVersion,a=i(t._source),s=Vi.current,l=s.useState(function(){return ym(o,t,n)}),u=l[1],c=l[0];l=He;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,m=f.source;f=f.subscribe;var y=De;return e.memoizedState={refs:d,source:t,subscribe:r},s.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var h=i(t._source);if(!Rt(a,h)){h=n(t._source),Rt(c,h)||(u(h),h=Zn(y),o.mutableReadLanes|=h&o.pendingLanes),h=o.mutableReadLanes,o.entangledLanes|=h;for(var v=o.entanglements,w=h;0n?98:n,function(){e(!0)}),Lr(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[Gn]=t,e[ll]=r,p0(e,t,!1,!1),t.stateNode=e,a=qc(n,r),n){case"dialog":we("cancel",e),we("close",e),o=r;break;case"iframe":case"object":case"embed":we("load",e),o=r;break;case"video":case"audio":for(o=0;oAf&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432)}else{if(!i)if(e=ml(a),e!==null){if(t.flags|=64,i=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),hi(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!dn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*et()-r.renderingStartTime>Af&&n!==1073741824&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=et(),n.sibling=null,t=Ie.current,Ne(Ie,i?t&1|2:t&1),n):null;case 23:case 24:return tp(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(L(156,t.tag))}function oE(e){switch(e.tag){case 1:yt(e.type)&&ul();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(Io(),Se(gt),Se(nt),$d(),t=e.flags,(t&64)!==0)throw Error(L(285));return e.flags=t&-4097|64,e;case 5:return Gd(e),null;case 13:return Se(Ie),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return Se(Ie),null;case 4:return Io(),null;case 10:return Yd(e),null;case 23:case 24:return tp(),null;default:return null}}function Kd(e,t){try{var n="",r=t;do n+=US(r),r=r.return;while(r);var o=n}catch(i){o=` -Error generating stack: `+i.message+` -`+i.stack}return{value:e,source:t,stack:o}}function wf(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var iE=typeof WeakMap=="function"?WeakMap:Map;function v0(e,t,n){n=Kn(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){El||(El=!0,xf=r),wf(e,t)},n}function g0(e,t,n){n=Kn(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var o=t.value;n.payload=function(){return wf(e,t),r(o)}}var i=e.stateNode;return i!==null&&typeof i.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(un===null?un=new Set([this]):un.add(this),wf(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var aE=typeof WeakSet=="function"?WeakSet:Set;function Im(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){tr(e,n)}else t.current=null}function sE(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Qt(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ud(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(L(163))}function lE(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var o=e;r=o.next,o=o.tag,(o&4)!==0&&(o&1)!==0&&(O0(n,e),vE(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Qt(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&dm(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}dm(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&Yy(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&by(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(L(163))}function Nm(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var o=n.memoizedProps.style;o=o!=null&&o.hasOwnProperty("display")?o.display:null,r.style.display=cy("display",o)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function Dm(e,t){if(Ir&&typeof Ir.onCommitFiberUnmount=="function")try{Ir.onCommitFiberUnmount(Bd,t)}catch(i){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,o=r.destroy;if(r=r.tag,o!==void 0)if((r&4)!==0)O0(t,n);else{r=t;try{o()}catch(i){tr(r,i)}}n=n.next}while(n!==e)}break;case 1:if(Im(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(i){tr(t,i)}break;case 5:Im(t);break;case 4:y0(e,t)}}function Rm(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function Lm(e){return e.tag===5||e.tag===3||e.tag===4}function Mm(e){e:{for(var t=e.return;t!==null;){if(Lm(t))break e;t=t.return}throw Error(L(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(L(161))}n.flags&16&&(la(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||Lm(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Sf(e,n,t):bf(e,n,t)}function Sf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=sl));else if(r!==4&&(e=e.child,e!==null))for(Sf(e,t,n),e=e.sibling;e!==null;)Sf(e,t,n),e=e.sibling}function bf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(bf(e,t,n),e=e.sibling;e!==null;)bf(e,t,n),e=e.sibling}function y0(e,t){for(var n=t,r=!1,o,i;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(L(160));switch(o=r.stateNode,r.tag){case 5:i=!1;break e;case 3:o=o.containerInfo,i=!0;break e;case 4:o=o.containerInfo,i=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,s=n,l=s;;)if(Dm(a,l),l.child!==null&&l.tag!==4)l.child.return=l,l=l.child;else{if(l===s)break e;for(;l.sibling===null;){if(l.return===null||l.return===s)break e;l=l.return}l.sibling.return=l.return,l=l.sibling}i?(a=o,s=n.stateNode,a.nodeType===8?a.parentNode.removeChild(s):a.removeChild(s)):o.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){o=n.stateNode.containerInfo,i=!0,n.child.return=n,n=n.child;continue}}else if(Dm(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function fc(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var o=e!==null?e.memoizedProps:r;e=t.type;var i=t.updateQueue;if(t.updateQueue=null,i!==null){for(n[ll]=r,e==="input"&&r.type==="radio"&&r.name!=null&&ay(n,r),qc(e,o),t=qc(e,r),o=0;oo&&(o=a),n&=~i}if(n=o,n=et()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*cE(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}Ve!==5&&(Ve=2),l=Kd(l,s),d=a;do{switch(d.tag){case 3:i=l,d.flags|=4096,t&=-t,d.lanes|=t;var T=v0(d,i,t);fm(d,T);break e;case 1:i=l;var C=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof C.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(un===null||!un.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var b=g0(d,i,t);fm(d,b);break e}}d=d.return}while(d!==null)}x0(n)}catch(E){t=E,Le===n&&n!==null&&(Le=n=n.return);continue}break}while(1)}function C0(){var e=bl.current;return bl.current=Sl,e===null?Sl:e}function Ri(e,t){var n=X;X|=16;var r=C0();at===e&&tt===t||bo(e,t);do try{dE();break}catch(o){E0(e,o)}while(1);if(Wd(),X=n,bl.current=r,Le!==null)throw Error(L(261));return at=null,tt=0,Ve}function dE(){for(;Le!==null;)A0(Le)}function pE(){for(;Le!==null&&!Jb();)A0(Le)}function A0(e){var t=_0(e.alternate,e,Mr);e.memoizedProps=e.pendingProps,t===null?x0(e):Le=t,qd.current=null}function x0(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=rE(n,t,Mr),n!==null){Le=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(Mr&1073741824)!==0||(n.mode&4)===0){for(var r=0,o=n.child;o!==null;)r|=o.lanes|o.childLanes,o=o.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(s=a,a=T,T=s),s=Xh(w,T),i=Xh(w,a),s&&i&&(A.rangeCount!==1||A.anchorNode!==s.node||A.anchorOffset!==s.offset||A.focusNode!==i.node||A.focusOffset!==i.offset)&&(S=S.createRange(),S.setStart(s.node,s.offset),A.removeAllRanges(),T>a?(A.addRange(S),A.extend(i.node,i.offset)):(S.setEnd(i.node,i.offset),A.addRange(S)))))),S=[],A=w;A=A.parentNode;)A.nodeType===1&&S.push({element:A,left:A.scrollLeft,top:A.scrollTop});for(typeof w.focus=="function"&&w.focus(),w=0;wet()-ep?bo(e,0):Zd|=n),jt(e,t)}function wE(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=To()===99?1:2:(An===0&&(An=Qo),t=eo(62914560&~An),t===0&&(t=4194304))),n=Ot(),e=lu(e,t),e!==null&&(eu(e,t,n),jt(e,n))}var _0;_0=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||gt.current)Zt=!0;else if((n&r)!==0)Zt=(e.flags&16384)!==0;else{switch(Zt=!1,t.tag){case 3:Am(t),lc();break;case 5:mm(t);break;case 1:yt(t.type)&&Us(t);break;case 4:pf(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var o=t.type._context;Ne(cl,o._currentValue),o._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?xm(e,t,n):(Ne(Ie,Ie.current&1),t=On(e,t,n),t!==null?t.sibling:null);Ne(Ie,Ie.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return Tm(e,t,n);t.flags|=64}if(o=t.memoizedState,o!==null&&(o.rendering=null,o.tail=null,o.lastEffect=null),Ne(Ie,Ie.current),r)break;return null;case 23:case 24:return t.lanes=0,uc(e,t,n)}return On(e,t,n)}else Zt=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=ko(t,nt.current),yo(t,n),o=Vd(null,t,r,e,o,n),t.flags|=1,typeof o=="object"&&o!==null&&typeof o.render=="function"&&o.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,yt(r)){var i=!0;Us(t)}else i=!1;t.memoizedState=o.state!==null&&o.state!==void 0?o.state:null,zd(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&pl(t,r,a,e),o.updater=au,t.stateNode=o,o._reactInternals=t,df(t,r,e,n),t=gf(null,t,r,!0,i,n)}else t.tag=0,ht(null,t,o,n),t=t.child;return t;case 16:o=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=o._init,o=i(o._payload),t.type=o,i=t.tag=bE(o),e=Qt(o,e),i){case 0:t=vf(null,t,o,e,n);break e;case 1:t=Cm(null,t,o,e,n);break e;case 11:t=bm(null,t,o,e,n);break e;case 14:t=Em(null,t,o,Qt(o.type,e),r,n);break e}throw Error(L(306,o,""))}return t;case 0:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),vf(e,t,r,o,n);case 1:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),Cm(e,t,r,o,n);case 3:if(Am(t),r=t.updateQueue,e===null||r===null)throw Error(L(282));if(r=t.pendingProps,o=t.memoizedState,o=o!==null?o.element:null,qy(e,t),ga(t,r,null,n),r=t.memoizedState.element,r===o)lc(),t=On(e,t,n);else{if(o=t.stateNode,(i=o.hydrate)&&($n=go(t.stateNode.containerInfo.firstChild),xn=t,i=dn=!0),i){if(e=o.mutableSourceEagerHydrationData,e!=null)for(o=0;o1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:cp(e)?2:fp(e)?3:0}function Co(e,t){return qo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function cC(e,t){return qo(e)===2?e.get(t):e[t]}function H0(e,t,n){var r=qo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function V0(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function cp(e){return vC&&e instanceof Map}function fp(e){return gC&&e instanceof Set}function Cr(e){return e.o||e.t}function dp(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Q0(e);delete t[Ce];for(var n=Ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=fC),Object.freeze(e),t&&Fr(e,function(n,r){return pp(r,!0)},!0)),e}function fC(){Kt(2)}function hp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function Pn(e){var t=Rf[e];return t||Kt(18,e),t}function dC(e,t){Rf[e]||(Rf[e]=t)}function If(){return ba}function mc(e,t){t&&(Pn("Patches"),e.u=[],e.s=[],e.v=t)}function Al(e){Nf(e),e.p.forEach(pC),e.p=null}function Nf(e){e===ba&&(ba=e.l)}function Ym(e){return ba={p:[],l:ba,h:e,m:!0,_:0}}function pC(e){var t=e[Ce];t.i===0||t.i===1?t.j():t.O=!0}function vc(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||Pn("ES5").S(t,e,r),r?(n[Ce].P&&(Al(t),Kt(4)),dr(e)&&(e=xl(t,e),t.l||Ol(t,e)),t.u&&Pn("Patches").M(n[Ce],e,t.u,t.s)):e=xl(t,n,[]),Al(t),t.u&&t.v(t.u,t.s),e!==J0?e:void 0}function xl(e,t,n){if(hp(t))return t;var r=t[Ce];if(!r)return Fr(t,function(i,a){return zm(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Ol(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=dp(r.k):r.o;Fr(r.i===3?new Set(o):o,function(i,a){return zm(e,r,o,i,a,n)}),Ol(e,o,!1),n&&e.u&&Pn("Patches").R(r,n,e.u,e.s)}return r.o}function zm(e,t,n,r,o,i){if(fr(o)){var a=xl(e,o,i&&t&&t.i!==3&&!Co(t.D,r)?i.concat(r):void 0);if(H0(n,r,a),!fr(a))return;e.m=!1}if(dr(o)&&!hp(o)){if(!e.h.F&&e._<1)return;xl(e,o),t&&t.A.l||Ol(e,o)}}function Ol(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&pp(t,n)}function gc(e,t){var n=e[Ce];return(n?Cr(n):e)[t]}function Gm(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function jn(e){e.P||(e.P=!0,e.l&&jn(e.l))}function yc(e){e.o||(e.o=dp(e.t))}function Df(e,t,n){var r=cp(t)?Pn("MapSet").N(t,n):fp(t)?Pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:If(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=xo;a&&(l=[s],u=Gs);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):Pn("ES5").J(t,n);return(n?n.A:If()).p.push(r),r}function hC(e){return fr(e)||Kt(22,e),function t(n){if(!dr(n))return n;var r,o=n[Ce],i=qo(n);if(o){if(!o.P&&(o.i<4||!Pn("ES5").K(o)))return o.t;o.I=!0,r=$m(n,i),o.I=!1}else r=$m(n,i);return Fr(r,function(a,s){o&&cC(o.t,a)===s||H0(r,a,t(s))}),i===3?new Set(r):r}(e)}function $m(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return dp(e)}function mC(){function e(i,a){var s=o[i];return s?s.enumerable=a:o[i]=s={configurable:!0,enumerable:a,get:function(){var l=this[Ce];return xo.get(l,i)},set:function(l){var u=this[Ce];xo.set(u,i,l)}},s}function t(i){for(var a=i.length-1;a>=0;a--){var s=i[a][Ce];if(!s.P)switch(s.i){case 5:r(s)&&jn(s);break;case 4:n(s)&&jn(s)}}}function n(i){for(var a=i.t,s=i.k,l=Ao(s),u=l.length-1;u>=0;u--){var c=l[u];if(c!==Ce){var f=a[c];if(f===void 0&&!Co(a,c))return!0;var d=s[c],p=d&&d[Ce];if(p?p.t!==f:!V0(d,f))return!0}}var m=!!a[Ce];return l.length!==Ao(a).length+(m?0:1)}function r(i){var a=i.k;if(a.length!==i.t.length)return!0;var s=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!s||s.get)}var o={};dC("ES5",{J:function(i,a){var s=Array.isArray(i),l=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?y-1:0),v=1;v1?u-1:0),f=1;f=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=Pn("Patches").$;return fr(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),_t=new wC,SC=_t.produce;_t.produceWithPatches.bind(_t);_t.setAutoFreeze.bind(_t);_t.setUseProxies.bind(_t);_t.applyPatches.bind(_t);_t.createDraft.bind(_t);_t.finishDraft.bind(_t);const $s=SC;function bC(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Qm(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Xm(e){for(var t=1;t0&&i[i.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!i||u[1]>i[0]&&u[1]0)for(var S=p.getState(),A=Array.from(n.values()),T=0,C=A;T!1}}),iA=()=>{const e=vr();return I.useCallback(()=>{e(aA())},[e])},{DISCONNECTED_FROM_SERVER:aA}=s1.actions,sA=s1.reducer;function Xa(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(i)),o=Object.keys(t).filter(i=>!n.includes(i));if(!Xa(r,o))return!1;for(let i of r)if(e[i]!==t[i])return!1;return!0}function l1(e,t,n){return n===0?!0:Xa(e.slice(0,n),t.slice(0,n))}function uA(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:l1(e,t,n)}const u1=vp({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:c1,RESET_SELECTION:a5,STEP_BACK_SELECTION:cA}=u1.actions,fA=u1.reducer,dA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function pA(e){const t=vr();return j.exports.useCallback(()=>{e!==null&&t(bw({path:e}))},[t,e])}const hA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",mA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",vA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",Mf="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",f1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",d1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",gA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",yA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",wA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",SA="_icon_1467k_1",bA={icon:SA},EA={undo:wA,redo:gA,tour:yA,alignTop:vA,alignBottom:mA,alignCenter:hA,alignSpread:Mf,alignTextCenter:Mf,alignTextLeft:f1,alignTextRight:d1};function CA({id:e,alt:t=e,size:n}){return g("img",{src:EA[e],alt:t,className:bA.icon,style:n?{height:n}:{}})}var p1={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},rv=j.exports.createContext&&j.exports.createContext(p1),Ur=globalThis&&globalThis.__assign||function(){return Ur=Object.assign||function(e){for(var t,n=1,r=arguments.length;ng("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),Sp=e=>N("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),PA=e=>g("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),kA="_button_1dliw_1",TA="_regular_1dliw_26",IA="_icon_1dliw_34",NA="_transparent_1dliw_42",Sc={button:kA,regular:TA,delete:"_delete_1dliw_30",icon:IA,transparent:NA},wt=o=>{var i=o,{children:e,variant:t="regular",className:n}=i,r=$t(i,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(s=>Sc[s]).join(" "):Sc[t]:"";return g("button",$(F({className:Sc.button+" "+a+(n?" "+n:"")},r),{children:e}))},DA="_deleteButton_1en02_1",RA={deleteButton:DA};function m1({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=pA(e);return N(wt,{className:RA.deleteButton,onClick:o=>{o.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[g(Sp,{}),t?null:"Delete Element"]})}function v1(){const e=vr(),t=Ja(r=>r.selectedPath),n=j.exports.useCallback(r=>{e(c1({path:r}))},[e]);return[t,n]}const bp=I.createContext([null,e=>{}]),LA=({children:e})=>{const t=I.useState(null);return g(bp.Provider,{value:t,children:e})};function MA(){return I.useContext(bp)}function g1({ref:e,nodeInfo:t,immovable:n=!1}){const r=I.useRef(!1),[,o]=I.useContext(bp),i=I.useCallback(()=>{r.current===!1||n||(o(null),r.current=!1,document.body.removeEventListener("dragover",ov),document.body.removeEventListener("drop",i))},[n,o]),a=I.useCallback(s=>{s.stopPropagation(),o(t),r.current=!0,document.body.addEventListener("dragover",ov),document.body.addEventListener("drop",i)},[i,t,o]);I.useEffect(()=>{var l;if(((l=t.currentPath)==null?void 0:l.length)===0||n)return;const s=e.current;if(!!s)return s.setAttribute("draggable","true"),s.addEventListener("dragstart",a),s.addEventListener("dragend",i),()=>{s.removeEventListener("dragstart",a),s.removeEventListener("dragend",i)}},[i,n,t.currentPath,a,e])}function ov(e){e.preventDefault()}const FA="_leaf_1yzht_1",UA="_selectedOverlay_1yzht_5",BA="_container_1yzht_15",iv={leaf:FA,selectedOverlay:UA,container:BA};function jA({ref:e,path:t}){I.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const Ep=r=>{var o=r,{path:e=[],canMove:t=!0}=o,n=$t(o,["path","canMove"]);const i=I.useRef(null),{uiName:a,uiArguments:s,uiChildren:l}=n,[u,c]=v1(),f=u?Xa(e,u):!1,d=en[a],p=y=>{y.stopPropagation(),c(e)};if(g1({ref:i,nodeInfo:{node:n,currentPath:e},immovable:!t}),jA({ref:i,path:e}),d.acceptsChildren===!0){const y=d.UiComponent;return g(y,{uiArguments:s,uiChildren:l!=null?l:[],compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})}const m=d.UiComponent;return g(m,{uiArguments:s,compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})},Cp=I.forwardRef((o,r)=>{var i=o,{className:e="",children:t}=i,n=$t(i,["className","children"]);const a=e+" card";return g("div",$(F({ref:r,className:a},n),{children:t}))}),WA=I.forwardRef((r,n)=>{var o=r,{className:e=""}=o,t=$t(o,["className"]);const i=e+" card-header";return g("div",F({ref:n,className:i},t))}),YA="_container_rm196_1",zA="_withTitle_rm196_13",GA="_panelTitle_rm196_22",$A="_contentHolder_rm196_27",HA="_dropWatcher_rm196_67",VA="_lastDropWatcher_rm196_75",JA="_firstDropWatcher_rm196_78",QA="_middleDropWatcher_rm196_89",XA="_onlyDropWatcher_rm196_93",KA="_hoveringOverSwap_rm196_98",qA="_availableToSwap_rm196_99",ZA="_pulse_rm196_1",ex="_emptyGridCard_rm196_143",tx="_emptyMessage_rm196_160",xt={container:YA,withTitle:zA,panelTitle:GA,contentHolder:$A,dropWatcher:HA,lastDropWatcher:VA,firstDropWatcher:JA,middleDropWatcher:QA,onlyDropWatcher:XA,hoveringOverSwap:KA,availableToSwap:qA,pulse:ZA,emptyGridCard:ex,emptyMessage:tx};function qt(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Ap(e)?2:xp(e)?3:0}function Ff(e,t){return Zo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function nx(e,t){return Zo(e)===2?e.get(t):e[t]}function y1(e,t,n){var r=Zo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function rx(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Ap(e){return sx&&e instanceof Map}function xp(e){return lx&&e instanceof Set}function Ar(e){return e.o||e.t}function Op(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=cx(e);delete t[Pt];for(var n=Tp(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=ox),Object.freeze(e),t&&Aa(e,function(n,r){return _p(r,!0)},!0)),e}function ox(){qt(2)}function Pp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function pn(e){var t=fx[e];return t||qt(18,e),t}function av(){return xa}function bc(e,t){t&&(pn("Patches"),e.u=[],e.s=[],e.v=t)}function Tl(e){Uf(e),e.p.forEach(ix),e.p=null}function Uf(e){e===xa&&(xa=e.l)}function sv(e){return xa={p:[],l:xa,h:e,m:!0,_:0}}function ix(e){var t=e[Pt];t.i===0||t.i===1?t.j():t.O=!0}function Ec(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||pn("ES5").S(t,e,r),r?(n[Pt].P&&(Tl(t),qt(4)),Br(e)&&(e=Il(t,e),t.l||Nl(t,e)),t.u&&pn("Patches").M(n[Pt].t,e,t.u,t.s)):e=Il(t,n,[]),Tl(t),t.u&&t.v(t.u,t.s),e!==w1?e:void 0}function Il(e,t,n){if(Pp(t))return t;var r=t[Pt];if(!r)return Aa(t,function(i,a){return lv(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Nl(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=Op(r.k):r.o;Aa(r.i===3?new Set(o):o,function(i,a){return lv(e,r,o,i,a,n)}),Nl(e,o,!1),n&&e.u&&pn("Patches").R(r,n,e.u,e.s)}return r.o}function lv(e,t,n,r,o,i){if(Do(o)){var a=Il(e,o,i&&t&&t.i!==3&&!Ff(t.D,r)?i.concat(r):void 0);if(y1(n,r,a),!Do(a))return;e.m=!1}if(Br(o)&&!Pp(o)){if(!e.h.F&&e._<1)return;Il(e,o),t&&t.A.l||Nl(e,o)}}function Nl(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&_p(t,n)}function Cc(e,t){var n=e[Pt];return(n?Ar(n):e)[t]}function uv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Bf(e){e.P||(e.P=!0,e.l&&Bf(e.l))}function Ac(e){e.o||(e.o=Op(e.t))}function jf(e,t,n){var r=Ap(t)?pn("MapSet").N(t,n):xp(t)?pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:av(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=Wf;a&&(l=[s],u=Li);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):pn("ES5").J(t,n);return(n?n.A:av()).p.push(r),r}function ax(e){return Do(e)||qt(22,e),function t(n){if(!Br(n))return n;var r,o=n[Pt],i=Zo(n);if(o){if(!o.P&&(o.i<4||!pn("ES5").K(o)))return o.t;o.I=!0,r=cv(n,i),o.I=!1}else r=cv(n,i);return Aa(r,function(a,s){o&&nx(o.t,a)===s||y1(r,a,t(s))}),i===3?new Set(r):r}(e)}function cv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Op(e)}var fv,xa,kp=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",sx=typeof Map!="undefined",lx=typeof Set!="undefined",dv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",w1=kp?Symbol.for("immer-nothing"):((fv={})["immer-nothing"]=!0,fv),pv=kp?Symbol.for("immer-draftable"):"__$immer_draftable",Pt=kp?Symbol.for("immer-state"):"__$immer_state",ux=""+Object.prototype.constructor,Tp=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,cx=Object.getOwnPropertyDescriptors||function(e){var t={};return Tp(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},fx={},Wf={get:function(e,t){if(t===Pt)return e;var n=Ar(e);if(!Ff(n,t))return function(o,i,a){var s,l=uv(i,a);return l?"value"in l?l.value:(s=l.get)===null||s===void 0?void 0:s.call(o.k):void 0}(e,n,t);var r=n[t];return e.I||!Br(r)?r:r===Cc(e.t,t)?(Ac(e),e.o[t]=jf(e.A.h,r,e)):r},has:function(e,t){return t in Ar(e)},ownKeys:function(e){return Reflect.ownKeys(Ar(e))},set:function(e,t,n){var r=uv(Ar(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var o=Cc(Ar(e),t),i=o==null?void 0:o[Pt];if(i&&i.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(rx(n,o)&&(n!==void 0||Ff(e.t,t)))return!0;Ac(e),Bf(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Cc(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,Ac(e),Bf(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=Ar(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){qt(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){qt(12)}},Li={};Aa(Wf,function(e,t){Li[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Li.deleteProperty=function(e,t){return Li.set.call(this,e,t,void 0)},Li.set=function(e,t,n){return Wf.set.call(this,e[0],t,n,e[0])};var dx=function(){function e(n){var r=this;this.g=dv,this.F=!0,this.produce=function(o,i,a){if(typeof o=="function"&&typeof i!="function"){var s=i;i=o;var l=r;return function(y){var h=this;y===void 0&&(y=s);for(var v=arguments.length,w=Array(v>1?v-1:0),S=1;S1?c-1:0),d=1;d=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=pn("Patches").$;return Do(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),kt=new dx,px=kt.produce;kt.produceWithPatches.bind(kt);kt.setAutoFreeze.bind(kt);kt.setUseProxies.bind(kt);kt.applyPatches.bind(kt);kt.createDraft.bind(kt);kt.finishDraft.bind(kt);const ei=px,Dl=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+i*r)};function hv(e){let t=1/0,n=-1/0;for(let i of e)in&&(n=i);const r=n-t,o=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===o-1}}function S1(e,t){return[...new Array(t)].fill(e)}function hx(e,t){return e.filter(n=>!t.includes(n))}function Yf(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function Oa(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function mx(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const o=r[t];return r[t]=void 0,r=Oa(r,n,o),r.filter(i=>typeof i!="undefined")}function vx(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const o=e[r-1];return[...e].splice(0,r-1).join(t)+n+o}function Ip(e){return e.uiChildren!==void 0}function rr(e,t){let n=e,r;for(r of t){if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function b1(e,t){return l1(e,t,Math.min(e.length,t.length))}function Np(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const o=n-1;return Xa(e.slice(0,o),t.slice(0,o))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function E1(e,{path:t}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=gx(e,t);if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function gx(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const o=n.length===0?e:rr(e,n);if(!Ip(o))throw new Error("Somehow trying to enter a leaf node");return{parentNode:o,indexToNode:r}}function yx(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:o}){const i=rr(e,t);if(!en[i.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(i.uiChildren)||(i.uiChildren=[]);const a=r==="last"?i.uiChildren.length:r;if(o!==void 0){const s=[...t,a];if(b1(o,s))throw new Error("Invalid move request");if(Np(o,s)){const l=o[o.length-1];i.uiChildren=mx(i.uiChildren,l,a);return}E1(e,{path:o})}i.uiChildren=Oa(i.uiChildren,a,n)}function wx({fromPath:e,toPath:t}){if(e==null)return!0;if(b1(e,t))return!1;if(Np(e,t)){const n=e.length,r=e[n-1],o=t[n-1];if(r===o||r===o-1)return!1}return!0}const Sx="_canAcceptDrop_1oxcd_1",bx="_pulse_1oxcd_1",Ex="_hoveringOver_1oxcd_32",zf={canAcceptDrop:Sx,pulse:bx,hoveringOver:Ex};function Dp({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:o=zf.canAcceptDrop,hoveringOverClass:i=zf.hoveringOver}){const[a,s]=MA(),{addCanAcceptDropHighlight:l,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=Cx({watcherRef:e,canAcceptDropClass:o,hoveringOverClass:i}),d=a?t(a):!1,p=I.useCallback(h=>{h.preventDefault(),h.stopPropagation(),u(),r==null||r()},[u,r]),m=I.useCallback(h=>{h.preventDefault(),c()},[c]),y=I.useCallback(h=>{if(h.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),s(null)},[d,a,n,c,s]);I.useEffect(()=>{const h=e.current;if(!!h)return d&&(l(),h.addEventListener("dragenter",p),h.addEventListener("dragleave",m),h.addEventListener("dragover",p),h.addEventListener("drop",y)),()=>{f(),h.removeEventListener("dragenter",p),h.removeEventListener("dragleave",m),h.removeEventListener("dragover",p),h.removeEventListener("drop",y)}},[l,d,m,p,y,f,e])}function Cx({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=I.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),o=I.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),i=I.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=I.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:o,removeHoveredOverHighlight:i,removeAllHighlights:a}}function Ax({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Ew(),o=I.useCallback(({node:a,currentPath:s})=>mv(a)!==null&&wx({fromPath:s,toPath:[...n,t]}),[t,n]),i=I.useCallback(({node:a,currentPath:s})=>{const l=mv(a);if(!l)throw new Error("No node to place...");r({node:l,currentPath:s,parentPath:n,positionInChildren:t})},[t,n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i})}function mv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function xx(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function vv(e){return Et({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function gv(e){return Et({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function C1(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}var Ou=A1;function A1(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],o={}.toString.call(r).slice(8,-1);o=="Array"||o=="Object"?t[n]=A1(r):o=="Date"?t[n]=new Date(r.getTime()):o=="RegExp"?t[n]=RegExp(r.source,Ox(r)):t[n]=r}return t}function Ox(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Ka(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function _x(e,t={}){const n=new Set;for(let r of e)for(let o of r)t.ignore&&t.ignore.includes(o)||n.add(o);return[...n]}function Px(e,{index:t,arr:n,dir:r}){const o=Ou(e);switch(r){case"rows":return Oa(o,t,n);case"cols":return o.map((i,a)=>Oa(i,t,n[a]))}}function kx(e,{index:t,dir:n}){const r=Ou(e);switch(n){case"rows":return Yf(r,t);case"cols":return r.map((o,i)=>Yf(o,t))}}const vn=".";function Rp(e){const t=new Map;return Tx(e).forEach(({itemRows:n,itemCols:r},o)=>{if(o===vn)return;const i=hv(n),a=hv(r);t.set(o,{colStart:a.minVal,rowStart:i.minVal,colSpan:a.span+1,rowSpan:i.span+1,isValid:i.isSequence&&a.isSequence})}),t}function Tx(e){var o;const t=new Map,{numRows:n,numCols:r}=Ka(e);for(let i=0;i1,c=r>1,f=[];return(yv({colRange:l,rowIndex:e-1,layoutAreas:o})||u)&&f.push("up"),(yv({colRange:l,rowIndex:i+1,layoutAreas:o})||u)&&f.push("down"),(wv({rowRange:s,colIndex:n-1,layoutAreas:o})||c)&&f.push("left"),(wv({rowRange:s,colIndex:a+1,layoutAreas:o})||c)&&f.push("right"),f}function yv({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===vn)}function wv({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===vn)}const Nx="_marker_rkm38_1",Dx="_dragger_rkm38_30",Rx="_move_rkm38_50",Sv={marker:Nx,dragger:Dx,move:Rx};function _a({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function Lx(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=_a(e)),"colSpan"in t&&(t=_a(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function Mx({row:e,col:t}){return`row${e}-col${t}`}function Fx({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:o,colStart:i,colEnd:a}=_a(t),s=n.length,l=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:o,growExtent:1};u=r-1,c=1,f=o;break;case"left":if(i===1)return{shrinkExtent:a,growExtent:1};u=i-1,c=1,f=a;break;case"down":if(o===s)return{shrinkExtent:r,growExtent:s};u=o+1,c=s,f=r;break;case"right":if(a===l)return{shrinkExtent:i,growExtent:l};u=a+1,c=l,f=i;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[m,y]=d?[i,a]:[r,o],h=(S,A)=>{const[T,C]=d?[S,A]:[A,S];return n[T-1][C-1]!==vn},v=Dl(m,y),w=Dl(u,c);for(let S of w)for(let A of v)if(h(S,A))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function x1(e,t,n){const r=t=r&&e<=o}function Ux({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=Gf(t.getPropertyValue("gap")),i=Gf(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],s=Bx(t,e),l=s.length,u=[];for(let c=0;cx1(i,l,u));if(a===void 0)return;const s=Wx[n];return o[s]=a.index,o}const Wx={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function Yx({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const o=_a(t),i=I.useRef(null),a=I.useCallback(u=>{const c=e.current,f=i.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=jx({mousePos:u,dragState:f});d&&Ev(c,d)},[e]),s=I.useCallback(()=>{const u=e.current,c=i.current;if(!u||!c)return;const f=c.gridItemExtent;Lx(f,o)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),bv("on")},[o,a,r,e]);return I.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),m=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:y,growExtent:h}=Fx({dragDirection:u,gridLocation:t,layoutAreas:n});i.current={dragHandle:u,gridItemExtent:_a(t),tractExtents:Ux({dir:m,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:v})=>x1(v,y,h))},Ev(e.current,i.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",s,{once:!0}),bv("off")},[s,t,n,a,e])}function bv(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function Ev(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:o}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(o+1))}function zx({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const o=I.useRef(null),i=Yx({overlayRef:o,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=I.useMemo(()=>Ix({gridLocation:t,layoutAreas:n}),[t,n]),s=I.useMemo(()=>{let l=[];for(let u of a)l.push(g("div",{className:Sv.dragger+" "+u,onMouseDown:c=>{Gx(c),i(u)},children:$x[u]},u));return l},[a,i]);return I.useEffect(()=>{var l;(l=o.current)==null||l.style.setProperty("--grid-area",e)},[e]),g("div",{ref:o,className:Sv.marker+" grid-area-overlay",children:s})}function Gx(e){e.preventDefault(),e.stopPropagation()}const $x={up:g(gv,{}),down:g(gv,{}),left:g(vv,{}),right:g(vv,{})};function Hx({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=I.useRef(null);return Dp({watcherRef:r,onDrop:o=>{n($(F({},o),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),g("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function Vx(e,t){const{numRows:n,numCols:r}=Ka(e),o=[];for(let i=0;i{const i=r==="rows"?"cols":"rows",a=O1(o);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const s=Rp(o.areas);let l=S1(vn,a[i].length);s.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=Hf(u,r);if(f<=t&&d>t){const m=Hf(u,i);for(let y=m.itemStart-1;y1}function Kx(e,{index:t,dir:n}){let r=[];return e.forEach((o,i)=>{const{itemStart:a,itemEnd:s}=Hf(o,n);a===t&&a===s&&r.push(i)}),r}const qx="_ResizableGrid_i4cq9_1",Zx={ResizableGrid:qx,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function T1(e){var o,i;const t=((o=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:o[0])||"px",n=(i=e.match(/^[\d|\.]*/g))==null?void 0:i[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function Wn(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const e2="_container_jk9tt_8",t2="_label_jk9tt_26",n2="_mainInput_jk9tt_59",kn={container:e2,label:t2,mainInput:n2},I1=I.createContext(null);function $r(e){const t=I.useContext(I1);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const r2=({onChange:e,children:t})=>g(I1.Provider,{value:e,children:t});function o2({name:e,isDisabled:t,defaultValue:n}){const r=$r(),o=`Click to ${t?"set":"unset"} ${e} property`;return g("input",{"aria-label":o,type:"checkbox",checked:!t,title:o,onChange:i=>{r({name:e,value:i.target.checked?n:void 0})}})}function Lp({name:e,label:t,optional:n,isDisabled:r,defaultValue:o,mainInput:i,width_setting:a="full"}){return N("label",{className:kn.container,"data-disabled":r,"data-width-setting":a,children:[N("div",{className:kn.label,children:[n?g(o2,{name:e,isDisabled:r,defaultValue:o}):null,t!=null?t:e,":"]}),g("div",{className:kn.mainInput,children:i})]})}const i2="_numericInput_n1lnu_1",a2={numericInput:i2};function Mp({value:e,ariaLabel:t,onChange:n,min:r,max:o,disabled:i=!1}){var s;const a=I.useCallback((l=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+l*c;r&&(f=Math.max(f,r)),o&&(f=Math.min(f,o)),n(f)},[o,r,n,e]);return g("input",{className:a2.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:i,value:(s=e==null?void 0:e.toString())!=null?s:"",onChange:l=>n(Number(l.target.value)),min:r,onKeyDown:l=>{(l.key==="ArrowUp"||l.key==="ArrowDown")&&(l.preventDefault(),a(l.key==="ArrowUp"?1:-1,l.shiftKey))}})}function Hn({name:e,label:t,value:n,min:r=0,max:o,onChange:i,optional:a=!1,defaultValue:s=1,disabled:l=n===void 0}){const u=$r(i);return g(Lp,{name:e,label:t,optional:a,isDisabled:l,defaultValue:s,width_setting:"fit",mainInput:g(Mp,{ariaLabel:t!=null?t:e,disabled:l,value:n,onChange:c=>u({name:e,value:c}),min:r,max:o})})}var Fp=s2;function s2(e,t,n){var r=null,o=null,i=function(){r&&(clearTimeout(r),o=null,r=null)},a=function(){var l=o;i(),l&&l()},s=function(){if(!t)return e.apply(this,arguments);var l=this,u=arguments,c=n&&!r;if(i(),o=function(){e.apply(l,u)},r=setTimeout(function(){if(r=null,!c){var f=o;return o=null,f()}},t),c)return o()};return s.cancel=i,s.flush=a,s}var Av=function(t){return t.reduce(function(n,r){var o=r[0],i=r[1];return n[o]=i,n},{})},xv=typeof window!="undefined"&&window.document&&window.document.createElement?j.exports.useLayoutEffect:j.exports.useEffect,St="top",Wt="bottom",Yt="right",bt="left",Up="auto",qa=[St,Wt,Yt,bt],Ro="start",Pa="end",l2="clippingParents",N1="viewport",vi="popper",u2="reference",Ov=qa.reduce(function(e,t){return e.concat([t+"-"+Ro,t+"-"+Pa])},[]),D1=[].concat(qa,[Up]).reduce(function(e,t){return e.concat([t,t+"-"+Ro,t+"-"+Pa])},[]),c2="beforeRead",f2="read",d2="afterRead",p2="beforeMain",h2="main",m2="afterMain",v2="beforeWrite",g2="write",y2="afterWrite",w2=[c2,f2,d2,p2,h2,m2,v2,g2,y2];function gn(e){return e?(e.nodeName||"").toLowerCase():null}function nn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function Lo(e){var t=nn(e).Element;return e instanceof t||e instanceof Element}function Ut(e){var t=nn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function R1(e){if(typeof ShadowRoot=="undefined")return!1;var t=nn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function S2(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},o=t.attributes[n]||{},i=t.elements[n];!Ut(i)||!gn(i)||(Object.assign(i.style,r),Object.keys(o).forEach(function(a){var s=o[a];s===!1?i.removeAttribute(a):i.setAttribute(a,s===!0?"":s)}))})}function b2(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var o=t.elements[r],i=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),s=a.reduce(function(l,u){return l[u]="",l},{});!Ut(o)||!gn(o)||(Object.assign(o.style,s),Object.keys(i).forEach(function(l){o.removeAttribute(l)}))})}}const E2={name:"applyStyles",enabled:!0,phase:"write",fn:S2,effect:b2,requires:["computeStyles"]};function hn(e){return e.split("-")[0]}var Nr=Math.max,Rl=Math.min,Mo=Math.round;function Fo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,o=1;if(Ut(e)&&t){var i=e.offsetHeight,a=e.offsetWidth;a>0&&(r=Mo(n.width)/a||1),i>0&&(o=Mo(n.height)/i||1)}return{width:n.width/r,height:n.height/o,top:n.top/o,right:n.right/r,bottom:n.bottom/o,left:n.left/r,x:n.left/r,y:n.top/o}}function Bp(e){var t=Fo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function L1(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&R1(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function Nn(e){return nn(e).getComputedStyle(e)}function C2(e){return["table","td","th"].indexOf(gn(e))>=0}function gr(e){return((Lo(e)?e.ownerDocument:e.document)||window.document).documentElement}function _u(e){return gn(e)==="html"?e:e.assignedSlot||e.parentNode||(R1(e)?e.host:null)||gr(e)}function _v(e){return!Ut(e)||Nn(e).position==="fixed"?null:e.offsetParent}function A2(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&Ut(e)){var r=Nn(e);if(r.position==="fixed")return null}for(var o=_u(e);Ut(o)&&["html","body"].indexOf(gn(o))<0;){var i=Nn(o);if(i.transform!=="none"||i.perspective!=="none"||i.contain==="paint"||["transform","perspective"].indexOf(i.willChange)!==-1||t&&i.willChange==="filter"||t&&i.filter&&i.filter!=="none")return o;o=o.parentNode}return null}function Za(e){for(var t=nn(e),n=_v(e);n&&C2(n)&&Nn(n).position==="static";)n=_v(n);return n&&(gn(n)==="html"||gn(n)==="body"&&Nn(n).position==="static")?t:n||A2(e)||t}function jp(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function qi(e,t,n){return Nr(e,Rl(t,n))}function x2(e,t,n){var r=qi(e,t,n);return r>n?n:r}function M1(){return{top:0,right:0,bottom:0,left:0}}function F1(e){return Object.assign({},M1(),e)}function U1(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var O2=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,F1(typeof t!="number"?t:U1(t,qa))};function _2(e){var t,n=e.state,r=e.name,o=e.options,i=n.elements.arrow,a=n.modifiersData.popperOffsets,s=hn(n.placement),l=jp(s),u=[bt,Yt].indexOf(s)>=0,c=u?"height":"width";if(!(!i||!a)){var f=O2(o.padding,n),d=Bp(i),p=l==="y"?St:bt,m=l==="y"?Wt:Yt,y=n.rects.reference[c]+n.rects.reference[l]-a[l]-n.rects.popper[c],h=a[l]-n.rects.reference[l],v=Za(i),w=v?l==="y"?v.clientHeight||0:v.clientWidth||0:0,S=y/2-h/2,A=f[p],T=w-d[c]-f[m],C=w/2-d[c]/2+S,O=qi(A,C,T),b=l;n.modifiersData[r]=(t={},t[b]=O,t.centerOffset=O-C,t)}}function P2(e){var t=e.state,n=e.options,r=n.element,o=r===void 0?"[data-popper-arrow]":r;o!=null&&(typeof o=="string"&&(o=t.elements.popper.querySelector(o),!o)||!L1(t.elements.popper,o)||(t.elements.arrow=o))}const k2={name:"arrow",enabled:!0,phase:"main",fn:_2,effect:P2,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Uo(e){return e.split("-")[1]}var T2={top:"auto",right:"auto",bottom:"auto",left:"auto"};function I2(e){var t=e.x,n=e.y,r=window,o=r.devicePixelRatio||1;return{x:Mo(t*o)/o||0,y:Mo(n*o)/o||0}}function Pv(e){var t,n=e.popper,r=e.popperRect,o=e.placement,i=e.variation,a=e.offsets,s=e.position,l=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,m=a.y,y=m===void 0?0:m,h=typeof c=="function"?c({x:p,y}):{x:p,y};p=h.x,y=h.y;var v=a.hasOwnProperty("x"),w=a.hasOwnProperty("y"),S=bt,A=St,T=window;if(u){var C=Za(n),O="clientHeight",b="clientWidth";if(C===nn(n)&&(C=gr(n),Nn(C).position!=="static"&&s==="absolute"&&(O="scrollHeight",b="scrollWidth")),C=C,o===St||(o===bt||o===Yt)&&i===Pa){A=Wt;var E=f&&T.visualViewport?T.visualViewport.height:C[O];y-=E-r.height,y*=l?1:-1}if(o===bt||(o===St||o===Wt)&&i===Pa){S=Yt;var x=f&&T.visualViewport?T.visualViewport.width:C[b];p-=x-r.width,p*=l?1:-1}}var _=Object.assign({position:s},u&&T2),k=c===!0?I2({x:p,y}):{x:p,y};if(p=k.x,y=k.y,l){var D;return Object.assign({},_,(D={},D[A]=w?"0":"",D[S]=v?"0":"",D.transform=(T.devicePixelRatio||1)<=1?"translate("+p+"px, "+y+"px)":"translate3d("+p+"px, "+y+"px, 0)",D))}return Object.assign({},_,(t={},t[A]=w?y+"px":"",t[S]=v?p+"px":"",t.transform="",t))}function N2(e){var t=e.state,n=e.options,r=n.gpuAcceleration,o=r===void 0?!0:r,i=n.adaptive,a=i===void 0?!0:i,s=n.roundOffsets,l=s===void 0?!0:s,u={placement:hn(t.placement),variation:Uo(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:o,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,Pv(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:l})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,Pv(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:l})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const D2={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:N2,data:{}};var As={passive:!0};function R2(e){var t=e.state,n=e.instance,r=e.options,o=r.scroll,i=o===void 0?!0:o,a=r.resize,s=a===void 0?!0:a,l=nn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return i&&u.forEach(function(c){c.addEventListener("scroll",n.update,As)}),s&&l.addEventListener("resize",n.update,As),function(){i&&u.forEach(function(c){c.removeEventListener("scroll",n.update,As)}),s&&l.removeEventListener("resize",n.update,As)}}const L2={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:R2,data:{}};var M2={left:"right",right:"left",bottom:"top",top:"bottom"};function Hs(e){return e.replace(/left|right|bottom|top/g,function(t){return M2[t]})}var F2={start:"end",end:"start"};function kv(e){return e.replace(/start|end/g,function(t){return F2[t]})}function Wp(e){var t=nn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Yp(e){return Fo(gr(e)).left+Wp(e).scrollLeft}function U2(e){var t=nn(e),n=gr(e),r=t.visualViewport,o=n.clientWidth,i=n.clientHeight,a=0,s=0;return r&&(o=r.width,i=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,s=r.offsetTop)),{width:o,height:i,x:a+Yp(e),y:s}}function B2(e){var t,n=gr(e),r=Wp(e),o=(t=e.ownerDocument)==null?void 0:t.body,i=Nr(n.scrollWidth,n.clientWidth,o?o.scrollWidth:0,o?o.clientWidth:0),a=Nr(n.scrollHeight,n.clientHeight,o?o.scrollHeight:0,o?o.clientHeight:0),s=-r.scrollLeft+Yp(e),l=-r.scrollTop;return Nn(o||n).direction==="rtl"&&(s+=Nr(n.clientWidth,o?o.clientWidth:0)-i),{width:i,height:a,x:s,y:l}}function zp(e){var t=Nn(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+o+r)}function B1(e){return["html","body","#document"].indexOf(gn(e))>=0?e.ownerDocument.body:Ut(e)&&zp(e)?e:B1(_u(e))}function Zi(e,t){var n;t===void 0&&(t=[]);var r=B1(e),o=r===((n=e.ownerDocument)==null?void 0:n.body),i=nn(r),a=o?[i].concat(i.visualViewport||[],zp(r)?r:[]):r,s=t.concat(a);return o?s:s.concat(Zi(_u(a)))}function Vf(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function j2(e){var t=Fo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function Tv(e,t){return t===N1?Vf(U2(e)):Lo(t)?j2(t):Vf(B2(gr(e)))}function W2(e){var t=Zi(_u(e)),n=["absolute","fixed"].indexOf(Nn(e).position)>=0,r=n&&Ut(e)?Za(e):e;return Lo(r)?t.filter(function(o){return Lo(o)&&L1(o,r)&&gn(o)!=="body"}):[]}function Y2(e,t,n){var r=t==="clippingParents"?W2(e):[].concat(t),o=[].concat(r,[n]),i=o[0],a=o.reduce(function(s,l){var u=Tv(e,l);return s.top=Nr(u.top,s.top),s.right=Rl(u.right,s.right),s.bottom=Rl(u.bottom,s.bottom),s.left=Nr(u.left,s.left),s},Tv(e,i));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function j1(e){var t=e.reference,n=e.element,r=e.placement,o=r?hn(r):null,i=r?Uo(r):null,a=t.x+t.width/2-n.width/2,s=t.y+t.height/2-n.height/2,l;switch(o){case St:l={x:a,y:t.y-n.height};break;case Wt:l={x:a,y:t.y+t.height};break;case Yt:l={x:t.x+t.width,y:s};break;case bt:l={x:t.x-n.width,y:s};break;default:l={x:t.x,y:t.y}}var u=o?jp(o):null;if(u!=null){var c=u==="y"?"height":"width";switch(i){case Ro:l[u]=l[u]-(t[c]/2-n[c]/2);break;case Pa:l[u]=l[u]+(t[c]/2-n[c]/2);break}}return l}function ka(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=r===void 0?e.placement:r,i=n.boundary,a=i===void 0?l2:i,s=n.rootBoundary,l=s===void 0?N1:s,u=n.elementContext,c=u===void 0?vi:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,m=p===void 0?0:p,y=F1(typeof m!="number"?m:U1(m,qa)),h=c===vi?u2:vi,v=e.rects.popper,w=e.elements[d?h:c],S=Y2(Lo(w)?w:w.contextElement||gr(e.elements.popper),a,l),A=Fo(e.elements.reference),T=j1({reference:A,element:v,strategy:"absolute",placement:o}),C=Vf(Object.assign({},v,T)),O=c===vi?C:A,b={top:S.top-O.top+y.top,bottom:O.bottom-S.bottom+y.bottom,left:S.left-O.left+y.left,right:O.right-S.right+y.right},E=e.modifiersData.offset;if(c===vi&&E){var x=E[o];Object.keys(b).forEach(function(_){var k=[Yt,Wt].indexOf(_)>=0?1:-1,D=[St,Wt].indexOf(_)>=0?"y":"x";b[_]+=x[D]*k})}return b}function z2(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=n.boundary,i=n.rootBoundary,a=n.padding,s=n.flipVariations,l=n.allowedAutoPlacements,u=l===void 0?D1:l,c=Uo(r),f=c?s?Ov:Ov.filter(function(m){return Uo(m)===c}):qa,d=f.filter(function(m){return u.indexOf(m)>=0});d.length===0&&(d=f);var p=d.reduce(function(m,y){return m[y]=ka(e,{placement:y,boundary:o,rootBoundary:i,padding:a})[hn(y)],m},{});return Object.keys(p).sort(function(m,y){return p[m]-p[y]})}function G2(e){if(hn(e)===Up)return[];var t=Hs(e);return[kv(e),t,kv(t)]}function $2(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!0:a,l=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,m=p===void 0?!0:p,y=n.allowedAutoPlacements,h=t.options.placement,v=hn(h),w=v===h,S=l||(w||!m?[Hs(h)]:G2(h)),A=[h].concat(S).reduce(function(le,ue){return le.concat(hn(ue)===Up?z2(t,{placement:ue,boundary:c,rootBoundary:f,padding:u,flipVariations:m,allowedAutoPlacements:y}):ue)},[]),T=t.rects.reference,C=t.rects.popper,O=new Map,b=!0,E=A[0],x=0;x=0,q=B?"width":"height",H=ka(t,{placement:_,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),ce=B?D?Yt:bt:D?Wt:St;T[q]>C[q]&&(ce=Hs(ce));var he=Hs(ce),ye=[];if(i&&ye.push(H[k]<=0),s&&ye.push(H[ce]<=0,H[he]<=0),ye.every(function(le){return le})){E=_,b=!1;break}O.set(_,ye)}if(b)for(var ne=m?3:1,R=function(ue){var ze=A.find(function(Fe){var Ue=O.get(Fe);if(Ue)return Ue.slice(0,ue).every(function(rt){return rt})});if(ze)return E=ze,"break"},Y=ne;Y>0;Y--){var V=R(Y);if(V==="break")break}t.placement!==E&&(t.modifiersData[r]._skip=!0,t.placement=E,t.reset=!0)}}const H2={name:"flip",enabled:!0,phase:"main",fn:$2,requiresIfExists:["offset"],data:{_skip:!1}};function Iv(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function Nv(e){return[St,Yt,Wt,bt].some(function(t){return e[t]>=0})}function V2(e){var t=e.state,n=e.name,r=t.rects.reference,o=t.rects.popper,i=t.modifiersData.preventOverflow,a=ka(t,{elementContext:"reference"}),s=ka(t,{altBoundary:!0}),l=Iv(a,r),u=Iv(s,o,i),c=Nv(l),f=Nv(u);t.modifiersData[n]={referenceClippingOffsets:l,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const J2={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:V2};function Q2(e,t,n){var r=hn(e),o=[bt,St].indexOf(r)>=0?-1:1,i=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=i[0],s=i[1];return a=a||0,s=(s||0)*o,[bt,Yt].indexOf(r)>=0?{x:s,y:a}:{x:a,y:s}}function X2(e){var t=e.state,n=e.options,r=e.name,o=n.offset,i=o===void 0?[0,0]:o,a=D1.reduce(function(c,f){return c[f]=Q2(f,t.rects,i),c},{}),s=a[t.placement],l=s.x,u=s.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=l,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const K2={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:X2};function q2(e){var t=e.state,n=e.name;t.modifiersData[n]=j1({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const Z2={name:"popperOffsets",enabled:!0,phase:"read",fn:q2,data:{}};function eO(e){return e==="x"?"y":"x"}function tO(e){var t=e.state,n=e.options,r=e.name,o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!1:a,l=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,m=n.tetherOffset,y=m===void 0?0:m,h=ka(t,{boundary:l,rootBoundary:u,padding:f,altBoundary:c}),v=hn(t.placement),w=Uo(t.placement),S=!w,A=jp(v),T=eO(A),C=t.modifiersData.popperOffsets,O=t.rects.reference,b=t.rects.popper,E=typeof y=="function"?y(Object.assign({},t.rects,{placement:t.placement})):y,x=typeof E=="number"?{mainAxis:E,altAxis:E}:Object.assign({mainAxis:0,altAxis:0},E),_=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,k={x:0,y:0};if(!!C){if(i){var D,B=A==="y"?St:bt,q=A==="y"?Wt:Yt,H=A==="y"?"height":"width",ce=C[A],he=ce+h[B],ye=ce-h[q],ne=p?-b[H]/2:0,R=w===Ro?O[H]:b[H],Y=w===Ro?-b[H]:-O[H],V=t.elements.arrow,le=p&&V?Bp(V):{width:0,height:0},ue=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:M1(),ze=ue[B],Fe=ue[q],Ue=qi(0,O[H],le[H]),rt=S?O[H]/2-ne-Ue-ze-x.mainAxis:R-Ue-ze-x.mainAxis,us=S?-O[H]/2+ne+Ue+Fe+x.mainAxis:Y+Ue+Fe+x.mainAxis,zu=t.elements.arrow&&Za(t.elements.arrow),vS=zu?A==="y"?zu.clientTop||0:zu.clientLeft||0:0,ch=(D=_==null?void 0:_[A])!=null?D:0,gS=ce+rt-ch-vS,yS=ce+us-ch,fh=qi(p?Rl(he,gS):he,ce,p?Nr(ye,yS):ye);C[A]=fh,k[A]=fh-ce}if(s){var dh,wS=A==="x"?St:bt,SS=A==="x"?Wt:Yt,yr=C[T],cs=T==="y"?"height":"width",ph=yr+h[wS],hh=yr-h[SS],Gu=[St,bt].indexOf(v)!==-1,mh=(dh=_==null?void 0:_[T])!=null?dh:0,vh=Gu?ph:yr-O[cs]-b[cs]-mh+x.altAxis,gh=Gu?yr+O[cs]+b[cs]-mh-x.altAxis:hh,yh=p&&Gu?x2(vh,yr,gh):qi(p?vh:ph,yr,p?gh:hh);C[T]=yh,k[T]=yh-yr}t.modifiersData[r]=k}}const nO={name:"preventOverflow",enabled:!0,phase:"main",fn:tO,requiresIfExists:["offset"]};function rO(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function oO(e){return e===nn(e)||!Ut(e)?Wp(e):rO(e)}function iO(e){var t=e.getBoundingClientRect(),n=Mo(t.width)/e.offsetWidth||1,r=Mo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function aO(e,t,n){n===void 0&&(n=!1);var r=Ut(t),o=Ut(t)&&iO(t),i=gr(t),a=Fo(e,o),s={scrollLeft:0,scrollTop:0},l={x:0,y:0};return(r||!r&&!n)&&((gn(t)!=="body"||zp(i))&&(s=oO(t)),Ut(t)?(l=Fo(t,!0),l.x+=t.clientLeft,l.y+=t.clientTop):i&&(l.x=Yp(i))),{x:a.left+s.scrollLeft-l.x,y:a.top+s.scrollTop-l.y,width:a.width,height:a.height}}function sO(e){var t=new Map,n=new Set,r=[];e.forEach(function(i){t.set(i.name,i)});function o(i){n.add(i.name);var a=[].concat(i.requires||[],i.requiresIfExists||[]);a.forEach(function(s){if(!n.has(s)){var l=t.get(s);l&&o(l)}}),r.push(i)}return e.forEach(function(i){n.has(i.name)||o(i)}),r}function lO(e){var t=sO(e);return w2.reduce(function(n,r){return n.concat(t.filter(function(o){return o.phase===r}))},[])}function uO(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function cO(e){var t=e.reduce(function(n,r){var o=n[r.name];return n[r.name]=o?Object.assign({},o,r,{options:Object.assign({},o.options,r.options),data:Object.assign({},o.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var Dv={placement:"bottom",modifiers:[],strategy:"absolute"};function Rv(){for(var e=arguments.length,t=new Array(e),n=0;n{var l=s,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:o,openDelayMs:i=0}=l,a=$t(l,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);const[u,c]=I.useState(null),[f,d]=I.useState(null),[p,m]=I.useState(null),{styles:y,attributes:h,update:v}=SO(u,f,{placement:t,modifiers:[{name:"arrow",options:{element:p}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),w=I.useMemo(()=>$(F({},y.popper),{backgroundColor:o}),[o,y.popper]),S=I.useMemo(()=>{let T;function C(){T=setTimeout(()=>{v==null||v(),f==null||f.setAttribute("data-show","")},i)}function O(){clearTimeout(T),f==null||f.removeAttribute("data-show")}return{[n==="hover"?"onMouseEnter":"onClick"]:()=>C(),onMouseLeave:()=>O()}},[i,f,n,v]),A=typeof r=="string";return N(Me,{children:[g("button",$(F(F({},a),S),{ref:c,children:e})),N("div",$(F({ref:d,className:xc.popover,style:w},h.popper),{children:[A?g("div",{className:xc.textContent,children:r}):r,g("div",{ref:m,className:xc.popperArrow,style:y.arrow})]}))]})},AO="_infoIcon_15ri6_1",xO="_container_15ri6_10",OO="_header_15ri6_15",_O="_info_15ri6_1",PO="_unit_15ri6_27",kO="_description_15ri6_31",to={infoIcon:AO,container:xO,header:OO,info:_O,unit:PO,description:kO},W1=({units:e})=>g(Gp,{className:to.infoIcon,popoverContent:g(TO,{units:e}),openDelayMs:500,placement:"auto",children:g(OA,{})});function TO({units:e}){return N("div",{className:to.container,children:[g("div",{className:to.header,children:"CSS size options"}),g("div",{className:to.info,children:e.map(t=>N(I.Fragment,{children:[g("div",{className:to.unit,children:t}),g("div",{className:to.description,children:IO[t]})]},t))})]})}const IO={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},NO="_wrapper_13r28_1",DO="_unitSelector_13r28_10",Ll={wrapper:NO,unitSelector:DO};function RO(e){const[t,n]=j.exports.useState(T1(e)),r=j.exports.useCallback(i=>{if(i===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:i})},[t.unit]),o=j.exports.useCallback(i=>{n(a=>{const s=a.unit;return i==="auto"?{unit:i,count:null}:s==="auto"?{unit:i,count:Y1[i]}:{unit:i,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:o}}const Y1={fr:1,px:10,rem:1,"%":100};function LO({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:o,updateCount:i,updateUnit:a}=RO(e!=null?e:"auto"),s=I.useMemo(()=>Fp(u=>{t(u)},500),[t]);if(I.useEffect(()=>{const u=Wn(o);if(e!==u)return s(Wn(o)),()=>s.cancel()},[o,s,e]),e===void 0&&!r)return null;const l=r||o.count===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(Wn(o))},children:[g(Mp,{ariaLabel:"value-count",value:l?void 0:o.count,disabled:l,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>g("option",{value:u,children:u},u))}),g(W1,{units:n})]})}function yn(s){var l=s,{name:e,label:t,onChange:n,optional:r,value:o,defaultValue:i="10px"}=l,a=$t(l,["name","label","onChange","optional","value","defaultValue"]);const u=$r(n),c=o===void 0;return g(Lp,{name:e,label:t,optional:r,isDisabled:c,defaultValue:i,width_setting:"fit",mainInput:g(LO,$(F({value:o!=null?o:i},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function MO({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:o}=T1(e),i=I.useCallback(l=>{if(l===void 0){if(o!=="auto")throw new Error("Undefined count with auto units");t(Wn({unit:o,count:null}));return}if(o==="auto"){console.error("How did you change the count of an auto unit?");return}t(Wn({unit:o,count:l}))},[t,o]),a=I.useCallback(l=>{if(l==="auto"){t(Wn({unit:l,count:null}));return}if(o==="auto"){t(Wn({unit:l,count:Y1[l]}));return}t(Wn({unit:l,count:r}))},[r,t,o]),s=r===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",children:[g(Mp,{ariaLabel:"value-count",value:s?void 0:r,disabled:s,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o,onChange:l=>a(l.target.value),children:n.map(l=>g("option",{value:l,children:l},l))}),g(W1,{units:n})]})}const FO="_tractInfoDisplay_9993b_1",UO="_sizeWidget_9993b_61",BO="_hoverListener_9993b_88",jO="_buttons_9993b_108",WO="_tractAddButton_9993b_121",YO="_deleteButton_9993b_122",co={tractInfoDisplay:FO,sizeWidget:UO,hoverListener:BO,buttons:jO,tractAddButton:WO,deleteButton:YO},zO=["fr","px"];function GO({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:o}){const i=j.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=j.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),s=j.exports.useCallback(()=>a(t),[a,t]),l=j.exports.useCallback(()=>a(t+1),[a,t]),u=j.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return N("div",{className:co.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[g("div",{className:co.hoverListener}),N("div",{className:co.sizeWidget,onClick:HO,children:[N("div",{className:co.buttons,children:[g(Lv,{dir:e,onClick:s}),g($O,{onClick:u,deletionConflicts:o}),g(Lv,{dir:e,onClick:l})]}),g(MO,{value:n,units:zO,onChange:i})]})]})}const z1=200;function $O({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return g(Gp,{className:co.deleteButton,onClick:G1(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:z1,children:g(Sp,{})})}function Lv({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return g(Gp,{className:co.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:G1(t),openDelayMs:z1,children:g(C1,{})})}function G1(e){return function(t){t.currentTarget.blur(),e==null||e()}}function Mv({dir:e,sizes:t,areas:n,onUpdate:r}){const o=j.exports.useCallback(({dir:i,index:a})=>k1(n,{dir:i,index:a+1}),[n]);return g(Me,{children:t.map((i,a)=>g(GO,{index:a,dir:e,size:i,onUpdate:r,deletionConflicts:o({dir:e,index:a})},e+a))})}function HO(e){e.stopPropagation()}const VO="_columnSizer_3i83d_1",JO="_rowSizer_3i83d_2",Fv={columnSizer:VO,rowSizer:JO};function Uv({dir:e,index:t,onStartDrag:n}){return g("div",{className:e==="rows"?Fv.rowSizer:Fv.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function QO(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const Ml=40,XO=.15,$1=e=>t=>Math.round(t/e)*e,KO=5,$p=$1(KO),qO=.01,ZO=$1(qO),Bv=e=>Number(e.toFixed(4));function e3(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const o=ZO(e*t),i=n.count+o,a=r.count-o;return(o<0?i/a:a/i)=i.length?null:i[u];if(c==="auto"||f==="auto"){const m=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=m[l],i[l]=c),f==="auto"&&(f=m[u],i[u]=f),r.style[o]=m.join(" ")}const d=o3(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=$(F({dir:t,mouseStart:V1(e,t),originalSizes:i,currentSizes:[...i],beforeIndex:l,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=i3({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function s3({mousePosition:e,drag:t,container:n}){const o=V1(e,t.dir)-t.mouseStart,i=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=n3(o,t);break;case"after-pixel":a=r3(o,t);break;case"both-pixel":a=t3(o,t);break;case"both-relative":a=e3(o,t);break}a!=="no-change"&&(a.beforeSize&&(i[t.beforeIndex]=a.beforeSize),a.afterSize&&(i[t.afterIndex]=a.afterSize),t.currentSizes=i,t.dir==="cols"?n.style.gridTemplateColumns=i.join(" "):n.style.gridTemplateRows=i.join(" "))}function l3(e){return e.match(/[0-9|.]+px/)!==null}function H1(e){return e.match(/[0-9|.]+fr/)!==null}function Fl(e){if(H1(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(l3(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function V1(e,t){return t==="rows"?e.clientY:e.clientX}function u3(e){return e.some(t=>H1(t))}function c3(e){return e.some(t=>t==="auto")}function jv(e,t){const n=Math.abs(t-e)+1,r=ee+i*r)}function f3({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(o=>`"${o.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function Wv(e){return e.split(" ")}function d3(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function p3(e){const t=Wv(e.style.gridTemplateRows),n=Wv(e.style.gridTemplateColumns),r=d3(e.style.gridTemplateAreas),o=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:o}}function h3({containerRef:e,onDragEnd:t}){return I.useCallback(({e:r,dir:o,index:i})=>{const a=QO(e,"How are you dragging on an element without a container?");r.preventDefault();const s=a3({mousePosition:r,dir:o,index:i,container:a}),{beforeIndex:l,afterIndex:u}=s,c=Yv(a,{dir:o,index:l,size:s.currentSizes[l]}),f=Yv(a,{dir:o,index:u,size:s.currentSizes[u]});m3(a,s.dir,{move:d=>{s3({mousePosition:d,drag:s,container:a}),c.update(s.currentSizes[l]),f.update(s.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(p3(a))}})},[e,t])}function Yv(e,{dir:t,index:n,size:r}){const o=document.createElement("div"),i=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(o.style,i,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,o.appendChild(a),e.appendChild(o),{remove:()=>o.remove(),update:s=>{a.innerHTML=s}}}function m3(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const o=()=>{i(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",o),r.addEventListener("mouseleave",o);function i(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",o),r.removeEventListener("mouseleave",o),r.remove()}}const v3="1fr";function g3(o){var i=o,{className:e,children:t,onNewLayout:n}=i,r=$t(i,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:s}=r,l=j.exports.useRef(null),u=f3(r),c=jv(2,s.length),f=jv(2,a.length),d=h3({containerRef:l,onDragEnd:n}),p=[Zx.ResizableGrid];e&&p.push(e);const m=j.exports.useCallback(h=>{switch(h.type){case"ADD":return _1(r,{afterIndex:h.index,dir:h.dir,size:v3});case"RESIZE":return y3(r,h);case"DELETE":return P1(r,h)}},[r]),y=j.exports.useCallback(h=>n(m(h)),[m,n]);return N("div",{className:p.join(" "),ref:l,style:u,children:[c.map(h=>g(Uv,{dir:"cols",index:h,onStartDrag:d},"cols"+h)),f.map(h=>g(Uv,{dir:"rows",index:h,onStartDrag:d},"rows"+h)),t,g(Mv,{dir:"cols",sizes:s,areas:r.areas,onUpdate:y}),g(Mv,{dir:"rows",sizes:a,areas:r.areas,onUpdate:y})]})}function y3(e,{dir:t,index:n,size:r}){return ei(e,o=>{o[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function w3(e,r){var o=r,{name:t}=o,n=$t(o,["name"]);const{rowStart:i,colStart:a}=n,s="rowEnd"in n?n.rowEnd:i+n.rowSpan-1,l="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Ou(e.areas);for(let c=0;c=i-1&&c=a-1&&d{for(let o of n)S3(r,o)})}function b3(e,t){return J1(e,t)}function E3(e,t,n){return ei(e,({areas:r})=>{const{numRows:o,numCols:i}=Ka(r);for(let a=0;a{const i=n==="rows"?"row_sizes":"col_sizes";o[i][t-1]=r})}function A3(e,{item_a:t,item_b:n}){return t===n?e:ei(e,r=>{const{n_rows:o,n_cols:i}=x3(r.areas);let a=!1,s=!1;for(let l=0;l{a.current&&r&&setTimeout(()=>{var s;return(s=a==null?void 0:a.current)==null?void 0:s.focus()},1)},[r]),g("input",{ref:a,className:k3.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:i,onChange:s=>n(s.target.value),disabled:o})}function pe({name:e,label:t,value:n,placeholder:r,onChange:o,autoFocus:i=!1,optional:a=!1,defaultValue:s="my-text"}){const l=$r(o),u=n===void 0,c=I.useRef(null);return I.useEffect(()=>{c.current&&i&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[i]),g(Lp,{name:e,label:t,optional:a,isDisabled:u,defaultValue:s,width_setting:"full",mainInput:g(T3,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>l({name:e,value:f}),autoFocus:i,disabled:u})})}const I3="_container_1ehu8_1",N3="_elementsPanel_1ehu8_28",D3="_propertiesPanel_1ehu8_33",R3="_editorHolder_1ehu8_47",L3="_titledPanel_1ehu8_59",M3="_panelTitleHeader_1ehu8_71",F3="_header_1ehu8_80",U3="_rightSide_1ehu8_88",B3="_divider_1ehu8_109",j3="_title_1ehu8_59",W3="_shinyLogo_1ehu8_120",Q1={container:I3,elementsPanel:N3,propertiesPanel:D3,editorHolder:R3,titledPanel:L3,panelTitleHeader:M3,header:F3,rightSide:U3,divider:B3,title:j3,shinyLogo:W3},Y3="_portalHolder_18ua3_1",z3="_portalModal_18ua3_11",G3="_title_18ua3_21",$3="_body_18ua3_25",H3="_portalForm_18ua3_30",V3="_portalFormInputs_18ua3_35",J3="_portalFormFooter_18ua3_42",Q3="_validationMsg_18ua3_48",X3="_infoText_18ua3_53",xs={portalHolder:Y3,portalModal:z3,title:G3,body:$3,portalForm:H3,portalFormInputs:V3,portalFormFooter:J3,validationMsg:Q3,infoText:X3},K3=({children:e,el:t="div"})=>{const[n]=j.exports.useState(document.createElement(t));return j.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Na.exports.createPortal(e,n)},X1=({children:e,title:t,label:n,onConfirm:r,onCancel:o})=>g(K3,{children:g("div",{className:xs.portalHolder,onClick:()=>o(),onKeyDown:i=>{i.key==="Escape"&&o()},children:N("div",{className:xs.portalModal,onClick:i=>i.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?g("div",{className:xs.title+" "+Q1.panelTitleHeader,children:t}):null,g("div",{className:xs.body,children:e})]})})}),q3="_portalHolder_18ua3_1",Z3="_portalModal_18ua3_11",e_="_title_18ua3_21",t_="_body_18ua3_25",n_="_portalForm_18ua3_30",r_="_portalFormInputs_18ua3_35",o_="_portalFormFooter_18ua3_42",i_="_validationMsg_18ua3_48",a_="_infoText_18ua3_53",gi={portalHolder:q3,portalModal:Z3,title:e_,body:t_,portalForm:n_,portalFormInputs:r_,portalFormFooter:o_,validationMsg:i_,infoText:a_};function s_({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[o,i]=I.useState(r),[a,s]=I.useState(null),l=I.useCallback(c=>{c&&c.preventDefault();const f=l_({name:o,existingAreaNames:n});if(f){s(f);return}t(o)},[n,o,t]),u=I.useCallback(({value:c})=>{s(null),i(c!=null?c:r)},[r]);return N(X1,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(o),onCancel:e,children:[g("form",{className:gi.portalForm,onSubmit:l,children:N("div",{className:gi.portalFormInputs,children:[g("span",{className:gi.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),g(pe,{label:"Name of new grid area",name:"New-Item-Name",value:o,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?g("div",{className:gi.validationMsg,children:a}):null]})}),N("div",{className:gi.portalFormFooter,children:[g(wt,{variant:"delete",onClick:e,children:"Cancel"}),g(wt,{onClick:()=>l(),children:"Done"})]})]})}function l_({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const u_="_container_1hvsg_1",c_={container:u_},K1=I.createContext(null),f_=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:o,compRef:i})=>{const a=vr(),s=Ew(),{onClick:l}=r,{uniqueAreas:u}=Qx(e),T=e,{areas:c}=T,f=$t(T,["areas"]),d=C=>{a(Sw({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:F(F({},f),C)}}))},p=I.useMemo(()=>Rp(c),[c]),[m,y]=I.useState(null),h=C=>{const{node:O,currentPath:b,pos:E}=C,x=b!==void 0,_=$f.includes(O.uiName);if(x&&_&&"area"in O.uiArguments&&O.uiArguments.area){const k=O.uiArguments.area;v({type:"MOVE_ITEM",name:k,pos:E});return}y(C)},v=C=>{d(Hp(e,C))},w=u.map(C=>g(zx,{area:C,areas:c,gridLocation:p.get(C),onNewPos:O=>v({type:"MOVE_ITEM",name:C,pos:O})},C)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},A=(C,{node:O,currentPath:b,pos:E})=>{if($f.includes(O.uiName)){const x=$(F({},O.uiArguments),{area:C});O.uiArguments=x}else O={uiName:"gridlayout::grid_card",uiArguments:{area:C},uiChildren:[O]};s({parentPath:[],node:O,currentPath:b}),v({type:"ADD_ITEM",name:C,pos:E}),y(null)};return N(K1.Provider,{value:v,children:[g("div",{ref:i,style:S,className:c_.container,onClick:l,draggable:!1,onDragStart:()=>{},children:N(g3,$(F({},e),{onNewLayout:d,children:[Jx(c).map(({row:C,col:O})=>g(Hx,{gridRow:C,gridColumn:O,onDroppedNode:h},Mx({row:C,col:O}))),t==null?void 0:t.map((C,O)=>g(Ep,F({path:[...o.path,O]},C),o.path.join(".")+O)),n,w]}))}),m?g(s_,{info:m,onCancel:()=>y(null),onDone:C=>A(C,m),existingAreaNames:u}):null]})};function d_(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function p_(){return I.useContext(K1)}function Vp({containerRef:e,path:t,area:n}){const r=p_(),o=I.useCallback(({node:a,currentPath:s})=>s===void 0||!$f.includes(a.uiName)?!1:Np(s,t),[t]),i=I.useCallback(a=>{var l;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const s=(l=a.node.uiArguments.area)!=null?l:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:s})},[n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i,canAcceptDropClass:xt.availableToSwap,hoveringOverClass:xt.hoveringOverSwap})}const h_=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:o},children:i,eventHandlers:a,compRef:s})=>{const l=r.length>0;return Vp({containerRef:s,area:e,path:o}),N(Cp,{className:xt.container+" "+(n?xt.withTitle:""),ref:s,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?g(WA,{className:xt.panelTitle,children:n}):null,N("div",{className:xt.contentHolder,"data-alignment":"top",children:[g(zv,{index:0,parentPath:o,numChildren:r.length}),l?r==null?void 0:r.map((u,c)=>N(I.Fragment,{children:[g(Ep,F({path:[...o,c]},u)),g(zv,{index:c+1,numChildren:r.length,parentPath:o})]},o.join(".")+c)):g(v_,{path:o})]}),i]})};function zv({index:e,numChildren:t,parentPath:n}){const r=I.useRef(null);Ax({watcherRef:r,positionInChildren:e,parentPath:n});const o=m_(e,t);return g("div",{ref:r,className:xt.dropWatcher+" "+o,"aria-label":"drop watcher"})}function m_(e,t){return e===0&&t===0?xt.onlyDropWatcher:e===0?xt.firstDropWatcher:e===t?xt.lastDropWatcher:xt.middleDropWatcher}function v_({path:e}){return N("div",{className:xt.emptyGridCard,children:[g("span",{className:xt.emptyMessage,children:"Empty grid card"}),g(m1,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const g_=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e.area}),g(pe,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),g(yn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},y_={area:"default-area",item_gap:"12px"},w_={title:"Grid Card",UiComponent:h_,SettingsComponent:g_,acceptsChildren:!0,defaultSettings:y_,iconSrc:dA,category:"gridlayout"},q1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function S_(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const Z1=({type:e,name:t,className:n})=>N("code",{className:n,children:[N("span",{style:{opacity:.55},children:[e,"$"]}),g("span",{children:t})]}),b_="_container_1rlbk_1",E_="_plotPlaceholder_1rlbk_5",C_="_label_1rlbk_19",Jf={container:b_,plotPlaceholder:E_,label:C_};function ew({outputId:e}){const t=j.exports.useRef(null),n=A_(t),r=n===null?100:Math.min(n.width,n.height);return N("div",{ref:t,className:Jf.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[g(Z1,{className:Jf.label,type:"output",name:e}),g(S_,{size:`calc(${r}px - 80px)`})]})}function A_(e){const[t,n]=j.exports.useState(null);return j.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(o=>{if(!e.current)return;const{offsetHeight:i,offsetWidth:a}=e.current;n({width:a,height:i})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const x_="_gridCardPlot_1a94v_1",O_={gridCardPlot:x_},__=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:o,compRef:i})=>(Vp({containerRef:i,area:t,path:r}),N(Cp,$(F({ref:i,style:{gridArea:t},className:O_.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},o),{children:[g(ew,{outputId:e!=null?e:t}),n]}))),P_=({settings:{area:e,outputId:t}})=>N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e}),g(pe,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),k_={title:"Grid Plot Card",UiComponent:__,SettingsComponent:P_,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:q1,category:"gridlayout"},T_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",I_="_textPanel_525i2_1",N_={textPanel:I_},D_=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:o},eventHandlers:i,compRef:a})=>(Vp({containerRef:a,area:t,path:o}),N(Cp,$(F({ref:a,className:N_.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},i),{children:[g("h1",{children:e}),r]}))),R_="_checkboxInput_12wa8_1",L_="_checkboxLabel_12wa8_10",Gv={checkboxInput:R_,checkboxLabel:L_};function tw({name:e,label:t,value:n,onChange:r,disabled:o,noLabel:i}){const a=$r(r),s=i?void 0:t!=null?t:e,l=`${e}-checkbox-input`,u=N(Me,{children:[g("input",{className:Gv.checkboxInput,id:l,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:o,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),g("label",{className:Gv.checkboxLabel,htmlFor:l,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return s!==void 0?N("div",{className:kn.container,children:[N("label",{className:kn.label,children:[s,":"]}),u]}):u}const M_="_radioContainer_1regb_1",F_="_option_1regb_15",U_="_radioInput_1regb_22",B_="_radioLabel_1regb_26",j_="_icon_1regb_41",yi={radioContainer:M_,option:F_,radioInput:U_,radioLabel:B_,icon:j_};function W_({name:e,label:t,options:n,currentSelection:r,onChange:o,optionsPerColumn:i}){const a=Object.keys(n),s=$r(o),l=j.exports.useMemo(()=>({gridTemplateColumns:i?`repeat(${i}, 1fr)`:void 0}),[i]);return N("div",{className:kn.container,"data-full-width":"true",children:[N("label",{htmlFor:e,className:kn.label,children:[t!=null?t:e,":"]}),g("fieldset",{className:yi.radioContainer,id:e,style:l,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return N("div",{className:yi.option,children:[g("input",{className:yi.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>s({name:e,value:u}),checked:u===r}),g("label",{className:yi.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?g("img",{src:c,alt:f,className:yi.icon}):c})]},u)})})]})}const Y_={start:{icon:f1,label:"left"},center:{icon:Mf,label:"center"},end:{icon:d1,label:"right"}},z_=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),g(pe,{name:"content",label:"Panel content",value:e.content}),g(W_,{name:"alignment",label:"Text Alignment",options:Y_,currentSelection:e.alignment,optionsPerColumn:3}),g(tw,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},G_={title:"Grid Text Card",UiComponent:D_,SettingsComponent:z_,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:T_,category:"gridlayout"},$_=({settings:e})=>g(Me,{children:g(yn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function H_(e,{path:t,node:n}){var s;const r=nw({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:o}=r,i=d_(o.uiChildren)[t[0]],a=(s=n.uiArguments.area)!=null?s:vn;i!==a&&(o.uiArguments=Hp(o.uiArguments,{type:"RENAME_ITEM",oldName:i,newName:a}))}function V_(e,{path:t}){const n=nw({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:o}=n,i=o.uiArguments.area;if(!i){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Hp(r.uiArguments,{type:"REMOVE_ITEM",name:i})}function nw({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=rr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const J_={title:"Grid Page",UiComponent:f_,SettingsComponent:$_,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:H_,DELETE_NODE:V_},category:"gridlayout"},Q_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",X_=({settings:e})=>{const{inputId:t,label:n}=e;return N(Me,{children:[g(pe,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),g(pe,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},K_="_container_tyghz_1",q_={container:K_},Z_=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:o="My Action Button",width:i}=e;return N("div",$(F({className:q_.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[g(wt,{style:i?{width:i}:void 0,children:o}),t]}))},e4={title:"Action Button",UiComponent:Z_,SettingsComponent:X_,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:Q_,category:"Inputs"},t4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",n4="_categoryDivider_8d7ls_1",r4={categoryDivider:n4};function ti({category:e}){return g("div",{className:r4.categoryDivider,children:g("span",{children:e?`${e}:`:null})})}function o4(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var rw={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function $v(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function wn(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function s4(e,t){if(e==null)return{};var n=a4(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function l4(e){return u4(e)||c4(e)||f4(e)||d4()}function u4(e){if(Array.isArray(e))return Qf(e)}function c4(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function f4(e,t){if(!!e){if(typeof e=="string")return Qf(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Qf(e,t)}}function Qf(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function h4(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function Xt(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Ul(e,t):Ul(e,t))||r&&e===n)return e;if(e===n)break}while(e=h4(e))}return null}var Vv=/\s+/g;function _e(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(Vv," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(Vv," ")}}function G(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function Dr(e,t){var n="";if(typeof e=="string")n=e;else do{var r=G(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var o=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return o&&new o(n)}function sw(e,t,n){if(e){var r=e.getElementsByTagName(t),o=0,i=r.length;if(n)for(;o=i:a=o<=i,!a)return r;if(r===mn())break;r=Vn(r,!1)}return!1}function Bo(e,t,n,r){for(var o=0,i=0,a=e.children;i2&&arguments[2]!==void 0?arguments[2]:{},o=r.evt,i=s4(r,b4);ts.pluginEvent.bind(Q)(t,n,wn({dragEl:U,parentEl:ke,ghostEl:Z,rootEl:be,nextEl:xr,lastDownEl:Qs,cloneEl:Oe,cloneHidden:Yn,dragStarted:Fi,putSortable:$e,activeSortable:Q.active,originalEvent:o,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un,hideGhostForTarget:pw,unhideGhostForTarget:hw,cloneNowHidden:function(){Yn=!0},cloneNowShown:function(){Yn=!1},dispatchSortableEvent:function(s){ot({sortable:n,name:s,originalEvent:o})}},i))};function ot(e){Mi(wn({putSortable:$e,cloneEl:Oe,targetEl:U,rootEl:be,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un},e))}var U,ke,Z,be,xr,Qs,Oe,Yn,fo,At,na,Un,Os,$e,no=!1,Bl=!1,jl=[],wr,Vt,kc,Tc,Kv,qv,Fi,Kr,ra,oa=!1,_s=!1,Xs,Qe,Ic=[],Xf=!1,Wl=[],Pu=typeof document!="undefined",Ps=ow,Zv=es||Rn?"cssFloat":"float",E4=Pu&&!iw&&!ow&&"draggable"in document.createElement("div"),cw=function(){if(!!Pu){if(Rn)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),fw=function(t,n){var r=G(t),o=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),i=Bo(t,0,n),a=Bo(t,1,n),s=i&&G(i),l=a&&G(a),u=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Ae(i).width,c=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Ae(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(i&&s.float&&s.float!=="none"){var f=s.float==="left"?"left":"right";return a&&(l.clear==="both"||l.clear===f)?"vertical":"horizontal"}return i&&(s.display==="block"||s.display==="flex"||s.display==="table"||s.display==="grid"||u>=o&&r[Zv]==="none"||a&&r[Zv]==="none"&&u+c>o)?"vertical":"horizontal"},C4=function(t,n,r){var o=r?t.left:t.top,i=r?t.right:t.bottom,a=r?t.width:t.height,s=r?n.left:n.top,l=r?n.right:n.bottom,u=r?n.width:n.height;return o===s||i===l||o+a/2===s+u/2},A4=function(t,n){var r;return jl.some(function(o){var i=o[Ze].options.emptyInsertThreshold;if(!(!i||Jp(o))){var a=Ae(o),s=t>=a.left-i&&t<=a.right+i,l=n>=a.top-i&&n<=a.bottom+i;if(s&&l)return r=o}}),r},dw=function(t){function n(i,a){return function(s,l,u,c){var f=s.options.group.name&&l.options.group.name&&s.options.group.name===l.options.group.name;if(i==null&&(a||f))return!0;if(i==null||i===!1)return!1;if(a&&i==="clone")return i;if(typeof i=="function")return n(i(s,l,u,c),a)(s,l,u,c);var d=(a?s:l).options.group.name;return i===!0||typeof i=="string"&&i===d||i.join&&i.indexOf(d)>-1}}var r={},o=t.group;(!o||Js(o)!="object")&&(o={name:o}),r.name=o.name,r.checkPull=n(o.pull,!0),r.checkPut=n(o.put),r.revertClone=o.revertClone,t.group=r},pw=function(){!cw&&Z&&G(Z,"display","none")},hw=function(){!cw&&Z&&G(Z,"display","")};Pu&&!iw&&document.addEventListener("click",function(e){if(Bl)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Bl=!1,!1},!0);var Sr=function(t){if(U){t=t.touches?t.touches[0]:t;var n=A4(t.clientX,t.clientY);if(n){var r={};for(var o in t)t.hasOwnProperty(o)&&(r[o]=t[o]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[Ze]._onDragOver(r)}}},x4=function(t){U&&U.parentNode[Ze]._isOutsideThisEl(t.target)};function Q(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=zt({},t),e[Ze]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return fw(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,s){a.setData("Text",s.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:Q.supportPointer!==!1&&"PointerEvent"in window&&!ea,emptyInsertThreshold:5};ts.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);dw(t);for(var o in this)o.charAt(0)==="_"&&typeof this[o]=="function"&&(this[o]=this[o].bind(this));this.nativeDraggable=t.forceFallback?!1:E4,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ie(e,"pointerdown",this._onTapStart):(ie(e,"mousedown",this._onTapStart),ie(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ie(e,"dragover",this),ie(e,"dragenter",this)),jl.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),zt(this,y4())}Q.prototype={constructor:Q,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Kr=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,U):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,o=this.options,i=o.preventOnFilter,a=t.type,s=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,l=(s||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||l,c=o.filter;if(D4(r),!U&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||o.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&ea&&l&&l.tagName.toUpperCase()==="SELECT")&&(l=Xt(l,o.draggable,r,!1),!(l&&l.animated)&&Qs!==l)){if(fo=Te(l),na=Te(l,o.draggable),typeof c=="function"){if(c.call(this,t,l,this)){ot({sortable:n,rootEl:u,name:"filter",targetEl:l,toEl:r,fromEl:r}),ut("filter",n,{evt:t}),i&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=Xt(u,f.trim(),r,!1),f)return ot({sortable:n,rootEl:f,name:"filter",targetEl:l,fromEl:r,toEl:r}),ut("filter",n,{evt:t}),!0}),c)){i&&t.cancelable&&t.preventDefault();return}o.handle&&!Xt(u,o.handle,r,!1)||this._prepareDragStart(t,s,l)}}},_prepareDragStart:function(t,n,r){var o=this,i=o.el,a=o.options,s=i.ownerDocument,l;if(r&&!U&&r.parentNode===i){var u=Ae(r);if(be=i,U=r,ke=U.parentNode,xr=U.nextSibling,Qs=r,Os=a.group,Q.dragged=U,wr={target:U,clientX:(n||t).clientX,clientY:(n||t).clientY},Kv=wr.clientX-u.left,qv=wr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,U.style["will-change"]="all",l=function(){if(ut("delayEnded",o,{evt:t}),Q.eventCanceled){o._onDrop();return}o._disableDelayedDragEvents(),!Hv&&o.nativeDraggable&&(U.draggable=!0),o._triggerDragStart(t,n),ot({sortable:o,name:"choose",originalEvent:t}),_e(U,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){sw(U,c.trim(),Nc)}),ie(s,"dragover",Sr),ie(s,"mousemove",Sr),ie(s,"touchmove",Sr),ie(s,"mouseup",o._onDrop),ie(s,"touchend",o._onDrop),ie(s,"touchcancel",o._onDrop),Hv&&this.nativeDraggable&&(this.options.touchStartThreshold=4,U.draggable=!0),ut("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(es||Rn))){if(Q.eventCanceled){this._onDrop();return}ie(s,"mouseup",o._disableDelayedDrag),ie(s,"touchend",o._disableDelayedDrag),ie(s,"touchcancel",o._disableDelayedDrag),ie(s,"mousemove",o._delayedDragTouchMoveHandler),ie(s,"touchmove",o._delayedDragTouchMoveHandler),a.supportPointer&&ie(s,"pointermove",o._delayedDragTouchMoveHandler),o._dragStartTimer=setTimeout(l,a.delay)}else l()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){U&&Nc(U),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;te(t,"mouseup",this._disableDelayedDrag),te(t,"touchend",this._disableDelayedDrag),te(t,"touchcancel",this._disableDelayedDrag),te(t,"mousemove",this._delayedDragTouchMoveHandler),te(t,"touchmove",this._delayedDragTouchMoveHandler),te(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ie(document,"pointermove",this._onTouchMove):n?ie(document,"touchmove",this._onTouchMove):ie(document,"mousemove",this._onTouchMove):(ie(U,"dragend",this),ie(be,"dragstart",this._onDragStart));try{document.selection?Ks(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(no=!1,be&&U){ut("dragStarted",this,{evt:n}),this.nativeDraggable&&ie(document,"dragover",x4);var r=this.options;!t&&_e(U,r.dragClass,!1),_e(U,r.ghostClass,!0),Q.active=this,t&&this._appendGhost(),ot({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(Vt){this._lastX=Vt.clientX,this._lastY=Vt.clientY,pw();for(var t=document.elementFromPoint(Vt.clientX,Vt.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(Vt.clientX,Vt.clientY),t!==n);)n=t;if(U.parentNode[Ze]._isOutsideThisEl(t),n)do{if(n[Ze]){var r=void 0;if(r=n[Ze]._onDragOver({clientX:Vt.clientX,clientY:Vt.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);hw()}},_onTouchMove:function(t){if(wr){var n=this.options,r=n.fallbackTolerance,o=n.fallbackOffset,i=t.touches?t.touches[0]:t,a=Z&&Dr(Z,!0),s=Z&&a&&a.a,l=Z&&a&&a.d,u=Ps&&Qe&&Qv(Qe),c=(i.clientX-wr.clientX+o.x)/(s||1)+(u?u[0]-Ic[0]:0)/(s||1),f=(i.clientY-wr.clientY+o.y)/(l||1)+(u?u[1]-Ic[1]:0)/(l||1);if(!Q.active&&!no){if(r&&Math.max(Math.abs(i.clientX-this._lastX),Math.abs(i.clientY-this._lastY))=0&&(ot({rootEl:ke,name:"add",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"remove",toEl:ke,originalEvent:t}),ot({rootEl:ke,name:"sort",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),$e&&$e.save()):At!==fo&&At>=0&&(ot({sortable:this,name:"update",toEl:ke,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),Q.active&&((At==null||At===-1)&&(At=fo,Un=na),ot({sortable:this,name:"end",toEl:ke,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){ut("nulling",this),be=U=ke=Z=xr=Oe=Qs=Yn=wr=Vt=Fi=At=Un=fo=na=Kr=ra=$e=Os=Q.dragged=Q.ghost=Q.clone=Q.active=null,Wl.forEach(function(t){t.checked=!0}),Wl.length=kc=Tc=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":U&&(this._onDragOver(t),O4(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,o=0,i=r.length,a=this.options;or.right+o||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+o}function T4(e,t,n,r,o,i,a,s){var l=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(s&&Xsc+u*i/2:lf-Xs)return-ra}else if(l>c+u*(1-o)/2&&lf-u*i/2)?l>c+u/2?1:-1:0}function I4(e){return Te(U)1&&(K.forEach(function(s){i.addAnimationState({target:s,rect:ct?Ae(s):a}),_c(s),s.fromRect=a,r.removeAnimationState(s)}),ct=!1,U4(!this.options.removeCloneOnHide,o))},dragOverCompleted:function(n){var r=n.sortable,o=n.isOwner,i=n.insertion,a=n.activeSortable,s=n.parentEl,l=n.putSortable,u=this.options;if(i){if(o&&a._hideClone(),Si=!1,u.animation&&K.length>1&&(ct||!o&&!a.options.sort&&!l)){var c=Ae(ve,!1,!0,!0);K.forEach(function(d){d!==ve&&(Xv(d,c),s.appendChild(d))}),ct=!0}if(!o)if(ct||Is(),K.length>1){var f=Ts;a._showClone(r),a.options.animation&&!Ts&&f&&Ct.forEach(function(d){a.addAnimationState({target:d,rect:bi}),d.fromRect=bi,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,o=n.isOwner,i=n.activeSortable;if(K.forEach(function(s){s.thisAnimationDuration=null}),i.options.animation&&!o&&i.multiDrag.isMultiDrag){bi=zt({},r);var a=Dr(ve,!0);bi.top-=a.f,bi.left-=a.e}},dragOverAnimationComplete:function(){ct&&(ct=!1,Is())},drop:function(n){var r=n.originalEvent,o=n.rootEl,i=n.parentEl,a=n.sortable,s=n.dispatchSortableEvent,l=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=i.children;if(!qr)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),_e(ve,f.selectedClass,!~K.indexOf(ve)),~K.indexOf(ve))K.splice(K.indexOf(ve),1),wi=null,Mi({sortable:a,rootEl:o,name:"deselect",targetEl:ve,originalEvent:r});else{if(K.push(ve),Mi({sortable:a,rootEl:o,name:"select",targetEl:ve,originalEvent:r}),r.shiftKey&&wi&&a.el.contains(wi)){var p=Te(wi),m=Te(ve);if(~p&&~m&&p!==m){var y,h;for(m>p?(h=p,y=m):(h=m,y=p+1);h1){var v=Ae(ve),w=Te(ve,":not(."+this.options.selectedClass+")");if(!Si&&f.animation&&(ve.thisAnimationDuration=null),c.captureAnimationState(),!Si&&(f.animation&&(ve.fromRect=v,K.forEach(function(A){if(A.thisAnimationDuration=null,A!==ve){var T=ct?Ae(A):v;A.fromRect=T,c.addAnimationState({target:A,rect:T})}})),Is(),K.forEach(function(A){d[w]?i.insertBefore(A,d[w]):i.appendChild(A),w++}),l===Te(ve))){var S=!1;K.forEach(function(A){if(A.sortableIndex!==Te(A)){S=!0;return}}),S&&s("update")}K.forEach(function(A){_c(A)}),c.animateAll()}Jt=c}(o===i||u&&u.lastPutMode!=="clone")&&Ct.forEach(function(A){A.parentNode&&A.parentNode.removeChild(A)})}},nullingGlobal:function(){this.isMultiDrag=qr=!1,Ct.length=0},destroyGlobal:function(){this._deselectMultiDrag(),te(document,"pointerup",this._deselectMultiDrag),te(document,"mouseup",this._deselectMultiDrag),te(document,"touchend",this._deselectMultiDrag),te(document,"keydown",this._checkKeyDown),te(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof qr!="undefined"&&qr)&&Jt===this.sortable&&!(n&&Xt(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;K.length;){var r=K[0];_e(r,this.options.selectedClass,!1),K.shift(),Mi({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},zt(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[Ze];!r||!r.options.multiDrag||~K.indexOf(n)||(Jt&&Jt!==r&&(Jt.multiDrag._deselectMultiDrag(),Jt=r),_e(n,r.options.selectedClass,!0),K.push(n))},deselect:function(n){var r=n.parentNode[Ze],o=K.indexOf(n);!r||!r.options.multiDrag||!~o||(_e(n,r.options.selectedClass,!1),K.splice(o,1))}},eventProperties:function(){var n=this,r=[],o=[];return K.forEach(function(i){r.push({multiDragElement:i,index:i.sortableIndex});var a;ct&&i!==ve?a=-1:ct?a=Te(i,":not(."+n.options.selectedClass+")"):a=Te(i),o.push({multiDragElement:i,index:a})}),{items:l4(K),clones:[].concat(Ct),oldIndicies:r,newIndicies:o}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function U4(e,t){K.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function tg(e,t){Ct.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function Is(){K.forEach(function(e){e!==ve&&e.parentNode&&e.parentNode.removeChild(e)})}Q.mount(new R4);Q.mount(Kp,Xp);const B4=Object.freeze(Object.defineProperty({__proto__:null,default:Q,MultiDrag:F4,Sortable:Q,Swap:L4},Symbol.toStringTag,{value:"Module"})),j4=Bg(B4);var vw={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],o=0;o$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>A);function l(C){C.parentElement!==null&&C.parentElement.removeChild(C)}function u(C,O,b){const E=C.children[b]||null;C.insertBefore(O,E)}function c(C){C.forEach(O=>l(O.element))}function f(C){C.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(C,O){const b=h(C),E={parentElement:C.from};let x=[];switch(b){case"normal":x=[{element:C.item,newIndex:C.newIndex,oldIndex:C.oldIndex,parentElement:C.from}];break;case"swap":const D=F({element:C.item,oldIndex:C.oldIndex,newIndex:C.newIndex},E),B=F({element:C.swapItem,oldIndex:C.newIndex,newIndex:C.oldIndex},E);x=[D,B];break;case"multidrag":x=C.oldIndicies.map((q,H)=>F({element:q.multiDragElement,oldIndex:q.index,newIndex:C.newIndicies[H].index},E));break}return v(x,O)}function p(C,O){const b=m(C,O);return y(C,b)}function m(C,O){const b=[...O];return C.concat().reverse().forEach(E=>b.splice(E.oldIndex,1)),b}function y(C,O,b,E){const x=[...O];return C.forEach(_=>{const k=E&&b&&E(_.item,b);x.splice(_.newIndex,0,k||_.item)}),x}function h(C){return C.oldIndicies&&C.oldIndicies.length>0?"multidrag":C.swapItem?"swap":"normal"}function v(C,O){return C.map(E=>$(F({},E),{item:O[E.oldIndex]})).sort((E,x)=>E.oldIndex-x.oldIndex)}function w(C){const us=C,{list:O,setList:b,children:E,tag:x,style:_,className:k,clone:D,onAdd:B,onChange:q,onChoose:H,onClone:ce,onEnd:he,onFilter:ye,onRemove:ne,onSort:R,onStart:Y,onUnchoose:V,onUpdate:le,onMove:ue,onSpill:ze,onSelect:Fe,onDeselect:Ue}=us;return $t(us,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class A extends r.Component{constructor(O){super(O),this.ref=r.createRef();const b=[...O.list].map(E=>Object.assign(E,{chosen:!1,selected:!1}));O.setList(b,this.sortable,S),i(o)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();i(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:b,className:E,id:x}=this.props,_={style:b,className:E,id:x},k=!O||O===null?"div":O;return r.createElement(k,F({ref:this.ref},_),this.getChildren())}getChildren(){const{children:O,dataIdAttr:b,selectedClass:E="sortable-selected",chosenClass:x="sortable-chosen",dragClass:_="sortable-drag",fallbackClass:k="sortable-falback",ghostClass:D="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:q="sortable-filter",list:H}=this.props;if(!O||O==null)return null;const ce=b||"data-id";return r.Children.map(O,(he,ye)=>{if(he===void 0)return;const ne=H[ye]||{},{className:R}=he.props,Y=typeof q=="string"&&{[q.replace(".","")]:!!ne.filtered},V=i(n)(R,F({[E]:ne.selected,[x]:ne.chosen},Y));return r.cloneElement(he,{[ce]:he.key,className:V})})}get sortable(){const O=this.ref.current;if(O===null)return null;const b=Object.keys(O).find(E=>E.includes("Sortable"));return b?O[b]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],b=["onChange","onClone","onFilter","onSort"],E=w(this.props);O.forEach(_=>E[_]=this.prepareOnHandlerPropAndDOM(_)),b.forEach(_=>E[_]=this.prepareOnHandlerProp(_));const x=(_,k)=>{const{onMove:D}=this.props,B=_.willInsertAfter||-1;if(!D)return B;const q=D(_,k,this.sortable,S);return typeof q=="undefined"?!1:q};return $(F({},E),{onMove:x})}prepareOnHandlerPropAndDOM(O){return b=>{this.callOnHandlerProp(b,O),this[O](b)}}prepareOnHandlerProp(O){return b=>{this.callOnHandlerProp(b,O)}}callOnHandlerProp(O,b){const E=this.props[b];E&&E(O,this.sortable,S)}onAdd(O){const{list:b,setList:E,clone:x}=this.props,_=[...S.dragging.props.list],k=d(O,_);c(k);const D=y(k,b,O,x).map(B=>Object.assign(B,{selected:!1}));E(D,this.sortable,S)}onRemove(O){const{list:b,setList:E}=this.props,x=h(O),_=d(O,b);f(_);let k=[...b];if(O.pullMode!=="clone")k=m(_,k);else{let D=_;switch(x){case"multidrag":D=_.map((B,q)=>$(F({},B),{element:O.clones[q]}));break;case"normal":D=_.map(B=>$(F({},B),{element:O.clone}));break;case"swap":default:i(o)(!0,`mode "${x}" cannot clone. Please remove "props.clone" from when using the "${x}" plugin`)}c(D),_.forEach(B=>{const q=B.oldIndex,H=this.props.clone(B.item,O);k.splice(q,1,H)})}k=k.map(D=>Object.assign(D,{selected:!1})),E(k,this.sortable,S)}onUpdate(O){const{list:b,setList:E}=this.props,x=d(O,b);c(x),f(x);const _=p(x,b);return E(_,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(_,{chosen:!0})),D});E(x,this.sortable,S)}onUnchoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(D,{chosen:!1})),D});E(x,this.sortable,S)}onSpill(O){const{removeOnSpill:b,revertOnSpill:E}=this.props;b&&!E&&l(O.item)}onSelect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;if(k===-1){console.log(`"${O.type}" had indice of "${_.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}x[k].selected=!0}),E(x,this.sortable,S)}onDeselect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;k!==-1&&(x[k].selected=!0)}),E(x,this.sortable,S)}}A.defaultProps={clone:C=>C};var T={};s(e.exports,T)})(rw);const $4="_container_xt7ji_1",H4="_list_xt7ji_6",V4="_item_xt7ji_15",J4="_keyField_xt7ji_29",Q4="_valueField_xt7ji_34",X4="_header_xt7ji_39",K4="_dragHandle_xt7ji_45",q4="_deleteButton_xt7ji_55",Z4="_addItemButton_xt7ji_65",eP="_separator_xt7ji_72",ft={container:$4,list:H4,item:V4,keyField:J4,valueField:Q4,header:X4,dragHandle:K4,deleteButton:q4,addItemButton:Z4,separator:eP};function qp({name:e,label:t,value:n,onChange:r,optional:o=!1,newItemValue:i={key:"myKey",value:"myValue"}}){const[a,s]=I.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),l=$r(r);I.useEffect(()=>{const f=tP(a);lA(f,n!=null?n:{})||l({name:e,value:f})},[e,l,a,n]);const u=I.useCallback(f=>{s(d=>d.filter(({id:p})=>p!==f))},[]),c=I.useCallback(()=>{s(f=>[...f,F({id:-1},i)].map((d,p)=>$(F({},d),{id:p})))},[i]);return N("div",{className:ft.container,children:[g(ti,{category:e!=null?e:t}),N("div",{className:ft.list,children:[N("div",{className:ft.item+" "+ft.header,children:[g("span",{className:ft.keyField,children:"Key"}),g("span",{className:ft.valueField,children:"Value"})]}),g(rw.exports.ReactSortable,{list:a,setList:s,handle:`.${ft.dragHandle}`,children:a.map((f,d)=>N("div",{className:ft.item,children:[g("div",{className:ft.dragHandle,title:"Reorder list",children:g(o4,{})}),g("input",{className:ft.keyField,type:"text",value:f.key,onChange:p=>{const m=[...a];m[d]=$(F({},f),{key:p.target.value}),s(m)}}),g("span",{className:ft.separator,children:":"}),g("input",{className:ft.valueField,type:"text",value:f.value,onChange:p=>{const m=[...a];m[d]=$(F({},f),{value:p.target.value}),s(m)}}),g(wt,{className:ft.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:g(Sp,{})})]},f.id))}),g(wt,{className:ft.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:g(C1,{})})]})]})}function tP(e){return e.reduce((n,{key:r,value:o})=>(n[r]=o,n),{})}const nP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),rP="_container_162lp_1",oP="_checkbox_162lp_14",Mc={container:rP,checkbox:oP},iP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices;return N("div",$(F({ref:r,className:Mc.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:Object.keys(o).map((i,a)=>g("div",{className:Mc.radio,children:N("label",{className:Mc.checkbox,children:[g("input",{type:"checkbox",name:o[i],value:o[i],defaultChecked:a===0}),g("span",{children:i})]})},i))}),e]}))},aP={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},sP={title:"Checkbox Group",UiComponent:iP,SettingsComponent:nP,acceptsChildren:!1,defaultSettings:aP,iconSrc:t4,category:"Inputs"},lP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",uP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(tw,{label:"Starting value",name:"value",value:e.value}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),cP="_container_1x0tz_1",fP="_label_1x0tz_10",ng={container:cP,label:fP},dP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=(l=t.width)!=null?l:"auto",i=F({},t),[a,s]=j.exports.useState(i.value);return j.exports.useEffect(()=>{s(i.value)},[i.value]),N("div",$(F({className:ng.container+" shiny::checkbox",style:{width:o},"aria-label":"shiny::checkbox",ref:r},n),{children:[N("label",{htmlFor:i.inputId,children:[g("input",{id:i.inputId,type:"checkbox",checked:a,onChange:u=>s(u.target.checked)}),g("span",{className:ng.label,children:i.label})]}),e]}))},pP={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},hP={title:"Checkbox Input",UiComponent:dP,SettingsComponent:uP,acceptsChildren:!1,defaultSettings:pP,iconSrc:lP,category:"Inputs"},mP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",vP="_wrappedSection_1dn9g_1",gP="_sectionContainer_1dn9g_9",zl={wrappedSection:vP,sectionContainer:gP},gw=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.wrappedSection,children:t})]}),yP=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.inputSection,children:t})]}),wP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(gw,{name:"Values",children:[g(Hn,{name:"value",value:e.value}),g(Hn,{name:"min",value:e.min,optional:!0,defaultValue:0}),g(Hn,{name:"max",value:e.max,optional:!0,defaultValue:10}),g(Hn,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),SP="_container_yicbr_1",bP={container:SP},EP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=F({},t),i=(l=o.width)!=null?l:"200px",[a,s]=j.exports.useState(o.value);return j.exports.useEffect(()=>{s(o.value)},[o.value]),N("div",$(F({className:bP.container+" shiny::numericInput",style:{width:i},"aria-label":"shiny::numericInput",ref:r},n),{children:[g("span",{children:o.label}),g("input",{type:"number",value:a,onChange:u=>s(Number(u.target.value)),min:o.min,max:o.max,step:o.step}),e]}))},CP={inputId:"myNumericInput",label:"Numeric Input",value:10},AP={title:"Numeric Input",UiComponent:EP,SettingsComponent:wP,acceptsChildren:!1,defaultSettings:CP,iconSrc:mP,category:"Inputs"},xP=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>N(Me,{children:[g(pe,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),g(yn,{name:"width",units:["px","%"],value:t}),g(yn,{name:"height",units:["px","%"],value:n})]}),OP=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:o,compRef:i})=>N("div",$(F({className:Jf.container,ref:i,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},o),{children:[g(ew,{outputId:e}),r]})),_P={title:"Plot Output",UiComponent:OP,SettingsComponent:xP,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:q1,category:"Outputs"},PP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",kP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),TP="_container_sgn7c_1",rg={container:TP},IP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=Object.keys(o),a=Object.values(o),[s,l]=I.useState(a[0]);return I.useEffect(()=>{a.includes(s)||l(a[0])},[s,a]),N("div",$(F({ref:r,className:rg.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:a.map((u,c)=>g("div",{className:rg.radio,children:N("label",{children:[g("input",{type:"radio",name:t.inputId,value:u,onChange:f=>l(f.target.value),checked:u===s}),g("span",{children:i[c]})]})},u))}),e]}))},NP={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},DP={title:"Radio Buttons",UiComponent:IP,SettingsComponent:kP,acceptsChildren:!1,defaultSettings:NP,iconSrc:PP,category:"Inputs"},RP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",LP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),MP="_container_1e5dd_1",FP={container:MP},UP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=t.inputId;return N("div",$(F({ref:r,className:FP.container},n),{children:[g("label",{htmlFor:i,children:t.label}),g("select",{id:i,children:Object.keys(o).map((a,s)=>g("option",{value:o[a],children:a},a))}),e]}))},BP={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},jP={title:"Select Input",UiComponent:UP,SettingsComponent:LP,acceptsChildren:!1,defaultSettings:BP,iconSrc:RP,category:"Inputs"},WP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",YP=({settings:e})=>{const t=F({},e);return N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:t.inputId}),g(pe,{name:"label",value:t.label}),N(gw,{name:"Values",children:[g(Hn,{name:"min",value:t.min}),g(Hn,{name:"max",value:t.max}),g(Hn,{name:"value",label:"start",value:t.value}),g(Hn,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},zP="_container_1f2js_1",GP="_sliderWrapper_1f2js_11",$P="_sliderInput_1f2js_16",Fc={container:zP,sliderWrapper:GP,sliderInput:$P},HP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=F({},t),{width:i="200px"}=o,[a,s]=j.exports.useState(o.value);return N("div",$(F({className:Fc.container+" shiny::sliderInput",style:{width:i},"aria-label":"shiny::sliderInput",ref:r},n),{children:[g("div",{children:o.label}),g("div",{className:Fc.sliderWrapper,children:g("input",{type:"range",min:o.min,max:o.max,value:a,onChange:l=>s(Number(l.target.value)),className:"slider "+Fc.sliderInput,"aria-label":"slider input","data-min":o.min,"data-max":o.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),N("div",{children:[g(Z1,{type:"input",name:o.inputId})," = ",a]}),e]}))},VP={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},JP={title:"Slider Input",UiComponent:HP,SettingsComponent:YP,acceptsChildren:!1,defaultSettings:VP,iconSrc:WP,category:"Inputs"},QP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",XP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(yP,{name:"Values",children:[g(pe,{name:"value",value:e.value}),g(pe,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),KP="_container_yicbr_1",qP={container:KP},ZP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o="200px",i="auto",a=F({},t),[s,l]=j.exports.useState(a.value);return j.exports.useEffect(()=>{l(a.value)},[a.value]),N("div",$(F({className:qP.container+" shiny::textInput",style:{height:i,width:o},"aria-label":"shiny::textInput",ref:r},n),{children:[g("label",{htmlFor:a.inputId,children:a.label}),g("input",{id:a.inputId,type:"text",value:s,onChange:u=>l(u.target.value),placeholder:a.placeholder}),e]}))},ek={inputId:"myTextInput",label:"Text Input",value:""},tk={title:"Text Input",UiComponent:ZP,SettingsComponent:XP,acceptsChildren:!1,defaultSettings:ek,iconSrc:QP,category:"Inputs"},nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",rk=({settings:e})=>g(pe,{label:"Output ID",name:"outputId",value:e.outputId}),ok="_container_1i6yi_1",ik={container:ok},ak=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>N("div",$(F({className:ik.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",N("code",{children:["output$",e.outputId]}),t]})),sk={title:"Text Output",UiComponent:ak,SettingsComponent:rk,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:nk,category:"Outputs"},lk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",uk=({settings:e})=>{var t;return g(pe,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},ck="_container_1xnzo_1",fk={container:ck},dk=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:o="shiny-ui-output"}=e;return N("div",$(F({className:fk.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",o,"!"]}),t]}))},pk={title:"Dynamic UI Output",UiComponent:dk,SettingsComponent:uk,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:lk,category:"Outputs"};function hk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function mk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function vk(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const gk="_container_p6wnj_1",yk="_infoMsg_p6wnj_14",wk="_codeHolder_p6wnj_19",ed={container:gk,infoMsg:yk,codeHolder:wk},Sk=({settings:e})=>N("div",{children:[g("div",{className:kn.container,children:N("span",{className:ed.infoMsg,children:[g(hk,{}),"Unknown function call. Can't modify with visual editor."]})}),g(ti,{category:"Code"}),g("div",{className:kn.container,children:g("pre",{className:ed.codeHolder,children:vk(e.text)})})]}),bk=20,Ek=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const o=e.text.slice(0,bk).replaceAll(/\s$/g,"")+"...";return N("div",$(F({className:ed.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{children:["unknown ui output: ",g("code",{children:o})]}),t]}))},Ck={title:"Unknown UI Function",UiComponent:Ek,SettingsComponent:Sk,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},en={"shiny::actionButton":e4,"shiny::numericInput":AP,"shiny::sliderInput":JP,"shiny::textInput":tk,"shiny::checkboxInput":hP,"shiny::checkboxGroupInput":sP,"shiny::selectInput":jP,"shiny::radioButtons":DP,"shiny::plotOutput":_P,"shiny::textOutput":sk,"shiny::uiOutput":pk,"gridlayout::grid_page":J_,"gridlayout::grid_card":w_,"gridlayout::grid_card_text":G_,"gridlayout::grid_card_plot":k_,unknownUiFunction:Ck};function Ak(e,{path:t,node:n}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=rr(e,t);Object.assign(r,n)}const Zp={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},yw=vp({name:"uiTree",initialState:Zp,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>ww(t.payload.initialState),UPDATE_NODE:(e,t)=>{Ak(e,t.payload)},PLACE_NODE:(e,t)=>{yx(e,t.payload)},DELETE_NODE:(e,t)=>{E1(e,t.payload)}}});function ww(e){const t=en[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return hx(r,n).length>0&&(e.uiArguments=F(F({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(i=>ww(i)),e}const{UPDATE_NODE:Sw,PLACE_NODE:xk,DELETE_NODE:bw,INIT_STATE:Ok,SET_FULL_STATE:_k}=yw.actions;function Ew(){const e=vr();return I.useCallback(n=>{e(xk(n))},[e])}const Pk=yw.reducer,Cw=oA();Cw.startListening({actionCreator:bw,effect:(e,t)=>Eh(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Xa(n,r)&&t.dispatch(cA()),r.lengthi)return;const a=[...r];a[n.length-1]=i-1,t.dispatch(c1({path:a}))})});const kk=Cw.middleware,Tk=FC({reducer:{uiTree:Pk,selectedPath:fA,connectedToServer:sA},middleware:e=>e().concat(kk)}),Ik=({children:e})=>g(jE,{store:Tk,children:e}),Nk=!1,Dk=!1;console.log("Env Vars",{VITE_PREBUILT_TREE:"true",VITE_SHOW_FAKE_PREVIEW:"false",BASE_URL:"./",MODE:"production",DEV:!1,PROD:!0});const Zs={ws:null,msg:null},Aw=$(F({},Zs),{status:"connecting"});function Rk(e,t){switch(t.type){case"CONNECTED":return $(F({},Zs),{status:"connected",ws:t.ws});case"FAILED":return $(F({},Zs),{status:"failed-to-open"});case"CLOSED":return $(F({},Zs),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function Lk(){const[e,t]=I.useReducer(Rk,Aw),n=I.useRef(!1);return I.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=Nk?"localhost:8888":window.location.host,o=new WebSocket(`ws://${r}`);return o.onerror=i=>{console.error("Error with httpuv websocket connection",i)},o.onopen=i=>{n.current=!0,t({type:"CONNECTED",ws:o})},o.onclose=i=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>o.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const xw=I.createContext(Aw),Mk=({children:e})=>{const t=Lk();return g(xw.Provider,{value:t,children:e})};function Ow(){return I.useContext(xw)}function Fk(e){return JSON.parse(e.data)}function _w(e,t){e.addEventListener("message",n=>{t(Fk(n))})}function td(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const Uk="_appViewerHolder_wu0cb_1",Bk="_title_wu0cb_55",jk="_appContainer_wu0cb_89",Wk="_previewFrame_wu0cb_109",Yk="_expandButton_wu0cb_134",zk="_reloadButton_wu0cb_135",Gk="_spin_wu0cb_160",$k="_restartButton_wu0cb_198",Hk="_loadingMessage_wu0cb_225",Vk="_error_wu0cb_236",mt={appViewerHolder:Uk,title:Bk,appContainer:jk,previewFrame:Wk,expandButton:Yk,reloadButton:zk,spin:Gk,restartButton:$k,loadingMessage:Hk,error:Vk},Jk="_fakeApp_t3dh1_1",Qk="_fakeDashboard_t3dh1_7",Xk="_header_t3dh1_22",Kk="_sidebar_t3dh1_31",qk="_top_t3dh1_35",Zk="_bottom_t3dh1_39",Ei={fakeApp:Jk,fakeDashboard:Qk,header:Xk,sidebar:Kk,top:qk,bottom:Zk},eT=()=>g("div",{className:mt.appContainer,children:N("div",{className:Ei.fakeDashboard+" "+mt.previewFrame,children:[g("div",{className:Ei.header,children:g("h1",{children:"App preview not available"})}),g("div",{className:Ei.sidebar}),g("div",{className:Ei.top}),g("div",{className:Ei.bottom})]})});function tT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function nT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function rT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function oT(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const iT="_logs_xjp5l_2",aT="_logsContents_xjp5l_25",sT="_expandTab_xjp5l_29",lT="_clearLogsButton_xjp5l_69",uT="_logLine_xjp5l_75",cT="_noLogsMsg_xjp5l_81",fT="_expandedLogs_xjp5l_93",dT="_expandLogsButton_xjp5l_101",pT="_unseenLogsNotification_xjp5l_108",hT="_slidein_xjp5l_1",br={logs:iT,logsContents:aT,expandTab:sT,clearLogsButton:lT,logLine:uT,noLogsMsg:cT,expandedLogs:fT,expandLogsButton:dT,unseenLogsNotification:pT,slidein:hT};function mT({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:o}=vT(e),i=e.length===0;return N("div",{className:br.logs,"data-expanded":n,children:[N("button",{className:br.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[g(rT,{className:br.unseenLogsNotification,"data-show":o}),"App Logs",n?g(tT,{}):g(nT,{})]}),N("div",{className:br.logsContents,children:[i?g("p",{className:br.noLogsMsg,children:"No recent logs"}):e.map((a,s)=>g("p",{className:br.logLine,children:a},s)),i?null:g(wt,{variant:"icon",title:"clear logs",className:br.clearLogsButton,onClick:t,children:g(oT,{})})]})]})}function vT(e){const[t,n]=I.useState(!1),[r,o]=I.useState(!1),[i,a]=I.useState(null),[s,l]=I.useState(new Date),u=I.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),o(!1)},[t]);return I.useEffect(()=>{l(new Date)},[e]),I.useEffect(()=>{if(t||e.length===0){o(!1);return}if(i===null||i{u==="connected"&&(ia(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>ia(c,{path:"APP-PREVIEW-RESTART"})),m(()=>()=>ia(c,{path:"APP-PREVIEW-STOP"})),_w(c,w=>{if(!gT(w))return;const{path:S,payload:A}=w;switch(S){case"SHINY_READY":l(!1),a(!1),n(A);break;case"SHINY_LOGS":o(wT(A));break;case"SHINY_CRASH":l(A);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:w})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=I.useState(()=>()=>console.log("No app running to reset")),[p,m]=I.useState(()=>()=>console.log("No app running to stop")),y=I.useCallback(()=>{o([])},[]),h={appLogs:r,clearLogs:y,restartApp:f,stopApp:p};return i?Object.assign(h,{status:"no-preview",appLoc:null}):s?Object.assign(h,{status:"crashed",error:s,appLoc:null}):t?Object.assign(h,{status:"finished",appLoc:t,error:null}):Object.assign(h,{status:"loading",appLoc:null,error:null})}function wT(e){return Array.isArray(e)?e:[e]}function ST(){const[e,t]=I.useState(.2),n=xT();return I.useEffect(()=>{!n||t(bT(n.width))},[n]),e}function bT(e){const t=mS-Pw*2,n=e-kw*2;return t/n}const Pw=16,kw=55;function ET(){const e=I.useRef(null),[t,n]=I.useState(!1),r=I.useCallback(()=>{n(f=>!f)},[]),{status:o,appLoc:i,appLogs:a,clearLogs:s,restartApp:l}=yT(),u=ST(),c=I.useCallback(f=>{!e.current||!i||(e.current.src=i,OT(f.currentTarget))},[i]);return o==="no-preview"&&!Dk?null:N(Me,{children:[N("h3",{className:mt.title+" "+Q1.panelTitleHeader,children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),"App Preview"]}),g("div",{className:mt.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Pw}px`,"--expanded-inset-horizontal":`${kw}px`},children:o==="loading"?g(AT,{}):o==="crashed"?g(CT,{onClick:l}):N(Me,{children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),N("div",{className:mt.appContainer,children:[o==="no-preview"?g(eT,{}):g("iframe",{className:mt.previewFrame,src:i,title:"Application Preview",ref:e}),g(wt,{variant:"icon",className:mt.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?g(mk,{}):g(xx,{})})]}),g(mT,{appLogs:a,clearLogs:s})]})})]})}function CT({onClick:e}){return N("div",{className:mt.appContainer,children:[N("p",{children:["App preview crashed.",g("br",{})," Try and restart?"]}),N(wt,{className:mt.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",g(td,{})]})]})}function AT(){return g("div",{className:mt.loadingMessage,children:g("h2",{children:"Loading app preview..."})})}function xT(){const[e,t]=I.useState(null),n=I.useMemo(()=>Fp(()=>{const{innerWidth:r,innerHeight:o}=window;t({width:r,height:o})},500),[]);return I.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function OT(e){e.classList.add(mt.spin),e.addEventListener("animationend",()=>e.classList.remove(mt.spin),!1)}const _T=e=>g("svg",$(F({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:g("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class PT{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function kT(){const e=Ja(c=>c.uiTree),t=vr(),[n,r]=I.useState(!1),[o,i]=I.useState(!1),a=I.useRef(new PT({comparisonFn:TT}));I.useEffect(()=>{if(!e||e===Zp)return;const c=a.current;c.addEntry(e),i(c.canGoBackwards()),r(c.canGoForwards())},[e]);const s=I.useCallback(c=>{t(_k({state:c}))},[t]),l=I.useCallback(()=>{console.log("Navigating backwards"),s(a.current.goBackwards())},[s]),u=I.useCallback(()=>{console.log("Navigating forwards"),s(a.current.goForwards())},[s]);return{goBackward:l,goForward:u,canGoBackward:o,canGoForward:n}}function TT(e,t){return typeof t=="undefined"?!1:e===t}const IT="_container_1d7pe_1",NT={container:IT};function DT(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=kT();return N("div",{className:NT.container+" undo-redo-buttons",children:[g(wt,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:g(PA,{height:"100%"})}),g(wt,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:g(_A,{height:"100%"})})]})}const RT="_elementsPalette_zecez_1",LT="_OptionItem_zecez_18",MT="_OptionIcon_zecez_27",FT="_OptionLabel_zecez_35",el={elementsPalette:RT,OptionItem:LT,OptionIcon:MT,OptionLabel:FT},og=["Inputs","Outputs","gridlayout","uncategorized"];function UT(e,t){var o,i;const n=og.indexOf(((o=en[e])==null?void 0:o.category)||"uncategorized"),r=og.indexOf(((i=en[t])==null?void 0:i.category)||"uncategorized");return nr?1:0}function BT({availableUi:e=en}){const t=j.exports.useMemo(()=>Object.keys(e).sort(UT),[e]);return g("div",{className:el.elementsPalette,children:t.map(n=>g(jT,{uiName:n},n))})}function jT({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r}=en[e],o={uiName:e,uiArguments:r},i=j.exports.useRef(null);return g1({ref:i,nodeInfo:{node:o}}),t===void 0?null:N("div",{ref:i,className:el.OptionItem,"data-ui-name":e,children:[g("img",{src:t,alt:n,className:el.OptionIcon}),g("label",{className:el.OptionLabel,children:n})]})}function Tw(e){return function(t){return typeof t===e}}var WT=Tw("function"),YT=function(e){return e===null},ig=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},ag=function(e){return!zT(e)&&!YT(e)&&(WT(e)||typeof e=="object")},zT=Tw("undefined"),nd=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function GT(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!vt(e[r],t[r]))return!1;return!0}function $T(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),o=e.byteLength;o--;)if(n.getUint8(o)!==r.getUint8(o))return!1;return!0}function HT(e,t){var n,r,o,i;if(e.size!==t.size)return!1;try{for(var a=nd(e.entries()),s=a.next();!s.done;s=a.next()){var l=s.value;if(!t.has(l[0]))return!1}}catch(f){n={error:f}}finally{try{s&&!s.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=nd(e.entries()),c=u.next();!c.done;c=u.next()){var l=c.value;if(!vt(l[1],t.get(l[0])))return!1}}catch(f){o={error:f}}finally{try{c&&!c.done&&(i=u.return)&&i.call(u)}finally{if(o)throw o.error}}return!0}function VT(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var o=nd(e.entries()),i=o.next();!i.done;i=o.next()){var a=i.value;if(!t.has(a[0]))return!1}}catch(s){n={error:s}}finally{try{i&&!i.done&&(r=o.return)&&r.call(o)}finally{if(n)throw n.error}}return!0}function vt(e,t){if(e===t)return!0;if(e&&ag(e)&&t&&ag(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return GT(e,t);if(e instanceof Map&&t instanceof Map)return HT(e,t);if(e instanceof Set&&t instanceof Set)return VT(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return $T(e,t);if(ig(e)&&ig(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var o=n.length;o--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[o]))return!1;for(var o=n.length;o--!==0;){var i=n[o];if(!(i==="_owner"&&e.$$typeof)&&!vt(e[i],t[i]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var JT=["innerHTML","ownerDocument","style","attributes","nodeValue"],QT=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],XT=["bigint","boolean","null","number","string","symbol","undefined"];function ku(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(KT(t))return t}function rn(e){return function(t){return ku(t)===e}}function KT(e){return QT.includes(e)}function ni(e){return function(t){return typeof t===e}}function qT(e){return XT.includes(e)}function P(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(P.array(e))return"Array";if(P.plainFunction(e))return"Function";var t=ku(e);return t||"Object"}P.array=Array.isArray;P.arrayOf=function(e,t){return!P.array(e)&&!P.function(t)?!1:e.every(function(n){return t(n)})};P.asyncGeneratorFunction=function(e){return ku(e)==="AsyncGeneratorFunction"};P.asyncFunction=rn("AsyncFunction");P.bigint=ni("bigint");P.boolean=function(e){return e===!0||e===!1};P.date=rn("Date");P.defined=function(e){return!P.undefined(e)};P.domElement=function(e){return P.object(e)&&!P.plainObject(e)&&e.nodeType===1&&P.string(e.nodeName)&&JT.every(function(t){return t in e})};P.empty=function(e){return P.string(e)&&e.length===0||P.array(e)&&e.length===0||P.object(e)&&!P.map(e)&&!P.set(e)&&Object.keys(e).length===0||P.set(e)&&e.size===0||P.map(e)&&e.size===0};P.error=rn("Error");P.function=ni("function");P.generator=function(e){return P.iterable(e)&&P.function(e.next)&&P.function(e.throw)};P.generatorFunction=rn("GeneratorFunction");P.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};P.iterable=function(e){return!P.nullOrUndefined(e)&&P.function(e[Symbol.iterator])};P.map=rn("Map");P.nan=function(e){return Number.isNaN(e)};P.null=function(e){return e===null};P.nullOrUndefined=function(e){return P.null(e)||P.undefined(e)};P.number=function(e){return ni("number")(e)&&!P.nan(e)};P.numericString=function(e){return P.string(e)&&e.length>0&&!Number.isNaN(Number(e))};P.object=function(e){return!P.nullOrUndefined(e)&&(P.function(e)||typeof e=="object")};P.oneOf=function(e,t){return P.array(e)?e.indexOf(t)>-1:!1};P.plainFunction=rn("Function");P.plainObject=function(e){if(ku(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};P.primitive=function(e){return P.null(e)||qT(typeof e)};P.promise=rn("Promise");P.propertyOf=function(e,t,n){if(!P.object(e)||!t)return!1;var r=e[t];return P.function(n)?n(r):P.defined(r)};P.regexp=rn("RegExp");P.set=rn("Set");P.string=ni("string");P.symbol=ni("symbol");P.undefined=ni("undefined");P.weakMap=rn("WeakMap");P.weakSet=rn("WeakSet");function ZT(){for(var e=[],t=0;tl);return P.undefined(r)||(u=u&&l===r),P.undefined(i)||(u=u&&s===i),u}function lg(e,t,n){var r=n.key,o=n.type,i=n.value,a=cn(e,r),s=cn(t,r),l=o==="added"?a:s,u=o==="added"?s:a;if(!P.nullOrUndefined(i)){if(P.defined(l)){if(P.array(l)||P.plainObject(l))return e6(l,u,i)}else return vt(u,i);return!1}return[a,s].every(P.array)?!u.every(eh(l)):[a,s].every(P.plainObject)?t6(Object.keys(l),Object.keys(u)):![a,s].every(function(c){return P.primitive(c)&&P.defined(c)})&&(o==="added"?!P.defined(a)&&P.defined(s):P.defined(a)&&!P.defined(s))}function ug(e,t,n){var r=n===void 0?{}:n,o=r.key,i=cn(e,o),a=cn(t,o);if(!Iw(i,a))throw new TypeError("Inputs have different types");if(!ZT(i,a))throw new TypeError("Inputs don't have length");return[i,a].every(P.plainObject)&&(i=Object.keys(i),a=Object.keys(a)),[i,a]}function cg(e){return function(t){var n=t[0],r=t[1];return P.array(e)?vt(e,r)||e.some(function(o){return vt(o,r)||P.array(r)&&eh(r)(o)}):P.plainObject(e)&&e[n]?!!e[n]&&vt(e[n],r):vt(e,r)}}function t6(e,t){return t.some(function(n){return!e.includes(n)})}function fg(e){return function(t){return P.array(e)?e.some(function(n){return vt(n,t)||P.array(t)&&eh(t)(n)}):vt(e,t)}}function Ci(e,t){return P.array(e)?e.some(function(n){return vt(n,t)}):vt(e,t)}function eh(e){return function(t){return e.some(function(n){return vt(n,t)})}}function Iw(){for(var e=[],t=0;t=0)return 1;return 0}();function R6(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function L6(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},D6))}}var M6=ns&&window.Promise,F6=M6?R6:L6;function Bw(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Hr(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function oh(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function rs(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Hr(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/(auto|scroll|overlay)/.test(n+o+r)?e:rs(oh(e))}function jw(e){return e&&e.referenceNode?e.referenceNode:e}var vg=ns&&!!(window.MSInputMethodContext&&document.documentMode),gg=ns&&/MSIE 10/.test(navigator.userAgent);function ri(e){return e===11?vg:e===10?gg:vg||gg}function Wo(e){if(!e)return document.documentElement;for(var t=ri(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Hr(n,"position")==="static"?Wo(n):n}function U6(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Wo(e.firstElementChild)===e}function rd(e){return e.parentNode!==null?rd(e.parentNode):e}function $l(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,o=n?t:e,i=document.createRange();i.setStart(r,0),i.setEnd(o,0);var a=i.commonAncestorContainer;if(e!==a&&t!==a||r.contains(o))return U6(a)?a:Wo(a);var s=rd(e);return s.host?$l(s.host,t):$l(e,rd(t).host)}function Yo(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var o=e.ownerDocument.documentElement,i=e.ownerDocument.scrollingElement||o;return i[n]}return e[n]}function B6(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Yo(t,"top"),o=Yo(t,"left"),i=n?-1:1;return e.top+=r*i,e.bottom+=r*i,e.left+=o*i,e.right+=o*i,e}function yg(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function wg(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],ri(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function Ww(e){var t=e.body,n=e.documentElement,r=ri(10)&&getComputedStyle(n);return{height:wg("Height",t,n,r),width:wg("Width",t,n,r)}}var j6=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},W6=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=ri(10),o=t.nodeName==="HTML",i=od(e),a=od(t),s=rs(e),l=Hr(t),u=parseFloat(l.borderTopWidth),c=parseFloat(l.borderLeftWidth);n&&o&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=pr({top:i.top-a.top-u,left:i.left-a.left-c,width:i.width,height:i.height});if(f.marginTop=0,f.marginLeft=0,!r&&o){var d=parseFloat(l.marginTop),p=parseFloat(l.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(s):t===s&&s.nodeName!=="BODY")&&(f=B6(f,t)),f}function Y6(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=ih(e,n),o=Math.max(n.clientWidth,window.innerWidth||0),i=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Yo(n),s=t?0:Yo(n,"left"),l={top:a-r.top+r.marginTop,left:s-r.left+r.marginLeft,width:o,height:i};return pr(l)}function Yw(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Hr(e,"position")==="fixed")return!0;var n=oh(e);return n?Yw(n):!1}function zw(e){if(!e||!e.parentElement||ri())return document.documentElement;for(var t=e.parentElement;t&&Hr(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function ah(e,t,n,r){var o=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,i={top:0,left:0},a=o?zw(e):$l(e,jw(t));if(r==="viewport")i=Y6(a,o);else{var s=void 0;r==="scrollParent"?(s=rs(oh(t)),s.nodeName==="BODY"&&(s=e.ownerDocument.documentElement)):r==="window"?s=e.ownerDocument.documentElement:s=r;var l=ih(s,a,o);if(s.nodeName==="HTML"&&!Yw(a)){var u=Ww(e.ownerDocument),c=u.height,f=u.width;i.top+=l.top-l.marginTop,i.bottom=c+l.top,i.left+=l.left-l.marginLeft,i.right=f+l.left}else i=l}n=n||0;var d=typeof n=="number";return i.left+=d?n:n.left||0,i.top+=d?n:n.top||0,i.right-=d?n:n.right||0,i.bottom-=d?n:n.bottom||0,i}function z6(e){var t=e.width,n=e.height;return t*n}function Gw(e,t,n,r,o){var i=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=ah(n,r,i,o),s={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},l=Object.keys(s).map(function(d){return Mt({key:d},s[d],{area:z6(s[d])})}).sort(function(d,p){return p.area-d.area}),u=l.filter(function(d){var p=d.width,m=d.height;return p>=n.clientWidth&&m>=n.clientHeight}),c=u.length>0?u[0].key:l[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function $w(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,o=r?zw(t):$l(t,jw(n));return ih(n,o,r)}function Hw(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),o=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),i={width:e.offsetWidth+o,height:e.offsetHeight+r};return i}function Hl(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function Vw(e,t,n){n=n.split("-")[0];var r=Hw(e),o={width:r.width,height:r.height},i=["right","left"].indexOf(n)!==-1,a=i?"top":"left",s=i?"left":"top",l=i?"height":"width",u=i?"width":"height";return o[a]=t[a]+t[l]/2-r[l]/2,n===s?o[s]=t[s]-r[u]:o[s]=t[Hl(s)],o}function os(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function G6(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(o){return o[t]===n});var r=os(e,function(o){return o[t]===n});return e.indexOf(r)}function Jw(e,t,n){var r=n===void 0?e:e.slice(0,G6(e,"name",n));return r.forEach(function(o){o.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var i=o.function||o.fn;o.enabled&&Bw(i)&&(t.offsets.popper=pr(t.offsets.popper),t.offsets.reference=pr(t.offsets.reference),t=i(t,o))}),t}function $6(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=$w(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=Gw(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=Vw(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=Jw(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function Qw(e,t){return e.some(function(n){var r=n.name,o=n.enabled;return o&&r===t})}function sh(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=s[f]+m-a[p]),e.offsets.popper=pr(e.offsets.popper);var y=s[f]+s[u]/2-m/2,h=Hr(e.instance.popper),v=parseFloat(h["margin"+c]),w=parseFloat(h["border"+c+"Width"]),S=y-e.offsets.popper[f]-v-w;return S=Math.max(Math.min(a[u]-m,S),0),e.arrowElement=r,e.offsets.arrow=(n={},zo(n,f,Math.round(S)),zo(n,d,""),n),e}function oI(e){return e==="end"?"start":e==="start"?"end":e}var Zw=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],Uc=Zw.slice(3);function Sg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=Uc.indexOf(e),r=Uc.slice(n+1).concat(Uc.slice(0,n));return t?r.reverse():r}var Bc={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function iI(e,t){if(Qw(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=ah(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],o=Hl(r),i=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case Bc.FLIP:a=[r,o];break;case Bc.CLOCKWISE:a=Sg(r);break;case Bc.COUNTERCLOCKWISE:a=Sg(r,!0);break;default:a=t.behavior}return a.forEach(function(s,l){if(r!==s||a.length===l+1)return e;r=e.placement.split("-")[0],o=Hl(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),y=f(u.top)f(n.bottom),v=r==="left"&&p||r==="right"&&m||r==="top"&&y||r==="bottom"&&h,w=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(w&&i==="start"&&p||w&&i==="end"&&m||!w&&i==="start"&&y||!w&&i==="end"&&h),A=!!t.flipVariationsByContent&&(w&&i==="start"&&m||w&&i==="end"&&p||!w&&i==="start"&&h||!w&&i==="end"&&y),T=S||A;(d||v||T)&&(e.flipped=!0,(d||v)&&(r=a[l+1]),T&&(i=oI(i)),e.placement=r+(i?"-"+i:""),e.offsets.popper=Mt({},e.offsets.popper,Vw(e.instance.popper,e.offsets.reference,e.placement)),e=Jw(e.instance.modifiers,e,"flip"))}),e}function aI(e){var t=e.offsets,n=t.popper,r=t.reference,o=e.placement.split("-")[0],i=Math.floor,a=["top","bottom"].indexOf(o)!==-1,s=a?"right":"bottom",l=a?"left":"top",u=a?"width":"height";return n[s]i(r[s])&&(e.offsets.popper[l]=i(r[s])),e}function sI(e,t,n,r){var o=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),i=+o[1],a=o[2];if(!i)return e;if(a.indexOf("%")===0){var s=void 0;switch(a){case"%p":s=n;break;case"%":case"%r":default:s=r}var l=pr(s);return l[t]/100*i}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*i}else return i}function lI(e,t,n,r){var o=[0,0],i=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),s=a.indexOf(os(a,function(c){return c.search(/,|\s/)!==-1}));a[s]&&a[s].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var l=/\s*,\s*|\s+/,u=s!==-1?[a.slice(0,s).concat([a[s].split(l)[0]]),[a[s].split(l)[1]].concat(a.slice(s+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!i:i)?"height":"width",p=!1;return c.reduce(function(m,y){return m[m.length-1]===""&&["+","-"].indexOf(y)!==-1?(m[m.length-1]=y,p=!0,m):p?(m[m.length-1]+=y,p=!1,m):m.concat(y)},[]).map(function(m){return sI(m,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){lh(d)&&(o[f]+=d*(c[p-1]==="-"?-1:1))})}),o}function uI(e,t){var n=t.offset,r=e.placement,o=e.offsets,i=o.popper,a=o.reference,s=r.split("-")[0],l=void 0;return lh(+n)?l=[+n,0]:l=lI(n,i,a,s),s==="left"?(i.top+=l[0],i.left-=l[1]):s==="right"?(i.top+=l[0],i.left+=l[1]):s==="top"?(i.left+=l[0],i.top-=l[1]):s==="bottom"&&(i.left+=l[0],i.top+=l[1]),e.popper=i,e}function cI(e,t){var n=t.boundariesElement||Wo(e.instance.popper);e.instance.reference===n&&(n=Wo(n));var r=sh("transform"),o=e.instance.popper.style,i=o.top,a=o.left,s=o[r];o.top="",o.left="",o[r]="";var l=ah(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);o.top=i,o.left=a,o[r]=s,t.boundaries=l;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var m=c[p];return c[p]l[p]&&!t.escapeWithReference&&(y=Math.min(c[m],l[p]-(p==="right"?c.width:c.height))),zo({},m,y)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=Mt({},c,f[p](d))}),e.offsets.popper=c,e}function fI(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var o=e.offsets,i=o.reference,a=o.popper,s=["bottom","top"].indexOf(n)!==-1,l=s?"left":"top",u=s?"width":"height",c={start:zo({},l,i[l]),end:zo({},l,i[l]+i[u]-a[u])};e.offsets.popper=Mt({},a,c[r])}return e}function dI(e){if(!qw(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=os(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};j6(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=F6(this.update.bind(this)),this.options=Mt({},e.Defaults,o),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(Mt({},e.Defaults.modifiers,o.modifiers)).forEach(function(a){r.options.modifiers[a]=Mt({},e.Defaults.modifiers[a]||{},o.modifiers?o.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return Mt({name:a},r.options.modifiers[a])}).sort(function(a,s){return a.order-s.order}),this.modifiers.forEach(function(a){a.enabled&&Bw(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var i=this.options.eventsEnabled;i&&this.enableEventListeners(),this.state.eventsEnabled=i}return W6(e,[{key:"update",value:function(){return $6.call(this)}},{key:"destroy",value:function(){return H6.call(this)}},{key:"enableEventListeners",value:function(){return J6.call(this)}},{key:"disableEventListeners",value:function(){return X6.call(this)}}]),e}();ju.Utils=(typeof window!="undefined"?window:global).PopperUtils;ju.placements=Zw;ju.Defaults=mI;const bg=ju;var eS={},tS={exports:{}};(function(e,t){(function(n,r){var o=r(n);e.exports=o})(Fg,function(n){var r=["N","E","A","D"];function o(b,E){b.super_=E,b.prototype=Object.create(E.prototype,{constructor:{value:b,enumerable:!1,writable:!0,configurable:!0}})}function i(b,E){Object.defineProperty(this,"kind",{value:b,enumerable:!0}),E&&E.length&&Object.defineProperty(this,"path",{value:E,enumerable:!0})}function a(b,E,x){a.super_.call(this,"E",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0}),Object.defineProperty(this,"rhs",{value:x,enumerable:!0})}o(a,i);function s(b,E){s.super_.call(this,"N",b),Object.defineProperty(this,"rhs",{value:E,enumerable:!0})}o(s,i);function l(b,E){l.super_.call(this,"D",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0})}o(l,i);function u(b,E,x){u.super_.call(this,"A",b),Object.defineProperty(this,"index",{value:E,enumerable:!0}),Object.defineProperty(this,"item",{value:x,enumerable:!0})}o(u,i);function c(b,E,x){var _=b.slice((x||E)+1||b.length);return b.length=E<0?b.length+E:E,b.push.apply(b,_),b}function f(b){var E=typeof b;return E!=="object"?E:b===Math?"math":b===null?"null":Array.isArray(b)?"array":Object.prototype.toString.call(b)==="[object Date]"?"date":typeof b.toString=="function"&&/^\/.*\//.test(b.toString())?"regexp":"object"}function d(b){var E=0;if(b.length===0)return E;for(var x=0;x0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,D),ue=ye!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,D);if(!le&&ue)x.push(new s(H,E));else if(!ue&&le)x.push(new l(H,b));else if(f(b)!==f(E))x.push(new a(H,b,E));else if(f(b)==="date"&&b-E!==0)x.push(new a(H,b,E));else if(he==="object"&&b!==null&&E!==null){for(ne=B.length-1;ne>-1;--ne)if(B[ne].lhs===b){V=!0;break}if(V)b!==E&&x.push(new a(H,b,E));else{if(B.push({lhs:b,rhs:E}),Array.isArray(b)){for(q&&(b.sort(function(Ue,rt){return p(Ue)-p(rt)}),E.sort(function(Ue,rt){return p(Ue)-p(rt)})),ne=E.length-1,R=b.length-1;ne>R;)x.push(new u(H,ne,new s(void 0,E[ne--])));for(;R>ne;)x.push(new u(H,R,new l(void 0,b[R--])));for(;ne>=0;--ne)m(b[ne],E[ne],x,_,H,ne,B,q)}else{var ze=Object.keys(b),Fe=Object.keys(E);for(ne=0;ne=0?(m(b[Y],E[Y],x,_,H,Y,B,q),Fe[V]=null):m(b[Y],void 0,x,_,H,Y,B,q);for(ne=0;ne -*/var vI={set:wI,get:gI,has:yI,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:SI};function gI(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,o){return r&&r[o]},e)}else return typeof t=="number"?e[t]:e;else return e}function yI(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a,s){return a==s.length-1?n.own?!!(o&&o.hasOwnProperty(i)):o!==null&&typeof o=="object"&&i in o:o&&o[i]},e)}else return typeof t=="number"?t in e:!1;else return!1}function wI(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a){const s=Number.isInteger(Number(r[a+1]));return o[i]=o[i]||(s?[]:{}),r.length==a+1&&(o[i]=n),o[i]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function SI(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var o=t.split("."),i=!1,a;return a=!!o.reduce(function(s,l){return i=i||s===n||!!s&&s[l]===n,s&&s[l]},e),r.validPath?i&&a:i}else return!1;else return!1}Object.defineProperty(eS,"__esModule",{value:!0});var bI=tS.exports,dt=vI;function EI(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(o)?o.indexOf(s)>=0:s===o;return l&&(i?u:!i)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var o=dt.get(e,n),i=dt.get(t,n),a=Array.isArray(r)?r.indexOf(o)<0:o!==r,s=Array.isArray(r)?r.indexOf(i)>=0:i===r;return a&&s},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return Eg(dt.get(e,n),dt.get(t,n))&&dt.get(e,n)dt.get(t,n)}}}var xI=eS.default=AI;function Cg(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Ee(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function nS(e,t){if(e==null)return{};var n=_I(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function bn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function rS(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:bn(e)}function ls(e){var t=OI();return function(){var r=Vl(e),o;if(t){var i=Vl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return rS(this,o)}}var PI={flip:{padding:20},preventOverflow:{padding:10}},ae={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},an=Dw.canUseDOM,Ai=nr.createPortal!==void 0;function jc(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ns(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd())}function kI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function TI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function II(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,o;o=function(a){n(a),TI(e,t,o)},kI(e,t,o,r)}function xg(){}var oS=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),an?(o.node=document.createElement("div"),r.id&&(o.node.id=r.id),r.zIndex&&(o.node.style.zIndex=r.zIndex),document.body.appendChild(o.node),o):rS(o)}return as(n,[{key:"componentDidMount",value:function(){!an||Ai||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!an||Ai||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!an||!this.node||(Ai||nr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!an)return null;var o=this.props,i=o.children,a=o.setRef;if(Ai)return nr.createPortal(i,this.node);var s=nr.unstable_renderSubtreeIntoContainer(this,i.length>1?g("div",{children:i}):i[0],this.node);return a(s),null}},{key:"renderReact16",value:function(){var o=this.props,i=o.hasChildren,a=o.placement,s=o.target;return i?this.renderPortal():s||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return Ai?this.renderReact16():null}}]),n}(I.Component);qe(oS,"propTypes",{children:M.exports.oneOfType([M.exports.element,M.exports.array]),hasChildren:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),placement:M.exports.string,setRef:M.exports.func.isRequired,target:M.exports.oneOfType([M.exports.object,M.exports.string]),zIndex:M.exports.number});var iS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"parentStyle",get:function(){var o=this.props,i=o.placement,a=o.styles,s=a.arrow.length,l={pointerEvents:"none",position:"absolute",width:"100%"};return i.startsWith("top")?(l.bottom=0,l.left=0,l.right=0,l.height=s):i.startsWith("bottom")?(l.left=0,l.right=0,l.top=0,l.height=s):i.startsWith("left")?(l.right=0,l.top=0,l.bottom=0):i.startsWith("right")&&(l.left=0,l.top=0),l}},{key:"render",value:function(){var o=this.props,i=o.placement,a=o.setArrowRef,s=o.styles,l=s.arrow,u=l.color,c=l.display,f=l.length,d=l.margin,p=l.position,m=l.spread,y={display:c,position:p},h,v=m,w=f;return i.startsWith("top")?(h="0,0 ".concat(v/2,",").concat(w," ").concat(v,",0"),y.bottom=0,y.marginLeft=d,y.marginRight=d):i.startsWith("bottom")?(h="".concat(v,",").concat(w," ").concat(v/2,",0 0,").concat(w),y.top=0,y.marginLeft=d,y.marginRight=d):i.startsWith("left")?(w=m,v=f,h="0,0 ".concat(v,",").concat(w/2," 0,").concat(w),y.right=0,y.marginTop=d,y.marginBottom=d):i.startsWith("right")&&(w=m,v=f,h="".concat(v,",").concat(w," ").concat(v,",0 0,").concat(w/2),y.left=0,y.marginTop=d,y.marginBottom=d),g("div",{className:"__floater__arrow",style:this.parentStyle,children:g("span",{ref:a,style:y,children:g("svg",{width:v,height:w,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:g("polygon",{points:h,fill:u})})})})}}]),n}(I.Component);qe(iS,"propTypes",{placement:M.exports.string.isRequired,setArrowRef:M.exports.func.isRequired,styles:M.exports.object.isRequired});var NI=["color","height","width"],aS=function(t){var n=t.handleClick,r=t.styles,o=r.color,i=r.height,a=r.width,s=nS(r,NI);return g("button",{"aria-label":"close",onClick:n,style:s,type:"button",children:g("svg",{width:"".concat(a,"px"),height:"".concat(i,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})})};aS.propTypes={handleClick:M.exports.func.isRequired,styles:M.exports.object.isRequired};var sS=function(t){var n=t.content,r=t.footer,o=t.handleClick,i=t.open,a=t.positionWrapper,s=t.showCloseButton,l=t.title,u=t.styles,c={content:I.isValidElement(n)?n:g("div",{className:"__floater__content",style:u.content,children:n})};return l&&(c.title=I.isValidElement(l)?l:g("div",{className:"__floater__title",style:u.title,children:l})),r&&(c.footer=I.isValidElement(r)?r:g("div",{className:"__floater__footer",style:u.footer,children:r})),(s||a)&&!P.boolean(i)&&(c.close=g(aS,{styles:u.close,handleClick:o})),N("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};sS.propTypes={content:M.exports.node.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,open:M.exports.bool,positionWrapper:M.exports.bool.isRequired,showCloseButton:M.exports.bool.isRequired,styles:M.exports.object.isRequired,title:M.exports.node};var lS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"style",get:function(){var o=this.props,i=o.disableAnimation,a=o.component,s=o.placement,l=o.hideArrow,u=o.status,c=o.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,m=c.floaterClosing,y=c.floaterOpening,h=c.floaterWithAnimation,v=c.floaterWithComponent,w={};return l||(s.startsWith("top")?w.padding="0 0 ".concat(f,"px"):s.startsWith("bottom")?w.padding="".concat(f,"px 0 0"):s.startsWith("left")?w.padding="0 ".concat(f,"px 0 0"):s.startsWith("right")&&(w.padding="0 0 0 ".concat(f,"px"))),[ae.OPENING,ae.OPEN].indexOf(u)!==-1&&(w=Ee(Ee({},w),y)),u===ae.CLOSING&&(w=Ee(Ee({},w),m)),u===ae.OPEN&&!i&&(w=Ee(Ee({},w),h)),s==="center"&&(w=Ee(Ee({},w),p)),a&&(w=Ee(Ee({},w),v)),Ee(Ee({},d),w)}},{key:"render",value:function(){var o=this.props,i=o.component,a=o.handleClick,s=o.hideArrow,l=o.setFloaterRef,u=o.status,c={},f=["__floater"];return i?I.isValidElement(i)?c.content=I.cloneElement(i,{closeFn:a}):c.content=i({closeFn:a}):c.content=g(sS,F({},this.props)),u===ae.OPEN&&f.push("__floater__open"),s||(c.arrow=g(iS,F({},this.props))),g("div",{ref:l,className:f.join(" "),style:this.style,children:N("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(I.Component);qe(lS,"propTypes",{component:M.exports.oneOfType([M.exports.func,M.exports.element]),content:M.exports.node,disableAnimation:M.exports.bool.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,hideArrow:M.exports.bool.isRequired,open:M.exports.bool,placement:M.exports.string.isRequired,positionWrapper:M.exports.bool.isRequired,setArrowRef:M.exports.func.isRequired,setFloaterRef:M.exports.func.isRequired,showCloseButton:M.exports.bool,status:M.exports.string.isRequired,styles:M.exports.object.isRequired,title:M.exports.node});var uS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"render",value:function(){var o=this.props,i=o.children,a=o.handleClick,s=o.handleMouseEnter,l=o.handleMouseLeave,u=o.setChildRef,c=o.setWrapperRef,f=o.style,d=o.styles,p;if(i)if(I.Children.count(i)===1)if(!I.isValidElement(i))p=g("span",{children:i});else{var m=P.function(i.type)?"innerRef":"ref";p=I.cloneElement(I.Children.only(i),qe({},m,u))}else p=i;return p?g("span",{ref:c,style:Ee(Ee({},d),f),onClick:a,onMouseEnter:s,onMouseLeave:l,children:p}):null}}]),n}(I.Component);qe(uS,"propTypes",{children:M.exports.node,handleClick:M.exports.func.isRequired,handleMouseEnter:M.exports.func.isRequired,handleMouseLeave:M.exports.func.isRequired,setChildRef:M.exports.func.isRequired,setWrapperRef:M.exports.func.isRequired,style:M.exports.object,styles:M.exports.object.isRequired});var DI={zIndex:100};function RI(e){var t=on(DI,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var LI=["arrow","flip","offset"],MI=["position","top","right","bottom","left"],uh=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),qe(bn(o),"setArrowRef",function(i){o.arrowRef=i}),qe(bn(o),"setChildRef",function(i){o.childRef=i}),qe(bn(o),"setFloaterRef",function(i){o.floaterRef||(o.floaterRef=i)}),qe(bn(o),"setWrapperRef",function(i){o.wrapperRef=i}),qe(bn(o),"handleTransitionEnd",function(){var i=o.state.status,a=o.props.callback;o.wrapperPopper&&o.wrapperPopper.instance.update(),o.setState({status:i===ae.OPENING?ae.OPEN:ae.IDLE},function(){var s=o.state.status;a(s===ae.OPEN?"open":"close",o.props)})}),qe(bn(o),"handleClick",function(){var i=o.props,a=i.event,s=i.open;if(!P.boolean(s)){var l=o.state,u=l.positionWrapper,c=l.status;(o.event==="click"||o.event==="hover"&&u)&&(Ns({title:"click",data:[{event:a,status:c===ae.OPEN?"closing":"opening"}],debug:o.debug}),o.toggle())}}),qe(bn(o),"handleMouseEnter",function(){var i=o.props,a=i.event,s=i.open;if(!(P.boolean(s)||jc())){var l=o.state.status;o.event==="hover"&&l===ae.IDLE&&(Ns({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:o.debug}),clearTimeout(o.eventDelayTimeout),o.toggle())}}),qe(bn(o),"handleMouseLeave",function(){var i=o.props,a=i.event,s=i.eventDelay,l=i.open;if(!(P.boolean(l)||jc())){var u=o.state,c=u.status,f=u.positionWrapper;o.event==="hover"&&(Ns({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:o.debug}),s?[ae.OPENING,ae.OPEN].indexOf(c)!==-1&&!f&&!o.eventDelayTimeout&&(o.eventDelayTimeout=setTimeout(function(){delete o.eventDelayTimeout,o.toggle()},s*1e3)):o.toggle(ae.IDLE))}}),o.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ae.INIT,statusWrapper:ae.INIT},o._isMounted=!1,an&&window.addEventListener("load",function(){o.popper&&o.popper.instance.update(),o.wrapperPopper&&o.wrapperPopper.instance.update()}),o}return as(n,[{key:"componentDidMount",value:function(){if(!!an){var o=this.state.positionWrapper,i=this.props,a=i.children,s=i.open,l=i.target;this._isMounted=!0,Ns({title:"init",data:{hasChildren:!!a,hasTarget:!!l,isControlled:P.boolean(s),positionWrapper:o,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&l&&P.boolean(s)}}},{key:"componentDidUpdate",value:function(o,i){if(!!an){var a=this.props,s=a.autoOpen,l=a.open,u=a.target,c=a.wrapperOptions,f=xI(i,this.state),d=f.changedFrom,p=f.changedTo;if(o.open!==l){var m;P.boolean(l)&&(m=l?ae.OPENING:ae.CLOSING),this.toggle(m)}(o.wrapperOptions.position!==c.position||o.target!==u)&&this.changeWrapperPosition(this.props),p("status",ae.IDLE)&&l?this.toggle(ae.OPEN):d("status",ae.INIT,ae.IDLE)&&s&&this.toggle(ae.OPEN),this.popper&&p("status",ae.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ae.OPENING)||p("status",ae.CLOSING))&&II(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!an||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var o=this,i=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,s=this.props,l=s.disableFlip,u=s.getPopper,c=s.hideArrow,f=s.offset,d=s.placement,p=s.wrapperOptions,m=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ae.IDLE});else if(i&&this.floaterRef){var y=this.options,h=y.arrow,v=y.flip,w=y.offset,S=nS(y,LI);new bg(i,this.floaterRef,{placement:d,modifiers:Ee({arrow:Ee({enabled:!c,element:this.arrowRef},h),flip:Ee({enabled:!l,behavior:m},v),offset:Ee({offset:"0, ".concat(f,"px")},w)},S),onCreate:function(C){o.popper=C,u(C,"floater"),o._isMounted&&o.setState({currentPlacement:C.placement,status:ae.IDLE}),d!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){o.popper=C;var O=o.state.currentPlacement;o._isMounted&&C.placement!==O&&o.setState({currentPlacement:C.placement})}})}if(a){var A=P.undefined(p.offset)?0:p.offset;new bg(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(A,"px")},flip:{enabled:!1}},onCreate:function(C){o.wrapperPopper=C,o._isMounted&&o.setState({statusWrapper:ae.IDLE}),u(C,"wrapper"),d!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(o){var i=o.target,a=o.wrapperOptions;this.setState({positionWrapper:a.position&&!!i})}},{key:"toggle",value:function(o){var i=this.state.status,a=i===ae.OPEN?ae.CLOSING:ae.OPENING;P.undefined(o)||(a=o),this.setState({status:a})}},{key:"debug",get:function(){var o=this.props.debug;return o||!!global.ReactFloaterDebug}},{key:"event",get:function(){var o=this.props,i=o.disableHoverToClick,a=o.event;return a==="hover"&&jc()&&!i?"click":a}},{key:"options",get:function(){var o=this.props.options;return on(PI,o||{})}},{key:"styles",get:function(){var o=this,i=this.state,a=i.status,s=i.positionWrapper,l=i.statusWrapper,u=this.props.styles,c=on(RI(u),u);if(s){var f;[ae.IDLE].indexOf(a)===-1||[ae.IDLE].indexOf(l)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Ee(Ee({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},s||(MI.forEach(function(p){o.wrapperStyles[p]=d[p]}),c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!an)return null;var o=this.props.target;return o?P.domElement(o)?o:document.querySelector(o):this.childRef||this.wrapperRef}},{key:"render",value:function(){var o=this.state,i=o.currentPlacement,a=o.positionWrapper,s=o.status,l=this.props,u=l.children,c=l.component,f=l.content,d=l.disableAnimation,p=l.footer,m=l.hideArrow,y=l.id,h=l.open,v=l.showCloseButton,w=l.style,S=l.target,A=l.title,T=g(uS,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:w,styles:this.styles.wrapper,children:u}),C={};return a?C.wrapperInPortal=T:C.wrapperAsChildren=T,N("span",{children:[N(oS,{hasChildren:!!u,id:y,placement:i,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[g(lS,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:m||i==="center",open:h,placement:i,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:v,status:s,styles:this.styles,title:A}),C.wrapperInPortal]}),C.wrapperAsChildren]})}}]),n}(I.Component);qe(uh,"propTypes",{autoOpen:M.exports.bool,callback:M.exports.func,children:M.exports.node,component:mg(M.exports.oneOfType([M.exports.func,M.exports.element]),function(e){return!e.content}),content:mg(M.exports.node,function(e){return!e.component}),debug:M.exports.bool,disableAnimation:M.exports.bool,disableFlip:M.exports.bool,disableHoverToClick:M.exports.bool,event:M.exports.oneOf(["hover","click"]),eventDelay:M.exports.number,footer:M.exports.node,getPopper:M.exports.func,hideArrow:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),offset:M.exports.number,open:M.exports.bool,options:M.exports.object,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:M.exports.bool,style:M.exports.object,styles:M.exports.object,target:M.exports.oneOfType([M.exports.object,M.exports.string]),title:M.exports.node,wrapperOptions:M.exports.shape({offset:M.exports.number,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:M.exports.bool})});qe(uh,"defaultProps",{autoOpen:!1,callback:xg,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:xg,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function Og(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function W(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function Ql(e,t){if(e==null)return{};var n=UI(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Pe(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function cS(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return Pe(e)}function Jr(e){var t=FI();return function(){var r=Jl(e),o;if(t){var i=Jl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return cS(this,o)}}var oe={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},it={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ee={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},re={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},Cn=Dw.canUseDOM,xi=Na.exports.createPortal!==void 0;function fS(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function Wc(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function Oi(e){var t=[],n=function r(o){if(typeof o=="string"||typeof o=="number")t.push(o);else if(Array.isArray(o))o.forEach(function(a){return r(a)});else if(o&&o.props){var i=o.props.children;Array.isArray(i)?i.forEach(function(a){return r(a)}):r(i)}};return n(e),t.join(" ").trim()}function Pg(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function BI(e,t){return!P.plainObject(e)||!P.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function jI(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(o,i,a,s){return i+i+a+a+s+s}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function kg(e){return e.disableBeacon||e.placement==="center"}function ld(e,t){var n,r=j.exports.isValidElement(e)||j.exports.isValidElement(t),o=P.undefined(e)||P.undefined(t);if(Wc(e)!==Wc(t)||r||o)return!1;if(P.domElement(e))return e.isSameNode(t);if(P.number(e))return e===t;if(P.function(e))return e.toString()===t.toString();for(var i in e)if(Pg(e,i)){if(typeof e[i]=="undefined"||typeof t[i]=="undefined")return!1;if(n=Wc(e[i]),["object","array"].indexOf(n)!==-1&&ld(e[i],t[i])||n==="function"&&ld(e[i],t[i]))continue;if(e[i]!==t[i])return!1}for(var a in t)if(Pg(t,a)&&typeof e[a]=="undefined")return!1;return!0}function Tg(){return["chrome","safari","firefox","opera"].indexOf(fS())===-1}function jr(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var WI={action:"",controlled:!1,index:0,lifecycle:ee.INIT,size:0,status:re.IDLE},Ig=["action","index","lifecycle","status"];function YI(e){var t=new Map,n=new Map,r=function(){function o(){var i=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},s=a.continuous,l=s===void 0?!1:s,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;Ln(this,o),J(this,"listener",void 0),J(this,"setSteps",function(d){var p=i.getState(),m=p.size,y=p.status,h={size:d.length,status:y};n.set("steps",d),y===re.WAITING&&!m&&d.length&&(h.status=re.RUNNING),i.setState(h)}),J(this,"addListener",function(d){i.listener=d}),J(this,"update",function(d){if(!BI(d,Ig))throw new Error("State is not valid. Valid keys: ".concat(Ig.join(", ")));i.setState(W({},i.getNextState(W(W(W({},i.getState()),d),{},{action:d.action||oe.UPDATE}),!0)))}),J(this,"start",function(d){var p=i.getState(),m=p.index,y=p.size;i.setState(W(W({},i.getNextState({action:oe.START,index:P.number(d)?d:m},!0)),{},{status:y?re.RUNNING:re.WAITING}))}),J(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.index,y=p.status;[re.FINISHED,re.SKIPPED].indexOf(y)===-1&&i.setState(W(W({},i.getNextState({action:oe.STOP,index:m+(d?1:0)})),{},{status:re.PAUSED}))}),J(this,"close",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.CLOSE,index:p+1})))}),J(this,"go",function(d){var p=i.getState(),m=p.controlled,y=p.status;if(!(m||y!==re.RUNNING)){var h=i.getSteps()[d];i.setState(W(W({},i.getNextState({action:oe.GO,index:d})),{},{status:h?y:re.FINISHED}))}}),J(this,"info",function(){return i.getState()}),J(this,"next",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(i.getNextState({action:oe.NEXT,index:p+1}))}),J(this,"open",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.UPDATE,lifecycle:ee.TOOLTIP})))}),J(this,"prev",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.PREV,index:p-1})))}),J(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.controlled;m||i.setState(W(W({},i.getNextState({action:oe.RESET,index:0})),{},{status:d?re.RUNNING:re.READY}))}),J(this,"skip",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState({action:oe.SKIP,lifecycle:ee.INIT,status:re.SKIPPED})}),this.setState({action:oe.INIT,controlled:P.number(u),continuous:l,index:P.number(u)?u:0,lifecycle:ee.INIT,status:f.length?re.READY:re.IDLE},!0),this.setSteps(f)}return Mn(o,[{key:"setState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=W(W({},l),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,m=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",m),s&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(l)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:W({},WI)}},{key:"getNextState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=l.action,c=l.controlled,f=l.index,d=l.size,p=l.status,m=P.number(a.index)?a.index:f,y=c&&!s?f:Math.min(Math.max(m,0),d);return{action:a.action||u,controlled:c,index:y,lifecycle:a.lifecycle||ee.INIT,size:a.size||d,status:y===d?re.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var s=JSON.stringify(a),l=JSON.stringify(this.getState());return s!==l}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),o}();return new r(e)}function aa(){return document.scrollingElement||document.createElement("body")}function dS(e){return e?e.getBoundingClientRect():{}}function zI(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function or(e){return typeof e=="string"?document.querySelector(e):e}function GI(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function Wu(e,t,n){var r=Lw(e);if(r.isSameNode(aa()))return n?document:aa();var o=r.scrollHeight>r.offsetHeight;return!o&&!t?(r.style.overflow="initial",aa()):r}function Yu(e,t){if(!e)return!1;var n=Wu(e,t);return!n.isSameNode(aa())}function $I(e){return e.offsetParent!==document.body}function Go(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:GI(e).position===t?!0:Go(e.parentNode,t)}function HI(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,o=n.visibility;if(r==="none"||o==="hidden")return!1}t=t.parentNode}return!0}function VI(e,t,n){var r=dS(e),o=Wu(e,n),i=Yu(e,n),a=0;o instanceof HTMLElement&&(a=o.scrollTop);var s=r.top+(!i&&!Go(e)?a:0);return Math.floor(s-t)}function ud(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?ud(e.offsetParent)+e.offsetTop:e.offsetTop:0}function JI(e,t,n){if(!e)return 0;var r=Lw(e),o=ud(e);return Yu(e,n)&&!$I(e)&&(o-=ud(r)),Math.floor(o-t)}function QI(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:aa(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,o){var i=t.scrollTop,a=e>i?e-i:i-e;i6.top(t,e,{duration:a<100?50:n},function(s){return s&&s.message!=="Element already at target scroll position"?o(s):r()})})}function XI(e){function t(r,o,i,a,s,l){var u=a||"<>",c=l||i;if(o[i]==null)return r?new Error("Required ".concat(s," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=on(KI,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return P.plainObject(e)?e.target?!0:(jr({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(jr({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function Dg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return P.array(e)?e.every(function(n){return pS(n,t)}):(jr({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var eN=Mn(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(Ln(this,e),J(this,"element",void 0),J(this,"options",void 0),J(this,"canBeTabbed",function(o){var i=o.tabIndex;(i===null||i<0)&&(i=void 0);var a=isNaN(i);return!a&&n.canHaveFocus(o)}),J(this,"canHaveFocus",function(o){var i=/input|select|textarea|button|object/,a=o.nodeName.toLowerCase(),s=i.test(a)&&!o.getAttribute("disabled")||a==="a"&&!!o.getAttribute("href");return s&&n.isVisible(o)}),J(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),J(this,"handleKeyDown",function(o){var i=n.options.keyCode,a=i===void 0?9:i;o.keyCode===a&&n.interceptTab(o)}),J(this,"interceptTab",function(o){var i=n.findValidTabElements();if(!!i.length){o.preventDefault();var a=o.shiftKey,s=i.indexOf(document.activeElement);s===-1||!a&&s+1===i.length?s=0:a&&s===0?s=i.length-1:s+=a?-1:1,i[s].focus()}}),J(this,"isHidden",function(o){var i=o.offsetWidth<=0&&o.offsetHeight<=0,a=window.getComputedStyle(o);return i&&!o.innerHTML?!0:i&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),J(this,"isVisible",function(o){for(var i=o;i;)if(i instanceof HTMLElement){if(i===document.body)break;if(n.isHidden(i))return!1;i=i.parentNode}return!0}),J(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),J(this,"checkFocus",function(o){document.activeElement!==o&&(o.focus(),window.requestAnimationFrame(function(){return n.checkFocus(o)}))}),J(this,"setFocus",function(){var o=n.options.selector;if(!!o){var i=n.element.querySelector(o);i&&window.requestAnimationFrame(function(){return n.checkFocus(i)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),tN=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;if(Ln(this,n),o=t.call(this,r),J(Pe(o),"setBeaconRef",function(l){o.beacon=l}),!r.beaconComponent){var i=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),s=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(s)),i.appendChild(a)}return o}return Mn(n,[{key:"componentDidMount",value:function(){var o=this,i=this.props.shouldFocus;setTimeout(function(){P.domElement(o.beacon)&&i&&o.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var o=document.getElementById("joyride-beacon-animation");o&&o.parentNode.removeChild(o)}},{key:"render",value:function(){var o=this.props,i=o.beaconComponent,a=o.locale,s=o.onClickOrHover,l=o.styles,u={"aria-label":a.open,onClick:s,onMouseEnter:s,ref:this.setBeaconRef,title:a.open},c;if(i){var f=i;c=g(f,F({},u))}else c=N("button",$(F({className:"react-joyride__beacon",style:l.beacon,type:"button"},u),{children:[g("span",{style:l.beaconInner}),g("span",{style:l.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(I.Component),nN=function(t){var n=t.styles;return g("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},rN=["mixBlendMode","zIndex"],oN=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a=p&&y<=p+c,w=h>=f&&h<=f+m,S=w&&v;S!==l&&r.updateState({mouseOverSpotlight:S})}),J(Pe(r),"handleScroll",function(){var s=r.props.target,l=or(s);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Go(l,"sticky")&&r.updateState({})}),J(Pe(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return Mn(n,[{key:"componentDidMount",value:function(){var o=this.props;o.debug,o.disableScrolling;var i=o.disableScrollParentFix,a=o.target,s=or(a);this.scrollParent=Wu(s,i,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(o){var i=this,a=this.props,s=a.lifecycle,l=a.spotlightClicks,u=Gl(o,this.props),c=u.changed;c("lifecycle",ee.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=i.state.isScrolling;f||i.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(l&&s===ee.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):s!==ee.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var o=this.state.showSpotlight,i=this.props,a=i.disableScrollParentFix,s=i.spotlightClicks,l=i.spotlightPadding,u=i.styles,c=i.target,f=or(c),d=dS(f),p=Go(f),m=VI(f,l,a);return W(W({},Tg()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+l*2),left:Math.round(d.left-l),opacity:o?1:0,pointerEvents:s?"none":"auto",position:p?"fixed":"absolute",top:m,transition:"opacity 0.2s",width:Math.round(d.width+l*2)})}},{key:"updateState",value:function(o){!this._isMounted||this.setState(o)}},{key:"render",value:function(){var o=this.state,i=o.mouseOverSpotlight,a=o.showSpotlight,s=this.props,l=s.disableOverlay,u=s.disableOverlayClose,c=s.lifecycle,f=s.onClickOverlay,d=s.placement,p=s.styles;if(l||c!==ee.TOOLTIP)return null;var m=p.overlay;Tg()&&(m=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var y=W({cursor:u?"default":"pointer",height:zI(),pointerEvents:i?"none":"auto"},m),h=d!=="center"&&a&&g(nN,{styles:this.spotlightStyles});if(fS()==="safari"){y.mixBlendMode,y.zIndex;var v=Ql(y,rN);h=g("div",{style:W({},v),children:h}),delete y.backgroundColor}return g("div",{className:"react-joyride__overlay",style:y,onClick:f,children:h})}}]),n}(I.Component),iN=["styles"],aN=["color","height","width"],sN=function(t){var n=t.styles,r=Ql(t,iN),o=n.color,i=n.height,a=n.width,s=Ql(n,aN);return g("button",$(F({style:s,type:"button"},r),{children:g("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof i=="number"?"".concat(i,"px"):i,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})}))},lN=function(e){Vr(n,e);var t=Jr(n);function n(){return Ln(this,n),t.apply(this,arguments)}return Mn(n,[{key:"render",value:function(){var o=this.props,i=o.backProps,a=o.closeProps,s=o.continuous,l=o.index,u=o.isLastStep,c=o.primaryProps,f=o.size,d=o.skipProps,p=o.step,m=o.tooltipProps,y=p.content,h=p.hideBackButton,v=p.hideCloseButton,w=p.hideFooter,S=p.showProgress,A=p.showSkipButton,T=p.title,C=p.styles,O=p.locale,b=O.back,E=O.close,x=O.last,_=O.next,k=O.skip,D={primary:E};return s&&(D.primary=u?x:_,S&&(D.primary=N("span",{children:[D.primary," (",l+1,"/",f,")"]}))),A&&!u&&(D.skip=g("button",$(F({style:C.buttonSkip,type:"button","aria-live":"off"},d),{children:k}))),!h&&l>0&&(D.back=g("button",$(F({style:C.buttonBack,type:"button"},i),{children:b}))),D.close=!v&&g(sN,F({styles:C.buttonClose},a)),N("div",$(F({className:"react-joyride__tooltip",style:C.tooltip},m),{children:[N("div",{style:C.tooltipContainer,children:[T&&g("h4",{style:C.tooltipTitle,"aria-label":T,children:T}),g("div",{style:C.tooltipContent,children:y})]}),!w&&N("div",{style:C.tooltipFooter,children:[g("div",{style:C.tooltipFooterSpacer,children:D.skip}),D.back,g("button",$(F({style:C.buttonNext,type:"button"},c),{children:D.primary}))]}),D.close]}),"JoyrideTooltip")}}]),n}(I.Component),uN=["beaconComponent","tooltipComponent"],cN=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a0||a===oe.PREV),C=w("action")||w("index")||w("lifecycle")||w("status"),O=S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT),b=w("action",[oe.NEXT,oe.PREV,oe.SKIP,oe.CLOSE]);if(b&&(O||u)&&s(W(W({},A),{},{index:o.index,lifecycle:ee.COMPLETE,step:o.step,type:it.STEP_AFTER})),w("index")&&f>0&&d===ee.INIT&&m===re.RUNNING&&y.placement==="center"&&h({lifecycle:ee.READY}),C&&y){var E=or(y.target),x=!!E,_=x&&HI(E);_?(S("status",re.READY,re.RUNNING)||S("lifecycle",ee.INIT,ee.READY))&&s(W(W({},A),{},{step:y,type:it.STEP_BEFORE})):(console.warn(x?"Target not visible":"Target not mounted",y),s(W(W({},A),{},{type:it.TARGET_NOT_FOUND,step:y})),u||h({index:f+([oe.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ee.INIT,ee.READY)&&h({lifecycle:kg(y)||T?ee.TOOLTIP:ee.BEACON}),w("index")&&jr({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),w("lifecycle",ee.BEACON)&&s(W(W({},A),{},{step:y,type:it.BEACON})),w("lifecycle",ee.TOOLTIP)&&(s(W(W({},A),{},{step:y,type:it.TOOLTIP})),this.scope=new eN(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var o=this.props,i=o.step,a=o.lifecycle;return!!(kg(i)||a===ee.TOOLTIP)}},{key:"render",value:function(){var o=this.props,i=o.continuous,a=o.debug,s=o.helpers,l=o.index,u=o.lifecycle,c=o.nonce,f=o.shouldScroll,d=o.size,p=o.step,m=or(p.target);return!pS(p)||!P.domElement(m)?null:N("div",{className:"react-joyride__step",children:[g(fN,{id:"react-joyride-portal",children:g(oN,$(F({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),g(uh,$(F({component:g(cN,{continuous:i,helpers:s,index:l,isLastStep:l+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(l),isPositioned:p.isFixed||Go(m),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:g(tN,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(l))}}]),n}(I.Component),hS=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;return Ln(this,n),o=t.call(this,r),J(Pe(o),"initStore",function(){var i=o.props,a=i.debug,s=i.getHelpers,l=i.run,u=i.stepIndex;o.store=new YI(W(W({},o.props),{},{controlled:l&&P.number(u)})),o.helpers=o.store.getHelpers();var c=o.store.addListener;return jr({title:"init",data:[{key:"props",value:o.props},{key:"state",value:o.state}],debug:a}),c(o.syncState),s(o.helpers),o.store.getState()}),J(Pe(o),"callback",function(i){var a=o.props.callback;P.function(a)&&a(i)}),J(Pe(o),"handleKeyboard",function(i){var a=o.state,s=a.index,l=a.lifecycle,u=o.props.steps,c=u[s],f=window.Event?i.which:i.keyCode;l===ee.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&o.store.close()}),J(Pe(o),"syncState",function(i){o.setState(i)}),J(Pe(o),"setPopper",function(i,a){a==="wrapper"?o.beaconPopper=i:o.tooltipPopper=i}),J(Pe(o),"shouldScroll",function(i,a,s,l,u,c,f){return!i&&(a!==0||s||l===ee.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!Go(c))&&f.lifecycle!==l&&[ee.BEACON,ee.TOOLTIP].indexOf(l)!==-1}),o.state=o.initStore(),o}return Mn(n,[{key:"componentDidMount",value:function(){if(!!Cn){var o=this.props,i=o.disableCloseOnEsc,a=o.debug,s=o.run,l=o.steps,u=this.store.start;Dg(l,a)&&s&&u(),i||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(o,i){if(!!Cn){var a=this.state,s=a.action,l=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,m=d.run,y=d.stepIndex,h=d.steps,v=o.steps,w=o.stepIndex,S=this.store,A=S.reset,T=S.setSteps,C=S.start,O=S.stop,b=S.update,E=Gl(o,this.props),x=E.changed,_=Gl(i,this.state),k=_.changed,D=_.changedFrom,B=Pi(h[u],this.props),q=!ld(v,h),H=P.number(y)&&x("stepIndex"),ce=or(B==null?void 0:B.target);if(q&&(Dg(h,p)?T(h):console.warn("Steps are not valid",h)),x("run")&&(m?C(y):O()),H){var he=w=0?C:0,l===re.RUNNING&&QI(C,T,y)}}}},{key:"render",value:function(){if(!Cn)return null;var o=this.state,i=o.index,a=o.status,s=this.props,l=s.continuous,u=s.debug,c=s.nonce,f=s.scrollToFirstStep,d=s.steps,p=Pi(d[i],this.props),m;return a===re.RUNNING&&p&&(m=g(dN,$(F({},this.state),{callback:this.callback,continuous:l,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(i!==0||f),step:p,update:this.store.update}))),g("div",{className:"react-joyride",children:m})}}]),n}(I.Component);J(hS,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const pN=N("div",{children:[g("p",{children:"You can see how the changes impact your app with the app preview."}),g("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),g("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),hN=N("div",{children:[g("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),g("p",{children:"You can click on elements to select them or drag them around to move them."}),g("p",{children:"Cards can be resized by dragging resize handles on the sides."}),g("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),g("p",{children:g("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),mN=N("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",g("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",g("span",{className:zf.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),vN=N("div",{children:[g("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),g("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),gN=[{target:".app-view",content:hN,disableBeacon:!0},{target:".elements-panel",content:mN,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:vN,placement:"left-start"},{target:".app-preview",content:pN,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function yN(){const[e,t]=j.exports.useState(0),[n,r]=j.exports.useState(!1),o=j.exports.useCallback(a=>{const{action:s,index:l,status:u,type:c}=a;console.log({action:s,index:l,status:u,type:c}),(c===it.STEP_AFTER||c===it.TARGET_NOT_FOUND)&&(s===oe.NEXT?t(l+1):s===oe.PREV?t(l-1):s===oe.CLOSE&&r(!1)),c===it.TOUR_END&&(s===oe.NEXT&&(r(!1),t(0)),s===oe.SKIP&&r(!1))},[]),i=j.exports.useCallback(()=>{r(!0)},[]);return N(Me,{children:[N(wt,{onClick:i,title:"Take a guided tour of app",variant:"transparent",children:[g(CA,{id:"tour",size:"24px"}),"Tour App"]}),g(hS,{callback:o,steps:gN,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:SN})]})}const Rg="#e07189",wN="#f6d5dc",SN={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:Rg},beaconOuter:{backgroundColor:wN,border:`2px solid ${Rg}`}},bN="_container_1ehu8_1",EN="_elementsPanel_1ehu8_28",CN="_propertiesPanel_1ehu8_33",AN="_editorHolder_1ehu8_47",xN="_titledPanel_1ehu8_59",ON="_panelTitleHeader_1ehu8_71",_N="_header_1ehu8_80",PN="_rightSide_1ehu8_88",kN="_divider_1ehu8_109",TN="_title_1ehu8_59",IN="_shinyLogo_1ehu8_120",pt={container:bN,elementsPanel:EN,propertiesPanel:CN,editorHolder:AN,titledPanel:xN,panelTitleHeader:ON,header:_N,rightSide:PN,divider:kN,title:TN,shinyLogo:IN},NN="_container_1fh41_1",DN="_node_1fh41_12",Lg={container:NN,node:DN};function RN({tree:e,path:t,onSelect:n}){const r=t.length;let o=[];for(let i=0;i<=r;i++){const a=rr(e,t.slice(0,i));if(a===void 0)return null;o.push(en[a.uiName].title)}return g("div",{className:Lg.container,children:o.map((i,a)=>g("div",{className:Lg.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:LN(i)},i+a))})}function LN(e){return e.replace(/[a-z]+::/,"")}const MN="_settingsPanel_zsgzt_1",FN="_currentElementAbout_zsgzt_10",UN="_settingsForm_zsgzt_17",BN="_settingsInputs_zsgzt_24",jN="_buttonsHolder_zsgzt_28",WN="_validationErrorMsg_zsgzt_45",ki={settingsPanel:MN,currentElementAbout:FN,settingsForm:UN,settingsInputs:BN,buttonsHolder:jN,validationErrorMsg:WN};function YN(e){const t=vr(),[n,r]=v1(),[o,i]=j.exports.useState(n!==null?rr(e,n):null),a=j.exports.useRef(!1),s=j.exports.useMemo(()=>Fp(u=>{!n||!a.current||t(Sw({path:n,node:u}))},250),[t,n]);return j.exports.useEffect(()=>{if(a.current=!1,n===null){i(null);return}rr(e,n)!==void 0&&i(rr(e,n))},[e,n]),j.exports.useEffect(()=>{!o||s(o)},[o,s]),{currentNode:o,updateArgumentsByName:({name:u,value:c})=>{i(f=>$(F({},f),{uiArguments:$(F({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function zN({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:o}=YN(e);if(r===null)return g("div",{children:"Select an element to edit properties"});if(t===null)return N("div",{children:["Error finding requested node at path ",r.join(".")]});const i=r.length===0,{uiName:a,uiArguments:s}=t,l=en[a].SettingsComponent;return N("div",{className:ki.settingsPanel+" properties-panel",children:[g("div",{className:ki.currentElementAbout,children:g(RN,{tree:e,path:r,onSelect:o})}),g("form",{className:ki.settingsForm,onSubmit:GN,children:g("div",{className:ki.settingsInputs,children:g(r2,{onChange:n,children:g(l,{settings:s})})})}),g("div",{className:ki.buttonsHolder,children:i?null:g(m1,{path:r})})]})}function GN(e){e.preventDefault()}function $N(e){return["INITIAL-DATA"].includes(e.path)}function HN(){const e=vr(),t=Ja(r=>r.uiTree),n=j.exports.useCallback(r=>{e(Ok({initialState:r}))},[e]);return{tree:t,setTree:n}}function VN(){const{tree:e,setTree:t}=HN(),{status:n,ws:r}=Ow(),[o,i]=j.exports.useState("loading"),a=j.exports.useRef(null),s=Ja(l=>l.uiTree);return j.exports.useEffect(()=>{n==="connected"&&(_w(r,l=>{!$N(l)||(a.current=l.payload,t(l.payload),i("connected"))}),ia(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(i("no-backend"),t(JN),console.log("Running in static mode"))},[t,n,r]),j.exports.useEffect(()=>{s===Zp||s===a.current||n==="connected"&&ia(r,{path:"STATE-UPDATE",payload:s})},[s,n,r]),{status:o,tree:e}}const JN={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},mS=236,QN={"--properties-panel-width":`${mS}px`};function XN(){const{status:e,tree:t}=VN();return e==="loading"?g(KN,{}):N(LA,{children:[N("div",{className:pt.container,style:QN,children:[N("div",{className:pt.header,children:[g(_T,{className:pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),g("h1",{className:pt.title,children:"Shiny UI Editor"}),N("div",{className:pt.rightSide,children:[g(yN,{}),g("div",{className:pt.divider}),g(DT,{})]})]}),N("div",{className:`${pt.elementsPanel} ${pt.titledPanel} elements-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Elements"}),g(BT,{})]}),g("div",{className:pt.editorHolder+" app-view",children:g(Ep,F({},t))}),N("div",{className:`${pt.propertiesPanel}`,children:[N("div",{className:`${pt.titledPanel} properties-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Properties"}),g(zN,{tree:t})]}),g("div",{className:`${pt.titledPanel} app-preview`,children:g(ET,{})})]})]}),g(qN,{})]})}function KN(){return g("h3",{children:"Loading initial state from server"})}function qN(){return Ja(t=>t.connectedToServer)?null:g(X1,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:g("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const ZN=()=>g(Ik,{children:g(Mk,{children:g(XN,{})})}),e5="modulepreload",t5=function(e,t){return new URL(e,t).href},Mg={},n5=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(o=>{if(o=t5(o,r),o in Mg)return;Mg[o]=!0;const i=o.endsWith(".css"),a=i?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${o}"]${a}`))return;const s=document.createElement("link");if(s.rel=i?"stylesheet":e5,i||(s.as="script",s.crossOrigin=""),s.href=o,document.head.appendChild(s),i)return new Promise((l,u)=>{s.addEventListener("load",l),s.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${o}`)))})})).then(()=>t())},r5=e=>{e&&e instanceof Function&&n5(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:o,getTTFB:i})=>{t(e),n(e),r(e),o(e),i(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function o5(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}nr.render(g(j.exports.StrictMode,{children:g(ZN,{})}),document.getElementById("root"));o5();r5(); diff --git a/docs/articles/demo-app/assets/index.c19e70b4.css b/docs/articles/demo-app/assets/index.c19e70b4.css deleted file mode 100644 index c0da750c3..000000000 --- a/docs/articles/demo-app/assets/index.c19e70b4.css +++ /dev/null @@ -1,6 +0,0 @@ -@charset "UTF-8";@import"https://fonts.googleapis.com/css2?family=Raleway:ital,wght@0,100..900;1,100..900&display=swap";/*! - * Bootstrap v5.1.3 (https://getbootstrap.com/) - * Copyright 2011-2021 The Bootstrap Authors - * Copyright 2011-2021 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE) - */:root{--bs-blue: #0d6efd;--bs-indigo: #6610f2;--bs-purple: #6f42c1;--bs-pink: #d63384;--bs-red: #dc3545;--bs-orange: #fd7e14;--bs-yellow: #ffc107;--bs-green: #198754;--bs-teal: #20c997;--bs-cyan: #0dcaf0;--bs-white: #fff;--bs-gray: #6c757d;--bs-gray-dark: #343a40;--bs-gray-100: #f8f9fa;--bs-gray-200: #e9ecef;--bs-gray-300: #dee2e6;--bs-gray-400: #ced4da;--bs-gray-500: #adb5bd;--bs-gray-600: #6c757d;--bs-gray-700: #495057;--bs-gray-800: #343a40;--bs-gray-900: #212529;--bs-primary: #0d6efd;--bs-secondary: #6c757d;--bs-success: #198754;--bs-info: #0dcaf0;--bs-warning: #ffc107;--bs-danger: #dc3545;--bs-light: #f8f9fa;--bs-dark: #212529;--bs-primary-rgb: 13, 110, 253;--bs-secondary-rgb: 108, 117, 125;--bs-success-rgb: 25, 135, 84;--bs-info-rgb: 13, 202, 240;--bs-warning-rgb: 255, 193, 7;--bs-danger-rgb: 220, 53, 69;--bs-light-rgb: 248, 249, 250;--bs-dark-rgb: 33, 37, 41;--bs-white-rgb: 255, 255, 255;--bs-black-rgb: 0, 0, 0;--bs-body-color-rgb: 33, 37, 41;--bs-body-bg-rgb: 255, 255, 255;--bs-font-sans-serif: system-ui, -apple-system, "Segoe UI", Roboto, "Helvetica Neue", Arial, "Noto Sans", "Liberation Sans", sans-serif, "Apple Color Emoji", "Segoe UI Emoji", "Segoe UI Symbol", "Noto Color Emoji";--bs-font-monospace: SFMono-Regular, Menlo, Monaco, Consolas, "Liberation Mono", "Courier New", monospace;--bs-gradient: linear-gradient(180deg, rgba(255, 255, 255, .15), rgba(255, 255, 255, 0));--bs-body-font-family: var(--bs-font-sans-serif);--bs-body-font-size: 1rem;--bs-body-font-weight: 400;--bs-body-line-height: 1.5;--bs-body-color: #212529;--bs-body-bg: #fff}*,*:before,*:after{box-sizing:border-box}@media (prefers-reduced-motion: no-preference){:root{scroll-behavior:smooth}}body{margin:0;font-family:var(--bs-body-font-family);font-size:var(--bs-body-font-size);font-weight:var(--bs-body-font-weight);line-height:var(--bs-body-line-height);color:var(--bs-body-color);text-align:var(--bs-body-text-align);background-color:var(--bs-body-bg);-webkit-text-size-adjust:100%;-webkit-tap-highlight-color:rgba(0,0,0,0)}hr{margin:1rem 0;color:inherit;background-color:currentColor;border:0;opacity:.25}hr:not([size]){height:1px}h6,.h6,h5,.h5,h4,.h4,h3,.h3,h2,.h2,h1,.h1{margin-top:0;margin-bottom:.5rem;font-weight:500;line-height:1.2}h1,.h1{font-size:calc(1.375rem + 1.5vw)}@media (min-width: 1200px){h1,.h1{font-size:2.5rem}}h2,.h2{font-size:calc(1.325rem + .9vw)}@media (min-width: 1200px){h2,.h2{font-size:2rem}}h3,.h3{font-size:calc(1.3rem + .6vw)}@media (min-width: 1200px){h3,.h3{font-size:1.75rem}}h4,.h4{font-size:calc(1.275rem + .3vw)}@media (min-width: 1200px){h4,.h4{font-size:1.5rem}}h5,.h5{font-size:1.25rem}h6,.h6{font-size:1rem}p{margin-top:0;margin-bottom:1rem}abbr[title],abbr[data-bs-original-title]{-webkit-text-decoration:underline dotted;text-decoration:underline dotted;cursor:help;-webkit-text-decoration-skip-ink:none;text-decoration-skip-ink:none}address{margin-bottom:1rem;font-style:normal;line-height:inherit}ol,ul{padding-left:2rem}ol,ul,dl{margin-top:0;margin-bottom:1rem}ol ol,ul ul,ol ul,ul ol{margin-bottom:0}dt{font-weight:700}dd{margin-bottom:.5rem;margin-left:0}blockquote{margin:0 0 1rem}b,strong{font-weight:bolder}small,.small{font-size:.875em}mark,.mark{padding:.2em;background-color:#fcf8e3}sub,sup{position:relative;font-size:.75em;line-height:0;vertical-align:baseline}sub{bottom:-.25em}sup{top:-.5em}a{color:#0d6efd;text-decoration:underline}a:hover{color:#0a58ca}a:not([href]):not([class]),a:not([href]):not([class]):hover{color:inherit;text-decoration:none}pre,code,kbd,samp{font-family:var(--bs-font-monospace);font-size:1em;direction:ltr;unicode-bidi:bidi-override}pre{display:block;margin-top:0;margin-bottom:1rem;overflow:auto;font-size:.875em}pre code{font-size:inherit;color:inherit;word-break:normal}code{font-size:.875em;color:#d63384;word-wrap:break-word}a>code{color:inherit}kbd{padding:.2rem .4rem;font-size:.875em;color:#fff;background-color:#212529;border-radius:.2rem}kbd kbd{padding:0;font-size:1em;font-weight:700}figure{margin:0 0 1rem}img,svg{vertical-align:middle}table{caption-side:bottom;border-collapse:collapse}caption{padding-top:.5rem;padding-bottom:.5rem;color:#6c757d;text-align:left}th{text-align:inherit;text-align:-webkit-match-parent}thead,tbody,tfoot,tr,td,th{border-color:inherit;border-style:solid;border-width:0}label{display:inline-block}button{border-radius:0}button:focus:not(:focus-visible){outline:0}input,button,select,optgroup,textarea{margin:0;font-family:inherit;font-size:inherit;line-height:inherit}button,select{text-transform:none}[role=button]{cursor:pointer}select{word-wrap:normal}select:disabled{opacity:1}[list]::-webkit-calendar-picker-indicator{display:none}button,[type=button],[type=reset],[type=submit]{-webkit-appearance:button}button:not(:disabled),[type=button]:not(:disabled),[type=reset]:not(:disabled),[type=submit]:not(:disabled){cursor:pointer}::-moz-focus-inner{padding:0;border-style:none}textarea{resize:vertical}fieldset{min-width:0;padding:0;margin:0;border:0}legend{float:left;width:100%;padding:0;margin-bottom:.5rem;font-size:calc(1.275rem + .3vw);line-height:inherit}@media (min-width: 1200px){legend{font-size:1.5rem}}legend+*{clear:left}::-webkit-datetime-edit-fields-wrapper,::-webkit-datetime-edit-text,::-webkit-datetime-edit-minute,::-webkit-datetime-edit-hour-field,::-webkit-datetime-edit-day-field,::-webkit-datetime-edit-month-field,::-webkit-datetime-edit-year-field{padding:0}::-webkit-inner-spin-button{height:auto}[type=search]{outline-offset:-2px;-webkit-appearance:textfield}::-webkit-search-decoration{-webkit-appearance:none}::-webkit-color-swatch-wrapper{padding:0}::-webkit-file-upload-button{font:inherit}::file-selector-button{font:inherit}::-webkit-file-upload-button{font:inherit;-webkit-appearance:button}output{display:inline-block}iframe{border:0}summary{display:list-item;cursor:pointer}progress{vertical-align:baseline}[hidden]{display:none!important}.lead{font-size:1.25rem;font-weight:300}.display-1{font-size:calc(1.625rem + 4.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-1{font-size:5rem}}.display-2{font-size:calc(1.575rem + 3.9vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-2{font-size:4.5rem}}.display-3{font-size:calc(1.525rem + 3.3vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-3{font-size:4rem}}.display-4{font-size:calc(1.475rem + 2.7vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-4{font-size:3.5rem}}.display-5{font-size:calc(1.425rem + 2.1vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-5{font-size:3rem}}.display-6{font-size:calc(1.375rem + 1.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-6{font-size:2.5rem}}.list-unstyled,.list-inline{padding-left:0;list-style:none}.list-inline-item{display:inline-block}.list-inline-item:not(:last-child){margin-right:.5rem}.initialism{font-size:.875em;text-transform:uppercase}.blockquote{margin-bottom:1rem;font-size:1.25rem}.blockquote>:last-child{margin-bottom:0}.blockquote-footer{margin-top:-1rem;margin-bottom:1rem;font-size:.875em;color:#6c757d}.blockquote-footer:before{content:"\2014\a0"}.img-fluid{max-width:100%;height:auto}.img-thumbnail{padding:.25rem;background-color:#fff;border:1px solid #dee2e6;border-radius:.25rem;max-width:100%;height:auto}.figure{display:inline-block}.figure-img{margin-bottom:.5rem;line-height:1}.figure-caption{font-size:.875em;color:#6c757d}.container,.container-fluid,.container-xxl,.container-xl,.container-lg,.container-md,.container-sm{width:100%;padding-right:var(--bs-gutter-x, .75rem);padding-left:var(--bs-gutter-x, .75rem);margin-right:auto;margin-left:auto}@media (min-width: 576px){.container-sm,.container{max-width:540px}}@media (min-width: 768px){.container-md,.container-sm,.container{max-width:720px}}@media (min-width: 992px){.container-lg,.container-md,.container-sm,.container{max-width:960px}}@media (min-width: 1200px){.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1140px}}@media (min-width: 1400px){.container-xxl,.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1320px}}.row{--bs-gutter-x: 1.5rem;--bs-gutter-y: 0;display:flex;flex-wrap:wrap;margin-top:calc(-1 * var(--bs-gutter-y));margin-right:calc(-.5 * var(--bs-gutter-x));margin-left:calc(-.5 * var(--bs-gutter-x))}.row>*{flex-shrink:0;width:100%;max-width:100%;padding-right:calc(var(--bs-gutter-x) * .5);padding-left:calc(var(--bs-gutter-x) * .5);margin-top:var(--bs-gutter-y)}.col{flex:1 0 0%}.row-cols-auto>*{flex:0 0 auto;width:auto}.row-cols-1>*{flex:0 0 auto;width:100%}.row-cols-2>*{flex:0 0 auto;width:50%}.row-cols-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-4>*{flex:0 0 auto;width:25%}.row-cols-5>*{flex:0 0 auto;width:20%}.row-cols-6>*{flex:0 0 auto;width:16.6666666667%}.col-auto{flex:0 0 auto;width:auto}.col-1{flex:0 0 auto;width:8.33333333%}.col-2{flex:0 0 auto;width:16.66666667%}.col-3{flex:0 0 auto;width:25%}.col-4{flex:0 0 auto;width:33.33333333%}.col-5{flex:0 0 auto;width:41.66666667%}.col-6{flex:0 0 auto;width:50%}.col-7{flex:0 0 auto;width:58.33333333%}.col-8{flex:0 0 auto;width:66.66666667%}.col-9{flex:0 0 auto;width:75%}.col-10{flex:0 0 auto;width:83.33333333%}.col-11{flex:0 0 auto;width:91.66666667%}.col-12{flex:0 0 auto;width:100%}.offset-1{margin-left:8.33333333%}.offset-2{margin-left:16.66666667%}.offset-3{margin-left:25%}.offset-4{margin-left:33.33333333%}.offset-5{margin-left:41.66666667%}.offset-6{margin-left:50%}.offset-7{margin-left:58.33333333%}.offset-8{margin-left:66.66666667%}.offset-9{margin-left:75%}.offset-10{margin-left:83.33333333%}.offset-11{margin-left:91.66666667%}.g-0,.gx-0{--bs-gutter-x: 0}.g-0,.gy-0{--bs-gutter-y: 0}.g-1,.gx-1{--bs-gutter-x: .25rem}.g-1,.gy-1{--bs-gutter-y: .25rem}.g-2,.gx-2{--bs-gutter-x: .5rem}.g-2,.gy-2{--bs-gutter-y: .5rem}.g-3,.gx-3{--bs-gutter-x: 1rem}.g-3,.gy-3{--bs-gutter-y: 1rem}.g-4,.gx-4{--bs-gutter-x: 1.5rem}.g-4,.gy-4{--bs-gutter-y: 1.5rem}.g-5,.gx-5{--bs-gutter-x: 3rem}.g-5,.gy-5{--bs-gutter-y: 3rem}@media (min-width: 576px){.col-sm{flex:1 0 0%}.row-cols-sm-auto>*{flex:0 0 auto;width:auto}.row-cols-sm-1>*{flex:0 0 auto;width:100%}.row-cols-sm-2>*{flex:0 0 auto;width:50%}.row-cols-sm-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-sm-4>*{flex:0 0 auto;width:25%}.row-cols-sm-5>*{flex:0 0 auto;width:20%}.row-cols-sm-6>*{flex:0 0 auto;width:16.6666666667%}.col-sm-auto{flex:0 0 auto;width:auto}.col-sm-1{flex:0 0 auto;width:8.33333333%}.col-sm-2{flex:0 0 auto;width:16.66666667%}.col-sm-3{flex:0 0 auto;width:25%}.col-sm-4{flex:0 0 auto;width:33.33333333%}.col-sm-5{flex:0 0 auto;width:41.66666667%}.col-sm-6{flex:0 0 auto;width:50%}.col-sm-7{flex:0 0 auto;width:58.33333333%}.col-sm-8{flex:0 0 auto;width:66.66666667%}.col-sm-9{flex:0 0 auto;width:75%}.col-sm-10{flex:0 0 auto;width:83.33333333%}.col-sm-11{flex:0 0 auto;width:91.66666667%}.col-sm-12{flex:0 0 auto;width:100%}.offset-sm-0{margin-left:0}.offset-sm-1{margin-left:8.33333333%}.offset-sm-2{margin-left:16.66666667%}.offset-sm-3{margin-left:25%}.offset-sm-4{margin-left:33.33333333%}.offset-sm-5{margin-left:41.66666667%}.offset-sm-6{margin-left:50%}.offset-sm-7{margin-left:58.33333333%}.offset-sm-8{margin-left:66.66666667%}.offset-sm-9{margin-left:75%}.offset-sm-10{margin-left:83.33333333%}.offset-sm-11{margin-left:91.66666667%}.g-sm-0,.gx-sm-0{--bs-gutter-x: 0}.g-sm-0,.gy-sm-0{--bs-gutter-y: 0}.g-sm-1,.gx-sm-1{--bs-gutter-x: .25rem}.g-sm-1,.gy-sm-1{--bs-gutter-y: .25rem}.g-sm-2,.gx-sm-2{--bs-gutter-x: .5rem}.g-sm-2,.gy-sm-2{--bs-gutter-y: .5rem}.g-sm-3,.gx-sm-3{--bs-gutter-x: 1rem}.g-sm-3,.gy-sm-3{--bs-gutter-y: 1rem}.g-sm-4,.gx-sm-4{--bs-gutter-x: 1.5rem}.g-sm-4,.gy-sm-4{--bs-gutter-y: 1.5rem}.g-sm-5,.gx-sm-5{--bs-gutter-x: 3rem}.g-sm-5,.gy-sm-5{--bs-gutter-y: 3rem}}@media (min-width: 768px){.col-md{flex:1 0 0%}.row-cols-md-auto>*{flex:0 0 auto;width:auto}.row-cols-md-1>*{flex:0 0 auto;width:100%}.row-cols-md-2>*{flex:0 0 auto;width:50%}.row-cols-md-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-md-4>*{flex:0 0 auto;width:25%}.row-cols-md-5>*{flex:0 0 auto;width:20%}.row-cols-md-6>*{flex:0 0 auto;width:16.6666666667%}.col-md-auto{flex:0 0 auto;width:auto}.col-md-1{flex:0 0 auto;width:8.33333333%}.col-md-2{flex:0 0 auto;width:16.66666667%}.col-md-3{flex:0 0 auto;width:25%}.col-md-4{flex:0 0 auto;width:33.33333333%}.col-md-5{flex:0 0 auto;width:41.66666667%}.col-md-6{flex:0 0 auto;width:50%}.col-md-7{flex:0 0 auto;width:58.33333333%}.col-md-8{flex:0 0 auto;width:66.66666667%}.col-md-9{flex:0 0 auto;width:75%}.col-md-10{flex:0 0 auto;width:83.33333333%}.col-md-11{flex:0 0 auto;width:91.66666667%}.col-md-12{flex:0 0 auto;width:100%}.offset-md-0{margin-left:0}.offset-md-1{margin-left:8.33333333%}.offset-md-2{margin-left:16.66666667%}.offset-md-3{margin-left:25%}.offset-md-4{margin-left:33.33333333%}.offset-md-5{margin-left:41.66666667%}.offset-md-6{margin-left:50%}.offset-md-7{margin-left:58.33333333%}.offset-md-8{margin-left:66.66666667%}.offset-md-9{margin-left:75%}.offset-md-10{margin-left:83.33333333%}.offset-md-11{margin-left:91.66666667%}.g-md-0,.gx-md-0{--bs-gutter-x: 0}.g-md-0,.gy-md-0{--bs-gutter-y: 0}.g-md-1,.gx-md-1{--bs-gutter-x: .25rem}.g-md-1,.gy-md-1{--bs-gutter-y: .25rem}.g-md-2,.gx-md-2{--bs-gutter-x: .5rem}.g-md-2,.gy-md-2{--bs-gutter-y: .5rem}.g-md-3,.gx-md-3{--bs-gutter-x: 1rem}.g-md-3,.gy-md-3{--bs-gutter-y: 1rem}.g-md-4,.gx-md-4{--bs-gutter-x: 1.5rem}.g-md-4,.gy-md-4{--bs-gutter-y: 1.5rem}.g-md-5,.gx-md-5{--bs-gutter-x: 3rem}.g-md-5,.gy-md-5{--bs-gutter-y: 3rem}}@media (min-width: 992px){.col-lg{flex:1 0 0%}.row-cols-lg-auto>*{flex:0 0 auto;width:auto}.row-cols-lg-1>*{flex:0 0 auto;width:100%}.row-cols-lg-2>*{flex:0 0 auto;width:50%}.row-cols-lg-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-lg-4>*{flex:0 0 auto;width:25%}.row-cols-lg-5>*{flex:0 0 auto;width:20%}.row-cols-lg-6>*{flex:0 0 auto;width:16.6666666667%}.col-lg-auto{flex:0 0 auto;width:auto}.col-lg-1{flex:0 0 auto;width:8.33333333%}.col-lg-2{flex:0 0 auto;width:16.66666667%}.col-lg-3{flex:0 0 auto;width:25%}.col-lg-4{flex:0 0 auto;width:33.33333333%}.col-lg-5{flex:0 0 auto;width:41.66666667%}.col-lg-6{flex:0 0 auto;width:50%}.col-lg-7{flex:0 0 auto;width:58.33333333%}.col-lg-8{flex:0 0 auto;width:66.66666667%}.col-lg-9{flex:0 0 auto;width:75%}.col-lg-10{flex:0 0 auto;width:83.33333333%}.col-lg-11{flex:0 0 auto;width:91.66666667%}.col-lg-12{flex:0 0 auto;width:100%}.offset-lg-0{margin-left:0}.offset-lg-1{margin-left:8.33333333%}.offset-lg-2{margin-left:16.66666667%}.offset-lg-3{margin-left:25%}.offset-lg-4{margin-left:33.33333333%}.offset-lg-5{margin-left:41.66666667%}.offset-lg-6{margin-left:50%}.offset-lg-7{margin-left:58.33333333%}.offset-lg-8{margin-left:66.66666667%}.offset-lg-9{margin-left:75%}.offset-lg-10{margin-left:83.33333333%}.offset-lg-11{margin-left:91.66666667%}.g-lg-0,.gx-lg-0{--bs-gutter-x: 0}.g-lg-0,.gy-lg-0{--bs-gutter-y: 0}.g-lg-1,.gx-lg-1{--bs-gutter-x: .25rem}.g-lg-1,.gy-lg-1{--bs-gutter-y: .25rem}.g-lg-2,.gx-lg-2{--bs-gutter-x: .5rem}.g-lg-2,.gy-lg-2{--bs-gutter-y: .5rem}.g-lg-3,.gx-lg-3{--bs-gutter-x: 1rem}.g-lg-3,.gy-lg-3{--bs-gutter-y: 1rem}.g-lg-4,.gx-lg-4{--bs-gutter-x: 1.5rem}.g-lg-4,.gy-lg-4{--bs-gutter-y: 1.5rem}.g-lg-5,.gx-lg-5{--bs-gutter-x: 3rem}.g-lg-5,.gy-lg-5{--bs-gutter-y: 3rem}}@media (min-width: 1200px){.col-xl{flex:1 0 0%}.row-cols-xl-auto>*{flex:0 0 auto;width:auto}.row-cols-xl-1>*{flex:0 0 auto;width:100%}.row-cols-xl-2>*{flex:0 0 auto;width:50%}.row-cols-xl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xl-4>*{flex:0 0 auto;width:25%}.row-cols-xl-5>*{flex:0 0 auto;width:20%}.row-cols-xl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xl-auto{flex:0 0 auto;width:auto}.col-xl-1{flex:0 0 auto;width:8.33333333%}.col-xl-2{flex:0 0 auto;width:16.66666667%}.col-xl-3{flex:0 0 auto;width:25%}.col-xl-4{flex:0 0 auto;width:33.33333333%}.col-xl-5{flex:0 0 auto;width:41.66666667%}.col-xl-6{flex:0 0 auto;width:50%}.col-xl-7{flex:0 0 auto;width:58.33333333%}.col-xl-8{flex:0 0 auto;width:66.66666667%}.col-xl-9{flex:0 0 auto;width:75%}.col-xl-10{flex:0 0 auto;width:83.33333333%}.col-xl-11{flex:0 0 auto;width:91.66666667%}.col-xl-12{flex:0 0 auto;width:100%}.offset-xl-0{margin-left:0}.offset-xl-1{margin-left:8.33333333%}.offset-xl-2{margin-left:16.66666667%}.offset-xl-3{margin-left:25%}.offset-xl-4{margin-left:33.33333333%}.offset-xl-5{margin-left:41.66666667%}.offset-xl-6{margin-left:50%}.offset-xl-7{margin-left:58.33333333%}.offset-xl-8{margin-left:66.66666667%}.offset-xl-9{margin-left:75%}.offset-xl-10{margin-left:83.33333333%}.offset-xl-11{margin-left:91.66666667%}.g-xl-0,.gx-xl-0{--bs-gutter-x: 0}.g-xl-0,.gy-xl-0{--bs-gutter-y: 0}.g-xl-1,.gx-xl-1{--bs-gutter-x: .25rem}.g-xl-1,.gy-xl-1{--bs-gutter-y: .25rem}.g-xl-2,.gx-xl-2{--bs-gutter-x: .5rem}.g-xl-2,.gy-xl-2{--bs-gutter-y: .5rem}.g-xl-3,.gx-xl-3{--bs-gutter-x: 1rem}.g-xl-3,.gy-xl-3{--bs-gutter-y: 1rem}.g-xl-4,.gx-xl-4{--bs-gutter-x: 1.5rem}.g-xl-4,.gy-xl-4{--bs-gutter-y: 1.5rem}.g-xl-5,.gx-xl-5{--bs-gutter-x: 3rem}.g-xl-5,.gy-xl-5{--bs-gutter-y: 3rem}}@media (min-width: 1400px){.col-xxl{flex:1 0 0%}.row-cols-xxl-auto>*{flex:0 0 auto;width:auto}.row-cols-xxl-1>*{flex:0 0 auto;width:100%}.row-cols-xxl-2>*{flex:0 0 auto;width:50%}.row-cols-xxl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xxl-4>*{flex:0 0 auto;width:25%}.row-cols-xxl-5>*{flex:0 0 auto;width:20%}.row-cols-xxl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xxl-auto{flex:0 0 auto;width:auto}.col-xxl-1{flex:0 0 auto;width:8.33333333%}.col-xxl-2{flex:0 0 auto;width:16.66666667%}.col-xxl-3{flex:0 0 auto;width:25%}.col-xxl-4{flex:0 0 auto;width:33.33333333%}.col-xxl-5{flex:0 0 auto;width:41.66666667%}.col-xxl-6{flex:0 0 auto;width:50%}.col-xxl-7{flex:0 0 auto;width:58.33333333%}.col-xxl-8{flex:0 0 auto;width:66.66666667%}.col-xxl-9{flex:0 0 auto;width:75%}.col-xxl-10{flex:0 0 auto;width:83.33333333%}.col-xxl-11{flex:0 0 auto;width:91.66666667%}.col-xxl-12{flex:0 0 auto;width:100%}.offset-xxl-0{margin-left:0}.offset-xxl-1{margin-left:8.33333333%}.offset-xxl-2{margin-left:16.66666667%}.offset-xxl-3{margin-left:25%}.offset-xxl-4{margin-left:33.33333333%}.offset-xxl-5{margin-left:41.66666667%}.offset-xxl-6{margin-left:50%}.offset-xxl-7{margin-left:58.33333333%}.offset-xxl-8{margin-left:66.66666667%}.offset-xxl-9{margin-left:75%}.offset-xxl-10{margin-left:83.33333333%}.offset-xxl-11{margin-left:91.66666667%}.g-xxl-0,.gx-xxl-0{--bs-gutter-x: 0}.g-xxl-0,.gy-xxl-0{--bs-gutter-y: 0}.g-xxl-1,.gx-xxl-1{--bs-gutter-x: .25rem}.g-xxl-1,.gy-xxl-1{--bs-gutter-y: .25rem}.g-xxl-2,.gx-xxl-2{--bs-gutter-x: .5rem}.g-xxl-2,.gy-xxl-2{--bs-gutter-y: .5rem}.g-xxl-3,.gx-xxl-3{--bs-gutter-x: 1rem}.g-xxl-3,.gy-xxl-3{--bs-gutter-y: 1rem}.g-xxl-4,.gx-xxl-4{--bs-gutter-x: 1.5rem}.g-xxl-4,.gy-xxl-4{--bs-gutter-y: 1.5rem}.g-xxl-5,.gx-xxl-5{--bs-gutter-x: 3rem}.g-xxl-5,.gy-xxl-5{--bs-gutter-y: 3rem}}.table{--bs-table-bg: transparent;--bs-table-accent-bg: transparent;--bs-table-striped-color: #212529;--bs-table-striped-bg: rgba(0, 0, 0, .05);--bs-table-active-color: #212529;--bs-table-active-bg: rgba(0, 0, 0, .1);--bs-table-hover-color: #212529;--bs-table-hover-bg: rgba(0, 0, 0, .075);width:100%;margin-bottom:1rem;color:#212529;vertical-align:top;border-color:#dee2e6}.table>:not(caption)>*>*{padding:.5rem;background-color:var(--bs-table-bg);border-bottom-width:1px;box-shadow:inset 0 0 0 9999px var(--bs-table-accent-bg)}.table>tbody{vertical-align:inherit}.table>thead{vertical-align:bottom}.table>:not(:first-child){border-top:2px solid currentColor}.caption-top{caption-side:top}.table-sm>:not(caption)>*>*{padding:.25rem}.table-bordered>:not(caption)>*{border-width:1px 0}.table-bordered>:not(caption)>*>*{border-width:0 1px}.table-borderless>:not(caption)>*>*{border-bottom-width:0}.table-borderless>:not(:first-child){border-top-width:0}.table-striped>tbody>tr:nth-of-type(odd)>*{--bs-table-accent-bg: var(--bs-table-striped-bg);color:var(--bs-table-striped-color)}.table-active{--bs-table-accent-bg: var(--bs-table-active-bg);color:var(--bs-table-active-color)}.table-hover>tbody>tr:hover>*{--bs-table-accent-bg: var(--bs-table-hover-bg);color:var(--bs-table-hover-color)}.table-primary{--bs-table-bg: #cfe2ff;--bs-table-striped-bg: #c5d7f2;--bs-table-striped-color: #000;--bs-table-active-bg: #bacbe6;--bs-table-active-color: #000;--bs-table-hover-bg: #bfd1ec;--bs-table-hover-color: #000;color:#000;border-color:#bacbe6}.table-secondary{--bs-table-bg: #e2e3e5;--bs-table-striped-bg: #d7d8da;--bs-table-striped-color: #000;--bs-table-active-bg: #cbccce;--bs-table-active-color: #000;--bs-table-hover-bg: #d1d2d4;--bs-table-hover-color: #000;color:#000;border-color:#cbccce}.table-success{--bs-table-bg: #d1e7dd;--bs-table-striped-bg: #c7dbd2;--bs-table-striped-color: #000;--bs-table-active-bg: #bcd0c7;--bs-table-active-color: #000;--bs-table-hover-bg: #c1d6cc;--bs-table-hover-color: #000;color:#000;border-color:#bcd0c7}.table-info{--bs-table-bg: #cff4fc;--bs-table-striped-bg: #c5e8ef;--bs-table-striped-color: #000;--bs-table-active-bg: #badce3;--bs-table-active-color: #000;--bs-table-hover-bg: #bfe2e9;--bs-table-hover-color: #000;color:#000;border-color:#badce3}.table-warning{--bs-table-bg: #fff3cd;--bs-table-striped-bg: #f2e7c3;--bs-table-striped-color: #000;--bs-table-active-bg: #e6dbb9;--bs-table-active-color: #000;--bs-table-hover-bg: #ece1be;--bs-table-hover-color: #000;color:#000;border-color:#e6dbb9}.table-danger{--bs-table-bg: #f8d7da;--bs-table-striped-bg: #eccccf;--bs-table-striped-color: #000;--bs-table-active-bg: #dfc2c4;--bs-table-active-color: #000;--bs-table-hover-bg: #e5c7ca;--bs-table-hover-color: #000;color:#000;border-color:#dfc2c4}.table-light{--bs-table-bg: #f8f9fa;--bs-table-striped-bg: #ecedee;--bs-table-striped-color: #000;--bs-table-active-bg: #dfe0e1;--bs-table-active-color: #000;--bs-table-hover-bg: #e5e6e7;--bs-table-hover-color: #000;color:#000;border-color:#dfe0e1}.table-dark{--bs-table-bg: #212529;--bs-table-striped-bg: #2c3034;--bs-table-striped-color: #fff;--bs-table-active-bg: #373b3e;--bs-table-active-color: #fff;--bs-table-hover-bg: #323539;--bs-table-hover-color: #fff;color:#fff;border-color:#373b3e}.table-responsive{overflow-x:auto;-webkit-overflow-scrolling:touch}@media (max-width: 575.98px){.table-responsive-sm{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 767.98px){.table-responsive-md{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 991.98px){.table-responsive-lg{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1199.98px){.table-responsive-xl{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1399.98px){.table-responsive-xxl{overflow-x:auto;-webkit-overflow-scrolling:touch}}.form-label{margin-bottom:.5rem}.col-form-label{padding-top:calc(.375rem + 1px);padding-bottom:calc(.375rem + 1px);margin-bottom:0;font-size:inherit;line-height:1.5}.col-form-label-lg{padding-top:calc(.5rem + 1px);padding-bottom:calc(.5rem + 1px);font-size:1.25rem}.col-form-label-sm{padding-top:calc(.25rem + 1px);padding-bottom:calc(.25rem + 1px);font-size:.875rem}.form-text{margin-top:.25rem;font-size:.875em;color:#6c757d}.form-control{display:block;width:100%;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-clip:padding-box;border:1px solid #ced4da;-webkit-appearance:none;-moz-appearance:none;appearance:none;border-radius:.25rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control{transition:none}}.form-control[type=file]{overflow:hidden}.form-control[type=file]:not(:disabled):not([readonly]){cursor:pointer}.form-control:focus{color:#212529;background-color:#fff;border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-control::-webkit-date-and-time-value{height:1.5em}.form-control::-moz-placeholder{color:#6c757d;opacity:1}.form-control::placeholder{color:#6c757d;opacity:1}.form-control:disabled,.form-control[readonly]{background-color:#e9ecef;opacity:1}.form-control::file-selector-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control::-webkit-file-upload-button{-webkit-transition:none;transition:none}.form-control::file-selector-button{transition:none}}.form-control:hover:not(:disabled):not([readonly])::file-selector-button{background-color:#dde0e3}.form-control::-webkit-file-upload-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;-webkit-transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control::-webkit-file-upload-button{-webkit-transition:none;transition:none}}.form-control:hover:not(:disabled):not([readonly])::-webkit-file-upload-button{background-color:#dde0e3}.form-control-plaintext{display:block;width:100%;padding:.375rem 0;margin-bottom:0;line-height:1.5;color:#212529;background-color:transparent;border:solid transparent;border-width:1px 0}.form-control-plaintext.form-control-sm,.form-control-plaintext.form-control-lg{padding-right:0;padding-left:0}.form-control-sm{min-height:calc(1.5em + .5rem + 2px);padding:.25rem .5rem;font-size:.875rem;border-radius:.2rem}.form-control-sm::file-selector-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-sm::-webkit-file-upload-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-lg{min-height:calc(1.5em + 1rem + 2px);padding:.5rem 1rem;font-size:1.25rem;border-radius:.3rem}.form-control-lg::file-selector-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}.form-control-lg::-webkit-file-upload-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}textarea.form-control{min-height:calc(1.5em + .75rem + 2px)}textarea.form-control-sm{min-height:calc(1.5em + .5rem + 2px)}textarea.form-control-lg{min-height:calc(1.5em + 1rem + 2px)}.form-control-color{width:3rem;height:auto;padding:.375rem}.form-control-color:not(:disabled):not([readonly]){cursor:pointer}.form-control-color::-moz-color-swatch{height:1.5em;border-radius:.25rem}.form-control-color::-webkit-color-swatch{height:1.5em;border-radius:.25rem}.form-select{display:block;width:100%;padding:.375rem 2.25rem .375rem .75rem;-moz-padding-start:calc(.75rem - 3px);font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='M2 5l6 6 6-6'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right .75rem center;background-size:16px 12px;border:1px solid #ced4da;border-radius:.25rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-select{transition:none}}.form-select:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-select[multiple],.form-select[size]:not([size="1"]){padding-right:.75rem;background-image:none}.form-select:disabled{background-color:#e9ecef}.form-select:-moz-focusring{color:transparent;text-shadow:0 0 0 #212529}.form-select-sm{padding-top:.25rem;padding-bottom:.25rem;padding-left:.5rem;font-size:.875rem;border-radius:.2rem}.form-select-lg{padding-top:.5rem;padding-bottom:.5rem;padding-left:1rem;font-size:1.25rem;border-radius:.3rem}.form-check{display:block;min-height:1.5rem;padding-left:1.5em;margin-bottom:.125rem}.form-check .form-check-input{float:left;margin-left:-1.5em}.form-check-input{width:1em;height:1em;margin-top:.25em;vertical-align:top;background-color:#fff;background-repeat:no-repeat;background-position:center;background-size:contain;border:1px solid rgba(0,0,0,.25);-webkit-appearance:none;-moz-appearance:none;appearance:none;-webkit-print-color-adjust:exact;color-adjust:exact}.form-check-input[type=checkbox]{border-radius:.25em}.form-check-input[type=radio]{border-radius:50%}.form-check-input:active{filter:brightness(90%)}.form-check-input:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-check-input:checked{background-color:#0d6efd;border-color:#0d6efd}.form-check-input:checked[type=checkbox]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='M6 10l3 3l6-6'/%3e%3c/svg%3e")}.form-check-input:checked[type=radio]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='2' fill='%23fff'/%3e%3c/svg%3e")}.form-check-input[type=checkbox]:indeterminate{background-color:#0d6efd;border-color:#0d6efd;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='M6 10h8'/%3e%3c/svg%3e")}.form-check-input:disabled{pointer-events:none;filter:none;opacity:.5}.form-check-input[disabled]~.form-check-label,.form-check-input:disabled~.form-check-label{opacity:.5}.form-switch{padding-left:2.5em}.form-switch .form-check-input{width:2em;margin-left:-2.5em;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='rgba%280, 0, 0, 0.25%29'/%3e%3c/svg%3e");background-position:left center;border-radius:2em;transition:background-position .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-switch .form-check-input{transition:none}}.form-switch .form-check-input:focus{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%2386b7fe'/%3e%3c/svg%3e")}.form-switch .form-check-input:checked{background-position:right center;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%23fff'/%3e%3c/svg%3e")}.form-check-inline{display:inline-block;margin-right:1rem}.btn-check{position:absolute;clip:rect(0,0,0,0);pointer-events:none}.btn-check[disabled]+.btn,.btn-check:disabled+.btn{pointer-events:none;filter:none;opacity:.65}.form-range{width:100%;height:1.5rem;padding:0;background-color:transparent;-webkit-appearance:none;-moz-appearance:none;appearance:none}.form-range:focus{outline:0}.form-range:focus::-webkit-slider-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range:focus::-moz-range-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range::-moz-focus-outer{border:0}.form-range::-webkit-slider-thumb{width:1rem;height:1rem;margin-top:-.25rem;background-color:#0d6efd;border:0;border-radius:1rem;-webkit-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-webkit-slider-thumb{-webkit-transition:none;transition:none}}.form-range::-webkit-slider-thumb:active{background-color:#b6d4fe}.form-range::-webkit-slider-runnable-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range::-moz-range-thumb{width:1rem;height:1rem;background-color:#0d6efd;border:0;border-radius:1rem;-moz-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-moz-range-thumb{-moz-transition:none;transition:none}}.form-range::-moz-range-thumb:active{background-color:#b6d4fe}.form-range::-moz-range-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range:disabled{pointer-events:none}.form-range:disabled::-webkit-slider-thumb{background-color:#adb5bd}.form-range:disabled::-moz-range-thumb{background-color:#adb5bd}.form-floating{position:relative}.form-floating>.form-control,.form-floating>.form-select{height:calc(3.5rem + 2px);line-height:1.25}.form-floating>label{position:absolute;top:0;left:0;height:100%;padding:1rem .75rem;pointer-events:none;border:1px solid transparent;transform-origin:0 0;transition:opacity .1s ease-in-out,transform .1s ease-in-out}@media (prefers-reduced-motion: reduce){.form-floating>label{transition:none}}.form-floating>.form-control{padding:1rem .75rem}.form-floating>.form-control::-moz-placeholder{color:transparent}.form-floating>.form-control::placeholder{color:transparent}.form-floating>.form-control:not(:-moz-placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:focus,.form-floating>.form-control:not(:placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:-webkit-autofill{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-select{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:not(:-moz-placeholder-shown)~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:focus~label,.form-floating>.form-control:not(:placeholder-shown)~label,.form-floating>.form-select~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:-webkit-autofill~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.input-group{position:relative;display:flex;flex-wrap:wrap;align-items:stretch;width:100%}.input-group>.form-control,.input-group>.form-select{position:relative;flex:1 1 auto;width:1%;min-width:0}.input-group>.form-control:focus,.input-group>.form-select:focus{z-index:3}.input-group .btn{position:relative;z-index:2}.input-group .btn:focus{z-index:3}.input-group-text{display:flex;align-items:center;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;text-align:center;white-space:nowrap;background-color:#e9ecef;border:1px solid #ced4da;border-radius:.25rem}.input-group-lg>.form-control,.input-group-lg>.form-select,.input-group-lg>.input-group-text,.input-group-lg>.btn{padding:.5rem 1rem;font-size:1.25rem;border-radius:.3rem}.input-group-sm>.form-control,.input-group-sm>.form-select,.input-group-sm>.input-group-text,.input-group-sm>.btn{padding:.25rem .5rem;font-size:.875rem;border-radius:.2rem}.input-group-lg>.form-select,.input-group-sm>.form-select{padding-right:3rem}.input-group:not(.has-validation)>:not(:last-child):not(.dropdown-toggle):not(.dropdown-menu),.input-group:not(.has-validation)>.dropdown-toggle:nth-last-child(n+3){border-top-right-radius:0;border-bottom-right-radius:0}.input-group.has-validation>:nth-last-child(n+3):not(.dropdown-toggle):not(.dropdown-menu),.input-group.has-validation>.dropdown-toggle:nth-last-child(n+4){border-top-right-radius:0;border-bottom-right-radius:0}.input-group>:not(:first-child):not(.dropdown-menu):not(.valid-tooltip):not(.valid-feedback):not(.invalid-tooltip):not(.invalid-feedback){margin-left:-1px;border-top-left-radius:0;border-bottom-left-radius:0}.valid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#198754}.valid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#198754e6;border-radius:.25rem}.was-validated :valid~.valid-feedback,.was-validated :valid~.valid-tooltip,.is-valid~.valid-feedback,.is-valid~.valid-tooltip{display:block}.was-validated .form-control:valid,.form-control.is-valid{border-color:#198754;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73L.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:valid:focus,.form-control.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated textarea.form-control:valid,textarea.form-control.is-valid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:valid,.form-select.is-valid{border-color:#198754}.was-validated .form-select:valid:not([multiple]):not([size]),.was-validated .form-select:valid:not([multiple])[size="1"],.form-select.is-valid:not([multiple]):not([size]),.form-select.is-valid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='M2 5l6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73L.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:valid:focus,.form-select.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated .form-check-input:valid,.form-check-input.is-valid{border-color:#198754}.was-validated .form-check-input:valid:checked,.form-check-input.is-valid:checked{background-color:#198754}.was-validated .form-check-input:valid:focus,.form-check-input.is-valid:focus{box-shadow:0 0 0 .25rem #19875440}.was-validated .form-check-input:valid~.form-check-label,.form-check-input.is-valid~.form-check-label{color:#198754}.form-check-inline .form-check-input~.valid-feedback{margin-left:.5em}.was-validated .input-group .form-control:valid,.input-group .form-control.is-valid,.was-validated .input-group .form-select:valid,.input-group .form-select.is-valid{z-index:1}.was-validated .input-group .form-control:valid:focus,.input-group .form-control.is-valid:focus,.was-validated .input-group .form-select:valid:focus,.input-group .form-select.is-valid:focus{z-index:3}.invalid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#dc3545}.invalid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#dc3545e6;border-radius:.25rem}.was-validated :invalid~.invalid-feedback,.was-validated :invalid~.invalid-tooltip,.is-invalid~.invalid-feedback,.is-invalid~.invalid-tooltip{display:block}.was-validated .form-control:invalid,.form-control.is-invalid{border-color:#dc3545;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:invalid:focus,.form-control.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated textarea.form-control:invalid,textarea.form-control.is-invalid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:invalid,.form-select.is-invalid{border-color:#dc3545}.was-validated .form-select:invalid:not([multiple]):not([size]),.was-validated .form-select:invalid:not([multiple])[size="1"],.form-select.is-invalid:not([multiple]):not([size]),.form-select.is-invalid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='M2 5l6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:invalid:focus,.form-select.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-check-input:invalid,.form-check-input.is-invalid{border-color:#dc3545}.was-validated .form-check-input:invalid:checked,.form-check-input.is-invalid:checked{background-color:#dc3545}.was-validated .form-check-input:invalid:focus,.form-check-input.is-invalid:focus{box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-check-input:invalid~.form-check-label,.form-check-input.is-invalid~.form-check-label{color:#dc3545}.form-check-inline .form-check-input~.invalid-feedback{margin-left:.5em}.was-validated .input-group .form-control:invalid,.input-group .form-control.is-invalid,.was-validated .input-group .form-select:invalid,.input-group .form-select.is-invalid{z-index:2}.was-validated .input-group .form-control:invalid:focus,.input-group .form-control.is-invalid:focus,.was-validated .input-group .form-select:invalid:focus,.input-group .form-select.is-invalid:focus{z-index:3}.btn{display:inline-block;font-weight:400;line-height:1.5;color:#212529;text-align:center;text-decoration:none;vertical-align:middle;cursor:pointer;-webkit-user-select:none;-moz-user-select:none;user-select:none;background-color:transparent;border:1px solid transparent;padding:.375rem .75rem;font-size:1rem;border-radius:.25rem;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.btn{transition:none}}.btn:hover{color:#212529}.btn-check:focus+.btn,.btn:focus{outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.btn:disabled,.btn.disabled,fieldset:disabled .btn{pointer-events:none;opacity:.65}.btn-primary{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-primary:hover{color:#fff;background-color:#0b5ed7;border-color:#0a58ca}.btn-check:focus+.btn-primary,.btn-primary:focus{color:#fff;background-color:#0b5ed7;border-color:#0a58ca;box-shadow:0 0 0 .25rem #3184fd80}.btn-check:checked+.btn-primary,.btn-check:active+.btn-primary,.btn-primary:active,.btn-primary.active,.show>.btn-primary.dropdown-toggle{color:#fff;background-color:#0a58ca;border-color:#0a53be}.btn-check:checked+.btn-primary:focus,.btn-check:active+.btn-primary:focus,.btn-primary:active:focus,.btn-primary.active:focus,.show>.btn-primary.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #3184fd80}.btn-primary:disabled,.btn-primary.disabled{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-secondary{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-secondary:hover{color:#fff;background-color:#5c636a;border-color:#565e64}.btn-check:focus+.btn-secondary,.btn-secondary:focus{color:#fff;background-color:#5c636a;border-color:#565e64;box-shadow:0 0 0 .25rem #828a9180}.btn-check:checked+.btn-secondary,.btn-check:active+.btn-secondary,.btn-secondary:active,.btn-secondary.active,.show>.btn-secondary.dropdown-toggle{color:#fff;background-color:#565e64;border-color:#51585e}.btn-check:checked+.btn-secondary:focus,.btn-check:active+.btn-secondary:focus,.btn-secondary:active:focus,.btn-secondary.active:focus,.show>.btn-secondary.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #828a9180}.btn-secondary:disabled,.btn-secondary.disabled{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-success{color:#fff;background-color:#198754;border-color:#198754}.btn-success:hover{color:#fff;background-color:#157347;border-color:#146c43}.btn-check:focus+.btn-success,.btn-success:focus{color:#fff;background-color:#157347;border-color:#146c43;box-shadow:0 0 0 .25rem #3c996e80}.btn-check:checked+.btn-success,.btn-check:active+.btn-success,.btn-success:active,.btn-success.active,.show>.btn-success.dropdown-toggle{color:#fff;background-color:#146c43;border-color:#13653f}.btn-check:checked+.btn-success:focus,.btn-check:active+.btn-success:focus,.btn-success:active:focus,.btn-success.active:focus,.show>.btn-success.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #3c996e80}.btn-success:disabled,.btn-success.disabled{color:#fff;background-color:#198754;border-color:#198754}.btn-info{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-info:hover{color:#000;background-color:#31d2f2;border-color:#25cff2}.btn-check:focus+.btn-info,.btn-info:focus{color:#000;background-color:#31d2f2;border-color:#25cff2;box-shadow:0 0 0 .25rem #0baccc80}.btn-check:checked+.btn-info,.btn-check:active+.btn-info,.btn-info:active,.btn-info.active,.show>.btn-info.dropdown-toggle{color:#000;background-color:#3dd5f3;border-color:#25cff2}.btn-check:checked+.btn-info:focus,.btn-check:active+.btn-info:focus,.btn-info:active:focus,.btn-info.active:focus,.show>.btn-info.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #0baccc80}.btn-info:disabled,.btn-info.disabled{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-warning{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-warning:hover{color:#000;background-color:#ffca2c;border-color:#ffc720}.btn-check:focus+.btn-warning,.btn-warning:focus{color:#000;background-color:#ffca2c;border-color:#ffc720;box-shadow:0 0 0 .25rem #d9a40680}.btn-check:checked+.btn-warning,.btn-check:active+.btn-warning,.btn-warning:active,.btn-warning.active,.show>.btn-warning.dropdown-toggle{color:#000;background-color:#ffcd39;border-color:#ffc720}.btn-check:checked+.btn-warning:focus,.btn-check:active+.btn-warning:focus,.btn-warning:active:focus,.btn-warning.active:focus,.show>.btn-warning.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #d9a40680}.btn-warning:disabled,.btn-warning.disabled{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-danger{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-danger:hover{color:#fff;background-color:#bb2d3b;border-color:#b02a37}.btn-check:focus+.btn-danger,.btn-danger:focus{color:#fff;background-color:#bb2d3b;border-color:#b02a37;box-shadow:0 0 0 .25rem #e1536180}.btn-check:checked+.btn-danger,.btn-check:active+.btn-danger,.btn-danger:active,.btn-danger.active,.show>.btn-danger.dropdown-toggle{color:#fff;background-color:#b02a37;border-color:#a52834}.btn-check:checked+.btn-danger:focus,.btn-check:active+.btn-danger:focus,.btn-danger:active:focus,.btn-danger.active:focus,.show>.btn-danger.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #e1536180}.btn-danger:disabled,.btn-danger.disabled{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-light{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-light:hover{color:#000;background-color:#f9fafb;border-color:#f9fafb}.btn-check:focus+.btn-light,.btn-light:focus{color:#000;background-color:#f9fafb;border-color:#f9fafb;box-shadow:0 0 0 .25rem #d3d4d580}.btn-check:checked+.btn-light,.btn-check:active+.btn-light,.btn-light:active,.btn-light.active,.show>.btn-light.dropdown-toggle{color:#000;background-color:#f9fafb;border-color:#f9fafb}.btn-check:checked+.btn-light:focus,.btn-check:active+.btn-light:focus,.btn-light:active:focus,.btn-light.active:focus,.show>.btn-light.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #d3d4d580}.btn-light:disabled,.btn-light.disabled{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-dark{color:#fff;background-color:#212529;border-color:#212529}.btn-dark:hover{color:#fff;background-color:#1c1f23;border-color:#1a1e21}.btn-check:focus+.btn-dark,.btn-dark:focus{color:#fff;background-color:#1c1f23;border-color:#1a1e21;box-shadow:0 0 0 .25rem #42464980}.btn-check:checked+.btn-dark,.btn-check:active+.btn-dark,.btn-dark:active,.btn-dark.active,.show>.btn-dark.dropdown-toggle{color:#fff;background-color:#1a1e21;border-color:#191c1f}.btn-check:checked+.btn-dark:focus,.btn-check:active+.btn-dark:focus,.btn-dark:active:focus,.btn-dark.active:focus,.show>.btn-dark.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #42464980}.btn-dark:disabled,.btn-dark.disabled{color:#fff;background-color:#212529;border-color:#212529}.btn-outline-primary{color:#0d6efd;border-color:#0d6efd}.btn-outline-primary:hover{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-check:focus+.btn-outline-primary,.btn-outline-primary:focus{box-shadow:0 0 0 .25rem #0d6efd80}.btn-check:checked+.btn-outline-primary,.btn-check:active+.btn-outline-primary,.btn-outline-primary:active,.btn-outline-primary.active,.btn-outline-primary.dropdown-toggle.show{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-check:checked+.btn-outline-primary:focus,.btn-check:active+.btn-outline-primary:focus,.btn-outline-primary:active:focus,.btn-outline-primary.active:focus,.btn-outline-primary.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #0d6efd80}.btn-outline-primary:disabled,.btn-outline-primary.disabled{color:#0d6efd;background-color:transparent}.btn-outline-secondary{color:#6c757d;border-color:#6c757d}.btn-outline-secondary:hover{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-check:focus+.btn-outline-secondary,.btn-outline-secondary:focus{box-shadow:0 0 0 .25rem #6c757d80}.btn-check:checked+.btn-outline-secondary,.btn-check:active+.btn-outline-secondary,.btn-outline-secondary:active,.btn-outline-secondary.active,.btn-outline-secondary.dropdown-toggle.show{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-check:checked+.btn-outline-secondary:focus,.btn-check:active+.btn-outline-secondary:focus,.btn-outline-secondary:active:focus,.btn-outline-secondary.active:focus,.btn-outline-secondary.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #6c757d80}.btn-outline-secondary:disabled,.btn-outline-secondary.disabled{color:#6c757d;background-color:transparent}.btn-outline-success{color:#198754;border-color:#198754}.btn-outline-success:hover{color:#fff;background-color:#198754;border-color:#198754}.btn-check:focus+.btn-outline-success,.btn-outline-success:focus{box-shadow:0 0 0 .25rem #19875480}.btn-check:checked+.btn-outline-success,.btn-check:active+.btn-outline-success,.btn-outline-success:active,.btn-outline-success.active,.btn-outline-success.dropdown-toggle.show{color:#fff;background-color:#198754;border-color:#198754}.btn-check:checked+.btn-outline-success:focus,.btn-check:active+.btn-outline-success:focus,.btn-outline-success:active:focus,.btn-outline-success.active:focus,.btn-outline-success.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #19875480}.btn-outline-success:disabled,.btn-outline-success.disabled{color:#198754;background-color:transparent}.btn-outline-info{color:#0dcaf0;border-color:#0dcaf0}.btn-outline-info:hover{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-check:focus+.btn-outline-info,.btn-outline-info:focus{box-shadow:0 0 0 .25rem #0dcaf080}.btn-check:checked+.btn-outline-info,.btn-check:active+.btn-outline-info,.btn-outline-info:active,.btn-outline-info.active,.btn-outline-info.dropdown-toggle.show{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-check:checked+.btn-outline-info:focus,.btn-check:active+.btn-outline-info:focus,.btn-outline-info:active:focus,.btn-outline-info.active:focus,.btn-outline-info.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #0dcaf080}.btn-outline-info:disabled,.btn-outline-info.disabled{color:#0dcaf0;background-color:transparent}.btn-outline-warning{color:#ffc107;border-color:#ffc107}.btn-outline-warning:hover{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-check:focus+.btn-outline-warning,.btn-outline-warning:focus{box-shadow:0 0 0 .25rem #ffc10780}.btn-check:checked+.btn-outline-warning,.btn-check:active+.btn-outline-warning,.btn-outline-warning:active,.btn-outline-warning.active,.btn-outline-warning.dropdown-toggle.show{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-check:checked+.btn-outline-warning:focus,.btn-check:active+.btn-outline-warning:focus,.btn-outline-warning:active:focus,.btn-outline-warning.active:focus,.btn-outline-warning.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #ffc10780}.btn-outline-warning:disabled,.btn-outline-warning.disabled{color:#ffc107;background-color:transparent}.btn-outline-danger{color:#dc3545;border-color:#dc3545}.btn-outline-danger:hover{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-check:focus+.btn-outline-danger,.btn-outline-danger:focus{box-shadow:0 0 0 .25rem #dc354580}.btn-check:checked+.btn-outline-danger,.btn-check:active+.btn-outline-danger,.btn-outline-danger:active,.btn-outline-danger.active,.btn-outline-danger.dropdown-toggle.show{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-check:checked+.btn-outline-danger:focus,.btn-check:active+.btn-outline-danger:focus,.btn-outline-danger:active:focus,.btn-outline-danger.active:focus,.btn-outline-danger.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #dc354580}.btn-outline-danger:disabled,.btn-outline-danger.disabled{color:#dc3545;background-color:transparent}.btn-outline-light{color:#f8f9fa;border-color:#f8f9fa}.btn-outline-light:hover{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-check:focus+.btn-outline-light,.btn-outline-light:focus{box-shadow:0 0 0 .25rem #f8f9fa80}.btn-check:checked+.btn-outline-light,.btn-check:active+.btn-outline-light,.btn-outline-light:active,.btn-outline-light.active,.btn-outline-light.dropdown-toggle.show{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-check:checked+.btn-outline-light:focus,.btn-check:active+.btn-outline-light:focus,.btn-outline-light:active:focus,.btn-outline-light.active:focus,.btn-outline-light.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #f8f9fa80}.btn-outline-light:disabled,.btn-outline-light.disabled{color:#f8f9fa;background-color:transparent}.btn-outline-dark{color:#212529;border-color:#212529}.btn-outline-dark:hover{color:#fff;background-color:#212529;border-color:#212529}.btn-check:focus+.btn-outline-dark,.btn-outline-dark:focus{box-shadow:0 0 0 .25rem #21252980}.btn-check:checked+.btn-outline-dark,.btn-check:active+.btn-outline-dark,.btn-outline-dark:active,.btn-outline-dark.active,.btn-outline-dark.dropdown-toggle.show{color:#fff;background-color:#212529;border-color:#212529}.btn-check:checked+.btn-outline-dark:focus,.btn-check:active+.btn-outline-dark:focus,.btn-outline-dark:active:focus,.btn-outline-dark.active:focus,.btn-outline-dark.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #21252980}.btn-outline-dark:disabled,.btn-outline-dark.disabled{color:#212529;background-color:transparent}.btn-link{font-weight:400;color:#0d6efd;text-decoration:underline}.btn-link:hover{color:#0a58ca}.btn-link:disabled,.btn-link.disabled{color:#6c757d}.btn-lg,.btn-group-lg>.btn{padding:.5rem 1rem;font-size:1.25rem;border-radius:.3rem}.btn-sm,.btn-group-sm>.btn{padding:.25rem .5rem;font-size:.875rem;border-radius:.2rem}.fade{transition:opacity .15s linear}@media (prefers-reduced-motion: reduce){.fade{transition:none}}.fade:not(.show){opacity:0}.collapse:not(.show){display:none}.collapsing{height:0;overflow:hidden;transition:height .35s ease}@media (prefers-reduced-motion: reduce){.collapsing{transition:none}}.collapsing.collapse-horizontal{width:0;height:auto;transition:width .35s ease}@media (prefers-reduced-motion: reduce){.collapsing.collapse-horizontal{transition:none}}.dropup,.dropend,.dropdown,.dropstart{position:relative}.dropdown-toggle{white-space:nowrap}.dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid;border-right:.3em solid transparent;border-bottom:0;border-left:.3em solid transparent}.dropdown-toggle:empty:after{margin-left:0}.dropdown-menu{position:absolute;z-index:1000;display:none;min-width:10rem;padding:.5rem 0;margin:0;font-size:1rem;color:#212529;text-align:left;list-style:none;background-color:#fff;background-clip:padding-box;border:1px solid rgba(0,0,0,.15);border-radius:.25rem}.dropdown-menu[data-bs-popper]{top:100%;left:0;margin-top:.125rem}.dropdown-menu-start{--bs-position: start}.dropdown-menu-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-end{--bs-position: end}.dropdown-menu-end[data-bs-popper]{right:0;left:auto}@media (min-width: 576px){.dropdown-menu-sm-start{--bs-position: start}.dropdown-menu-sm-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-sm-end{--bs-position: end}.dropdown-menu-sm-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 768px){.dropdown-menu-md-start{--bs-position: start}.dropdown-menu-md-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-md-end{--bs-position: end}.dropdown-menu-md-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 992px){.dropdown-menu-lg-start{--bs-position: start}.dropdown-menu-lg-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-lg-end{--bs-position: end}.dropdown-menu-lg-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1200px){.dropdown-menu-xl-start{--bs-position: start}.dropdown-menu-xl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xl-end{--bs-position: end}.dropdown-menu-xl-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1400px){.dropdown-menu-xxl-start{--bs-position: start}.dropdown-menu-xxl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xxl-end{--bs-position: end}.dropdown-menu-xxl-end[data-bs-popper]{right:0;left:auto}}.dropup .dropdown-menu[data-bs-popper]{top:auto;bottom:100%;margin-top:0;margin-bottom:.125rem}.dropup .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:0;border-right:.3em solid transparent;border-bottom:.3em solid;border-left:.3em solid transparent}.dropup .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-menu[data-bs-popper]{top:0;right:auto;left:100%;margin-top:0;margin-left:.125rem}.dropend .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:0;border-bottom:.3em solid transparent;border-left:.3em solid}.dropend .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-toggle:after{vertical-align:0}.dropstart .dropdown-menu[data-bs-popper]{top:0;right:100%;left:auto;margin-top:0;margin-right:.125rem}.dropstart .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:""}.dropstart .dropdown-toggle:after{display:none}.dropstart .dropdown-toggle:before{display:inline-block;margin-right:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:.3em solid;border-bottom:.3em solid transparent}.dropstart .dropdown-toggle:empty:after{margin-left:0}.dropstart .dropdown-toggle:before{vertical-align:0}.dropdown-divider{height:0;margin:.5rem 0;overflow:hidden;border-top:1px solid rgba(0,0,0,.15)}.dropdown-item{display:block;width:100%;padding:.25rem 1rem;clear:both;font-weight:400;color:#212529;text-align:inherit;text-decoration:none;white-space:nowrap;background-color:transparent;border:0}.dropdown-item:hover,.dropdown-item:focus{color:#1e2125;background-color:#e9ecef}.dropdown-item.active,.dropdown-item:active{color:#fff;text-decoration:none;background-color:#0d6efd}.dropdown-item.disabled,.dropdown-item:disabled{color:#adb5bd;pointer-events:none;background-color:transparent}.dropdown-menu.show{display:block}.dropdown-header{display:block;padding:.5rem 1rem;margin-bottom:0;font-size:.875rem;color:#6c757d;white-space:nowrap}.dropdown-item-text{display:block;padding:.25rem 1rem;color:#212529}.dropdown-menu-dark{color:#dee2e6;background-color:#343a40;border-color:#00000026}.dropdown-menu-dark .dropdown-item{color:#dee2e6}.dropdown-menu-dark .dropdown-item:hover,.dropdown-menu-dark .dropdown-item:focus{color:#fff;background-color:#ffffff26}.dropdown-menu-dark .dropdown-item.active,.dropdown-menu-dark .dropdown-item:active{color:#fff;background-color:#0d6efd}.dropdown-menu-dark .dropdown-item.disabled,.dropdown-menu-dark .dropdown-item:disabled{color:#adb5bd}.dropdown-menu-dark .dropdown-divider{border-color:#00000026}.dropdown-menu-dark .dropdown-item-text{color:#dee2e6}.dropdown-menu-dark .dropdown-header{color:#adb5bd}.btn-group,.btn-group-vertical{position:relative;display:inline-flex;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;flex:1 1 auto}.btn-group>.btn-check:checked+.btn,.btn-group>.btn-check:focus+.btn,.btn-group>.btn:hover,.btn-group>.btn:focus,.btn-group>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn-check:checked+.btn,.btn-group-vertical>.btn-check:focus+.btn,.btn-group-vertical>.btn:hover,.btn-group-vertical>.btn:focus,.btn-group-vertical>.btn:active,.btn-group-vertical>.btn.active{z-index:1}.btn-toolbar{display:flex;flex-wrap:wrap;justify-content:flex-start}.btn-toolbar .input-group{width:auto}.btn-group>.btn:not(:first-child),.btn-group>.btn-group:not(:first-child){margin-left:-1px}.btn-group>.btn:not(:last-child):not(.dropdown-toggle),.btn-group>.btn-group:not(:last-child)>.btn{border-top-right-radius:0;border-bottom-right-radius:0}.btn-group>.btn:nth-child(n+3),.btn-group>:not(.btn-check)+.btn,.btn-group>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-bottom-left-radius:0}.dropdown-toggle-split{padding-right:.5625rem;padding-left:.5625rem}.dropdown-toggle-split:after,.dropup .dropdown-toggle-split:after,.dropend .dropdown-toggle-split:after{margin-left:0}.dropstart .dropdown-toggle-split:before{margin-right:0}.btn-sm+.dropdown-toggle-split,.btn-group-sm>.btn+.dropdown-toggle-split{padding-right:.375rem;padding-left:.375rem}.btn-lg+.dropdown-toggle-split,.btn-group-lg>.btn+.dropdown-toggle-split{padding-right:.75rem;padding-left:.75rem}.btn-group-vertical{flex-direction:column;align-items:flex-start;justify-content:center}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group{width:100%}.btn-group-vertical>.btn:not(:first-child),.btn-group-vertical>.btn-group:not(:first-child){margin-top:-1px}.btn-group-vertical>.btn:not(:last-child):not(.dropdown-toggle),.btn-group-vertical>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn~.btn,.btn-group-vertical>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-top-right-radius:0}.nav{display:flex;flex-wrap:wrap;padding-left:0;margin-bottom:0;list-style:none}.nav-link{display:block;padding:.5rem 1rem;color:#0d6efd;text-decoration:none;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out}@media (prefers-reduced-motion: reduce){.nav-link{transition:none}}.nav-link:hover,.nav-link:focus{color:#0a58ca}.nav-link.disabled{color:#6c757d;pointer-events:none;cursor:default}.nav-tabs{border-bottom:1px solid #dee2e6}.nav-tabs .nav-link{margin-bottom:-1px;background:none;border:1px solid transparent;border-top-left-radius:.25rem;border-top-right-radius:.25rem}.nav-tabs .nav-link:hover,.nav-tabs .nav-link:focus{border-color:#e9ecef #e9ecef #dee2e6;isolation:isolate}.nav-tabs .nav-link.disabled{color:#6c757d;background-color:transparent;border-color:transparent}.nav-tabs .nav-link.active,.nav-tabs .nav-item.show .nav-link{color:#495057;background-color:#fff;border-color:#dee2e6 #dee2e6 #fff}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-left-radius:0;border-top-right-radius:0}.nav-pills .nav-link{background:none;border:0;border-radius:.25rem}.nav-pills .nav-link.active,.nav-pills .show>.nav-link{color:#fff;background-color:#0d6efd}.nav-fill>.nav-link,.nav-fill .nav-item{flex:1 1 auto;text-align:center}.nav-justified>.nav-link,.nav-justified .nav-item{flex-basis:0;flex-grow:1;text-align:center}.nav-fill .nav-item .nav-link,.nav-justified .nav-item .nav-link{width:100%}.tab-content>.tab-pane{display:none}.tab-content>.active{display:block}.navbar{position:relative;display:flex;flex-wrap:wrap;align-items:center;justify-content:space-between;padding-top:.5rem;padding-bottom:.5rem}.navbar>.container,.navbar>.container-fluid,.navbar>.container-sm,.navbar>.container-md,.navbar>.container-lg,.navbar>.container-xl,.navbar>.container-xxl{display:flex;flex-wrap:inherit;align-items:center;justify-content:space-between}.navbar-brand{padding-top:.3125rem;padding-bottom:.3125rem;margin-right:1rem;font-size:1.25rem;text-decoration:none;white-space:nowrap}.navbar-nav{display:flex;flex-direction:column;padding-left:0;margin-bottom:0;list-style:none}.navbar-nav .nav-link{padding-right:0;padding-left:0}.navbar-nav .dropdown-menu{position:static}.navbar-text{padding-top:.5rem;padding-bottom:.5rem}.navbar-collapse{flex-basis:100%;flex-grow:1;align-items:center}.navbar-toggler{padding:.25rem .75rem;font-size:1.25rem;line-height:1;background-color:transparent;border:1px solid transparent;border-radius:.25rem;transition:box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.navbar-toggler{transition:none}}.navbar-toggler:hover{text-decoration:none}.navbar-toggler:focus{text-decoration:none;outline:0;box-shadow:0 0 0 .25rem}.navbar-toggler-icon{display:inline-block;width:1.5em;height:1.5em;vertical-align:middle;background-repeat:no-repeat;background-position:center;background-size:100%}.navbar-nav-scroll{max-height:var(--bs-scroll-height, 75vh);overflow-y:auto}@media (min-width: 576px){.navbar-expand-sm{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-sm .navbar-nav{flex-direction:row}.navbar-expand-sm .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-sm .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-sm .navbar-nav-scroll{overflow:visible}.navbar-expand-sm .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-sm .navbar-toggler,.navbar-expand-sm .offcanvas-header{display:none}.navbar-expand-sm .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-sm .offcanvas-top,.navbar-expand-sm .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-sm .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 768px){.navbar-expand-md{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-md .navbar-nav{flex-direction:row}.navbar-expand-md .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-md .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-md .navbar-nav-scroll{overflow:visible}.navbar-expand-md .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-md .navbar-toggler,.navbar-expand-md .offcanvas-header{display:none}.navbar-expand-md .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-md .offcanvas-top,.navbar-expand-md .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-md .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 992px){.navbar-expand-lg{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-lg .navbar-nav{flex-direction:row}.navbar-expand-lg .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-lg .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-lg .navbar-nav-scroll{overflow:visible}.navbar-expand-lg .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-lg .navbar-toggler,.navbar-expand-lg .offcanvas-header{display:none}.navbar-expand-lg .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-lg .offcanvas-top,.navbar-expand-lg .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-lg .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1200px){.navbar-expand-xl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xl .navbar-nav{flex-direction:row}.navbar-expand-xl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xl .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-xl .navbar-nav-scroll{overflow:visible}.navbar-expand-xl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xl .navbar-toggler,.navbar-expand-xl .offcanvas-header{display:none}.navbar-expand-xl .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-xl .offcanvas-top,.navbar-expand-xl .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-xl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1400px){.navbar-expand-xxl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xxl .navbar-nav{flex-direction:row}.navbar-expand-xxl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xxl .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-xxl .navbar-nav-scroll{overflow:visible}.navbar-expand-xxl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xxl .navbar-toggler,.navbar-expand-xxl .offcanvas-header{display:none}.navbar-expand-xxl .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-xxl .offcanvas-top,.navbar-expand-xxl .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-xxl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}.navbar-expand{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand .navbar-nav{flex-direction:row}.navbar-expand .navbar-nav .dropdown-menu{position:absolute}.navbar-expand .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand .navbar-nav-scroll{overflow:visible}.navbar-expand .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand .navbar-toggler,.navbar-expand .offcanvas-header{display:none}.navbar-expand .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand .offcanvas-top,.navbar-expand .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}.navbar-light .navbar-brand{color:#000000e6}.navbar-light .navbar-brand:hover,.navbar-light .navbar-brand:focus{color:#000000e6}.navbar-light .navbar-nav .nav-link{color:#0000008c}.navbar-light .navbar-nav .nav-link:hover,.navbar-light .navbar-nav .nav-link:focus{color:#000000b3}.navbar-light .navbar-nav .nav-link.disabled{color:#0000004d}.navbar-light .navbar-nav .show>.nav-link,.navbar-light .navbar-nav .nav-link.active{color:#000000e6}.navbar-light .navbar-toggler{color:#0000008c;border-color:#0000001a}.navbar-light .navbar-toggler-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%280, 0, 0, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e")}.navbar-light .navbar-text{color:#0000008c}.navbar-light .navbar-text a,.navbar-light .navbar-text a:hover,.navbar-light .navbar-text a:focus{color:#000000e6}.navbar-dark .navbar-brand{color:#fff}.navbar-dark .navbar-brand:hover,.navbar-dark .navbar-brand:focus{color:#fff}.navbar-dark .navbar-nav .nav-link{color:#ffffff8c}.navbar-dark .navbar-nav .nav-link:hover,.navbar-dark .navbar-nav .nav-link:focus{color:#ffffffbf}.navbar-dark .navbar-nav .nav-link.disabled{color:#ffffff40}.navbar-dark .navbar-nav .show>.nav-link,.navbar-dark .navbar-nav .nav-link.active{color:#fff}.navbar-dark .navbar-toggler{color:#ffffff8c;border-color:#ffffff1a}.navbar-dark .navbar-toggler-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%28255, 255, 255, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e")}.navbar-dark .navbar-text{color:#ffffff8c}.navbar-dark .navbar-text a,.navbar-dark .navbar-text a:hover,.navbar-dark .navbar-text a:focus{color:#fff}.card{position:relative;display:flex;flex-direction:column;min-width:0;word-wrap:break-word;background-color:#fff;background-clip:border-box;border:1px solid rgba(0,0,0,.125);border-radius:.25rem}.card>hr{margin-right:0;margin-left:0}.card>.list-group{border-top:inherit;border-bottom:inherit}.card>.list-group:first-child{border-top-width:0;border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.card>.list-group:last-child{border-bottom-width:0;border-bottom-right-radius:calc(.25rem - 1px);border-bottom-left-radius:calc(.25rem - 1px)}.card>.card-header+.list-group,.card>.list-group+.card-footer{border-top:0}.card-body{flex:1 1 auto;padding:1rem}.card-title{margin-bottom:.5rem}.card-subtitle{margin-top:-.25rem;margin-bottom:0}.card-text:last-child{margin-bottom:0}.card-link+.card-link{margin-left:1rem}.card-header{padding:.5rem 1rem;margin-bottom:0;background-color:#00000008;border-bottom:1px solid rgba(0,0,0,.125)}.card-header:first-child{border-radius:calc(.25rem - 1px) calc(.25rem - 1px) 0 0}.card-footer{padding:.5rem 1rem;background-color:#00000008;border-top:1px solid rgba(0,0,0,.125)}.card-footer:last-child{border-radius:0 0 calc(.25rem - 1px) calc(.25rem - 1px)}.card-header-tabs{margin-right:-.5rem;margin-bottom:-.5rem;margin-left:-.5rem;border-bottom:0}.card-header-pills{margin-right:-.5rem;margin-left:-.5rem}.card-img-overlay{position:absolute;inset:0;padding:1rem;border-radius:calc(.25rem - 1px)}.card-img,.card-img-top,.card-img-bottom{width:100%}.card-img,.card-img-top{border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.card-img,.card-img-bottom{border-bottom-right-radius:calc(.25rem - 1px);border-bottom-left-radius:calc(.25rem - 1px)}.card-group>.card{margin-bottom:.75rem}@media (min-width: 576px){.card-group{display:flex;flex-flow:row wrap}.card-group>.card{flex:1 0 0%;margin-bottom:0}.card-group>.card+.card{margin-left:0;border-left:0}.card-group>.card:not(:last-child){border-top-right-radius:0;border-bottom-right-radius:0}.card-group>.card:not(:last-child) .card-img-top,.card-group>.card:not(:last-child) .card-header{border-top-right-radius:0}.card-group>.card:not(:last-child) .card-img-bottom,.card-group>.card:not(:last-child) .card-footer{border-bottom-right-radius:0}.card-group>.card:not(:first-child){border-top-left-radius:0;border-bottom-left-radius:0}.card-group>.card:not(:first-child) .card-img-top,.card-group>.card:not(:first-child) .card-header{border-top-left-radius:0}.card-group>.card:not(:first-child) .card-img-bottom,.card-group>.card:not(:first-child) .card-footer{border-bottom-left-radius:0}}.accordion-button{position:relative;display:flex;align-items:center;width:100%;padding:1rem 1.25rem;font-size:1rem;color:#212529;text-align:left;background-color:#fff;border:0;border-radius:0;overflow-anchor:none;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out,border-radius .15s ease}@media (prefers-reduced-motion: reduce){.accordion-button{transition:none}}.accordion-button:not(.collapsed){color:#0c63e4;background-color:#e7f1ff;box-shadow:inset 0 -1px #00000020}.accordion-button:not(.collapsed):after{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%230c63e4'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");transform:rotate(-180deg)}.accordion-button:after{flex-shrink:0;width:1.25rem;height:1.25rem;margin-left:auto;content:"";background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23212529'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");background-repeat:no-repeat;background-size:1.25rem;transition:transform .2s ease-in-out}@media (prefers-reduced-motion: reduce){.accordion-button:after{transition:none}}.accordion-button:hover{z-index:2}.accordion-button:focus{z-index:3;border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.accordion-header{margin-bottom:0}.accordion-item{background-color:#fff;border:1px solid rgba(0,0,0,.125)}.accordion-item:first-of-type{border-top-left-radius:.25rem;border-top-right-radius:.25rem}.accordion-item:first-of-type .accordion-button{border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.accordion-item:not(:first-of-type){border-top:0}.accordion-item:last-of-type{border-bottom-right-radius:.25rem;border-bottom-left-radius:.25rem}.accordion-item:last-of-type .accordion-button.collapsed{border-bottom-right-radius:calc(.25rem - 1px);border-bottom-left-radius:calc(.25rem - 1px)}.accordion-item:last-of-type .accordion-collapse{border-bottom-right-radius:.25rem;border-bottom-left-radius:.25rem}.accordion-body{padding:1rem 1.25rem}.accordion-flush .accordion-collapse{border-width:0}.accordion-flush .accordion-item{border-right:0;border-left:0;border-radius:0}.accordion-flush .accordion-item:first-child{border-top:0}.accordion-flush .accordion-item:last-child{border-bottom:0}.accordion-flush .accordion-item .accordion-button{border-radius:0}.breadcrumb{display:flex;flex-wrap:wrap;padding:0;margin-bottom:1rem;list-style:none}.breadcrumb-item+.breadcrumb-item{padding-left:.5rem}.breadcrumb-item+.breadcrumb-item:before{float:left;padding-right:.5rem;color:#6c757d;content:var(--bs-breadcrumb-divider, "/")}.breadcrumb-item.active{color:#6c757d}.pagination{display:flex;padding-left:0;list-style:none}.page-link{position:relative;display:block;color:#0d6efd;text-decoration:none;background-color:#fff;border:1px solid #dee2e6;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.page-link{transition:none}}.page-link:hover{z-index:2;color:#0a58ca;background-color:#e9ecef;border-color:#dee2e6}.page-link:focus{z-index:3;color:#0a58ca;background-color:#e9ecef;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.page-item:not(:first-child) .page-link{margin-left:-1px}.page-item.active .page-link{z-index:3;color:#fff;background-color:#0d6efd;border-color:#0d6efd}.page-item.disabled .page-link{color:#6c757d;pointer-events:none;background-color:#fff;border-color:#dee2e6}.page-link{padding:.375rem .75rem}.page-item:first-child .page-link{border-top-left-radius:.25rem;border-bottom-left-radius:.25rem}.page-item:last-child .page-link{border-top-right-radius:.25rem;border-bottom-right-radius:.25rem}.pagination-lg .page-link{padding:.75rem 1.5rem;font-size:1.25rem}.pagination-lg .page-item:first-child .page-link{border-top-left-radius:.3rem;border-bottom-left-radius:.3rem}.pagination-lg .page-item:last-child .page-link{border-top-right-radius:.3rem;border-bottom-right-radius:.3rem}.pagination-sm .page-link{padding:.25rem .5rem;font-size:.875rem}.pagination-sm .page-item:first-child .page-link{border-top-left-radius:.2rem;border-bottom-left-radius:.2rem}.pagination-sm .page-item:last-child .page-link{border-top-right-radius:.2rem;border-bottom-right-radius:.2rem}.badge{display:inline-block;padding:.35em .65em;font-size:.75em;font-weight:700;line-height:1;color:#fff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25rem}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.alert{position:relative;padding:1rem;margin-bottom:1rem;border:1px solid transparent;border-radius:.25rem}.alert-heading{color:inherit}.alert-link{font-weight:700}.alert-dismissible{padding-right:3rem}.alert-dismissible .btn-close{position:absolute;top:0;right:0;z-index:2;padding:1.25rem 1rem}.alert-primary{color:#084298;background-color:#cfe2ff;border-color:#b6d4fe}.alert-primary .alert-link{color:#06357a}.alert-secondary{color:#41464b;background-color:#e2e3e5;border-color:#d3d6d8}.alert-secondary .alert-link{color:#34383c}.alert-success{color:#0f5132;background-color:#d1e7dd;border-color:#badbcc}.alert-success .alert-link{color:#0c4128}.alert-info{color:#055160;background-color:#cff4fc;border-color:#b6effb}.alert-info .alert-link{color:#04414d}.alert-warning{color:#664d03;background-color:#fff3cd;border-color:#ffecb5}.alert-warning .alert-link{color:#523e02}.alert-danger{color:#842029;background-color:#f8d7da;border-color:#f5c2c7}.alert-danger .alert-link{color:#6a1a21}.alert-light{color:#636464;background-color:#fefefe;border-color:#fdfdfe}.alert-light .alert-link{color:#4f5050}.alert-dark{color:#141619;background-color:#d3d3d4;border-color:#bcbebf}.alert-dark .alert-link{color:#101214}@-webkit-keyframes progress-bar-stripes{0%{background-position-x:1rem}}@keyframes progress-bar-stripes{0%{background-position-x:1rem}}.progress{display:flex;height:1rem;overflow:hidden;font-size:.75rem;background-color:#e9ecef;border-radius:.25rem}.progress-bar{display:flex;flex-direction:column;justify-content:center;overflow:hidden;color:#fff;text-align:center;white-space:nowrap;background-color:#0d6efd;transition:width .6s ease}@media (prefers-reduced-motion: reduce){.progress-bar{transition:none}}.progress-bar-striped{background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-size:1rem 1rem}.progress-bar-animated{-webkit-animation:1s linear infinite progress-bar-stripes;animation:1s linear infinite progress-bar-stripes}@media (prefers-reduced-motion: reduce){.progress-bar-animated{-webkit-animation:none;animation:none}}.list-group{display:flex;flex-direction:column;padding-left:0;margin-bottom:0;border-radius:.25rem}.list-group-numbered{list-style-type:none;counter-reset:section}.list-group-numbered>li:before{content:counters(section,".") ". ";counter-increment:section}.list-group-item-action{width:100%;color:#495057;text-align:inherit}.list-group-item-action:hover,.list-group-item-action:focus{z-index:1;color:#495057;text-decoration:none;background-color:#f8f9fa}.list-group-item-action:active{color:#212529;background-color:#e9ecef}.list-group-item{position:relative;display:block;padding:.5rem 1rem;color:#212529;text-decoration:none;background-color:#fff;border:1px solid rgba(0,0,0,.125)}.list-group-item:first-child{border-top-left-radius:inherit;border-top-right-radius:inherit}.list-group-item:last-child{border-bottom-right-radius:inherit;border-bottom-left-radius:inherit}.list-group-item.disabled,.list-group-item:disabled{color:#6c757d;pointer-events:none;background-color:#fff}.list-group-item.active{z-index:2;color:#fff;background-color:#0d6efd;border-color:#0d6efd}.list-group-item+.list-group-item{border-top-width:0}.list-group-item+.list-group-item.active{margin-top:-1px;border-top-width:1px}.list-group-horizontal{flex-direction:row}.list-group-horizontal>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal>.list-group-item.active{margin-top:0}.list-group-horizontal>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}@media (min-width: 576px){.list-group-horizontal-sm{flex-direction:row}.list-group-horizontal-sm>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-sm>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-sm>.list-group-item.active{margin-top:0}.list-group-horizontal-sm>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-sm>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 768px){.list-group-horizontal-md{flex-direction:row}.list-group-horizontal-md>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-md>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-md>.list-group-item.active{margin-top:0}.list-group-horizontal-md>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-md>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 992px){.list-group-horizontal-lg{flex-direction:row}.list-group-horizontal-lg>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-lg>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-lg>.list-group-item.active{margin-top:0}.list-group-horizontal-lg>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-lg>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 1200px){.list-group-horizontal-xl{flex-direction:row}.list-group-horizontal-xl>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-xl>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-xl>.list-group-item.active{margin-top:0}.list-group-horizontal-xl>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-xl>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 1400px){.list-group-horizontal-xxl{flex-direction:row}.list-group-horizontal-xxl>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-xxl>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-xxl>.list-group-item.active{margin-top:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}.list-group-flush{border-radius:0}.list-group-flush>.list-group-item{border-width:0 0 1px}.list-group-flush>.list-group-item:last-child{border-bottom-width:0}.list-group-item-primary{color:#084298;background-color:#cfe2ff}.list-group-item-primary.list-group-item-action:hover,.list-group-item-primary.list-group-item-action:focus{color:#084298;background-color:#bacbe6}.list-group-item-primary.list-group-item-action.active{color:#fff;background-color:#084298;border-color:#084298}.list-group-item-secondary{color:#41464b;background-color:#e2e3e5}.list-group-item-secondary.list-group-item-action:hover,.list-group-item-secondary.list-group-item-action:focus{color:#41464b;background-color:#cbccce}.list-group-item-secondary.list-group-item-action.active{color:#fff;background-color:#41464b;border-color:#41464b}.list-group-item-success{color:#0f5132;background-color:#d1e7dd}.list-group-item-success.list-group-item-action:hover,.list-group-item-success.list-group-item-action:focus{color:#0f5132;background-color:#bcd0c7}.list-group-item-success.list-group-item-action.active{color:#fff;background-color:#0f5132;border-color:#0f5132}.list-group-item-info{color:#055160;background-color:#cff4fc}.list-group-item-info.list-group-item-action:hover,.list-group-item-info.list-group-item-action:focus{color:#055160;background-color:#badce3}.list-group-item-info.list-group-item-action.active{color:#fff;background-color:#055160;border-color:#055160}.list-group-item-warning{color:#664d03;background-color:#fff3cd}.list-group-item-warning.list-group-item-action:hover,.list-group-item-warning.list-group-item-action:focus{color:#664d03;background-color:#e6dbb9}.list-group-item-warning.list-group-item-action.active{color:#fff;background-color:#664d03;border-color:#664d03}.list-group-item-danger{color:#842029;background-color:#f8d7da}.list-group-item-danger.list-group-item-action:hover,.list-group-item-danger.list-group-item-action:focus{color:#842029;background-color:#dfc2c4}.list-group-item-danger.list-group-item-action.active{color:#fff;background-color:#842029;border-color:#842029}.list-group-item-light{color:#636464;background-color:#fefefe}.list-group-item-light.list-group-item-action:hover,.list-group-item-light.list-group-item-action:focus{color:#636464;background-color:#e5e5e5}.list-group-item-light.list-group-item-action.active{color:#fff;background-color:#636464;border-color:#636464}.list-group-item-dark{color:#141619;background-color:#d3d3d4}.list-group-item-dark.list-group-item-action:hover,.list-group-item-dark.list-group-item-action:focus{color:#141619;background-color:#bebebf}.list-group-item-dark.list-group-item-action.active{color:#fff;background-color:#141619;border-color:#141619}.btn-close{box-sizing:content-box;width:1em;height:1em;padding:.25em;color:#000;background:transparent url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23000'%3e%3cpath d='M.293.293a1 1 0 011.414 0L8 6.586 14.293.293a1 1 0 111.414 1.414L9.414 8l6.293 6.293a1 1 0 01-1.414 1.414L8 9.414l-6.293 6.293a1 1 0 01-1.414-1.414L6.586 8 .293 1.707a1 1 0 010-1.414z'/%3e%3c/svg%3e") center/1em auto no-repeat;border:0;border-radius:.25rem;opacity:.5}.btn-close:hover{color:#000;text-decoration:none;opacity:.75}.btn-close:focus{outline:0;box-shadow:0 0 0 .25rem #0d6efd40;opacity:1}.btn-close:disabled,.btn-close.disabled{pointer-events:none;-webkit-user-select:none;-moz-user-select:none;user-select:none;opacity:.25}.btn-close-white{filter:invert(1) grayscale(100%) brightness(200%)}.toast{width:350px;max-width:100%;font-size:.875rem;pointer-events:auto;background-color:#ffffffd9;background-clip:padding-box;border:1px solid rgba(0,0,0,.1);box-shadow:0 .5rem 1rem #00000026;border-radius:.25rem}.toast.showing{opacity:0}.toast:not(.show){display:none}.toast-container{width:-webkit-max-content;width:-moz-max-content;width:max-content;max-width:100%;pointer-events:none}.toast-container>:not(:last-child){margin-bottom:.75rem}.toast-header{display:flex;align-items:center;padding:.5rem .75rem;color:#6c757d;background-color:#ffffffd9;background-clip:padding-box;border-bottom:1px solid rgba(0,0,0,.05);border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.toast-header .btn-close{margin-right:-.375rem;margin-left:.75rem}.toast-body{padding:.75rem;word-wrap:break-word}.modal{position:fixed;top:0;left:0;z-index:1055;display:none;width:100%;height:100%;overflow-x:hidden;overflow-y:auto;outline:0}.modal-dialog{position:relative;width:auto;margin:.5rem;pointer-events:none}.modal.fade .modal-dialog{transition:transform .3s ease-out;transform:translateY(-50px)}@media (prefers-reduced-motion: reduce){.modal.fade .modal-dialog{transition:none}}.modal.show .modal-dialog{transform:none}.modal.modal-static .modal-dialog{transform:scale(1.02)}.modal-dialog-scrollable{height:calc(100% - 1rem)}.modal-dialog-scrollable .modal-content{max-height:100%;overflow:hidden}.modal-dialog-scrollable .modal-body{overflow-y:auto}.modal-dialog-centered{display:flex;align-items:center;min-height:calc(100% - 1rem)}.modal-content{position:relative;display:flex;flex-direction:column;width:100%;pointer-events:auto;background-color:#fff;background-clip:padding-box;border:1px solid rgba(0,0,0,.2);border-radius:.3rem;outline:0}.modal-backdrop{position:fixed;top:0;left:0;z-index:1050;width:100vw;height:100vh;background-color:#000}.modal-backdrop.fade{opacity:0}.modal-backdrop.show{opacity:.5}.modal-header{display:flex;flex-shrink:0;align-items:center;justify-content:space-between;padding:1rem;border-bottom:1px solid #dee2e6;border-top-left-radius:calc(.3rem - 1px);border-top-right-radius:calc(.3rem - 1px)}.modal-header .btn-close{padding:.5rem;margin:-.5rem -.5rem -.5rem auto}.modal-title{margin-bottom:0;line-height:1.5}.modal-body{position:relative;flex:1 1 auto;padding:1rem}.modal-footer{display:flex;flex-wrap:wrap;flex-shrink:0;align-items:center;justify-content:flex-end;padding:.75rem;border-top:1px solid #dee2e6;border-bottom-right-radius:calc(.3rem - 1px);border-bottom-left-radius:calc(.3rem - 1px)}.modal-footer>*{margin:.25rem}@media (min-width: 576px){.modal-dialog{max-width:500px;margin:1.75rem auto}.modal-dialog-scrollable{height:calc(100% - 3.5rem)}.modal-dialog-centered{min-height:calc(100% - 3.5rem)}.modal-sm{max-width:300px}}@media (min-width: 992px){.modal-lg,.modal-xl{max-width:800px}}@media (min-width: 1200px){.modal-xl{max-width:1140px}}.modal-fullscreen{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen .modal-header{border-radius:0}.modal-fullscreen .modal-body{overflow-y:auto}.modal-fullscreen .modal-footer{border-radius:0}@media (max-width: 575.98px){.modal-fullscreen-sm-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-sm-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-sm-down .modal-header{border-radius:0}.modal-fullscreen-sm-down .modal-body{overflow-y:auto}.modal-fullscreen-sm-down .modal-footer{border-radius:0}}@media (max-width: 767.98px){.modal-fullscreen-md-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-md-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-md-down .modal-header{border-radius:0}.modal-fullscreen-md-down .modal-body{overflow-y:auto}.modal-fullscreen-md-down .modal-footer{border-radius:0}}@media (max-width: 991.98px){.modal-fullscreen-lg-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-lg-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-lg-down .modal-header{border-radius:0}.modal-fullscreen-lg-down .modal-body{overflow-y:auto}.modal-fullscreen-lg-down .modal-footer{border-radius:0}}@media (max-width: 1199.98px){.modal-fullscreen-xl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xl-down .modal-header{border-radius:0}.modal-fullscreen-xl-down .modal-body{overflow-y:auto}.modal-fullscreen-xl-down .modal-footer{border-radius:0}}@media (max-width: 1399.98px){.modal-fullscreen-xxl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xxl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xxl-down .modal-header{border-radius:0}.modal-fullscreen-xxl-down .modal-body{overflow-y:auto}.modal-fullscreen-xxl-down .modal-footer{border-radius:0}}.tooltip{position:absolute;z-index:1080;display:block;margin:0;font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;word-spacing:normal;white-space:normal;line-break:auto;font-size:.875rem;word-wrap:break-word;opacity:0}.tooltip.show{opacity:.9}.tooltip .tooltip-arrow{position:absolute;display:block;width:.8rem;height:.4rem}.tooltip .tooltip-arrow:before{position:absolute;content:"";border-color:transparent;border-style:solid}.bs-tooltip-top,.bs-tooltip-auto[data-popper-placement^=top]{padding:.4rem 0}.bs-tooltip-top .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow{bottom:0}.bs-tooltip-top .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow:before{top:-1px;border-width:.4rem .4rem 0;border-top-color:#000}.bs-tooltip-end,.bs-tooltip-auto[data-popper-placement^=right]{padding:0 .4rem}.bs-tooltip-end .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow{left:0;width:.4rem;height:.8rem}.bs-tooltip-end .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow:before{right:-1px;border-width:.4rem .4rem .4rem 0;border-right-color:#000}.bs-tooltip-bottom,.bs-tooltip-auto[data-popper-placement^=bottom]{padding:.4rem 0}.bs-tooltip-bottom .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow{top:0}.bs-tooltip-bottom .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow:before{bottom:-1px;border-width:0 .4rem .4rem;border-bottom-color:#000}.bs-tooltip-start,.bs-tooltip-auto[data-popper-placement^=left]{padding:0 .4rem}.bs-tooltip-start .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow{right:0;width:.4rem;height:.8rem}.bs-tooltip-start .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow:before{left:-1px;border-width:.4rem 0 .4rem .4rem;border-left-color:#000}.tooltip-inner{max-width:200px;padding:.25rem .5rem;color:#fff;text-align:center;background-color:#000;border-radius:.25rem}.popover{position:absolute;top:0;left:0;z-index:1070;display:block;max-width:276px;font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;word-spacing:normal;white-space:normal;line-break:auto;font-size:.875rem;word-wrap:break-word;background-color:#fff;background-clip:padding-box;border:1px solid rgba(0,0,0,.2);border-radius:.3rem}.popover .popover-arrow{position:absolute;display:block;width:1rem;height:.5rem}.popover .popover-arrow:before,.popover .popover-arrow:after{position:absolute;display:block;content:"";border-color:transparent;border-style:solid}.bs-popover-top>.popover-arrow,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow{bottom:calc(-.5rem - 1px)}.bs-popover-top>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:before{bottom:0;border-width:.5rem .5rem 0;border-top-color:#00000040}.bs-popover-top>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:after{bottom:1px;border-width:.5rem .5rem 0;border-top-color:#fff}.bs-popover-end>.popover-arrow,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow{left:calc(-.5rem - 1px);width:.5rem;height:1rem}.bs-popover-end>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:before{left:0;border-width:.5rem .5rem .5rem 0;border-right-color:#00000040}.bs-popover-end>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:after{left:1px;border-width:.5rem .5rem .5rem 0;border-right-color:#fff}.bs-popover-bottom>.popover-arrow,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow{top:calc(-.5rem - 1px)}.bs-popover-bottom>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:before{top:0;border-width:0 .5rem .5rem .5rem;border-bottom-color:#00000040}.bs-popover-bottom>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:after{top:1px;border-width:0 .5rem .5rem .5rem;border-bottom-color:#fff}.bs-popover-bottom .popover-header:before,.bs-popover-auto[data-popper-placement^=bottom] .popover-header:before{position:absolute;top:0;left:50%;display:block;width:1rem;margin-left:-.5rem;content:"";border-bottom:1px solid #f0f0f0}.bs-popover-start>.popover-arrow,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow{right:calc(-.5rem - 1px);width:.5rem;height:1rem}.bs-popover-start>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:before{right:0;border-width:.5rem 0 .5rem .5rem;border-left-color:#00000040}.bs-popover-start>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:after{right:1px;border-width:.5rem 0 .5rem .5rem;border-left-color:#fff}.popover-header{padding:.5rem 1rem;margin-bottom:0;font-size:1rem;background-color:#f0f0f0;border-bottom:1px solid rgba(0,0,0,.2);border-top-left-radius:calc(.3rem - 1px);border-top-right-radius:calc(.3rem - 1px)}.popover-header:empty{display:none}.popover-body{padding:1rem;color:#212529}.carousel{position:relative}.carousel.pointer-event{touch-action:pan-y}.carousel-inner{position:relative;width:100%;overflow:hidden}.carousel-inner:after{display:block;clear:both;content:""}.carousel-item{position:relative;display:none;float:left;width:100%;margin-right:-100%;-webkit-backface-visibility:hidden;backface-visibility:hidden;transition:transform .6s ease-in-out}@media (prefers-reduced-motion: reduce){.carousel-item{transition:none}}.carousel-item.active,.carousel-item-next,.carousel-item-prev{display:block}.carousel-item-next:not(.carousel-item-start),.active.carousel-item-end{transform:translate(100%)}.carousel-item-prev:not(.carousel-item-end),.active.carousel-item-start{transform:translate(-100%)}.carousel-fade .carousel-item{opacity:0;transition-property:opacity;transform:none}.carousel-fade .carousel-item.active,.carousel-fade .carousel-item-next.carousel-item-start,.carousel-fade .carousel-item-prev.carousel-item-end{z-index:1;opacity:1}.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{z-index:0;opacity:0;transition:opacity 0s .6s}@media (prefers-reduced-motion: reduce){.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{transition:none}}.carousel-control-prev,.carousel-control-next{position:absolute;top:0;bottom:0;z-index:1;display:flex;align-items:center;justify-content:center;width:15%;padding:0;color:#fff;text-align:center;background:none;border:0;opacity:.5;transition:opacity .15s ease}@media (prefers-reduced-motion: reduce){.carousel-control-prev,.carousel-control-next{transition:none}}.carousel-control-prev:hover,.carousel-control-prev:focus,.carousel-control-next:hover,.carousel-control-next:focus{color:#fff;text-decoration:none;outline:0;opacity:.9}.carousel-control-prev{left:0}.carousel-control-next{right:0}.carousel-control-prev-icon,.carousel-control-next-icon{display:inline-block;width:2rem;height:2rem;background-repeat:no-repeat;background-position:50%;background-size:100% 100%}.carousel-control-prev-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M11.354 1.646a.5.5 0 0 1 0 .708L5.707 8l5.647 5.646a.5.5 0 0 1-.708.708l-6-6a.5.5 0 0 1 0-.708l6-6a.5.5 0 0 1 .708 0z'/%3e%3c/svg%3e")}.carousel-control-next-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M4.646 1.646a.5.5 0 0 1 .708 0l6 6a.5.5 0 0 1 0 .708l-6 6a.5.5 0 0 1-.708-.708L10.293 8 4.646 2.354a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e")}.carousel-indicators{position:absolute;right:0;bottom:0;left:0;z-index:2;display:flex;justify-content:center;padding:0;margin-right:15%;margin-bottom:1rem;margin-left:15%;list-style:none}.carousel-indicators [data-bs-target]{box-sizing:content-box;flex:0 1 auto;width:30px;height:3px;padding:0;margin-right:3px;margin-left:3px;text-indent:-999px;cursor:pointer;background-color:#fff;background-clip:padding-box;border:0;border-top:10px solid transparent;border-bottom:10px solid transparent;opacity:.5;transition:opacity .6s ease}@media (prefers-reduced-motion: reduce){.carousel-indicators [data-bs-target]{transition:none}}.carousel-indicators .active{opacity:1}.carousel-caption{position:absolute;right:15%;bottom:1.25rem;left:15%;padding-top:1.25rem;padding-bottom:1.25rem;color:#fff;text-align:center}.carousel-dark .carousel-control-prev-icon,.carousel-dark .carousel-control-next-icon{filter:invert(1) grayscale(100)}.carousel-dark .carousel-indicators [data-bs-target]{background-color:#000}.carousel-dark .carousel-caption{color:#000}@-webkit-keyframes spinner-border{to{transform:rotate(360deg)}}@keyframes spinner-border{to{transform:rotate(360deg)}}.spinner-border{display:inline-block;width:2rem;height:2rem;vertical-align:-.125em;border:.25em solid currentColor;border-right-color:transparent;border-radius:50%;-webkit-animation:.75s linear infinite spinner-border;animation:.75s linear infinite spinner-border}.spinner-border-sm{width:1rem;height:1rem;border-width:.2em}@-webkit-keyframes spinner-grow{0%{transform:scale(0)}50%{opacity:1;transform:none}}@keyframes spinner-grow{0%{transform:scale(0)}50%{opacity:1;transform:none}}.spinner-grow{display:inline-block;width:2rem;height:2rem;vertical-align:-.125em;background-color:currentColor;border-radius:50%;opacity:0;-webkit-animation:.75s linear infinite spinner-grow;animation:.75s linear infinite spinner-grow}.spinner-grow-sm{width:1rem;height:1rem}@media (prefers-reduced-motion: reduce){.spinner-border,.spinner-grow{-webkit-animation-duration:1.5s;animation-duration:1.5s}}.offcanvas{position:fixed;bottom:0;z-index:1045;display:flex;flex-direction:column;max-width:100%;visibility:hidden;background-color:#fff;background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}@media (prefers-reduced-motion: reduce){.offcanvas{transition:none}}.offcanvas-backdrop{position:fixed;top:0;left:0;z-index:1040;width:100vw;height:100vh;background-color:#000}.offcanvas-backdrop.fade{opacity:0}.offcanvas-backdrop.show{opacity:.5}.offcanvas-header{display:flex;align-items:center;justify-content:space-between;padding:1rem}.offcanvas-header .btn-close{padding:.5rem;margin-top:-.5rem;margin-right:-.5rem;margin-bottom:-.5rem}.offcanvas-title{margin-bottom:0;line-height:1.5}.offcanvas-body{flex-grow:1;padding:1rem;overflow-y:auto}.offcanvas-start{top:0;left:0;width:400px;border-right:1px solid rgba(0,0,0,.2);transform:translate(-100%)}.offcanvas-end{top:0;right:0;width:400px;border-left:1px solid rgba(0,0,0,.2);transform:translate(100%)}.offcanvas-top{top:0;right:0;left:0;height:30vh;max-height:100%;border-bottom:1px solid rgba(0,0,0,.2);transform:translateY(-100%)}.offcanvas-bottom{right:0;left:0;height:30vh;max-height:100%;border-top:1px solid rgba(0,0,0,.2);transform:translateY(100%)}.offcanvas.show{transform:none}.placeholder{display:inline-block;min-height:1em;vertical-align:middle;cursor:wait;background-color:currentColor;opacity:.5}.placeholder.btn:before{display:inline-block;content:""}.placeholder-xs{min-height:.6em}.placeholder-sm{min-height:.8em}.placeholder-lg{min-height:1.2em}.placeholder-glow .placeholder{-webkit-animation:placeholder-glow 2s ease-in-out infinite;animation:placeholder-glow 2s ease-in-out infinite}@-webkit-keyframes placeholder-glow{50%{opacity:.2}}@keyframes placeholder-glow{50%{opacity:.2}}.placeholder-wave{-webkit-mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);-webkit-mask-size:200% 100%;mask-size:200% 100%;-webkit-animation:placeholder-wave 2s linear infinite;animation:placeholder-wave 2s linear infinite}@-webkit-keyframes placeholder-wave{to{-webkit-mask-position:-200% 0%;mask-position:-200% 0%}}@keyframes placeholder-wave{to{-webkit-mask-position:-200% 0%;mask-position:-200% 0%}}.clearfix:after{display:block;clear:both;content:""}.link-primary{color:#0d6efd}.link-primary:hover,.link-primary:focus{color:#0a58ca}.link-secondary{color:#6c757d}.link-secondary:hover,.link-secondary:focus{color:#565e64}.link-success{color:#198754}.link-success:hover,.link-success:focus{color:#146c43}.link-info{color:#0dcaf0}.link-info:hover,.link-info:focus{color:#3dd5f3}.link-warning{color:#ffc107}.link-warning:hover,.link-warning:focus{color:#ffcd39}.link-danger{color:#dc3545}.link-danger:hover,.link-danger:focus{color:#b02a37}.link-light{color:#f8f9fa}.link-light:hover,.link-light:focus{color:#f9fafb}.link-dark{color:#212529}.link-dark:hover,.link-dark:focus{color:#1a1e21}.ratio{position:relative;width:100%}.ratio:before{display:block;padding-top:var(--bs-aspect-ratio);content:""}.ratio>*{position:absolute;top:0;left:0;width:100%;height:100%}.ratio-1x1{--bs-aspect-ratio: 100%}.ratio-4x3{--bs-aspect-ratio: 75%}.ratio-16x9{--bs-aspect-ratio: 56.25%}.ratio-21x9{--bs-aspect-ratio: 42.8571428571%}.fixed-top{position:fixed;top:0;right:0;left:0;z-index:1030}.fixed-bottom{position:fixed;right:0;bottom:0;left:0;z-index:1030}.sticky-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}@media (min-width: 576px){.sticky-sm-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 768px){.sticky-md-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 992px){.sticky-lg-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 1200px){.sticky-xl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 1400px){.sticky-xxl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}.hstack{display:flex;flex-direction:row;align-items:center;align-self:stretch}.vstack{display:flex;flex:1 1 auto;flex-direction:column;align-self:stretch}.visually-hidden,.visually-hidden-focusable:not(:focus):not(:focus-within){position:absolute!important;width:1px!important;height:1px!important;padding:0!important;margin:-1px!important;overflow:hidden!important;clip:rect(0,0,0,0)!important;white-space:nowrap!important;border:0!important}.stretched-link:after{position:absolute;inset:0;z-index:1;content:""}.text-truncate{overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.vr{display:inline-block;align-self:stretch;width:1px;min-height:1em;background-color:currentColor;opacity:.25}.align-baseline{vertical-align:baseline!important}.align-top{vertical-align:top!important}.align-middle{vertical-align:middle!important}.align-bottom{vertical-align:bottom!important}.align-text-bottom{vertical-align:text-bottom!important}.align-text-top{vertical-align:text-top!important}.float-start{float:left!important}.float-end{float:right!important}.float-none{float:none!important}.opacity-0{opacity:0!important}.opacity-25{opacity:.25!important}.opacity-50{opacity:.5!important}.opacity-75{opacity:.75!important}.opacity-100{opacity:1!important}.overflow-auto{overflow:auto!important}.overflow-hidden{overflow:hidden!important}.overflow-visible{overflow:visible!important}.overflow-scroll{overflow:scroll!important}.d-inline{display:inline!important}.d-inline-block{display:inline-block!important}.d-block{display:block!important}.d-grid{display:grid!important}.d-table{display:table!important}.d-table-row{display:table-row!important}.d-table-cell{display:table-cell!important}.d-flex{display:flex!important}.d-inline-flex{display:inline-flex!important}.d-none{display:none!important}.shadow{box-shadow:0 .5rem 1rem #00000026!important}.shadow-sm{box-shadow:0 .125rem .25rem #00000013!important}.shadow-lg{box-shadow:0 1rem 3rem #0000002d!important}.shadow-none{box-shadow:none!important}.position-static{position:static!important}.position-relative{position:relative!important}.position-absolute{position:absolute!important}.position-fixed{position:fixed!important}.position-sticky{position:-webkit-sticky!important;position:sticky!important}.top-0{top:0!important}.top-50{top:50%!important}.top-100{top:100%!important}.bottom-0{bottom:0!important}.bottom-50{bottom:50%!important}.bottom-100{bottom:100%!important}.start-0{left:0!important}.start-50{left:50%!important}.start-100{left:100%!important}.end-0{right:0!important}.end-50{right:50%!important}.end-100{right:100%!important}.translate-middle{transform:translate(-50%,-50%)!important}.translate-middle-x{transform:translate(-50%)!important}.translate-middle-y{transform:translateY(-50%)!important}.border{border:1px solid #dee2e6!important}.border-0{border:0!important}.border-top{border-top:1px solid #dee2e6!important}.border-top-0{border-top:0!important}.border-end{border-right:1px solid #dee2e6!important}.border-end-0{border-right:0!important}.border-bottom{border-bottom:1px solid #dee2e6!important}.border-bottom-0{border-bottom:0!important}.border-start{border-left:1px solid #dee2e6!important}.border-start-0{border-left:0!important}.border-primary{border-color:#0d6efd!important}.border-secondary{border-color:#6c757d!important}.border-success{border-color:#198754!important}.border-info{border-color:#0dcaf0!important}.border-warning{border-color:#ffc107!important}.border-danger{border-color:#dc3545!important}.border-light{border-color:#f8f9fa!important}.border-dark{border-color:#212529!important}.border-white{border-color:#fff!important}.border-1{border-width:1px!important}.border-2{border-width:2px!important}.border-3{border-width:3px!important}.border-4{border-width:4px!important}.border-5{border-width:5px!important}.w-25{width:25%!important}.w-50{width:50%!important}.w-75{width:75%!important}.w-100{width:100%!important}.w-auto{width:auto!important}.mw-100{max-width:100%!important}.vw-100{width:100vw!important}.min-vw-100{min-width:100vw!important}.h-25{height:25%!important}.h-50{height:50%!important}.h-75{height:75%!important}.h-100{height:100%!important}.h-auto{height:auto!important}.mh-100{max-height:100%!important}.vh-100{height:100vh!important}.min-vh-100{min-height:100vh!important}.flex-fill{flex:1 1 auto!important}.flex-row{flex-direction:row!important}.flex-column{flex-direction:column!important}.flex-row-reverse{flex-direction:row-reverse!important}.flex-column-reverse{flex-direction:column-reverse!important}.flex-grow-0{flex-grow:0!important}.flex-grow-1{flex-grow:1!important}.flex-shrink-0{flex-shrink:0!important}.flex-shrink-1{flex-shrink:1!important}.flex-wrap{flex-wrap:wrap!important}.flex-nowrap{flex-wrap:nowrap!important}.flex-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-0{gap:0!important}.gap-1{gap:.25rem!important}.gap-2{gap:.5rem!important}.gap-3{gap:1rem!important}.gap-4{gap:1.5rem!important}.gap-5{gap:3rem!important}.justify-content-start{justify-content:flex-start!important}.justify-content-end{justify-content:flex-end!important}.justify-content-center{justify-content:center!important}.justify-content-between{justify-content:space-between!important}.justify-content-around{justify-content:space-around!important}.justify-content-evenly{justify-content:space-evenly!important}.align-items-start{align-items:flex-start!important}.align-items-end{align-items:flex-end!important}.align-items-center{align-items:center!important}.align-items-baseline{align-items:baseline!important}.align-items-stretch{align-items:stretch!important}.align-content-start{align-content:flex-start!important}.align-content-end{align-content:flex-end!important}.align-content-center{align-content:center!important}.align-content-between{align-content:space-between!important}.align-content-around{align-content:space-around!important}.align-content-stretch{align-content:stretch!important}.align-self-auto{align-self:auto!important}.align-self-start{align-self:flex-start!important}.align-self-end{align-self:flex-end!important}.align-self-center{align-self:center!important}.align-self-baseline{align-self:baseline!important}.align-self-stretch{align-self:stretch!important}.order-first{order:-1!important}.order-0{order:0!important}.order-1{order:1!important}.order-2{order:2!important}.order-3{order:3!important}.order-4{order:4!important}.order-5{order:5!important}.order-last{order:6!important}.m-0{margin:0!important}.m-1{margin:.25rem!important}.m-2{margin:.5rem!important}.m-3{margin:1rem!important}.m-4{margin:1.5rem!important}.m-5{margin:3rem!important}.m-auto{margin:auto!important}.mx-0{margin-right:0!important;margin-left:0!important}.mx-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-3{margin-right:1rem!important;margin-left:1rem!important}.mx-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-5{margin-right:3rem!important;margin-left:3rem!important}.mx-auto{margin-right:auto!important;margin-left:auto!important}.my-0{margin-top:0!important;margin-bottom:0!important}.my-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-0{margin-top:0!important}.mt-1{margin-top:.25rem!important}.mt-2{margin-top:.5rem!important}.mt-3{margin-top:1rem!important}.mt-4{margin-top:1.5rem!important}.mt-5{margin-top:3rem!important}.mt-auto{margin-top:auto!important}.me-0{margin-right:0!important}.me-1{margin-right:.25rem!important}.me-2{margin-right:.5rem!important}.me-3{margin-right:1rem!important}.me-4{margin-right:1.5rem!important}.me-5{margin-right:3rem!important}.me-auto{margin-right:auto!important}.mb-0{margin-bottom:0!important}.mb-1{margin-bottom:.25rem!important}.mb-2{margin-bottom:.5rem!important}.mb-3{margin-bottom:1rem!important}.mb-4{margin-bottom:1.5rem!important}.mb-5{margin-bottom:3rem!important}.mb-auto{margin-bottom:auto!important}.ms-0{margin-left:0!important}.ms-1{margin-left:.25rem!important}.ms-2{margin-left:.5rem!important}.ms-3{margin-left:1rem!important}.ms-4{margin-left:1.5rem!important}.ms-5{margin-left:3rem!important}.ms-auto{margin-left:auto!important}.p-0{padding:0!important}.p-1{padding:.25rem!important}.p-2{padding:.5rem!important}.p-3{padding:1rem!important}.p-4{padding:1.5rem!important}.p-5{padding:3rem!important}.px-0{padding-right:0!important;padding-left:0!important}.px-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-3{padding-right:1rem!important;padding-left:1rem!important}.px-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-5{padding-right:3rem!important;padding-left:3rem!important}.py-0{padding-top:0!important;padding-bottom:0!important}.py-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-0{padding-top:0!important}.pt-1{padding-top:.25rem!important}.pt-2{padding-top:.5rem!important}.pt-3{padding-top:1rem!important}.pt-4{padding-top:1.5rem!important}.pt-5{padding-top:3rem!important}.pe-0{padding-right:0!important}.pe-1{padding-right:.25rem!important}.pe-2{padding-right:.5rem!important}.pe-3{padding-right:1rem!important}.pe-4{padding-right:1.5rem!important}.pe-5{padding-right:3rem!important}.pb-0{padding-bottom:0!important}.pb-1{padding-bottom:.25rem!important}.pb-2{padding-bottom:.5rem!important}.pb-3{padding-bottom:1rem!important}.pb-4{padding-bottom:1.5rem!important}.pb-5{padding-bottom:3rem!important}.ps-0{padding-left:0!important}.ps-1{padding-left:.25rem!important}.ps-2{padding-left:.5rem!important}.ps-3{padding-left:1rem!important}.ps-4{padding-left:1.5rem!important}.ps-5{padding-left:3rem!important}.font-monospace{font-family:var(--bs-font-monospace)!important}.fs-1{font-size:calc(1.375rem + 1.5vw)!important}.fs-2{font-size:calc(1.325rem + .9vw)!important}.fs-3{font-size:calc(1.3rem + .6vw)!important}.fs-4{font-size:calc(1.275rem + .3vw)!important}.fs-5{font-size:1.25rem!important}.fs-6{font-size:1rem!important}.fst-italic{font-style:italic!important}.fst-normal{font-style:normal!important}.fw-light{font-weight:300!important}.fw-lighter{font-weight:lighter!important}.fw-normal{font-weight:400!important}.fw-bold{font-weight:700!important}.fw-bolder{font-weight:bolder!important}.lh-1{line-height:1!important}.lh-sm{line-height:1.25!important}.lh-base{line-height:1.5!important}.lh-lg{line-height:2!important}.text-start{text-align:left!important}.text-end{text-align:right!important}.text-center{text-align:center!important}.text-decoration-none{text-decoration:none!important}.text-decoration-underline{text-decoration:underline!important}.text-decoration-line-through{text-decoration:line-through!important}.text-lowercase{text-transform:lowercase!important}.text-uppercase{text-transform:uppercase!important}.text-capitalize{text-transform:capitalize!important}.text-wrap{white-space:normal!important}.text-nowrap{white-space:nowrap!important}.text-break{word-wrap:break-word!important;word-break:break-word!important}.text-primary{--bs-text-opacity: 1;color:rgba(var(--bs-primary-rgb),var(--bs-text-opacity))!important}.text-secondary{--bs-text-opacity: 1;color:rgba(var(--bs-secondary-rgb),var(--bs-text-opacity))!important}.text-success{--bs-text-opacity: 1;color:rgba(var(--bs-success-rgb),var(--bs-text-opacity))!important}.text-info{--bs-text-opacity: 1;color:rgba(var(--bs-info-rgb),var(--bs-text-opacity))!important}.text-warning{--bs-text-opacity: 1;color:rgba(var(--bs-warning-rgb),var(--bs-text-opacity))!important}.text-danger{--bs-text-opacity: 1;color:rgba(var(--bs-danger-rgb),var(--bs-text-opacity))!important}.text-light{--bs-text-opacity: 1;color:rgba(var(--bs-light-rgb),var(--bs-text-opacity))!important}.text-dark{--bs-text-opacity: 1;color:rgba(var(--bs-dark-rgb),var(--bs-text-opacity))!important}.text-black{--bs-text-opacity: 1;color:rgba(var(--bs-black-rgb),var(--bs-text-opacity))!important}.text-white{--bs-text-opacity: 1;color:rgba(var(--bs-white-rgb),var(--bs-text-opacity))!important}.text-body{--bs-text-opacity: 1;color:rgba(var(--bs-body-color-rgb),var(--bs-text-opacity))!important}.text-muted{--bs-text-opacity: 1;color:#6c757d!important}.text-black-50{--bs-text-opacity: 1;color:#00000080!important}.text-white-50{--bs-text-opacity: 1;color:#ffffff80!important}.text-reset{--bs-text-opacity: 1;color:inherit!important}.text-opacity-25{--bs-text-opacity: .25}.text-opacity-50{--bs-text-opacity: .5}.text-opacity-75{--bs-text-opacity: .75}.text-opacity-100{--bs-text-opacity: 1}.bg-primary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-primary-rgb),var(--bs-bg-opacity))!important}.bg-secondary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-secondary-rgb),var(--bs-bg-opacity))!important}.bg-success{--bs-bg-opacity: 1;background-color:rgba(var(--bs-success-rgb),var(--bs-bg-opacity))!important}.bg-info{--bs-bg-opacity: 1;background-color:rgba(var(--bs-info-rgb),var(--bs-bg-opacity))!important}.bg-warning{--bs-bg-opacity: 1;background-color:rgba(var(--bs-warning-rgb),var(--bs-bg-opacity))!important}.bg-danger{--bs-bg-opacity: 1;background-color:rgba(var(--bs-danger-rgb),var(--bs-bg-opacity))!important}.bg-light{--bs-bg-opacity: 1;background-color:rgba(var(--bs-light-rgb),var(--bs-bg-opacity))!important}.bg-dark{--bs-bg-opacity: 1;background-color:rgba(var(--bs-dark-rgb),var(--bs-bg-opacity))!important}.bg-black{--bs-bg-opacity: 1;background-color:rgba(var(--bs-black-rgb),var(--bs-bg-opacity))!important}.bg-white{--bs-bg-opacity: 1;background-color:rgba(var(--bs-white-rgb),var(--bs-bg-opacity))!important}.bg-body{--bs-bg-opacity: 1;background-color:rgba(var(--bs-body-bg-rgb),var(--bs-bg-opacity))!important}.bg-transparent{--bs-bg-opacity: 1;background-color:transparent!important}.bg-opacity-10{--bs-bg-opacity: .1}.bg-opacity-25{--bs-bg-opacity: .25}.bg-opacity-50{--bs-bg-opacity: .5}.bg-opacity-75{--bs-bg-opacity: .75}.bg-opacity-100{--bs-bg-opacity: 1}.bg-gradient{background-image:var(--bs-gradient)!important}.user-select-all{-webkit-user-select:all!important;-moz-user-select:all!important;user-select:all!important}.user-select-auto{-webkit-user-select:auto!important;-moz-user-select:auto!important;user-select:auto!important}.user-select-none{-webkit-user-select:none!important;-moz-user-select:none!important;user-select:none!important}.pe-none{pointer-events:none!important}.pe-auto{pointer-events:auto!important}.rounded{border-radius:.25rem!important}.rounded-0{border-radius:0!important}.rounded-1{border-radius:.2rem!important}.rounded-2{border-radius:.25rem!important}.rounded-3{border-radius:.3rem!important}.rounded-circle{border-radius:50%!important}.rounded-pill{border-radius:50rem!important}.rounded-top{border-top-left-radius:.25rem!important;border-top-right-radius:.25rem!important}.rounded-end{border-top-right-radius:.25rem!important;border-bottom-right-radius:.25rem!important}.rounded-bottom{border-bottom-right-radius:.25rem!important;border-bottom-left-radius:.25rem!important}.rounded-start{border-bottom-left-radius:.25rem!important;border-top-left-radius:.25rem!important}.visible{visibility:visible!important}.invisible{visibility:hidden!important}@media (min-width: 576px){.float-sm-start{float:left!important}.float-sm-end{float:right!important}.float-sm-none{float:none!important}.d-sm-inline{display:inline!important}.d-sm-inline-block{display:inline-block!important}.d-sm-block{display:block!important}.d-sm-grid{display:grid!important}.d-sm-table{display:table!important}.d-sm-table-row{display:table-row!important}.d-sm-table-cell{display:table-cell!important}.d-sm-flex{display:flex!important}.d-sm-inline-flex{display:inline-flex!important}.d-sm-none{display:none!important}.flex-sm-fill{flex:1 1 auto!important}.flex-sm-row{flex-direction:row!important}.flex-sm-column{flex-direction:column!important}.flex-sm-row-reverse{flex-direction:row-reverse!important}.flex-sm-column-reverse{flex-direction:column-reverse!important}.flex-sm-grow-0{flex-grow:0!important}.flex-sm-grow-1{flex-grow:1!important}.flex-sm-shrink-0{flex-shrink:0!important}.flex-sm-shrink-1{flex-shrink:1!important}.flex-sm-wrap{flex-wrap:wrap!important}.flex-sm-nowrap{flex-wrap:nowrap!important}.flex-sm-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-sm-0{gap:0!important}.gap-sm-1{gap:.25rem!important}.gap-sm-2{gap:.5rem!important}.gap-sm-3{gap:1rem!important}.gap-sm-4{gap:1.5rem!important}.gap-sm-5{gap:3rem!important}.justify-content-sm-start{justify-content:flex-start!important}.justify-content-sm-end{justify-content:flex-end!important}.justify-content-sm-center{justify-content:center!important}.justify-content-sm-between{justify-content:space-between!important}.justify-content-sm-around{justify-content:space-around!important}.justify-content-sm-evenly{justify-content:space-evenly!important}.align-items-sm-start{align-items:flex-start!important}.align-items-sm-end{align-items:flex-end!important}.align-items-sm-center{align-items:center!important}.align-items-sm-baseline{align-items:baseline!important}.align-items-sm-stretch{align-items:stretch!important}.align-content-sm-start{align-content:flex-start!important}.align-content-sm-end{align-content:flex-end!important}.align-content-sm-center{align-content:center!important}.align-content-sm-between{align-content:space-between!important}.align-content-sm-around{align-content:space-around!important}.align-content-sm-stretch{align-content:stretch!important}.align-self-sm-auto{align-self:auto!important}.align-self-sm-start{align-self:flex-start!important}.align-self-sm-end{align-self:flex-end!important}.align-self-sm-center{align-self:center!important}.align-self-sm-baseline{align-self:baseline!important}.align-self-sm-stretch{align-self:stretch!important}.order-sm-first{order:-1!important}.order-sm-0{order:0!important}.order-sm-1{order:1!important}.order-sm-2{order:2!important}.order-sm-3{order:3!important}.order-sm-4{order:4!important}.order-sm-5{order:5!important}.order-sm-last{order:6!important}.m-sm-0{margin:0!important}.m-sm-1{margin:.25rem!important}.m-sm-2{margin:.5rem!important}.m-sm-3{margin:1rem!important}.m-sm-4{margin:1.5rem!important}.m-sm-5{margin:3rem!important}.m-sm-auto{margin:auto!important}.mx-sm-0{margin-right:0!important;margin-left:0!important}.mx-sm-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-sm-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-sm-3{margin-right:1rem!important;margin-left:1rem!important}.mx-sm-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-sm-5{margin-right:3rem!important;margin-left:3rem!important}.mx-sm-auto{margin-right:auto!important;margin-left:auto!important}.my-sm-0{margin-top:0!important;margin-bottom:0!important}.my-sm-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-sm-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-sm-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-sm-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-sm-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-sm-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-sm-0{margin-top:0!important}.mt-sm-1{margin-top:.25rem!important}.mt-sm-2{margin-top:.5rem!important}.mt-sm-3{margin-top:1rem!important}.mt-sm-4{margin-top:1.5rem!important}.mt-sm-5{margin-top:3rem!important}.mt-sm-auto{margin-top:auto!important}.me-sm-0{margin-right:0!important}.me-sm-1{margin-right:.25rem!important}.me-sm-2{margin-right:.5rem!important}.me-sm-3{margin-right:1rem!important}.me-sm-4{margin-right:1.5rem!important}.me-sm-5{margin-right:3rem!important}.me-sm-auto{margin-right:auto!important}.mb-sm-0{margin-bottom:0!important}.mb-sm-1{margin-bottom:.25rem!important}.mb-sm-2{margin-bottom:.5rem!important}.mb-sm-3{margin-bottom:1rem!important}.mb-sm-4{margin-bottom:1.5rem!important}.mb-sm-5{margin-bottom:3rem!important}.mb-sm-auto{margin-bottom:auto!important}.ms-sm-0{margin-left:0!important}.ms-sm-1{margin-left:.25rem!important}.ms-sm-2{margin-left:.5rem!important}.ms-sm-3{margin-left:1rem!important}.ms-sm-4{margin-left:1.5rem!important}.ms-sm-5{margin-left:3rem!important}.ms-sm-auto{margin-left:auto!important}.p-sm-0{padding:0!important}.p-sm-1{padding:.25rem!important}.p-sm-2{padding:.5rem!important}.p-sm-3{padding:1rem!important}.p-sm-4{padding:1.5rem!important}.p-sm-5{padding:3rem!important}.px-sm-0{padding-right:0!important;padding-left:0!important}.px-sm-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-sm-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-sm-3{padding-right:1rem!important;padding-left:1rem!important}.px-sm-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-sm-5{padding-right:3rem!important;padding-left:3rem!important}.py-sm-0{padding-top:0!important;padding-bottom:0!important}.py-sm-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-sm-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-sm-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-sm-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-sm-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-sm-0{padding-top:0!important}.pt-sm-1{padding-top:.25rem!important}.pt-sm-2{padding-top:.5rem!important}.pt-sm-3{padding-top:1rem!important}.pt-sm-4{padding-top:1.5rem!important}.pt-sm-5{padding-top:3rem!important}.pe-sm-0{padding-right:0!important}.pe-sm-1{padding-right:.25rem!important}.pe-sm-2{padding-right:.5rem!important}.pe-sm-3{padding-right:1rem!important}.pe-sm-4{padding-right:1.5rem!important}.pe-sm-5{padding-right:3rem!important}.pb-sm-0{padding-bottom:0!important}.pb-sm-1{padding-bottom:.25rem!important}.pb-sm-2{padding-bottom:.5rem!important}.pb-sm-3{padding-bottom:1rem!important}.pb-sm-4{padding-bottom:1.5rem!important}.pb-sm-5{padding-bottom:3rem!important}.ps-sm-0{padding-left:0!important}.ps-sm-1{padding-left:.25rem!important}.ps-sm-2{padding-left:.5rem!important}.ps-sm-3{padding-left:1rem!important}.ps-sm-4{padding-left:1.5rem!important}.ps-sm-5{padding-left:3rem!important}.text-sm-start{text-align:left!important}.text-sm-end{text-align:right!important}.text-sm-center{text-align:center!important}}@media (min-width: 768px){.float-md-start{float:left!important}.float-md-end{float:right!important}.float-md-none{float:none!important}.d-md-inline{display:inline!important}.d-md-inline-block{display:inline-block!important}.d-md-block{display:block!important}.d-md-grid{display:grid!important}.d-md-table{display:table!important}.d-md-table-row{display:table-row!important}.d-md-table-cell{display:table-cell!important}.d-md-flex{display:flex!important}.d-md-inline-flex{display:inline-flex!important}.d-md-none{display:none!important}.flex-md-fill{flex:1 1 auto!important}.flex-md-row{flex-direction:row!important}.flex-md-column{flex-direction:column!important}.flex-md-row-reverse{flex-direction:row-reverse!important}.flex-md-column-reverse{flex-direction:column-reverse!important}.flex-md-grow-0{flex-grow:0!important}.flex-md-grow-1{flex-grow:1!important}.flex-md-shrink-0{flex-shrink:0!important}.flex-md-shrink-1{flex-shrink:1!important}.flex-md-wrap{flex-wrap:wrap!important}.flex-md-nowrap{flex-wrap:nowrap!important}.flex-md-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-md-0{gap:0!important}.gap-md-1{gap:.25rem!important}.gap-md-2{gap:.5rem!important}.gap-md-3{gap:1rem!important}.gap-md-4{gap:1.5rem!important}.gap-md-5{gap:3rem!important}.justify-content-md-start{justify-content:flex-start!important}.justify-content-md-end{justify-content:flex-end!important}.justify-content-md-center{justify-content:center!important}.justify-content-md-between{justify-content:space-between!important}.justify-content-md-around{justify-content:space-around!important}.justify-content-md-evenly{justify-content:space-evenly!important}.align-items-md-start{align-items:flex-start!important}.align-items-md-end{align-items:flex-end!important}.align-items-md-center{align-items:center!important}.align-items-md-baseline{align-items:baseline!important}.align-items-md-stretch{align-items:stretch!important}.align-content-md-start{align-content:flex-start!important}.align-content-md-end{align-content:flex-end!important}.align-content-md-center{align-content:center!important}.align-content-md-between{align-content:space-between!important}.align-content-md-around{align-content:space-around!important}.align-content-md-stretch{align-content:stretch!important}.align-self-md-auto{align-self:auto!important}.align-self-md-start{align-self:flex-start!important}.align-self-md-end{align-self:flex-end!important}.align-self-md-center{align-self:center!important}.align-self-md-baseline{align-self:baseline!important}.align-self-md-stretch{align-self:stretch!important}.order-md-first{order:-1!important}.order-md-0{order:0!important}.order-md-1{order:1!important}.order-md-2{order:2!important}.order-md-3{order:3!important}.order-md-4{order:4!important}.order-md-5{order:5!important}.order-md-last{order:6!important}.m-md-0{margin:0!important}.m-md-1{margin:.25rem!important}.m-md-2{margin:.5rem!important}.m-md-3{margin:1rem!important}.m-md-4{margin:1.5rem!important}.m-md-5{margin:3rem!important}.m-md-auto{margin:auto!important}.mx-md-0{margin-right:0!important;margin-left:0!important}.mx-md-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-md-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-md-3{margin-right:1rem!important;margin-left:1rem!important}.mx-md-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-md-5{margin-right:3rem!important;margin-left:3rem!important}.mx-md-auto{margin-right:auto!important;margin-left:auto!important}.my-md-0{margin-top:0!important;margin-bottom:0!important}.my-md-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-md-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-md-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-md-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-md-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-md-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-md-0{margin-top:0!important}.mt-md-1{margin-top:.25rem!important}.mt-md-2{margin-top:.5rem!important}.mt-md-3{margin-top:1rem!important}.mt-md-4{margin-top:1.5rem!important}.mt-md-5{margin-top:3rem!important}.mt-md-auto{margin-top:auto!important}.me-md-0{margin-right:0!important}.me-md-1{margin-right:.25rem!important}.me-md-2{margin-right:.5rem!important}.me-md-3{margin-right:1rem!important}.me-md-4{margin-right:1.5rem!important}.me-md-5{margin-right:3rem!important}.me-md-auto{margin-right:auto!important}.mb-md-0{margin-bottom:0!important}.mb-md-1{margin-bottom:.25rem!important}.mb-md-2{margin-bottom:.5rem!important}.mb-md-3{margin-bottom:1rem!important}.mb-md-4{margin-bottom:1.5rem!important}.mb-md-5{margin-bottom:3rem!important}.mb-md-auto{margin-bottom:auto!important}.ms-md-0{margin-left:0!important}.ms-md-1{margin-left:.25rem!important}.ms-md-2{margin-left:.5rem!important}.ms-md-3{margin-left:1rem!important}.ms-md-4{margin-left:1.5rem!important}.ms-md-5{margin-left:3rem!important}.ms-md-auto{margin-left:auto!important}.p-md-0{padding:0!important}.p-md-1{padding:.25rem!important}.p-md-2{padding:.5rem!important}.p-md-3{padding:1rem!important}.p-md-4{padding:1.5rem!important}.p-md-5{padding:3rem!important}.px-md-0{padding-right:0!important;padding-left:0!important}.px-md-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-md-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-md-3{padding-right:1rem!important;padding-left:1rem!important}.px-md-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-md-5{padding-right:3rem!important;padding-left:3rem!important}.py-md-0{padding-top:0!important;padding-bottom:0!important}.py-md-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-md-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-md-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-md-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-md-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-md-0{padding-top:0!important}.pt-md-1{padding-top:.25rem!important}.pt-md-2{padding-top:.5rem!important}.pt-md-3{padding-top:1rem!important}.pt-md-4{padding-top:1.5rem!important}.pt-md-5{padding-top:3rem!important}.pe-md-0{padding-right:0!important}.pe-md-1{padding-right:.25rem!important}.pe-md-2{padding-right:.5rem!important}.pe-md-3{padding-right:1rem!important}.pe-md-4{padding-right:1.5rem!important}.pe-md-5{padding-right:3rem!important}.pb-md-0{padding-bottom:0!important}.pb-md-1{padding-bottom:.25rem!important}.pb-md-2{padding-bottom:.5rem!important}.pb-md-3{padding-bottom:1rem!important}.pb-md-4{padding-bottom:1.5rem!important}.pb-md-5{padding-bottom:3rem!important}.ps-md-0{padding-left:0!important}.ps-md-1{padding-left:.25rem!important}.ps-md-2{padding-left:.5rem!important}.ps-md-3{padding-left:1rem!important}.ps-md-4{padding-left:1.5rem!important}.ps-md-5{padding-left:3rem!important}.text-md-start{text-align:left!important}.text-md-end{text-align:right!important}.text-md-center{text-align:center!important}}@media (min-width: 992px){.float-lg-start{float:left!important}.float-lg-end{float:right!important}.float-lg-none{float:none!important}.d-lg-inline{display:inline!important}.d-lg-inline-block{display:inline-block!important}.d-lg-block{display:block!important}.d-lg-grid{display:grid!important}.d-lg-table{display:table!important}.d-lg-table-row{display:table-row!important}.d-lg-table-cell{display:table-cell!important}.d-lg-flex{display:flex!important}.d-lg-inline-flex{display:inline-flex!important}.d-lg-none{display:none!important}.flex-lg-fill{flex:1 1 auto!important}.flex-lg-row{flex-direction:row!important}.flex-lg-column{flex-direction:column!important}.flex-lg-row-reverse{flex-direction:row-reverse!important}.flex-lg-column-reverse{flex-direction:column-reverse!important}.flex-lg-grow-0{flex-grow:0!important}.flex-lg-grow-1{flex-grow:1!important}.flex-lg-shrink-0{flex-shrink:0!important}.flex-lg-shrink-1{flex-shrink:1!important}.flex-lg-wrap{flex-wrap:wrap!important}.flex-lg-nowrap{flex-wrap:nowrap!important}.flex-lg-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-lg-0{gap:0!important}.gap-lg-1{gap:.25rem!important}.gap-lg-2{gap:.5rem!important}.gap-lg-3{gap:1rem!important}.gap-lg-4{gap:1.5rem!important}.gap-lg-5{gap:3rem!important}.justify-content-lg-start{justify-content:flex-start!important}.justify-content-lg-end{justify-content:flex-end!important}.justify-content-lg-center{justify-content:center!important}.justify-content-lg-between{justify-content:space-between!important}.justify-content-lg-around{justify-content:space-around!important}.justify-content-lg-evenly{justify-content:space-evenly!important}.align-items-lg-start{align-items:flex-start!important}.align-items-lg-end{align-items:flex-end!important}.align-items-lg-center{align-items:center!important}.align-items-lg-baseline{align-items:baseline!important}.align-items-lg-stretch{align-items:stretch!important}.align-content-lg-start{align-content:flex-start!important}.align-content-lg-end{align-content:flex-end!important}.align-content-lg-center{align-content:center!important}.align-content-lg-between{align-content:space-between!important}.align-content-lg-around{align-content:space-around!important}.align-content-lg-stretch{align-content:stretch!important}.align-self-lg-auto{align-self:auto!important}.align-self-lg-start{align-self:flex-start!important}.align-self-lg-end{align-self:flex-end!important}.align-self-lg-center{align-self:center!important}.align-self-lg-baseline{align-self:baseline!important}.align-self-lg-stretch{align-self:stretch!important}.order-lg-first{order:-1!important}.order-lg-0{order:0!important}.order-lg-1{order:1!important}.order-lg-2{order:2!important}.order-lg-3{order:3!important}.order-lg-4{order:4!important}.order-lg-5{order:5!important}.order-lg-last{order:6!important}.m-lg-0{margin:0!important}.m-lg-1{margin:.25rem!important}.m-lg-2{margin:.5rem!important}.m-lg-3{margin:1rem!important}.m-lg-4{margin:1.5rem!important}.m-lg-5{margin:3rem!important}.m-lg-auto{margin:auto!important}.mx-lg-0{margin-right:0!important;margin-left:0!important}.mx-lg-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-lg-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-lg-3{margin-right:1rem!important;margin-left:1rem!important}.mx-lg-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-lg-5{margin-right:3rem!important;margin-left:3rem!important}.mx-lg-auto{margin-right:auto!important;margin-left:auto!important}.my-lg-0{margin-top:0!important;margin-bottom:0!important}.my-lg-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-lg-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-lg-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-lg-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-lg-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-lg-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-lg-0{margin-top:0!important}.mt-lg-1{margin-top:.25rem!important}.mt-lg-2{margin-top:.5rem!important}.mt-lg-3{margin-top:1rem!important}.mt-lg-4{margin-top:1.5rem!important}.mt-lg-5{margin-top:3rem!important}.mt-lg-auto{margin-top:auto!important}.me-lg-0{margin-right:0!important}.me-lg-1{margin-right:.25rem!important}.me-lg-2{margin-right:.5rem!important}.me-lg-3{margin-right:1rem!important}.me-lg-4{margin-right:1.5rem!important}.me-lg-5{margin-right:3rem!important}.me-lg-auto{margin-right:auto!important}.mb-lg-0{margin-bottom:0!important}.mb-lg-1{margin-bottom:.25rem!important}.mb-lg-2{margin-bottom:.5rem!important}.mb-lg-3{margin-bottom:1rem!important}.mb-lg-4{margin-bottom:1.5rem!important}.mb-lg-5{margin-bottom:3rem!important}.mb-lg-auto{margin-bottom:auto!important}.ms-lg-0{margin-left:0!important}.ms-lg-1{margin-left:.25rem!important}.ms-lg-2{margin-left:.5rem!important}.ms-lg-3{margin-left:1rem!important}.ms-lg-4{margin-left:1.5rem!important}.ms-lg-5{margin-left:3rem!important}.ms-lg-auto{margin-left:auto!important}.p-lg-0{padding:0!important}.p-lg-1{padding:.25rem!important}.p-lg-2{padding:.5rem!important}.p-lg-3{padding:1rem!important}.p-lg-4{padding:1.5rem!important}.p-lg-5{padding:3rem!important}.px-lg-0{padding-right:0!important;padding-left:0!important}.px-lg-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-lg-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-lg-3{padding-right:1rem!important;padding-left:1rem!important}.px-lg-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-lg-5{padding-right:3rem!important;padding-left:3rem!important}.py-lg-0{padding-top:0!important;padding-bottom:0!important}.py-lg-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-lg-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-lg-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-lg-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-lg-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-lg-0{padding-top:0!important}.pt-lg-1{padding-top:.25rem!important}.pt-lg-2{padding-top:.5rem!important}.pt-lg-3{padding-top:1rem!important}.pt-lg-4{padding-top:1.5rem!important}.pt-lg-5{padding-top:3rem!important}.pe-lg-0{padding-right:0!important}.pe-lg-1{padding-right:.25rem!important}.pe-lg-2{padding-right:.5rem!important}.pe-lg-3{padding-right:1rem!important}.pe-lg-4{padding-right:1.5rem!important}.pe-lg-5{padding-right:3rem!important}.pb-lg-0{padding-bottom:0!important}.pb-lg-1{padding-bottom:.25rem!important}.pb-lg-2{padding-bottom:.5rem!important}.pb-lg-3{padding-bottom:1rem!important}.pb-lg-4{padding-bottom:1.5rem!important}.pb-lg-5{padding-bottom:3rem!important}.ps-lg-0{padding-left:0!important}.ps-lg-1{padding-left:.25rem!important}.ps-lg-2{padding-left:.5rem!important}.ps-lg-3{padding-left:1rem!important}.ps-lg-4{padding-left:1.5rem!important}.ps-lg-5{padding-left:3rem!important}.text-lg-start{text-align:left!important}.text-lg-end{text-align:right!important}.text-lg-center{text-align:center!important}}@media (min-width: 1200px){.float-xl-start{float:left!important}.float-xl-end{float:right!important}.float-xl-none{float:none!important}.d-xl-inline{display:inline!important}.d-xl-inline-block{display:inline-block!important}.d-xl-block{display:block!important}.d-xl-grid{display:grid!important}.d-xl-table{display:table!important}.d-xl-table-row{display:table-row!important}.d-xl-table-cell{display:table-cell!important}.d-xl-flex{display:flex!important}.d-xl-inline-flex{display:inline-flex!important}.d-xl-none{display:none!important}.flex-xl-fill{flex:1 1 auto!important}.flex-xl-row{flex-direction:row!important}.flex-xl-column{flex-direction:column!important}.flex-xl-row-reverse{flex-direction:row-reverse!important}.flex-xl-column-reverse{flex-direction:column-reverse!important}.flex-xl-grow-0{flex-grow:0!important}.flex-xl-grow-1{flex-grow:1!important}.flex-xl-shrink-0{flex-shrink:0!important}.flex-xl-shrink-1{flex-shrink:1!important}.flex-xl-wrap{flex-wrap:wrap!important}.flex-xl-nowrap{flex-wrap:nowrap!important}.flex-xl-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-xl-0{gap:0!important}.gap-xl-1{gap:.25rem!important}.gap-xl-2{gap:.5rem!important}.gap-xl-3{gap:1rem!important}.gap-xl-4{gap:1.5rem!important}.gap-xl-5{gap:3rem!important}.justify-content-xl-start{justify-content:flex-start!important}.justify-content-xl-end{justify-content:flex-end!important}.justify-content-xl-center{justify-content:center!important}.justify-content-xl-between{justify-content:space-between!important}.justify-content-xl-around{justify-content:space-around!important}.justify-content-xl-evenly{justify-content:space-evenly!important}.align-items-xl-start{align-items:flex-start!important}.align-items-xl-end{align-items:flex-end!important}.align-items-xl-center{align-items:center!important}.align-items-xl-baseline{align-items:baseline!important}.align-items-xl-stretch{align-items:stretch!important}.align-content-xl-start{align-content:flex-start!important}.align-content-xl-end{align-content:flex-end!important}.align-content-xl-center{align-content:center!important}.align-content-xl-between{align-content:space-between!important}.align-content-xl-around{align-content:space-around!important}.align-content-xl-stretch{align-content:stretch!important}.align-self-xl-auto{align-self:auto!important}.align-self-xl-start{align-self:flex-start!important}.align-self-xl-end{align-self:flex-end!important}.align-self-xl-center{align-self:center!important}.align-self-xl-baseline{align-self:baseline!important}.align-self-xl-stretch{align-self:stretch!important}.order-xl-first{order:-1!important}.order-xl-0{order:0!important}.order-xl-1{order:1!important}.order-xl-2{order:2!important}.order-xl-3{order:3!important}.order-xl-4{order:4!important}.order-xl-5{order:5!important}.order-xl-last{order:6!important}.m-xl-0{margin:0!important}.m-xl-1{margin:.25rem!important}.m-xl-2{margin:.5rem!important}.m-xl-3{margin:1rem!important}.m-xl-4{margin:1.5rem!important}.m-xl-5{margin:3rem!important}.m-xl-auto{margin:auto!important}.mx-xl-0{margin-right:0!important;margin-left:0!important}.mx-xl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xl-auto{margin-right:auto!important;margin-left:auto!important}.my-xl-0{margin-top:0!important;margin-bottom:0!important}.my-xl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xl-0{margin-top:0!important}.mt-xl-1{margin-top:.25rem!important}.mt-xl-2{margin-top:.5rem!important}.mt-xl-3{margin-top:1rem!important}.mt-xl-4{margin-top:1.5rem!important}.mt-xl-5{margin-top:3rem!important}.mt-xl-auto{margin-top:auto!important}.me-xl-0{margin-right:0!important}.me-xl-1{margin-right:.25rem!important}.me-xl-2{margin-right:.5rem!important}.me-xl-3{margin-right:1rem!important}.me-xl-4{margin-right:1.5rem!important}.me-xl-5{margin-right:3rem!important}.me-xl-auto{margin-right:auto!important}.mb-xl-0{margin-bottom:0!important}.mb-xl-1{margin-bottom:.25rem!important}.mb-xl-2{margin-bottom:.5rem!important}.mb-xl-3{margin-bottom:1rem!important}.mb-xl-4{margin-bottom:1.5rem!important}.mb-xl-5{margin-bottom:3rem!important}.mb-xl-auto{margin-bottom:auto!important}.ms-xl-0{margin-left:0!important}.ms-xl-1{margin-left:.25rem!important}.ms-xl-2{margin-left:.5rem!important}.ms-xl-3{margin-left:1rem!important}.ms-xl-4{margin-left:1.5rem!important}.ms-xl-5{margin-left:3rem!important}.ms-xl-auto{margin-left:auto!important}.p-xl-0{padding:0!important}.p-xl-1{padding:.25rem!important}.p-xl-2{padding:.5rem!important}.p-xl-3{padding:1rem!important}.p-xl-4{padding:1.5rem!important}.p-xl-5{padding:3rem!important}.px-xl-0{padding-right:0!important;padding-left:0!important}.px-xl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xl-0{padding-top:0!important;padding-bottom:0!important}.py-xl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xl-0{padding-top:0!important}.pt-xl-1{padding-top:.25rem!important}.pt-xl-2{padding-top:.5rem!important}.pt-xl-3{padding-top:1rem!important}.pt-xl-4{padding-top:1.5rem!important}.pt-xl-5{padding-top:3rem!important}.pe-xl-0{padding-right:0!important}.pe-xl-1{padding-right:.25rem!important}.pe-xl-2{padding-right:.5rem!important}.pe-xl-3{padding-right:1rem!important}.pe-xl-4{padding-right:1.5rem!important}.pe-xl-5{padding-right:3rem!important}.pb-xl-0{padding-bottom:0!important}.pb-xl-1{padding-bottom:.25rem!important}.pb-xl-2{padding-bottom:.5rem!important}.pb-xl-3{padding-bottom:1rem!important}.pb-xl-4{padding-bottom:1.5rem!important}.pb-xl-5{padding-bottom:3rem!important}.ps-xl-0{padding-left:0!important}.ps-xl-1{padding-left:.25rem!important}.ps-xl-2{padding-left:.5rem!important}.ps-xl-3{padding-left:1rem!important}.ps-xl-4{padding-left:1.5rem!important}.ps-xl-5{padding-left:3rem!important}.text-xl-start{text-align:left!important}.text-xl-end{text-align:right!important}.text-xl-center{text-align:center!important}}@media (min-width: 1400px){.float-xxl-start{float:left!important}.float-xxl-end{float:right!important}.float-xxl-none{float:none!important}.d-xxl-inline{display:inline!important}.d-xxl-inline-block{display:inline-block!important}.d-xxl-block{display:block!important}.d-xxl-grid{display:grid!important}.d-xxl-table{display:table!important}.d-xxl-table-row{display:table-row!important}.d-xxl-table-cell{display:table-cell!important}.d-xxl-flex{display:flex!important}.d-xxl-inline-flex{display:inline-flex!important}.d-xxl-none{display:none!important}.flex-xxl-fill{flex:1 1 auto!important}.flex-xxl-row{flex-direction:row!important}.flex-xxl-column{flex-direction:column!important}.flex-xxl-row-reverse{flex-direction:row-reverse!important}.flex-xxl-column-reverse{flex-direction:column-reverse!important}.flex-xxl-grow-0{flex-grow:0!important}.flex-xxl-grow-1{flex-grow:1!important}.flex-xxl-shrink-0{flex-shrink:0!important}.flex-xxl-shrink-1{flex-shrink:1!important}.flex-xxl-wrap{flex-wrap:wrap!important}.flex-xxl-nowrap{flex-wrap:nowrap!important}.flex-xxl-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-xxl-0{gap:0!important}.gap-xxl-1{gap:.25rem!important}.gap-xxl-2{gap:.5rem!important}.gap-xxl-3{gap:1rem!important}.gap-xxl-4{gap:1.5rem!important}.gap-xxl-5{gap:3rem!important}.justify-content-xxl-start{justify-content:flex-start!important}.justify-content-xxl-end{justify-content:flex-end!important}.justify-content-xxl-center{justify-content:center!important}.justify-content-xxl-between{justify-content:space-between!important}.justify-content-xxl-around{justify-content:space-around!important}.justify-content-xxl-evenly{justify-content:space-evenly!important}.align-items-xxl-start{align-items:flex-start!important}.align-items-xxl-end{align-items:flex-end!important}.align-items-xxl-center{align-items:center!important}.align-items-xxl-baseline{align-items:baseline!important}.align-items-xxl-stretch{align-items:stretch!important}.align-content-xxl-start{align-content:flex-start!important}.align-content-xxl-end{align-content:flex-end!important}.align-content-xxl-center{align-content:center!important}.align-content-xxl-between{align-content:space-between!important}.align-content-xxl-around{align-content:space-around!important}.align-content-xxl-stretch{align-content:stretch!important}.align-self-xxl-auto{align-self:auto!important}.align-self-xxl-start{align-self:flex-start!important}.align-self-xxl-end{align-self:flex-end!important}.align-self-xxl-center{align-self:center!important}.align-self-xxl-baseline{align-self:baseline!important}.align-self-xxl-stretch{align-self:stretch!important}.order-xxl-first{order:-1!important}.order-xxl-0{order:0!important}.order-xxl-1{order:1!important}.order-xxl-2{order:2!important}.order-xxl-3{order:3!important}.order-xxl-4{order:4!important}.order-xxl-5{order:5!important}.order-xxl-last{order:6!important}.m-xxl-0{margin:0!important}.m-xxl-1{margin:.25rem!important}.m-xxl-2{margin:.5rem!important}.m-xxl-3{margin:1rem!important}.m-xxl-4{margin:1.5rem!important}.m-xxl-5{margin:3rem!important}.m-xxl-auto{margin:auto!important}.mx-xxl-0{margin-right:0!important;margin-left:0!important}.mx-xxl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xxl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xxl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xxl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xxl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xxl-auto{margin-right:auto!important;margin-left:auto!important}.my-xxl-0{margin-top:0!important;margin-bottom:0!important}.my-xxl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xxl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xxl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xxl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xxl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xxl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xxl-0{margin-top:0!important}.mt-xxl-1{margin-top:.25rem!important}.mt-xxl-2{margin-top:.5rem!important}.mt-xxl-3{margin-top:1rem!important}.mt-xxl-4{margin-top:1.5rem!important}.mt-xxl-5{margin-top:3rem!important}.mt-xxl-auto{margin-top:auto!important}.me-xxl-0{margin-right:0!important}.me-xxl-1{margin-right:.25rem!important}.me-xxl-2{margin-right:.5rem!important}.me-xxl-3{margin-right:1rem!important}.me-xxl-4{margin-right:1.5rem!important}.me-xxl-5{margin-right:3rem!important}.me-xxl-auto{margin-right:auto!important}.mb-xxl-0{margin-bottom:0!important}.mb-xxl-1{margin-bottom:.25rem!important}.mb-xxl-2{margin-bottom:.5rem!important}.mb-xxl-3{margin-bottom:1rem!important}.mb-xxl-4{margin-bottom:1.5rem!important}.mb-xxl-5{margin-bottom:3rem!important}.mb-xxl-auto{margin-bottom:auto!important}.ms-xxl-0{margin-left:0!important}.ms-xxl-1{margin-left:.25rem!important}.ms-xxl-2{margin-left:.5rem!important}.ms-xxl-3{margin-left:1rem!important}.ms-xxl-4{margin-left:1.5rem!important}.ms-xxl-5{margin-left:3rem!important}.ms-xxl-auto{margin-left:auto!important}.p-xxl-0{padding:0!important}.p-xxl-1{padding:.25rem!important}.p-xxl-2{padding:.5rem!important}.p-xxl-3{padding:1rem!important}.p-xxl-4{padding:1.5rem!important}.p-xxl-5{padding:3rem!important}.px-xxl-0{padding-right:0!important;padding-left:0!important}.px-xxl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xxl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xxl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xxl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xxl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xxl-0{padding-top:0!important;padding-bottom:0!important}.py-xxl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xxl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xxl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xxl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xxl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xxl-0{padding-top:0!important}.pt-xxl-1{padding-top:.25rem!important}.pt-xxl-2{padding-top:.5rem!important}.pt-xxl-3{padding-top:1rem!important}.pt-xxl-4{padding-top:1.5rem!important}.pt-xxl-5{padding-top:3rem!important}.pe-xxl-0{padding-right:0!important}.pe-xxl-1{padding-right:.25rem!important}.pe-xxl-2{padding-right:.5rem!important}.pe-xxl-3{padding-right:1rem!important}.pe-xxl-4{padding-right:1.5rem!important}.pe-xxl-5{padding-right:3rem!important}.pb-xxl-0{padding-bottom:0!important}.pb-xxl-1{padding-bottom:.25rem!important}.pb-xxl-2{padding-bottom:.5rem!important}.pb-xxl-3{padding-bottom:1rem!important}.pb-xxl-4{padding-bottom:1.5rem!important}.pb-xxl-5{padding-bottom:3rem!important}.ps-xxl-0{padding-left:0!important}.ps-xxl-1{padding-left:.25rem!important}.ps-xxl-2{padding-left:.5rem!important}.ps-xxl-3{padding-left:1rem!important}.ps-xxl-4{padding-left:1.5rem!important}.ps-xxl-5{padding-left:3rem!important}.text-xxl-start{text-align:left!important}.text-xxl-end{text-align:right!important}.text-xxl-center{text-align:center!important}}@media (min-width: 1200px){.fs-1{font-size:2.5rem!important}.fs-2{font-size:2rem!important}.fs-3{font-size:1.75rem!important}.fs-4{font-size:1.5rem!important}}@media print{.d-print-inline{display:inline!important}.d-print-inline-block{display:inline-block!important}.d-print-block{display:block!important}.d-print-grid{display:grid!important}.d-print-table{display:table!important}.d-print-table-row{display:table-row!important}.d-print-table-cell{display:table-cell!important}.d-print-flex{display:flex!important}.d-print-inline-flex{display:inline-flex!important}.d-print-none{display:none!important}}:root{--bg-color: #edf2f7;--rstudio-blue-h: 209;--rstudio-blue-s: 59%;--rstudio-blue-l: 66%;--rstudio-blue-hsl: var(--rstudio-blue-h) var(--rstudio-blue-s) var(--rstudio-blue-l);--rstudio-blue: hsl(var(--rstudio-blue-hsl));--rstudio-blue-transparent: hsl(var(--rstudio-blue-hsl) / .5);--rstudio-grey-h: 0;--rstudio-grey-s: 0%;--rstudio-grey-l: 25%;--rstudio-grey-hsl: var(--rstudio-grey-h) var(--rstudio-grey-s) var(--rstudio-grey-l);--rstudio-grey: hsl(var(--rstudio-grey-hsl));--rstudio-grey-transparent: hsl(var(--rstudio-grey-hsl) / .5);--rstudio-white-h: 0;--rstudio-white-s: 0%;--rstudio-white-l: 100%;--rstudio-white-hsl: var(--rstudio-white-h) var(--rstudio-white-s) var(--rstudio-white-l);--rstudio-white: hsl(var(--rstudio-white-hsl));--rstudio-white-transparent: hsl(var(--rstudio-white-hsl) / .9);--grey: hsl(211 19% 70%);--light-grey: #e9edf3;--dark-grey: hsl(211 19% 50%);--divider-color: #a5b3c2;--icon-color: #76838f;--background-grey: var(--light-grey);--header-grey: var(--grey);--red: rgb(250, 83, 22);--font-color: hsl(214 9% 15%);--font-color-disabled: hsl(214 9% 15% / .5);--selected-border-color: var(--rstudio-blue);--outline-color: var(--grey);--disabled-color: hsl(var(--rstudio-grey-hsl) / .5);--disabled-outline: 1px solid hsl(var(--rstudio-grey-hsl) / .15);--corner-radius: 8px;--vertical-spacing: 10px;--horizontal-spacing: 15px;--selected-border-width: 3px;--animation-speed: .2s;--animation-curve: ease-in-out;--outline: 1px solid var(--outline-color);--input-vertical-padding: 1px;--input-horizontal-padding: 5px;--fonts: "Lucida Sans", "DejaVu Sans", "Lucida Grande", "Segoe UI", -apple-system, BlinkMacSystemFont, Verdana, Helvetica, sans-serif;--mono-fonts: Consolas, "Lucida Console", Monaco, monospace;--shadow-color: 0deg 0% 13%;--shadow-elevation-medium: .3px .5px .7px hsl(var(--shadow-color) / .36), .8px 1.6px 2px -.8px hsl(var(--shadow-color) / .36), 2.1px 4.1px 5.2px -1.7px hsl(var(--shadow-color) / .36), 5px 10px 12.6px -2.5px hsl(var(--shadow-color) / .36)}*{box-sizing:border-box}html{height:100%}body{overflow:hidden}body,input{font-family:var(--fonts);line-height:1.5;color:var(--font-color);margin:0;font-size:13px}h1,h2,h3{margin:0;color:var(--rstudio-grey)}.disable-text-selection *{user-select:none}button{border:none;background:none;cursor:pointer}h1,h2,h3{font-weight:unset;line-height:unset}code{color:unset;font-family:unset;font-size:unset}img._icon_1467k_1{height:30px;display:block}._button_1dliw_1{--background-color: var(--rstudio-white);--text-color: var(--font-color);--outline-color: transparent;--outline-width: 1px;padding:.5rem 1rem;border:var(--outline-width) solid var(--outline-color);background-color:var(--background-color);color:var(--text-color);border-radius:var(--corner-radius);align-self:center;display:flex;align-items:center;justify-content:center;gap:4px}._button_1dliw_1:disabled{--text-color: var(--font-color-disabled);cursor:not-allowed}._regular_1dliw_26{--outline-color: var(--rstudio-blue)}._delete_1dliw_30{--outline-color: var(--red)}._icon_1dliw_34{--outline-width: 0px;display:grid;place-content:center;padding:8px;aspect-ratio:1}._transparent_1dliw_42{--outline-color: transparent;--background-color: transparent}._icon_1dliw_34>svg{margin-bottom:-2px}._deleteButton_1en02_1{color:var(--red);display:flex;align-items:center;justify-content:flex-start}._deleteButton_1en02_1>svg{font-size:1.5rem}._leaf_1yzht_1{outline:1px solid forestgreen}div._selectedOverlay_1yzht_5{position:absolute;width:100%;height:100%;top:0;left:0;pointer-events:none;outline:var(--selected-border-width) solid var(--selected-border-color, pink)}._container_1yzht_15,._leaf_1yzht_1{position:relative}._container_rm196_1{position:relative;height:100%;width:100%;min-width:0;background-color:var(--rstudio-white, white);--card-padding: 6px;isolation:isolate}._container_rm196_1._withTitle_rm196_13{display:grid;grid-template-areas:"title" "contentHolder";grid-template-rows:min-content minmax(0,1fr)}._panelTitle_rm196_22{grid-area:title;padding:var(--card-padding) calc(var(--card-padding) * 1.5)}._contentHolder_rm196_27{grid-area:contentHolder;--spacing: var(--item-gap, 1rem);position:relative;height:100%;width:100%;min-width:0;display:flex;flex-direction:column;align-items:center;padding:var(--card-padding)}._contentHolder_rm196_27[data-alignment=top]{justify-content:top}._contentHolder_rm196_27[data-alignment=center]{justify-content:center}._contentHolder_rm196_27[data-alignment=spread]{justify-content:space-evenly}._contentHolder_rm196_27[data-alignment=bottom]{justify-content:end}._contentHolder_rm196_27>div{position:relative}div._dropWatcher_rm196_67{height:var(--spacing);width:100%;z-index:2}._contentHolder_rm196_27[data-alignment=top]>div._lastDropWatcher_rm196_75,._contentHolder_rm196_27[data-alignment=bottom]>div._firstDropWatcher_rm196_78,._contentHolder_rm196_27[data-alignment=center]>div._firstDropWatcher_rm196_78,._contentHolder_rm196_27[data-alignment=center]>div._lastDropWatcher_rm196_75,._contentHolder_rm196_27[data-alignment=spread]>div._lastDropWatcher_rm196_75,._contentHolder_rm196_27[data-alignment=spread]>div._firstDropWatcher_rm196_78,._contentHolder_rm196_27[data-alignment=spread]>div._middleDropWatcher_rm196_89,div._onlyDropWatcher_rm196_93{flex-grow:1;height:unset}._hoveringOverSwap_rm196_98,._availableToSwap_rm196_99{--highlight-color: var(--rstudio-blue, pink)}div._hoveringOverSwap_rm196_98:after{content:"Swap positions";position:absolute;background-color:var(--highlight-color);color:var(--rstudio-white);bottom:100%;inset-inline:20px;z-index:2;text-align:center;padding-block:4px}div._availableToSwap_rm196_99{--outline-start-width: 2px;--outline-end-width: 5px;--start-shadow: inset 0px 0 0px var(--outline-start-width) var(--highlight-color);--end-shadow: inset 0px 0 0px var(--outline-end-width) var(--highlight-color);box-shadow:var(--start-shadow);animation-duration:3s;animation-name:_pulse_rm196_1;animation-timing-function:ease-in-out;animation-iteration-count:infinite}@keyframes _pulse_rm196_1{0%{box-shadow:var(--start-shadow)}50%{box-shadow:var(--end-shadow)}to{box-shadow:var(--start-shadow)}}div._emptyGridCard_rm196_143{position:absolute;inset:0;display:grid;place-content:center;justify-items:center;gap:var(--vertical-spacing);z-index:2;pointer-events:none}div._emptyGridCard_rm196_143>button{pointer-events:initial}._emptyMessage_rm196_160{font-style:italic;opacity:.5}._canAcceptDrop_1oxcd_1{--outline-start-width: 2px;--outline-end-width: 5px;--start-shadow: inset 0px 0 0px var(--outline-start-width) var(--red);--end-shadow: inset 0px 0 0px var(--outline-end-width) var(--red);box-shadow:var(--start-shadow);animation-duration:3s;animation-name:_pulse_1oxcd_1;animation-timing-function:ease-in-out;animation-iteration-count:infinite}@keyframes _pulse_1oxcd_1{0%{box-shadow:var(--start-shadow)}50%{box-shadow:var(--end-shadow)}to{box-shadow:var(--start-shadow)}}div._canAcceptDrop_1oxcd_1._hoveringOver_1oxcd_32{background-color:var(--red);z-index:10}._marker_rkm38_1{font-weight:lighter;font-style:italic;padding:2px;position:relative;pointer-events:none;z-index:1}._marker_rkm38_1:hover{outline:2px solid var(--rstudio-blue)}._marker_rkm38_1:not(.dragging){grid-area:var(--grid-area)}._marker_rkm38_1.dragging{grid-row-start:var(--drag-grid-row-start);grid-row-end:var(--drag-grid-row-end);grid-column-start:var(--drag-grid-column-start);grid-column-end:var(--drag-grid-column-end);background-color:var(--rstudio-blue-transparent)}._dragger_rkm38_30{--dragger-short: 12px;--dragger-aspect: 2;--dragger-long: calc(var(--dragger-short) * var(--dragger-aspect));--offset-long: calc(50% - var(--dragger-long) / 2);display:grid;place-content:center;position:absolute;opacity:.2;background-color:var(--rstudio-blue);color:var(--rstudio-white);pointer-events:auto}._dragger_rkm38_30:hover{opacity:1}._dragger_rkm38_30._move_rkm38_50{height:var(--dragger-long);width:var(--dragger-long);left:var(--offset-long);top:var(--offset-long);cursor:grab}._dragger_rkm38_30.up,._dragger_rkm38_30.down{height:var(--dragger-short);width:var(--dragger-long);left:var(--offset-long);cursor:ns-resize}._dragger_rkm38_30.right,._dragger_rkm38_30.left{width:var(--dragger-short);height:var(--dragger-long);top:var(--offset-long);cursor:ew-resize}._dragger_rkm38_30.up{top:0}._dragger_rkm38_30.down{bottom:0}._dragger_rkm38_30.right{right:0}._dragger_rkm38_30.left{left:0}._ResizableGrid_i4cq9_1{--grid-gap: 5px;--grid-pad: var(--pad, 10px);height:100%;width:100%;min-height:80px;min-width:400px;display:grid;padding:var(--grid-pad);gap:var(--grid-gap);position:relative;isolation:isolate}._ResizableGrid_i4cq9_1>*{min-width:0;min-height:0}div#_size-detection-cell_i4cq9_1{width:100%;height:100%;grid-row:1/-1;grid-column:1/-1}input{padding:var(--input-vertical-padding) var(--input-horizontal-padding);border:1px solid var(--light-grey);border-radius:var(--corner-radius)}._container_jk9tt_8{--vertical-pad: calc(var(--vertical-spacing) * 1.5);margin-top:var(--vertical-pad);margin-bottom:var(--vertical-pad);max-width:100%;min-width:0;position:relative;isolation:isolate;display:block}._container_jk9tt_8[data-width-setting=fit]{width:fit-content}._container_jk9tt_8[data-width-setting=full]{width:100%}._label_jk9tt_26{display:block;padding-bottom:3px;width:auto;display:flex;justify-items:flex-start;align-items:center;gap:8px;text-transform:capitalize}._label_jk9tt_26 input[type=checkbox]{width:fit-content;margin-bottom:-2px}._container_jk9tt_8 input{max-width:100%}input:disabled,select:disabled{outline:var(--disabled-outline);opacity:.25;cursor:not-allowed}._container_jk9tt_8[data-disabled=true]{color:var(--disabled-color)}._mainInput_jk9tt_59{position:relative}._container_jk9tt_8[data-disabled=true] ._mainInput_jk9tt_59:before{content:"";position:absolute;inset:0;border-radius:var(--corner-radius);border:var(--disabled-outline);background-color:var(--rstudio-white);z-index:1;pointer-events:none}._container_jk9tt_8[data-disabled=true] ._mainInput_jk9tt_59:after{content:"Default";position:absolute;left:50%;top:50%;transform:translate(-50%,-50%);pointer-events:none;z-index:2}._mainInput_jk9tt_59>input[type=checkbox]{width:fit-content}input[type=number]._numericInput_n1lnu_1{border:1px solid var(--light-grey);border-radius:var(--corner-radius);flex-grow:1;text-align:end;--incrementer-pad: 5px;width:62px;padding-right:19px;-moz-appearance:textfield}input[type=number]._numericInput_n1lnu_1::-webkit-inner-spin-button,input[type=number]._numericInput_n1lnu_1::-webkit-outer-spin-button{-webkit-appearance:none;background-image:url(data:image/svg+xml,%3Csvg%20width%3D%2218%22%20height%3D%2220%22%20viewBox%3D%220%200%2018%2020%22%20fill%3D%22none%22%20xmlns%3D%22http%3A%2F%2Fwww.w3.org%2F2000%2Fsvg%22%3E%0A%3Cpath%20d%3D%22M8.89765%200.384033L15.9496%207.16973H1.84573L8.89765%200.384033Z%22%20fill%3D%22%2375A8DB%22%2F%3E%0A%3Cpath%20d%3D%22M8.89765%2019.384L15.9496%2012.5983H1.84573L8.89765%2019.384Z%22%20fill%3D%22%2375A8DB%22%2F%3E%0A%3C%2Fsvg%3E);background-size:contain;background-repeat:no-repeat;background-position:left;width:1em;opacity:1;position:absolute;top:4px;right:2px;bottom:4.5px}._popover_oqmv8_1{pointer-events:none;opacity:0;border-radius:var(--corner-radius);background-color:var(--rstudio-white);filter:drop-shadow(1px 1px 4px hsl(0deg 0% 0% / .25))}._textContent_oqmv8_10{padding:5px;font-style:italic;width:max-content;max-width:200px}._popover_oqmv8_1[data-show]{opacity:1;z-index:9999;transition-property:opacity;transition-duration:10ms;transition-timing-function:ease-in}._popperArrow_oqmv8_25,._popperArrow_oqmv8_25:before{position:absolute;width:8px;height:8px;background:inherit}._popperArrow_oqmv8_25{visibility:hidden}._popperArrow_oqmv8_25:before{visibility:visible;content:"";transform:rotate(45deg)}._popover_oqmv8_1[data-popper-placement^=top]>._popperArrow_oqmv8_25{bottom:-4px}._popover_oqmv8_1[data-popper-placement^=bottom]>._popperArrow_oqmv8_25{top:-4px}._popover_oqmv8_1[data-popper-placement^=left]>._popperArrow_oqmv8_25{right:-4px}._popover_oqmv8_1[data-popper-placement^=right]>._popperArrow_oqmv8_25{left:-4px}._infoIcon_15ri6_1{width:24px;color:var(--rstudio-blue);background-color:transparent;font-size:19px;display:grid;place-content:center}._container_15ri6_10{width:min(100%,max-content);padding:4px}._header_15ri6_15{border-bottom:1px solid var(--divider-color, pink);margin-bottom:3px;padding-bottom:3px}._info_15ri6_1{display:grid;grid-template-columns:auto auto;gap:4px}._unit_15ri6_27{text-align:end;font-weight:700}._description_15ri6_31{font-style:italic}._wrapper_13r28_1{position:relative;display:flex;max-width:125px;padding-block:2px;gap:2px;--incrementerSize: 10px}._unitSelector_13r28_10{--dropdown-width: 13px;text-align:center;padding:3px;padding-right:var(--dropdown-width);border:1px solid var(--light-grey);border-radius:var(--corner-radius);position:relative;appearance:none;background-image:url(data:image/svg+xml,%3Csvg%20width%3D%2218%22%20height%3D%2210%22%20viewBox%3D%220%200%2018%2010%22%20fill%3D%22none%22%20xmlns%3D%22http%3A%2F%2Fwww.w3.org%2F2000%2Fsvg%22%3E%3Cpath%20d%3D%22M8.87703%209.38397L15.929%202.59828H1.82511L8.87703%209.38397Z%22%20fill%3D%22%2375A8DB%22%2F%3E%3C%2Fsvg%3E%0A);background-size:var(--dropdown-width);background-repeat:no-repeat;background-position:right}._wrapper_13r28_1>input[type=number]{max-width:90px;min-width:40px}._tractInfoDisplay_9993b_1{--transition-delay: .1s;--transition-speed: .1s;--transition-ease: ease-in-out;--expand-transition: none;--offset: calc(-1 * var(--grid-pad));--scale: 0;--size-widget-bg-color: hsla(220, 27%, 94%, .9);--size-widget-spacing: 5px;--add-button-diameter: 19px;--add-button-color: var(--icon-color);--delete-button-height: 20px;position:relative;z-index:1;isolation:isolate;grid-column:1;grid-row:1}._tractInfoDisplay_9993b_1:focus-within,._tractInfoDisplay_9993b_1:hover{--scale: 100%;--expand-transition: transform var(--transition-speed) var(--transition-ease) var(--transition-delay);z-index:3}._tractInfoDisplay_9993b_1[data-drag-dir=rows]{grid-row:var(--tract-index);margin-left:var(--offset);width:fit-content}._tractInfoDisplay_9993b_1[data-drag-dir=cols]{grid-column:var(--tract-index);margin-top:var(--offset);height:fit-content}._sizeWidget_9993b_61{position:absolute;transition:var(--expand-transition);padding:2px;display:flex;align-items:center;gap:var(--size-widget-spacing);background-color:var(--size-widget-bg-color);height:100%;width:100%}._tractInfoDisplay_9993b_1[data-drag-dir=rows]>._sizeWidget_9993b_61{width:fit-content;border-radius:0 var(--corner-radius) var(--corner-radius) 0;transform:scaleX(var(--scale));transform-origin:left;padding-right:var(--size-widget-spacing)}._tractInfoDisplay_9993b_1[data-drag-dir=cols]>._sizeWidget_9993b_61{height:fit-content;flex-direction:column;border-radius:0 0 var(--corner-radius) var(--corner-radius);transform:scaleY(var(--scale));transform-origin:top;padding-bottom:var(--size-widget-spacing)}._hoverListener_9993b_88{position:absolute;--thickness: calc(2 * var(--grid-pad));--offset: calc(-1 * var(--grid-pad));inset:calc(4px - var(--grid-pad))}._tractInfoDisplay_9993b_1[data-drag-dir=rows] ._hoverListener_9993b_88{width:var(--thickness);left:var(--offset)}._tractInfoDisplay_9993b_1[data-drag-dir=cols] ._hoverListener_9993b_88{height:var(--thickness);top:var(--offset)}._buttons_9993b_108{display:flex;justify-content:space-between}._tractInfoDisplay_9993b_1[data-drag-dir=cols] ._buttons_9993b_108{width:100%;flex-direction:row}._tractInfoDisplay_9993b_1[data-drag-dir=rows] ._buttons_9993b_108{height:100%;flex-direction:column}._tractAddButton_9993b_121,._deleteButton_9993b_122{--offset_amnt: 2px;--offset: calc(var(--offset_amnt) - var(--add-button-diameter));width:var(--add-button-diameter);height:var(--add-button-diameter);aspect-ratio:1/1;display:grid;place-content:center;border-radius:50%}._tractAddButton_9993b_121{background-color:var(--add-button-color);color:var(--rstudio-white)}._deleteButton_9993b_122{background-color:transparent;font-size:var(--delete-button-height)}._deleteButton_9993b_122[data-enabled=true]{color:var(--red)}._deleteButton_9993b_122[data-enabled=false]{color:var(--disabled-color);cursor:not-allowed}div._columnSizer_3i83d_1,div._rowSizer_3i83d_2{--sizer-color: #c9e2f3;--sizer-expansion-amnt: 1.3;--sizer-margin-offset: calc(-1 * var(--grid-gap));--sizer-thickness: 2px;--sizer-hang-over: 16px;--sizer-offset: calc(var(--grid-pad) + var(--sizer-hang-over));--sizer-length: calc(100% + var(--sizer-offset) + var(--grid-pad));--sizer-main-axis-offset: calc(-1 * var(--sizer-offset));--sizer-off-axis-offset: calc(50% - var(--sizer-thickness) / 2);z-index:-1;background-color:transparent;opacity:1;position:relative;transition:transform 1s .5s}._columnSizer_3i83d_1{grid-row:1/-1;width:var(--grid-gap);margin-left:var(--sizer-margin-offset);height:var(--sizer-length);cursor:ew-resize}._rowSizer_3i83d_2{grid-column:1/-1;height:var(--grid-gap);margin-top:var(--sizer-margin-offset);width:var(--sizer-length);cursor:ns-resize}div._columnSizer_3i83d_1:after,div._rowSizer_3i83d_2:after{content:"";position:absolute;background-color:var(--sizer-color)}div._columnSizer_3i83d_1:after{height:100%;width:var(--sizer-thickness);left:var(--sizer-off-axis-offset);top:var(--sizer-main-axis-offset)}div._rowSizer_3i83d_2:after{width:100%;height:var(--sizer-thickness);top:var(--sizer-off-axis-offset);left:var(--sizer-main-axis-offset)}._columnSizer_3i83d_1:hover,._rowSizer_3i83d_2:hover{transition:transform 0s}._columnSizer_3i83d_1:hover{transform:scaleX(var(--sizer-expansion-amnt))}._rowSizer_3i83d_2:hover{transform:scaleY(var(--sizer-expansion-amnt))}._container_16q2n_1{display:flex;gap:.5rem;flex-wrap:wrap;align-items:center;margin-bottom:1rem;width:100%}._label_16q2n_10{font-style:italic;width:auto}._input_16q2n_15{border:1px solid var(--light-grey);border-radius:var(--corner-radius);width:100%}._portalHolder_18ua3_1{background-color:#fffb;position:absolute;inset:0;display:grid;place-content:center;z-index:2}._portalModal_18ua3_11{outline:1px solid grey;width:450px;background-color:var(--rstudio-white);display:flex;flex-direction:column;border-radius:var(--corner-radius);overflow:scroll}._title_18ua3_21{padding:8px}._body_18ua3_25{flex-grow:1;padding:1rem}._portalForm_18ua3_30{display:flex;flex-direction:column}._portalFormInputs_18ua3_35{flex-grow:1;display:flex;justify-content:center;flex-direction:column}._portalFormFooter_18ua3_42{padding-top:1rem;display:flex;justify-content:space-around}._validationMsg_18ua3_48{color:var(--red);font-style:italic}._infoText_18ua3_53{font-style:italic}._portalHolder_18ua3_1{background-color:#fffb;position:absolute;inset:0;display:grid;place-content:center;z-index:2}._portalModal_18ua3_11{outline:1px solid grey;width:450px;background-color:var(--rstudio-white);display:flex;flex-direction:column;border-radius:var(--corner-radius);overflow:scroll}._title_18ua3_21{padding:8px}._body_18ua3_25{flex-grow:1;padding:1rem}._portalForm_18ua3_30{display:flex;flex-direction:column}._portalFormInputs_18ua3_35{flex-grow:1;display:flex;justify-content:center;flex-direction:column}._portalFormFooter_18ua3_42{padding-top:1rem;display:flex;justify-content:space-around}._validationMsg_18ua3_48{color:var(--red);font-style:italic}._infoText_18ua3_53{font-style:italic}._container_1hvsg_1{display:grid;outline:var(--outline);position:relative;height:100%;width:100%}._container_1rlbk_1{max-height:100%}._plotPlaceholder_1rlbk_5{--pad: 15px;--label-height: 30px;--plot-offset: calc(2 * var(--pad) + var(--label-height));padding:var(--pad);height:100%;max-height:100%;display:flex;flex-direction:column;justify-content:space-evenly;align-items:center;background-color:var(--light-grey)}._plotPlaceholder_1rlbk_5 ._label_1rlbk_19{height:var(--label-height);line-height:var(--label-height)}._plotPlaceholder_1rlbk_5>svg{margin-inline:auto}._gridCardPlot_1a94v_1{background-color:var(--rstudio-white);width:100%;height:100%;max-width:100%;max-height:100%;position:relative}._gridCardPlot_1a94v_1>h1{font-size:2rem}._textPanel_525i2_1{background-color:var(--rstudio-white);display:grid;align-items:center;width:100%;height:100%;padding:1rem;position:relative}._textPanel_525i2_1>h1{font-size:2rem}._checkboxInput_12wa8_1{height:0;width:0;visibility:hidden;position:absolute}label._checkboxLabel_12wa8_10{--height: 30px;--aspect-ratio: 2.8;--animation-speed: .2s;--toggle-inset: 2px;--on-color: var(--rstudio-blue, pink);--off-color: var(--grey);--width: calc(var(--height) * var(--aspect-ratio));--toggle-h: calc(var(--height) - var(--toggle-inset) * 2);--toggle-w: calc(var(--width) * .5);font-size:12px;cursor:pointer;color:transparent;width:var(--width);height:var(--height);border-radius:var(--corner-radius);background:var(--off-color);display:block;position:relative;margin-inline:4px}._checkboxLabel_12wa8_10:after{content:attr(data-value);color:var(--dark-grey);text-align:center;position:absolute;display:grid;place-content:center;top:var(--toggle-inset);left:var(--toggle-inset);width:var(--toggle-w);height:var(--toggle-h);border-radius:calc(var(--corner-radius) - var(--toggle-inset));background:var(--rstudio-white);transition:var(--animation-speed)}._checkboxInput_12wa8_1:checked+._checkboxLabel_12wa8_10{background:var(--on-color)}._checkboxInput_12wa8_1:checked+._checkboxLabel_12wa8_10:after{left:calc(100% - var(--toggle-inset));transform:translate(-100%)}._checkboxLabel_12wa8_10:active:after{width:calc(var(--toggle-w) * 1.2)}._radioContainer_1regb_1{display:grid;gap:5px;justify-content:space-around;align-content:center;border:none;max-width:100%;min-width:0;grid-template-columns:repeat(auto-fill,minmax(40px,1fr));padding:0}._option_1regb_15{height:25px;width:100%}._option_1regb_15>._radioInput_1regb_22{display:none}._radioLabel_1regb_26{display:flex;justify-content:center;align-items:center;border:1px solid var(--light-grey);border-radius:var(--corner-radius);background-color:var(--rstudio-white);max-height:105px;height:100%;padding:2px;color:var(--rstudio-blue);position:relative}._icon_1regb_41{height:100%;display:block}._radioLabel_1regb_26 svg{height:1.65rem;padding:1px;font-size:1.6rem}._radioInput_1regb_22:checked+._radioLabel_1regb_26{outline:3px solid var(--rstudio-blue);outline-offset:-2px;font-weight:700}._radioInput_1regb_22:hover:not(:checked)+._radioLabel_1regb_26{outline:2px solid var(--rstudio-blue)}._radioInput_1regb_22:hover+._radioLabel_1regb_26:after,._radioInput_1regb_22:hover+._radioLabel_1regb_26 ._icon_1regb_41{transition-property:opacity;transition-duration:1.5s;transition-delay:.15s}._radioInput_1regb_22+._radioLabel_1regb_26:after{content:attr(data-name);opacity:0;position:absolute;pointer-events:none}._radioInput_1regb_22:hover+._radioLabel_1regb_26:after{transition-timing-function:ease-in;opacity:1}._radioInput_1regb_22:hover+._radioLabel_1regb_26 ._icon_1regb_41{transition-timing-function:ease-out;opacity:0}._container_tyghz_1{display:grid;grid-template-rows:1fr;grid-template-columns:1fr;place-content:center;padding:5px;max-height:100%}._categoryDivider_8d7ls_1{display:block;position:relative;isolation:isolate;height:var(--vertical-spacing);display:flex;align-items:center}._categoryDivider_8d7ls_1>span{text-transform:capitalize;background-color:var(--light-grey)}._categoryDivider_8d7ls_1:before{content:"";position:absolute;top:50%;left:0;width:100%;height:1px;background-color:var(--divider-color);z-index:-1;opacity:.5}._container_xt7ji_1{--gap-size: 4px;margin-top:21px}._list_xt7ji_6{width:fit-content;display:flex;flex-direction:column;align-items:center;margin-block:calc(2 * var(--gap-size));--border: 1px solid var(--grey)}._item_xt7ji_15{width:100%;display:grid;grid-template-columns:15px 1fr auto 1fr 15px;grid-template-areas:"drag key colon value delete";gap:var(--gap-size);align-items:center;padding:var(--gap-size)}._item_xt7ji_15.sortable-chosen{outline:2px solid var(--rstudio-blue)}._keyField_xt7ji_29{grid-area:key;min-width:0}._valueField_xt7ji_34{grid-area:value;min-width:0}._header_xt7ji_39{margin-top:-5px;margin-bottom:-5px;text-align:center}._dragHandle_xt7ji_45{grid-area:drag;cursor:ns-resize;transform:translateY(2px)}._item_xt7ji_15 svg{width:16px}._deleteButton_xt7ji_55{grid-area:delete;--offset: 4px;background-color:transparent;transform:translate(-2px,-2px);outline:none}._addItemButton_xt7ji_65{color:var(--icon-color);font-size:14px;padding:4px;transform:translateY(-2px)}._separator_xt7ji_72{transform:translateY(-1px)}._deleteButton_xt7ji_55:hover>svg{stroke-width:3}._container_162lp_1{position:relative;padding:4px}._container_162lp_1>input{width:100%}._container_162lp_1>label{font-weight:700}._checkbox_162lp_14{display:flex;align-items:center;gap:4px}._container_1x0tz_1{position:relative;padding:4px}._container_1x0tz_1>input{width:100%}._label_1x0tz_10{margin-left:5px}._wrappedSection_1dn9g_1{display:flex;border:none;flex-wrap:wrap;justify-content:space-between;margin-block-end:var(--vertical-spacing)}._sectionContainer_1dn9g_9{margin-block-start:25px}._wrappedSection_1dn9g_1>*{margin-bottom:0}._wrappedSection_1dn9g_1 input{max-width:unset}._container_sgn7c_1{position:relative;padding:4px}._container_sgn7c_1>input{width:100%}._container_sgn7c_1>label{font-weight:700}._container_1e5dd_1{position:relative;padding:4px}._container_1e5dd_1>input{width:100%}._container_1e5dd_1>label{font-weight:700}._container_1e5dd_1>select{display:block;width:100%;height:40px}._container_1f2js_1{padding:6px;--tract-thickness: 12px;--handle-diameter: 17px;--tract-color: var(--rstudio-blue);--handle-color: var(--light-grey);--handle-outline: 1px solid var(--grey)}._sliderWrapper_1f2js_11{padding-top:var(--tract-thickness);padding-right:3px}input[type=range]._sliderInput_1f2js_16{-webkit-appearance:none;appearance:none;width:100%;height:var(--tract-thickness);background-color:var(--tract-color);padding:0;margin-top:15px;position:relative;border-radius:var(--tract-thickness)}input[type=range]._sliderInput_1f2js_16::-webkit-slider-thumb{-webkit-appearance:none;appearance:none;width:var(--handle-diameter);height:var(--handle-diameter);border-radius:50%;background:var(--handle-color);outline:var(--handle-outline);cursor:pointer}._sliderInput_1f2js_16:before,._sliderInput_1f2js_16:after{position:absolute;bottom:calc(50% + var(--handle-diameter) / 2 + 2px);background-color:var(--light-grey);padding-inline:4px;padding-block:2px;font-size:12px;border-radius:2px}._sliderInput_1f2js_16:before{content:attr(data-min);left:0}._sliderInput_1f2js_16:after{content:attr(data-max);right:0}._container_yicbr_1{position:relative;padding:4px}._container_yicbr_1>input{width:100%}._container_1i6yi_1{padding:1rem;max-height:100%;background-color:var(--light-grey);border-radius:var(--corner-radius)}._container_1xnzo_1{display:grid;grid-template-rows:1fr;grid-template-columns:1fr;place-content:center;padding:1rem;max-height:100%;min-height:200px;background-color:var(--light-grey);border-radius:var(--corner-radius)}._container_p6wnj_1{--gap: 10px;width:calc(100% - var(--gap));margin:auto;height:min(calc(100% - var(--gap)),75px);padding:4px;background-color:var(--light-grey);border-radius:var(--corner-radius);position:relative;display:grid;place-content:center}._infoMsg_p6wnj_14>svg{color:var(--rstudio-blue);margin-right:4px;margin-bottom:-2px}._codeHolder_p6wnj_19{overflow:auto;font-family:var(--mono-fonts);border:1px solid var(--rstudio-grey);background-color:var(--rstudio-white);padding:5px}div._appViewerHolder_wu0cb_1{--app-scale-amnt: .24;--animation-speed: .25s;--animation-speed-timing: var(--animation-speed) ease;--expand-btn-size: 1rem;--logs-font-size: .65rem;--logs-padding: var(--vertical-spacing);--expanded-inset-horizontal: 70px;--expanded-inset-top: 70px;--expanded-inset-bottom: calc(70px + var(--logs-offset-expanded));--preview-inset-horizontal: 10px;--preview-inset-top: 10px;--preview-inset-bottom: calc( var(--preview-inset-top) + var(--logs-button-h) + var(--logs-offset) );--logs-button-h: 28px;--logs-offset: 0px;--logs-offset-expanded: 30px;--app-expanded-w: calc(100vw - var(--expanded-inset-horizontal) * 2);--app-expanded-h: calc( 100vh - var(--expanded-inset-top) - var(--expanded-inset-bottom) );--app-preview-w: calc(var(--app-expanded-w) * var(--app-scale-amnt));--app-preview-h: calc(var(--app-expanded-h) * var(--app-scale-amnt));height:calc(var(--app-preview-h) + var(--preview-inset-top) + var(--preview-inset-bottom));position:relative;overflow:hidden}._title_wu0cb_55{position:relative}._appViewerHolder_wu0cb_1[data-expanded=true]{--expand-btn-size: 1.5rem;--logs-font-size: .9rem;--logs-padding: 32px;--viewer-h: 1fr;--logs-button-h: 30px;--logs-offset: 35px;position:fixed;inset:0;width:100vw;height:100vh;z-index:10;background-color:hsl(var(--rstudio-grey-hsl) / .15);backdrop-filter:blur(6px);transition:all var(--animation-speed-timing);transition-property:backdrop-filter background-color}._appContainer_wu0cb_89{display:grid;place-content:center}._appViewerHolder_wu0cb_1[data-expanded=false]>._appContainer_wu0cb_89{position:absolute;top:var(--preview-inset-top);right:var(--preview-inset-horizontal);width:var(--app-preview-w);height:var(--app-preview-h)}._appViewerHolder_wu0cb_1[data-expanded=true]>._appContainer_wu0cb_89{position:absolute;inset-inline:var(--expanded-inset-horizontal);top:var(--expanded-inset-top);height:var(--app-expanded-h)}._previewFrame_wu0cb_109{background-color:var(--rstudio-white);width:var(--app-expanded-w);height:var(--app-expanded-h);transform:scale(var(--app-scale-amnt));border:1px solid var(--outline-color);display:block;border-radius:2px}._appViewerHolder_wu0cb_1[data-expanded=true] ._previewFrame_wu0cb_109{transform:scale(1);transition:transform var(--animation-speed-timing);border:none;box-shadow:var(--shadow-elevation-medium)}._appViewerHolder_wu0cb_1[data-expanded=false] ._previewFrame_wu0cb_109{transition:none}._expandButton_wu0cb_134,._reloadButton_wu0cb_135{position:absolute;background-color:transparent;outline:none;border:none;transition-property:opacity,color,transform;transition-duration:.25s;transition-timing-function:ease-in}._reloadButton_wu0cb_135{top:0;bottom:0;color:currentColor;font-size:1.5rem;--normal-transform: scaleY(-1) var(--expand-scale, scale(1)) rotate(90deg);transform:var(--normal-transform)}._reloadButton_wu0cb_135:hover{--expand-scale: scale(1.1)}._spin_wu0cb_160{animation-duration:1s;animation-name:_spin_wu0cb_160;--at-rest-transform: var(--normal-transform, scale(1))}@keyframes _spin_wu0cb_160{0%{transform:var(--at-rest-transform) rotate(0)}to{transform:var(--at-rest-transform) rotate(-360deg);animation-timing-function:ease-out}}._appViewerHolder_wu0cb_1 ._reloadButton_wu0cb_135{display:none}._expandButton_wu0cb_134{width:100%;height:100%;font-size:50px;opacity:0;color:transparent}._expandButton_wu0cb_134:hover{color:inherit;opacity:1;transform:scale(1.1)}._restartButton_wu0cb_198{width:fit-content;margin-inline:auto}._appViewerHolder_wu0cb_1[data-expanded=true] ._expandButton_wu0cb_134,._appViewerHolder_wu0cb_1[data-expanded=true] ._reloadButton_wu0cb_135{width:var(--expanded-inset-left);height:var(--expanded-inset-top);font-size:2.5rem;opacity:1;position:fixed;top:0;display:block}._appViewerHolder_wu0cb_1[data-expanded=true] ._expandButton_wu0cb_134{color:inherit;right:0}._appViewerHolder_wu0cb_1>h2{color:var(--rstudio-grey);text-align:center;font-style:italic}._loadingMessage_wu0cb_225{display:grid;place-content:center;width:100%;height:100%;padding:1rem}._loadingMessage_wu0cb_225>h2{text-align:center}h2._error_wu0cb_236{color:var(--red)}._fakeApp_t3dh1_1{display:grid;place-content:center;font-size:4rem}._fakeDashboard_t3dh1_7{display:grid;gap:5px;grid:"header header" 100px "sidebar top " 2fr "sidebar bottom" 1fr / 150px 1fr}._fakeDashboard_t3dh1_7>div{width:100%;height:100%}._fakeDashboard_t3dh1_7>._header_t3dh1_22{grid-area:header;background-color:#ba55d3b3;display:grid;place-content:center}._header_t3dh1_22>h1{color:#fff}._fakeDashboard_t3dh1_7>._sidebar_t3dh1_31{grid-area:sidebar;background-color:#ce8740b3}._fakeDashboard_t3dh1_7>._top_t3dh1_35{grid-area:top;background-color:#228c22b3}._fakeDashboard_t3dh1_7>._bottom_t3dh1_39{grid-area:bottom;background-color:#4682b4b3}._logs_xjp5l_2{--tab-height: var(--logs-button-h, 20px);--background-color: var(--rstudio-white);--outline-color: var(--rstudio-grey, red);--side-offset: 8px;position:absolute;bottom:0;left:var(--side-offset);right:var(--side-offset);top:0;grid-area:logs;isolation:isolate;transform:translateY(calc(100% - var(--tab-height) - var(--logs-offset, 0px)));transition:transform var(--animation-speed, .25s) ease-in}._logs_xjp5l_2[data-expanded=true]{transform:translateY(5px)}._logs_xjp5l_2[data-expanded=true] ._logsContents_xjp5l_25{overflow:auto}button._expandTab_xjp5l_29,._logsContents_xjp5l_25{background-color:var(--background-color)}button._expandTab_xjp5l_29{z-index:2;border-radius:var(--corner-radius) var(--corner-radius) 0 0!important;width:fit-content;height:var(--tab-height);margin-inline:auto;gap:5px;padding-inline:10px;justify-content:center;background-color:var(--background-color);outline:var(--outline);display:flex;align-items:center;position:relative}button._expandTab_xjp5l_29:after{position:absolute;content:"";width:100%;height:3px;bottom:-2px;background-color:var(--background-color)}._logsContents_xjp5l_25{z-index:1;border:var(--outline);height:calc(100% - var(--tab-height));padding:var(--logs-padding);position:relative}._clearLogsButton_xjp5l_69{outline:none;position:absolute;top:0;right:0}p._logLine_xjp5l_75{font-family:var(--mono-fonts);font-size:var(--logs-font-size);margin:0}._noLogsMsg_xjp5l_81{opacity:.8;height:100%;text-align:center;font-size:1rem}._expandedLogs_xjp5l_93 ._logsContents_xjp5l_25{overflow:auto}._expandLogsButton_xjp5l_101{flex-grow:1;text-align:center;font-size:calc(var(--logs-font-size) * 1.3);height:100%}._unseenLogsNotification_xjp5l_108{color:var(--red);right:0;opacity:0;font-size:9px}._unseenLogsNotification_xjp5l_108[data-show=true]{opacity:1;animation-duration:2s;animation-name:_slidein_xjp5l_1;animation-iteration-count:3;animation-timing-function:ease-in-out;transition:opacity 1s}@keyframes _slidein_xjp5l_1{0%{transform:scale(1)}50%{transform:scale(1.5)}to{transform:scale(1)}}._container_1d7pe_1{display:flex;position:relative}._container_1d7pe_1>button>svg{color:var(--icon-color, silver)}._container_1d7pe_1>button{height:var(--header-height, 100%);padding:0;position:relative;font-size:2rem}._container_1d7pe_1>button:disabled{color:var(--disabled-color);opacity:.2}._elementsPalette_zecez_1{--icon-size: 75px;--padding: 8px;height:100%;overflow:auto;padding:var(--padding);display:grid;align-items:start;grid-template-columns:repeat(2,var(--icon-size));justify-content:center;justify-items:center;align-content:start;gap:var(--padding)}._OptionItem_zecez_18{width:var(--icon-size);height:75px;border-radius:var(--corner-radius);position:relative;cursor:grab;text-align:center}._OptionIcon_zecez_27{margin:-12px 0 0;display:block;width:100%;pointer-events:none}._OptionLabel_zecez_35{margin-top:-18px;display:block;line-height:15px}._OptionItem_zecez_18:hover{outline:var(--outline)}._OptionItem_zecez_18:active{cursor:grabbing}._OptionItem_zecez_18>svg{color:var(--rstudio-blue)}._container_1ehu8_1{--header-height: 31px;--padding: var(--horizontal-spacing);height:100%;width:100%;background-color:var(--background-grey, #edf2f7);display:grid;grid-template-rows:var(--header-height) 1fr;grid-template-columns:auto 1fr var(--properties-panel-width);grid-template-areas:"header header header " "elements editor properties"}._container_1ehu8_1 *{min-height:0}._container_1ehu8_1>div{outline:1px solid var(--header-grey);min-width:0;isolation:isolate}._elementsPanel_1ehu8_28{grid-area:elements;overflow:auto}._propertiesPanel_1ehu8_33{grid-area:properties;display:flex;flex-direction:column;justify-content:space-between}._propertiesPanel_1ehu8_33>.properties-panel{flex:1}._propertiesPanel_1ehu8_33>.app-preview{flex-grow:0}._editorHolder_1ehu8_47{grid-area:editor;background-color:var(--rstudio-white);padding:32px;height:100%;width:100%;position:relative}._titledPanel_1ehu8_59{display:grid;grid-template-rows:var(--header-height) 1fr;background-color:var(--background-grey);isolation:isolate}._titledPanel_1ehu8_59>*{min-width:0}._panelTitleHeader_1ehu8_71{text-align:center;line-height:var(--header-height);background-color:var(--header-grey, forestgreen);font-size:1.05rem;font-weight:lighter;color:var(--rstudio-white)}._header_1ehu8_80{grid-area:header;gap:var(--padding);display:flex;justify-content:flex-start;align-items:center}._rightSide_1ehu8_88{margin-left:auto;width:var(--properties-panel-width);display:inherit;align-items:center;gap:14px}._rightSide_1ehu8_88>:first-child{margin-left:-6px}._rightSide_1ehu8_88 .react-joyride{display:none}._rightSide_1ehu8_88>.undo-redo-buttons{transform:translate(-1px,-1px)}._divider_1ehu8_109{height:20px;background-color:var(--divider-color);width:2px}._title_1ehu8_59{font-size:1.15rem;color:var(--rstudio-blue)}._shinyLogo_1ehu8_120{display:inline-block;height:100%;border-radius:0 15px 15px 0;padding-block:3px;padding-inline:5px}._header_1ehu8_80 button{padding:0}._container_1fh41_1{--flex-gap: 8px;padding:var(--vertical-spacing);display:flex;flex-direction:column;gap:var(--flex-gap);position:relative;width:fit-content;max-width:100%}._node_1fh41_12{padding:var(--input-vertical-padding) var(--input-horizontal-padding);width:100%;max-width:100%;overflow-wrap:break-word;position:relative;cursor:pointer;background-color:var(--rstudio-white);border-radius:var(--corner-radius)}._node_1fh41_12:last-child{background-color:var(--rstudio-blue);color:var(--rstudio-white)}._node_1fh41_12:before,._node_1fh41_12:after{--dot-size: 6px;--line-width: 2px;--offset: 5px;--color: var(--header-grey);content:"";position:absolute}._node_1fh41_12:after{width:var(--dot-size);height:var(--dot-size);background-color:var(--background-grey);outline-width:var(--line-width);outline-style:solid;outline-color:var(--color);border-radius:50%;left:calc(-1 * (var(--input-horizontal-padding) + var(--dot-size) / 2 + var(--offset)));top:calc(50% - var(--dot-size) / 2)}._node_1fh41_12:first-child:after{border-radius:0}._node_1fh41_12:before{background-color:var(--color);width:var(--line-width);height:calc(100% + var(--flex-gap));left:calc(-1 * (var(--input-horizontal-padding) + var(--line-width) / 2 + var(--offset)));top:calc(-1 * var(--flex-gap) / 2)}._node_1fh41_12:only-child:before{display:none}._node_1fh41_12:first-child:before,._node_1fh41_12:last-child:before{height:calc(50% + var(--flex-gap) / 2)}._node_1fh41_12:first-child:before{top:50%}._settingsPanel_zsgzt_1{--vertical-gap: var(--vertical-spacing);display:flex;flex-direction:column;padding-inline:var(--horizontal-spacing);padding-block:var(--vertical-gap);height:100%}._currentElementAbout_zsgzt_10{flex-shrink:0}form._settingsForm_zsgzt_17{flex:1;height:100%;overflow:auto;isolation:isolate}._settingsInputs_zsgzt_24{overflow:auto}._buttonsHolder_zsgzt_28{margin-top:auto;background-color:var(--light-grey);padding-block:var(--vertical-gap);display:flex;flex-direction:column;justify-content:space-around;align-items:center;gap:var(--vertical-spacing)}._buttonsHolder_zsgzt_28>Button{height:40px;width:100%;border:none}._validationErrorMsg_zsgzt_45{padding:.5rem;color:var(--red);font-family:var(--mono-fonts)} diff --git a/docs/articles/demo-app/assets/index.d6a2ed27.css b/docs/articles/demo-app/assets/index.d6a2ed27.css deleted file mode 100644 index 2027a22c4..000000000 --- a/docs/articles/demo-app/assets/index.d6a2ed27.css +++ /dev/null @@ -1,6 +0,0 @@ -@charset "UTF-8";@import"https://fonts.googleapis.com/css2?family=Raleway:ital,wght@0,100..900;1,100..900&display=swap";/*! - * Bootstrap v5.1.3 (https://getbootstrap.com/) - * Copyright 2011-2021 The Bootstrap Authors - * Copyright 2011-2021 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/main/LICENSE) - */:root{--bs-blue: #0d6efd;--bs-indigo: #6610f2;--bs-purple: #6f42c1;--bs-pink: #d63384;--bs-red: #dc3545;--bs-orange: #fd7e14;--bs-yellow: #ffc107;--bs-green: #198754;--bs-teal: #20c997;--bs-cyan: #0dcaf0;--bs-white: #fff;--bs-gray: #6c757d;--bs-gray-dark: #343a40;--bs-gray-100: #f8f9fa;--bs-gray-200: #e9ecef;--bs-gray-300: #dee2e6;--bs-gray-400: #ced4da;--bs-gray-500: #adb5bd;--bs-gray-600: #6c757d;--bs-gray-700: #495057;--bs-gray-800: #343a40;--bs-gray-900: #212529;--bs-primary: #0d6efd;--bs-secondary: #6c757d;--bs-success: #198754;--bs-info: #0dcaf0;--bs-warning: #ffc107;--bs-danger: #dc3545;--bs-light: #f8f9fa;--bs-dark: #212529;--bs-primary-rgb: 13, 110, 253;--bs-secondary-rgb: 108, 117, 125;--bs-success-rgb: 25, 135, 84;--bs-info-rgb: 13, 202, 240;--bs-warning-rgb: 255, 193, 7;--bs-danger-rgb: 220, 53, 69;--bs-light-rgb: 248, 249, 250;--bs-dark-rgb: 33, 37, 41;--bs-white-rgb: 255, 255, 255;--bs-black-rgb: 0, 0, 0;--bs-body-color-rgb: 33, 37, 41;--bs-body-bg-rgb: 255, 255, 255;--bs-font-sans-serif: system-ui, -apple-system, "Segoe UI", Roboto, "Helvetica Neue", Arial, "Noto Sans", "Liberation Sans", sans-serif, "Apple Color Emoji", "Segoe UI Emoji", "Segoe UI Symbol", "Noto Color Emoji";--bs-font-monospace: SFMono-Regular, Menlo, Monaco, Consolas, "Liberation Mono", "Courier New", monospace;--bs-gradient: linear-gradient(180deg, rgba(255, 255, 255, .15), rgba(255, 255, 255, 0));--bs-body-font-family: var(--bs-font-sans-serif);--bs-body-font-size: 1rem;--bs-body-font-weight: 400;--bs-body-line-height: 1.5;--bs-body-color: #212529;--bs-body-bg: #fff}*,*:before,*:after{box-sizing:border-box}@media (prefers-reduced-motion: no-preference){:root{scroll-behavior:smooth}}body{margin:0;font-family:var(--bs-body-font-family);font-size:var(--bs-body-font-size);font-weight:var(--bs-body-font-weight);line-height:var(--bs-body-line-height);color:var(--bs-body-color);text-align:var(--bs-body-text-align);background-color:var(--bs-body-bg);-webkit-text-size-adjust:100%;-webkit-tap-highlight-color:rgba(0,0,0,0)}hr{margin:1rem 0;color:inherit;background-color:currentColor;border:0;opacity:.25}hr:not([size]){height:1px}h6,.h6,h5,.h5,h4,.h4,h3,.h3,h2,.h2,h1,.h1{margin-top:0;margin-bottom:.5rem;font-weight:500;line-height:1.2}h1,.h1{font-size:calc(1.375rem + 1.5vw)}@media (min-width: 1200px){h1,.h1{font-size:2.5rem}}h2,.h2{font-size:calc(1.325rem + .9vw)}@media (min-width: 1200px){h2,.h2{font-size:2rem}}h3,.h3{font-size:calc(1.3rem + .6vw)}@media (min-width: 1200px){h3,.h3{font-size:1.75rem}}h4,.h4{font-size:calc(1.275rem + .3vw)}@media (min-width: 1200px){h4,.h4{font-size:1.5rem}}h5,.h5{font-size:1.25rem}h6,.h6{font-size:1rem}p{margin-top:0;margin-bottom:1rem}abbr[title],abbr[data-bs-original-title]{-webkit-text-decoration:underline dotted;text-decoration:underline dotted;cursor:help;-webkit-text-decoration-skip-ink:none;text-decoration-skip-ink:none}address{margin-bottom:1rem;font-style:normal;line-height:inherit}ol,ul{padding-left:2rem}ol,ul,dl{margin-top:0;margin-bottom:1rem}ol ol,ul ul,ol ul,ul ol{margin-bottom:0}dt{font-weight:700}dd{margin-bottom:.5rem;margin-left:0}blockquote{margin:0 0 1rem}b,strong{font-weight:bolder}small,.small{font-size:.875em}mark,.mark{padding:.2em;background-color:#fcf8e3}sub,sup{position:relative;font-size:.75em;line-height:0;vertical-align:baseline}sub{bottom:-.25em}sup{top:-.5em}a{color:#0d6efd;text-decoration:underline}a:hover{color:#0a58ca}a:not([href]):not([class]),a:not([href]):not([class]):hover{color:inherit;text-decoration:none}pre,code,kbd,samp{font-family:var(--bs-font-monospace);font-size:1em;direction:ltr;unicode-bidi:bidi-override}pre{display:block;margin-top:0;margin-bottom:1rem;overflow:auto;font-size:.875em}pre code{font-size:inherit;color:inherit;word-break:normal}code{font-size:.875em;color:#d63384;word-wrap:break-word}a>code{color:inherit}kbd{padding:.2rem .4rem;font-size:.875em;color:#fff;background-color:#212529;border-radius:.2rem}kbd kbd{padding:0;font-size:1em;font-weight:700}figure{margin:0 0 1rem}img,svg{vertical-align:middle}table{caption-side:bottom;border-collapse:collapse}caption{padding-top:.5rem;padding-bottom:.5rem;color:#6c757d;text-align:left}th{text-align:inherit;text-align:-webkit-match-parent}thead,tbody,tfoot,tr,td,th{border-color:inherit;border-style:solid;border-width:0}label{display:inline-block}button{border-radius:0}button:focus:not(:focus-visible){outline:0}input,button,select,optgroup,textarea{margin:0;font-family:inherit;font-size:inherit;line-height:inherit}button,select{text-transform:none}[role=button]{cursor:pointer}select{word-wrap:normal}select:disabled{opacity:1}[list]::-webkit-calendar-picker-indicator{display:none}button,[type=button],[type=reset],[type=submit]{-webkit-appearance:button}button:not(:disabled),[type=button]:not(:disabled),[type=reset]:not(:disabled),[type=submit]:not(:disabled){cursor:pointer}::-moz-focus-inner{padding:0;border-style:none}textarea{resize:vertical}fieldset{min-width:0;padding:0;margin:0;border:0}legend{float:left;width:100%;padding:0;margin-bottom:.5rem;font-size:calc(1.275rem + .3vw);line-height:inherit}@media (min-width: 1200px){legend{font-size:1.5rem}}legend+*{clear:left}::-webkit-datetime-edit-fields-wrapper,::-webkit-datetime-edit-text,::-webkit-datetime-edit-minute,::-webkit-datetime-edit-hour-field,::-webkit-datetime-edit-day-field,::-webkit-datetime-edit-month-field,::-webkit-datetime-edit-year-field{padding:0}::-webkit-inner-spin-button{height:auto}[type=search]{outline-offset:-2px;-webkit-appearance:textfield}::-webkit-search-decoration{-webkit-appearance:none}::-webkit-color-swatch-wrapper{padding:0}::-webkit-file-upload-button{font:inherit}::file-selector-button{font:inherit}::-webkit-file-upload-button{font:inherit;-webkit-appearance:button}output{display:inline-block}iframe{border:0}summary{display:list-item;cursor:pointer}progress{vertical-align:baseline}[hidden]{display:none!important}.lead{font-size:1.25rem;font-weight:300}.display-1{font-size:calc(1.625rem + 4.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-1{font-size:5rem}}.display-2{font-size:calc(1.575rem + 3.9vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-2{font-size:4.5rem}}.display-3{font-size:calc(1.525rem + 3.3vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-3{font-size:4rem}}.display-4{font-size:calc(1.475rem + 2.7vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-4{font-size:3.5rem}}.display-5{font-size:calc(1.425rem + 2.1vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-5{font-size:3rem}}.display-6{font-size:calc(1.375rem + 1.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-6{font-size:2.5rem}}.list-unstyled,.list-inline{padding-left:0;list-style:none}.list-inline-item{display:inline-block}.list-inline-item:not(:last-child){margin-right:.5rem}.initialism{font-size:.875em;text-transform:uppercase}.blockquote{margin-bottom:1rem;font-size:1.25rem}.blockquote>:last-child{margin-bottom:0}.blockquote-footer{margin-top:-1rem;margin-bottom:1rem;font-size:.875em;color:#6c757d}.blockquote-footer:before{content:"\2014\a0"}.img-fluid{max-width:100%;height:auto}.img-thumbnail{padding:.25rem;background-color:#fff;border:1px solid #dee2e6;border-radius:.25rem;max-width:100%;height:auto}.figure{display:inline-block}.figure-img{margin-bottom:.5rem;line-height:1}.figure-caption{font-size:.875em;color:#6c757d}.container,.container-fluid,.container-xxl,.container-xl,.container-lg,.container-md,.container-sm{width:100%;padding-right:var(--bs-gutter-x, .75rem);padding-left:var(--bs-gutter-x, .75rem);margin-right:auto;margin-left:auto}@media (min-width: 576px){.container-sm,.container{max-width:540px}}@media (min-width: 768px){.container-md,.container-sm,.container{max-width:720px}}@media (min-width: 992px){.container-lg,.container-md,.container-sm,.container{max-width:960px}}@media (min-width: 1200px){.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1140px}}@media (min-width: 1400px){.container-xxl,.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1320px}}.row{--bs-gutter-x: 1.5rem;--bs-gutter-y: 0;display:flex;flex-wrap:wrap;margin-top:calc(-1 * var(--bs-gutter-y));margin-right:calc(-.5 * var(--bs-gutter-x));margin-left:calc(-.5 * var(--bs-gutter-x))}.row>*{flex-shrink:0;width:100%;max-width:100%;padding-right:calc(var(--bs-gutter-x) * .5);padding-left:calc(var(--bs-gutter-x) * .5);margin-top:var(--bs-gutter-y)}.col{flex:1 0 0%}.row-cols-auto>*{flex:0 0 auto;width:auto}.row-cols-1>*{flex:0 0 auto;width:100%}.row-cols-2>*{flex:0 0 auto;width:50%}.row-cols-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-4>*{flex:0 0 auto;width:25%}.row-cols-5>*{flex:0 0 auto;width:20%}.row-cols-6>*{flex:0 0 auto;width:16.6666666667%}.col-auto{flex:0 0 auto;width:auto}.col-1{flex:0 0 auto;width:8.33333333%}.col-2{flex:0 0 auto;width:16.66666667%}.col-3{flex:0 0 auto;width:25%}.col-4{flex:0 0 auto;width:33.33333333%}.col-5{flex:0 0 auto;width:41.66666667%}.col-6{flex:0 0 auto;width:50%}.col-7{flex:0 0 auto;width:58.33333333%}.col-8{flex:0 0 auto;width:66.66666667%}.col-9{flex:0 0 auto;width:75%}.col-10{flex:0 0 auto;width:83.33333333%}.col-11{flex:0 0 auto;width:91.66666667%}.col-12{flex:0 0 auto;width:100%}.offset-1{margin-left:8.33333333%}.offset-2{margin-left:16.66666667%}.offset-3{margin-left:25%}.offset-4{margin-left:33.33333333%}.offset-5{margin-left:41.66666667%}.offset-6{margin-left:50%}.offset-7{margin-left:58.33333333%}.offset-8{margin-left:66.66666667%}.offset-9{margin-left:75%}.offset-10{margin-left:83.33333333%}.offset-11{margin-left:91.66666667%}.g-0,.gx-0{--bs-gutter-x: 0}.g-0,.gy-0{--bs-gutter-y: 0}.g-1,.gx-1{--bs-gutter-x: .25rem}.g-1,.gy-1{--bs-gutter-y: .25rem}.g-2,.gx-2{--bs-gutter-x: .5rem}.g-2,.gy-2{--bs-gutter-y: .5rem}.g-3,.gx-3{--bs-gutter-x: 1rem}.g-3,.gy-3{--bs-gutter-y: 1rem}.g-4,.gx-4{--bs-gutter-x: 1.5rem}.g-4,.gy-4{--bs-gutter-y: 1.5rem}.g-5,.gx-5{--bs-gutter-x: 3rem}.g-5,.gy-5{--bs-gutter-y: 3rem}@media (min-width: 576px){.col-sm{flex:1 0 0%}.row-cols-sm-auto>*{flex:0 0 auto;width:auto}.row-cols-sm-1>*{flex:0 0 auto;width:100%}.row-cols-sm-2>*{flex:0 0 auto;width:50%}.row-cols-sm-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-sm-4>*{flex:0 0 auto;width:25%}.row-cols-sm-5>*{flex:0 0 auto;width:20%}.row-cols-sm-6>*{flex:0 0 auto;width:16.6666666667%}.col-sm-auto{flex:0 0 auto;width:auto}.col-sm-1{flex:0 0 auto;width:8.33333333%}.col-sm-2{flex:0 0 auto;width:16.66666667%}.col-sm-3{flex:0 0 auto;width:25%}.col-sm-4{flex:0 0 auto;width:33.33333333%}.col-sm-5{flex:0 0 auto;width:41.66666667%}.col-sm-6{flex:0 0 auto;width:50%}.col-sm-7{flex:0 0 auto;width:58.33333333%}.col-sm-8{flex:0 0 auto;width:66.66666667%}.col-sm-9{flex:0 0 auto;width:75%}.col-sm-10{flex:0 0 auto;width:83.33333333%}.col-sm-11{flex:0 0 auto;width:91.66666667%}.col-sm-12{flex:0 0 auto;width:100%}.offset-sm-0{margin-left:0}.offset-sm-1{margin-left:8.33333333%}.offset-sm-2{margin-left:16.66666667%}.offset-sm-3{margin-left:25%}.offset-sm-4{margin-left:33.33333333%}.offset-sm-5{margin-left:41.66666667%}.offset-sm-6{margin-left:50%}.offset-sm-7{margin-left:58.33333333%}.offset-sm-8{margin-left:66.66666667%}.offset-sm-9{margin-left:75%}.offset-sm-10{margin-left:83.33333333%}.offset-sm-11{margin-left:91.66666667%}.g-sm-0,.gx-sm-0{--bs-gutter-x: 0}.g-sm-0,.gy-sm-0{--bs-gutter-y: 0}.g-sm-1,.gx-sm-1{--bs-gutter-x: .25rem}.g-sm-1,.gy-sm-1{--bs-gutter-y: .25rem}.g-sm-2,.gx-sm-2{--bs-gutter-x: .5rem}.g-sm-2,.gy-sm-2{--bs-gutter-y: .5rem}.g-sm-3,.gx-sm-3{--bs-gutter-x: 1rem}.g-sm-3,.gy-sm-3{--bs-gutter-y: 1rem}.g-sm-4,.gx-sm-4{--bs-gutter-x: 1.5rem}.g-sm-4,.gy-sm-4{--bs-gutter-y: 1.5rem}.g-sm-5,.gx-sm-5{--bs-gutter-x: 3rem}.g-sm-5,.gy-sm-5{--bs-gutter-y: 3rem}}@media (min-width: 768px){.col-md{flex:1 0 0%}.row-cols-md-auto>*{flex:0 0 auto;width:auto}.row-cols-md-1>*{flex:0 0 auto;width:100%}.row-cols-md-2>*{flex:0 0 auto;width:50%}.row-cols-md-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-md-4>*{flex:0 0 auto;width:25%}.row-cols-md-5>*{flex:0 0 auto;width:20%}.row-cols-md-6>*{flex:0 0 auto;width:16.6666666667%}.col-md-auto{flex:0 0 auto;width:auto}.col-md-1{flex:0 0 auto;width:8.33333333%}.col-md-2{flex:0 0 auto;width:16.66666667%}.col-md-3{flex:0 0 auto;width:25%}.col-md-4{flex:0 0 auto;width:33.33333333%}.col-md-5{flex:0 0 auto;width:41.66666667%}.col-md-6{flex:0 0 auto;width:50%}.col-md-7{flex:0 0 auto;width:58.33333333%}.col-md-8{flex:0 0 auto;width:66.66666667%}.col-md-9{flex:0 0 auto;width:75%}.col-md-10{flex:0 0 auto;width:83.33333333%}.col-md-11{flex:0 0 auto;width:91.66666667%}.col-md-12{flex:0 0 auto;width:100%}.offset-md-0{margin-left:0}.offset-md-1{margin-left:8.33333333%}.offset-md-2{margin-left:16.66666667%}.offset-md-3{margin-left:25%}.offset-md-4{margin-left:33.33333333%}.offset-md-5{margin-left:41.66666667%}.offset-md-6{margin-left:50%}.offset-md-7{margin-left:58.33333333%}.offset-md-8{margin-left:66.66666667%}.offset-md-9{margin-left:75%}.offset-md-10{margin-left:83.33333333%}.offset-md-11{margin-left:91.66666667%}.g-md-0,.gx-md-0{--bs-gutter-x: 0}.g-md-0,.gy-md-0{--bs-gutter-y: 0}.g-md-1,.gx-md-1{--bs-gutter-x: .25rem}.g-md-1,.gy-md-1{--bs-gutter-y: .25rem}.g-md-2,.gx-md-2{--bs-gutter-x: .5rem}.g-md-2,.gy-md-2{--bs-gutter-y: .5rem}.g-md-3,.gx-md-3{--bs-gutter-x: 1rem}.g-md-3,.gy-md-3{--bs-gutter-y: 1rem}.g-md-4,.gx-md-4{--bs-gutter-x: 1.5rem}.g-md-4,.gy-md-4{--bs-gutter-y: 1.5rem}.g-md-5,.gx-md-5{--bs-gutter-x: 3rem}.g-md-5,.gy-md-5{--bs-gutter-y: 3rem}}@media (min-width: 992px){.col-lg{flex:1 0 0%}.row-cols-lg-auto>*{flex:0 0 auto;width:auto}.row-cols-lg-1>*{flex:0 0 auto;width:100%}.row-cols-lg-2>*{flex:0 0 auto;width:50%}.row-cols-lg-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-lg-4>*{flex:0 0 auto;width:25%}.row-cols-lg-5>*{flex:0 0 auto;width:20%}.row-cols-lg-6>*{flex:0 0 auto;width:16.6666666667%}.col-lg-auto{flex:0 0 auto;width:auto}.col-lg-1{flex:0 0 auto;width:8.33333333%}.col-lg-2{flex:0 0 auto;width:16.66666667%}.col-lg-3{flex:0 0 auto;width:25%}.col-lg-4{flex:0 0 auto;width:33.33333333%}.col-lg-5{flex:0 0 auto;width:41.66666667%}.col-lg-6{flex:0 0 auto;width:50%}.col-lg-7{flex:0 0 auto;width:58.33333333%}.col-lg-8{flex:0 0 auto;width:66.66666667%}.col-lg-9{flex:0 0 auto;width:75%}.col-lg-10{flex:0 0 auto;width:83.33333333%}.col-lg-11{flex:0 0 auto;width:91.66666667%}.col-lg-12{flex:0 0 auto;width:100%}.offset-lg-0{margin-left:0}.offset-lg-1{margin-left:8.33333333%}.offset-lg-2{margin-left:16.66666667%}.offset-lg-3{margin-left:25%}.offset-lg-4{margin-left:33.33333333%}.offset-lg-5{margin-left:41.66666667%}.offset-lg-6{margin-left:50%}.offset-lg-7{margin-left:58.33333333%}.offset-lg-8{margin-left:66.66666667%}.offset-lg-9{margin-left:75%}.offset-lg-10{margin-left:83.33333333%}.offset-lg-11{margin-left:91.66666667%}.g-lg-0,.gx-lg-0{--bs-gutter-x: 0}.g-lg-0,.gy-lg-0{--bs-gutter-y: 0}.g-lg-1,.gx-lg-1{--bs-gutter-x: .25rem}.g-lg-1,.gy-lg-1{--bs-gutter-y: .25rem}.g-lg-2,.gx-lg-2{--bs-gutter-x: .5rem}.g-lg-2,.gy-lg-2{--bs-gutter-y: .5rem}.g-lg-3,.gx-lg-3{--bs-gutter-x: 1rem}.g-lg-3,.gy-lg-3{--bs-gutter-y: 1rem}.g-lg-4,.gx-lg-4{--bs-gutter-x: 1.5rem}.g-lg-4,.gy-lg-4{--bs-gutter-y: 1.5rem}.g-lg-5,.gx-lg-5{--bs-gutter-x: 3rem}.g-lg-5,.gy-lg-5{--bs-gutter-y: 3rem}}@media (min-width: 1200px){.col-xl{flex:1 0 0%}.row-cols-xl-auto>*{flex:0 0 auto;width:auto}.row-cols-xl-1>*{flex:0 0 auto;width:100%}.row-cols-xl-2>*{flex:0 0 auto;width:50%}.row-cols-xl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xl-4>*{flex:0 0 auto;width:25%}.row-cols-xl-5>*{flex:0 0 auto;width:20%}.row-cols-xl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xl-auto{flex:0 0 auto;width:auto}.col-xl-1{flex:0 0 auto;width:8.33333333%}.col-xl-2{flex:0 0 auto;width:16.66666667%}.col-xl-3{flex:0 0 auto;width:25%}.col-xl-4{flex:0 0 auto;width:33.33333333%}.col-xl-5{flex:0 0 auto;width:41.66666667%}.col-xl-6{flex:0 0 auto;width:50%}.col-xl-7{flex:0 0 auto;width:58.33333333%}.col-xl-8{flex:0 0 auto;width:66.66666667%}.col-xl-9{flex:0 0 auto;width:75%}.col-xl-10{flex:0 0 auto;width:83.33333333%}.col-xl-11{flex:0 0 auto;width:91.66666667%}.col-xl-12{flex:0 0 auto;width:100%}.offset-xl-0{margin-left:0}.offset-xl-1{margin-left:8.33333333%}.offset-xl-2{margin-left:16.66666667%}.offset-xl-3{margin-left:25%}.offset-xl-4{margin-left:33.33333333%}.offset-xl-5{margin-left:41.66666667%}.offset-xl-6{margin-left:50%}.offset-xl-7{margin-left:58.33333333%}.offset-xl-8{margin-left:66.66666667%}.offset-xl-9{margin-left:75%}.offset-xl-10{margin-left:83.33333333%}.offset-xl-11{margin-left:91.66666667%}.g-xl-0,.gx-xl-0{--bs-gutter-x: 0}.g-xl-0,.gy-xl-0{--bs-gutter-y: 0}.g-xl-1,.gx-xl-1{--bs-gutter-x: .25rem}.g-xl-1,.gy-xl-1{--bs-gutter-y: .25rem}.g-xl-2,.gx-xl-2{--bs-gutter-x: .5rem}.g-xl-2,.gy-xl-2{--bs-gutter-y: .5rem}.g-xl-3,.gx-xl-3{--bs-gutter-x: 1rem}.g-xl-3,.gy-xl-3{--bs-gutter-y: 1rem}.g-xl-4,.gx-xl-4{--bs-gutter-x: 1.5rem}.g-xl-4,.gy-xl-4{--bs-gutter-y: 1.5rem}.g-xl-5,.gx-xl-5{--bs-gutter-x: 3rem}.g-xl-5,.gy-xl-5{--bs-gutter-y: 3rem}}@media (min-width: 1400px){.col-xxl{flex:1 0 0%}.row-cols-xxl-auto>*{flex:0 0 auto;width:auto}.row-cols-xxl-1>*{flex:0 0 auto;width:100%}.row-cols-xxl-2>*{flex:0 0 auto;width:50%}.row-cols-xxl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xxl-4>*{flex:0 0 auto;width:25%}.row-cols-xxl-5>*{flex:0 0 auto;width:20%}.row-cols-xxl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xxl-auto{flex:0 0 auto;width:auto}.col-xxl-1{flex:0 0 auto;width:8.33333333%}.col-xxl-2{flex:0 0 auto;width:16.66666667%}.col-xxl-3{flex:0 0 auto;width:25%}.col-xxl-4{flex:0 0 auto;width:33.33333333%}.col-xxl-5{flex:0 0 auto;width:41.66666667%}.col-xxl-6{flex:0 0 auto;width:50%}.col-xxl-7{flex:0 0 auto;width:58.33333333%}.col-xxl-8{flex:0 0 auto;width:66.66666667%}.col-xxl-9{flex:0 0 auto;width:75%}.col-xxl-10{flex:0 0 auto;width:83.33333333%}.col-xxl-11{flex:0 0 auto;width:91.66666667%}.col-xxl-12{flex:0 0 auto;width:100%}.offset-xxl-0{margin-left:0}.offset-xxl-1{margin-left:8.33333333%}.offset-xxl-2{margin-left:16.66666667%}.offset-xxl-3{margin-left:25%}.offset-xxl-4{margin-left:33.33333333%}.offset-xxl-5{margin-left:41.66666667%}.offset-xxl-6{margin-left:50%}.offset-xxl-7{margin-left:58.33333333%}.offset-xxl-8{margin-left:66.66666667%}.offset-xxl-9{margin-left:75%}.offset-xxl-10{margin-left:83.33333333%}.offset-xxl-11{margin-left:91.66666667%}.g-xxl-0,.gx-xxl-0{--bs-gutter-x: 0}.g-xxl-0,.gy-xxl-0{--bs-gutter-y: 0}.g-xxl-1,.gx-xxl-1{--bs-gutter-x: .25rem}.g-xxl-1,.gy-xxl-1{--bs-gutter-y: .25rem}.g-xxl-2,.gx-xxl-2{--bs-gutter-x: .5rem}.g-xxl-2,.gy-xxl-2{--bs-gutter-y: .5rem}.g-xxl-3,.gx-xxl-3{--bs-gutter-x: 1rem}.g-xxl-3,.gy-xxl-3{--bs-gutter-y: 1rem}.g-xxl-4,.gx-xxl-4{--bs-gutter-x: 1.5rem}.g-xxl-4,.gy-xxl-4{--bs-gutter-y: 1.5rem}.g-xxl-5,.gx-xxl-5{--bs-gutter-x: 3rem}.g-xxl-5,.gy-xxl-5{--bs-gutter-y: 3rem}}.table{--bs-table-bg: transparent;--bs-table-accent-bg: transparent;--bs-table-striped-color: #212529;--bs-table-striped-bg: rgba(0, 0, 0, .05);--bs-table-active-color: #212529;--bs-table-active-bg: rgba(0, 0, 0, .1);--bs-table-hover-color: #212529;--bs-table-hover-bg: rgba(0, 0, 0, .075);width:100%;margin-bottom:1rem;color:#212529;vertical-align:top;border-color:#dee2e6}.table>:not(caption)>*>*{padding:.5rem;background-color:var(--bs-table-bg);border-bottom-width:1px;box-shadow:inset 0 0 0 9999px var(--bs-table-accent-bg)}.table>tbody{vertical-align:inherit}.table>thead{vertical-align:bottom}.table>:not(:first-child){border-top:2px solid currentColor}.caption-top{caption-side:top}.table-sm>:not(caption)>*>*{padding:.25rem}.table-bordered>:not(caption)>*{border-width:1px 0}.table-bordered>:not(caption)>*>*{border-width:0 1px}.table-borderless>:not(caption)>*>*{border-bottom-width:0}.table-borderless>:not(:first-child){border-top-width:0}.table-striped>tbody>tr:nth-of-type(odd)>*{--bs-table-accent-bg: var(--bs-table-striped-bg);color:var(--bs-table-striped-color)}.table-active{--bs-table-accent-bg: var(--bs-table-active-bg);color:var(--bs-table-active-color)}.table-hover>tbody>tr:hover>*{--bs-table-accent-bg: var(--bs-table-hover-bg);color:var(--bs-table-hover-color)}.table-primary{--bs-table-bg: #cfe2ff;--bs-table-striped-bg: #c5d7f2;--bs-table-striped-color: #000;--bs-table-active-bg: #bacbe6;--bs-table-active-color: #000;--bs-table-hover-bg: #bfd1ec;--bs-table-hover-color: #000;color:#000;border-color:#bacbe6}.table-secondary{--bs-table-bg: #e2e3e5;--bs-table-striped-bg: #d7d8da;--bs-table-striped-color: #000;--bs-table-active-bg: #cbccce;--bs-table-active-color: #000;--bs-table-hover-bg: #d1d2d4;--bs-table-hover-color: #000;color:#000;border-color:#cbccce}.table-success{--bs-table-bg: #d1e7dd;--bs-table-striped-bg: #c7dbd2;--bs-table-striped-color: #000;--bs-table-active-bg: #bcd0c7;--bs-table-active-color: #000;--bs-table-hover-bg: #c1d6cc;--bs-table-hover-color: #000;color:#000;border-color:#bcd0c7}.table-info{--bs-table-bg: #cff4fc;--bs-table-striped-bg: #c5e8ef;--bs-table-striped-color: #000;--bs-table-active-bg: #badce3;--bs-table-active-color: #000;--bs-table-hover-bg: #bfe2e9;--bs-table-hover-color: #000;color:#000;border-color:#badce3}.table-warning{--bs-table-bg: #fff3cd;--bs-table-striped-bg: #f2e7c3;--bs-table-striped-color: #000;--bs-table-active-bg: #e6dbb9;--bs-table-active-color: #000;--bs-table-hover-bg: #ece1be;--bs-table-hover-color: #000;color:#000;border-color:#e6dbb9}.table-danger{--bs-table-bg: #f8d7da;--bs-table-striped-bg: #eccccf;--bs-table-striped-color: #000;--bs-table-active-bg: #dfc2c4;--bs-table-active-color: #000;--bs-table-hover-bg: #e5c7ca;--bs-table-hover-color: #000;color:#000;border-color:#dfc2c4}.table-light{--bs-table-bg: #f8f9fa;--bs-table-striped-bg: #ecedee;--bs-table-striped-color: #000;--bs-table-active-bg: #dfe0e1;--bs-table-active-color: #000;--bs-table-hover-bg: #e5e6e7;--bs-table-hover-color: #000;color:#000;border-color:#dfe0e1}.table-dark{--bs-table-bg: #212529;--bs-table-striped-bg: #2c3034;--bs-table-striped-color: #fff;--bs-table-active-bg: #373b3e;--bs-table-active-color: #fff;--bs-table-hover-bg: #323539;--bs-table-hover-color: #fff;color:#fff;border-color:#373b3e}.table-responsive{overflow-x:auto;-webkit-overflow-scrolling:touch}@media (max-width: 575.98px){.table-responsive-sm{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 767.98px){.table-responsive-md{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 991.98px){.table-responsive-lg{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1199.98px){.table-responsive-xl{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1399.98px){.table-responsive-xxl{overflow-x:auto;-webkit-overflow-scrolling:touch}}.form-label{margin-bottom:.5rem}.col-form-label{padding-top:calc(.375rem + 1px);padding-bottom:calc(.375rem + 1px);margin-bottom:0;font-size:inherit;line-height:1.5}.col-form-label-lg{padding-top:calc(.5rem + 1px);padding-bottom:calc(.5rem + 1px);font-size:1.25rem}.col-form-label-sm{padding-top:calc(.25rem + 1px);padding-bottom:calc(.25rem + 1px);font-size:.875rem}.form-text{margin-top:.25rem;font-size:.875em;color:#6c757d}.form-control{display:block;width:100%;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-clip:padding-box;border:1px solid #ced4da;-webkit-appearance:none;-moz-appearance:none;appearance:none;border-radius:.25rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control{transition:none}}.form-control[type=file]{overflow:hidden}.form-control[type=file]:not(:disabled):not([readonly]){cursor:pointer}.form-control:focus{color:#212529;background-color:#fff;border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-control::-webkit-date-and-time-value{height:1.5em}.form-control::-moz-placeholder{color:#6c757d;opacity:1}.form-control::placeholder{color:#6c757d;opacity:1}.form-control:disabled,.form-control[readonly]{background-color:#e9ecef;opacity:1}.form-control::file-selector-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control::-webkit-file-upload-button{-webkit-transition:none;transition:none}.form-control::file-selector-button{transition:none}}.form-control:hover:not(:disabled):not([readonly])::file-selector-button{background-color:#dde0e3}.form-control::-webkit-file-upload-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;-webkit-transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control::-webkit-file-upload-button{-webkit-transition:none;transition:none}}.form-control:hover:not(:disabled):not([readonly])::-webkit-file-upload-button{background-color:#dde0e3}.form-control-plaintext{display:block;width:100%;padding:.375rem 0;margin-bottom:0;line-height:1.5;color:#212529;background-color:transparent;border:solid transparent;border-width:1px 0}.form-control-plaintext.form-control-sm,.form-control-plaintext.form-control-lg{padding-right:0;padding-left:0}.form-control-sm{min-height:calc(1.5em + .5rem + 2px);padding:.25rem .5rem;font-size:.875rem;border-radius:.2rem}.form-control-sm::file-selector-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-sm::-webkit-file-upload-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-lg{min-height:calc(1.5em + 1rem + 2px);padding:.5rem 1rem;font-size:1.25rem;border-radius:.3rem}.form-control-lg::file-selector-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}.form-control-lg::-webkit-file-upload-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}textarea.form-control{min-height:calc(1.5em + .75rem + 2px)}textarea.form-control-sm{min-height:calc(1.5em + .5rem + 2px)}textarea.form-control-lg{min-height:calc(1.5em + 1rem + 2px)}.form-control-color{width:3rem;height:auto;padding:.375rem}.form-control-color:not(:disabled):not([readonly]){cursor:pointer}.form-control-color::-moz-color-swatch{height:1.5em;border-radius:.25rem}.form-control-color::-webkit-color-swatch{height:1.5em;border-radius:.25rem}.form-select{display:block;width:100%;padding:.375rem 2.25rem .375rem .75rem;-moz-padding-start:calc(.75rem - 3px);font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='M2 5l6 6 6-6'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right .75rem center;background-size:16px 12px;border:1px solid #ced4da;border-radius:.25rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-select{transition:none}}.form-select:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-select[multiple],.form-select[size]:not([size="1"]){padding-right:.75rem;background-image:none}.form-select:disabled{background-color:#e9ecef}.form-select:-moz-focusring{color:transparent;text-shadow:0 0 0 #212529}.form-select-sm{padding-top:.25rem;padding-bottom:.25rem;padding-left:.5rem;font-size:.875rem;border-radius:.2rem}.form-select-lg{padding-top:.5rem;padding-bottom:.5rem;padding-left:1rem;font-size:1.25rem;border-radius:.3rem}.form-check{display:block;min-height:1.5rem;padding-left:1.5em;margin-bottom:.125rem}.form-check .form-check-input{float:left;margin-left:-1.5em}.form-check-input{width:1em;height:1em;margin-top:.25em;vertical-align:top;background-color:#fff;background-repeat:no-repeat;background-position:center;background-size:contain;border:1px solid rgba(0,0,0,.25);-webkit-appearance:none;-moz-appearance:none;appearance:none;-webkit-print-color-adjust:exact;color-adjust:exact}.form-check-input[type=checkbox]{border-radius:.25em}.form-check-input[type=radio]{border-radius:50%}.form-check-input:active{filter:brightness(90%)}.form-check-input:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-check-input:checked{background-color:#0d6efd;border-color:#0d6efd}.form-check-input:checked[type=checkbox]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='M6 10l3 3l6-6'/%3e%3c/svg%3e")}.form-check-input:checked[type=radio]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='2' fill='%23fff'/%3e%3c/svg%3e")}.form-check-input[type=checkbox]:indeterminate{background-color:#0d6efd;border-color:#0d6efd;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='M6 10h8'/%3e%3c/svg%3e")}.form-check-input:disabled{pointer-events:none;filter:none;opacity:.5}.form-check-input[disabled]~.form-check-label,.form-check-input:disabled~.form-check-label{opacity:.5}.form-switch{padding-left:2.5em}.form-switch .form-check-input{width:2em;margin-left:-2.5em;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='rgba%280, 0, 0, 0.25%29'/%3e%3c/svg%3e");background-position:left center;border-radius:2em;transition:background-position .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-switch .form-check-input{transition:none}}.form-switch .form-check-input:focus{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%2386b7fe'/%3e%3c/svg%3e")}.form-switch .form-check-input:checked{background-position:right center;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%23fff'/%3e%3c/svg%3e")}.form-check-inline{display:inline-block;margin-right:1rem}.btn-check{position:absolute;clip:rect(0,0,0,0);pointer-events:none}.btn-check[disabled]+.btn,.btn-check:disabled+.btn{pointer-events:none;filter:none;opacity:.65}.form-range{width:100%;height:1.5rem;padding:0;background-color:transparent;-webkit-appearance:none;-moz-appearance:none;appearance:none}.form-range:focus{outline:0}.form-range:focus::-webkit-slider-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range:focus::-moz-range-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range::-moz-focus-outer{border:0}.form-range::-webkit-slider-thumb{width:1rem;height:1rem;margin-top:-.25rem;background-color:#0d6efd;border:0;border-radius:1rem;-webkit-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-webkit-slider-thumb{-webkit-transition:none;transition:none}}.form-range::-webkit-slider-thumb:active{background-color:#b6d4fe}.form-range::-webkit-slider-runnable-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range::-moz-range-thumb{width:1rem;height:1rem;background-color:#0d6efd;border:0;border-radius:1rem;-moz-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-moz-range-thumb{-moz-transition:none;transition:none}}.form-range::-moz-range-thumb:active{background-color:#b6d4fe}.form-range::-moz-range-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range:disabled{pointer-events:none}.form-range:disabled::-webkit-slider-thumb{background-color:#adb5bd}.form-range:disabled::-moz-range-thumb{background-color:#adb5bd}.form-floating{position:relative}.form-floating>.form-control,.form-floating>.form-select{height:calc(3.5rem + 2px);line-height:1.25}.form-floating>label{position:absolute;top:0;left:0;height:100%;padding:1rem .75rem;pointer-events:none;border:1px solid transparent;transform-origin:0 0;transition:opacity .1s ease-in-out,transform .1s ease-in-out}@media (prefers-reduced-motion: reduce){.form-floating>label{transition:none}}.form-floating>.form-control{padding:1rem .75rem}.form-floating>.form-control::-moz-placeholder{color:transparent}.form-floating>.form-control::placeholder{color:transparent}.form-floating>.form-control:not(:-moz-placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:focus,.form-floating>.form-control:not(:placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:-webkit-autofill{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-select{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:not(:-moz-placeholder-shown)~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:focus~label,.form-floating>.form-control:not(:placeholder-shown)~label,.form-floating>.form-select~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:-webkit-autofill~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.input-group{position:relative;display:flex;flex-wrap:wrap;align-items:stretch;width:100%}.input-group>.form-control,.input-group>.form-select{position:relative;flex:1 1 auto;width:1%;min-width:0}.input-group>.form-control:focus,.input-group>.form-select:focus{z-index:3}.input-group .btn{position:relative;z-index:2}.input-group .btn:focus{z-index:3}.input-group-text{display:flex;align-items:center;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;text-align:center;white-space:nowrap;background-color:#e9ecef;border:1px solid #ced4da;border-radius:.25rem}.input-group-lg>.form-control,.input-group-lg>.form-select,.input-group-lg>.input-group-text,.input-group-lg>.btn{padding:.5rem 1rem;font-size:1.25rem;border-radius:.3rem}.input-group-sm>.form-control,.input-group-sm>.form-select,.input-group-sm>.input-group-text,.input-group-sm>.btn{padding:.25rem .5rem;font-size:.875rem;border-radius:.2rem}.input-group-lg>.form-select,.input-group-sm>.form-select{padding-right:3rem}.input-group:not(.has-validation)>:not(:last-child):not(.dropdown-toggle):not(.dropdown-menu),.input-group:not(.has-validation)>.dropdown-toggle:nth-last-child(n+3){border-top-right-radius:0;border-bottom-right-radius:0}.input-group.has-validation>:nth-last-child(n+3):not(.dropdown-toggle):not(.dropdown-menu),.input-group.has-validation>.dropdown-toggle:nth-last-child(n+4){border-top-right-radius:0;border-bottom-right-radius:0}.input-group>:not(:first-child):not(.dropdown-menu):not(.valid-tooltip):not(.valid-feedback):not(.invalid-tooltip):not(.invalid-feedback){margin-left:-1px;border-top-left-radius:0;border-bottom-left-radius:0}.valid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#198754}.valid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#198754e6;border-radius:.25rem}.was-validated :valid~.valid-feedback,.was-validated :valid~.valid-tooltip,.is-valid~.valid-feedback,.is-valid~.valid-tooltip{display:block}.was-validated .form-control:valid,.form-control.is-valid{border-color:#198754;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73L.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:valid:focus,.form-control.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated textarea.form-control:valid,textarea.form-control.is-valid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:valid,.form-select.is-valid{border-color:#198754}.was-validated .form-select:valid:not([multiple]):not([size]),.was-validated .form-select:valid:not([multiple])[size="1"],.form-select.is-valid:not([multiple]):not([size]),.form-select.is-valid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='M2 5l6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73L.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:valid:focus,.form-select.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated .form-check-input:valid,.form-check-input.is-valid{border-color:#198754}.was-validated .form-check-input:valid:checked,.form-check-input.is-valid:checked{background-color:#198754}.was-validated .form-check-input:valid:focus,.form-check-input.is-valid:focus{box-shadow:0 0 0 .25rem #19875440}.was-validated .form-check-input:valid~.form-check-label,.form-check-input.is-valid~.form-check-label{color:#198754}.form-check-inline .form-check-input~.valid-feedback{margin-left:.5em}.was-validated .input-group .form-control:valid,.input-group .form-control.is-valid,.was-validated .input-group .form-select:valid,.input-group .form-select.is-valid{z-index:1}.was-validated .input-group .form-control:valid:focus,.input-group .form-control.is-valid:focus,.was-validated .input-group .form-select:valid:focus,.input-group .form-select.is-valid:focus{z-index:3}.invalid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#dc3545}.invalid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#dc3545e6;border-radius:.25rem}.was-validated :invalid~.invalid-feedback,.was-validated :invalid~.invalid-tooltip,.is-invalid~.invalid-feedback,.is-invalid~.invalid-tooltip{display:block}.was-validated .form-control:invalid,.form-control.is-invalid{border-color:#dc3545;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:invalid:focus,.form-control.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated textarea.form-control:invalid,textarea.form-control.is-invalid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:invalid,.form-select.is-invalid{border-color:#dc3545}.was-validated .form-select:invalid:not([multiple]):not([size]),.was-validated .form-select:invalid:not([multiple])[size="1"],.form-select.is-invalid:not([multiple]):not([size]),.form-select.is-invalid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='M2 5l6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:invalid:focus,.form-select.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-check-input:invalid,.form-check-input.is-invalid{border-color:#dc3545}.was-validated .form-check-input:invalid:checked,.form-check-input.is-invalid:checked{background-color:#dc3545}.was-validated .form-check-input:invalid:focus,.form-check-input.is-invalid:focus{box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-check-input:invalid~.form-check-label,.form-check-input.is-invalid~.form-check-label{color:#dc3545}.form-check-inline .form-check-input~.invalid-feedback{margin-left:.5em}.was-validated .input-group .form-control:invalid,.input-group .form-control.is-invalid,.was-validated .input-group .form-select:invalid,.input-group .form-select.is-invalid{z-index:2}.was-validated .input-group .form-control:invalid:focus,.input-group .form-control.is-invalid:focus,.was-validated .input-group .form-select:invalid:focus,.input-group .form-select.is-invalid:focus{z-index:3}.btn{display:inline-block;font-weight:400;line-height:1.5;color:#212529;text-align:center;text-decoration:none;vertical-align:middle;cursor:pointer;-webkit-user-select:none;-moz-user-select:none;user-select:none;background-color:transparent;border:1px solid transparent;padding:.375rem .75rem;font-size:1rem;border-radius:.25rem;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.btn{transition:none}}.btn:hover{color:#212529}.btn-check:focus+.btn,.btn:focus{outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.btn:disabled,.btn.disabled,fieldset:disabled .btn{pointer-events:none;opacity:.65}.btn-primary{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-primary:hover{color:#fff;background-color:#0b5ed7;border-color:#0a58ca}.btn-check:focus+.btn-primary,.btn-primary:focus{color:#fff;background-color:#0b5ed7;border-color:#0a58ca;box-shadow:0 0 0 .25rem #3184fd80}.btn-check:checked+.btn-primary,.btn-check:active+.btn-primary,.btn-primary:active,.btn-primary.active,.show>.btn-primary.dropdown-toggle{color:#fff;background-color:#0a58ca;border-color:#0a53be}.btn-check:checked+.btn-primary:focus,.btn-check:active+.btn-primary:focus,.btn-primary:active:focus,.btn-primary.active:focus,.show>.btn-primary.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #3184fd80}.btn-primary:disabled,.btn-primary.disabled{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-secondary{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-secondary:hover{color:#fff;background-color:#5c636a;border-color:#565e64}.btn-check:focus+.btn-secondary,.btn-secondary:focus{color:#fff;background-color:#5c636a;border-color:#565e64;box-shadow:0 0 0 .25rem #828a9180}.btn-check:checked+.btn-secondary,.btn-check:active+.btn-secondary,.btn-secondary:active,.btn-secondary.active,.show>.btn-secondary.dropdown-toggle{color:#fff;background-color:#565e64;border-color:#51585e}.btn-check:checked+.btn-secondary:focus,.btn-check:active+.btn-secondary:focus,.btn-secondary:active:focus,.btn-secondary.active:focus,.show>.btn-secondary.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #828a9180}.btn-secondary:disabled,.btn-secondary.disabled{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-success{color:#fff;background-color:#198754;border-color:#198754}.btn-success:hover{color:#fff;background-color:#157347;border-color:#146c43}.btn-check:focus+.btn-success,.btn-success:focus{color:#fff;background-color:#157347;border-color:#146c43;box-shadow:0 0 0 .25rem #3c996e80}.btn-check:checked+.btn-success,.btn-check:active+.btn-success,.btn-success:active,.btn-success.active,.show>.btn-success.dropdown-toggle{color:#fff;background-color:#146c43;border-color:#13653f}.btn-check:checked+.btn-success:focus,.btn-check:active+.btn-success:focus,.btn-success:active:focus,.btn-success.active:focus,.show>.btn-success.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #3c996e80}.btn-success:disabled,.btn-success.disabled{color:#fff;background-color:#198754;border-color:#198754}.btn-info{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-info:hover{color:#000;background-color:#31d2f2;border-color:#25cff2}.btn-check:focus+.btn-info,.btn-info:focus{color:#000;background-color:#31d2f2;border-color:#25cff2;box-shadow:0 0 0 .25rem #0baccc80}.btn-check:checked+.btn-info,.btn-check:active+.btn-info,.btn-info:active,.btn-info.active,.show>.btn-info.dropdown-toggle{color:#000;background-color:#3dd5f3;border-color:#25cff2}.btn-check:checked+.btn-info:focus,.btn-check:active+.btn-info:focus,.btn-info:active:focus,.btn-info.active:focus,.show>.btn-info.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #0baccc80}.btn-info:disabled,.btn-info.disabled{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-warning{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-warning:hover{color:#000;background-color:#ffca2c;border-color:#ffc720}.btn-check:focus+.btn-warning,.btn-warning:focus{color:#000;background-color:#ffca2c;border-color:#ffc720;box-shadow:0 0 0 .25rem #d9a40680}.btn-check:checked+.btn-warning,.btn-check:active+.btn-warning,.btn-warning:active,.btn-warning.active,.show>.btn-warning.dropdown-toggle{color:#000;background-color:#ffcd39;border-color:#ffc720}.btn-check:checked+.btn-warning:focus,.btn-check:active+.btn-warning:focus,.btn-warning:active:focus,.btn-warning.active:focus,.show>.btn-warning.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #d9a40680}.btn-warning:disabled,.btn-warning.disabled{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-danger{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-danger:hover{color:#fff;background-color:#bb2d3b;border-color:#b02a37}.btn-check:focus+.btn-danger,.btn-danger:focus{color:#fff;background-color:#bb2d3b;border-color:#b02a37;box-shadow:0 0 0 .25rem #e1536180}.btn-check:checked+.btn-danger,.btn-check:active+.btn-danger,.btn-danger:active,.btn-danger.active,.show>.btn-danger.dropdown-toggle{color:#fff;background-color:#b02a37;border-color:#a52834}.btn-check:checked+.btn-danger:focus,.btn-check:active+.btn-danger:focus,.btn-danger:active:focus,.btn-danger.active:focus,.show>.btn-danger.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #e1536180}.btn-danger:disabled,.btn-danger.disabled{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-light{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-light:hover{color:#000;background-color:#f9fafb;border-color:#f9fafb}.btn-check:focus+.btn-light,.btn-light:focus{color:#000;background-color:#f9fafb;border-color:#f9fafb;box-shadow:0 0 0 .25rem #d3d4d580}.btn-check:checked+.btn-light,.btn-check:active+.btn-light,.btn-light:active,.btn-light.active,.show>.btn-light.dropdown-toggle{color:#000;background-color:#f9fafb;border-color:#f9fafb}.btn-check:checked+.btn-light:focus,.btn-check:active+.btn-light:focus,.btn-light:active:focus,.btn-light.active:focus,.show>.btn-light.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #d3d4d580}.btn-light:disabled,.btn-light.disabled{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-dark{color:#fff;background-color:#212529;border-color:#212529}.btn-dark:hover{color:#fff;background-color:#1c1f23;border-color:#1a1e21}.btn-check:focus+.btn-dark,.btn-dark:focus{color:#fff;background-color:#1c1f23;border-color:#1a1e21;box-shadow:0 0 0 .25rem #42464980}.btn-check:checked+.btn-dark,.btn-check:active+.btn-dark,.btn-dark:active,.btn-dark.active,.show>.btn-dark.dropdown-toggle{color:#fff;background-color:#1a1e21;border-color:#191c1f}.btn-check:checked+.btn-dark:focus,.btn-check:active+.btn-dark:focus,.btn-dark:active:focus,.btn-dark.active:focus,.show>.btn-dark.dropdown-toggle:focus{box-shadow:0 0 0 .25rem #42464980}.btn-dark:disabled,.btn-dark.disabled{color:#fff;background-color:#212529;border-color:#212529}.btn-outline-primary{color:#0d6efd;border-color:#0d6efd}.btn-outline-primary:hover{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-check:focus+.btn-outline-primary,.btn-outline-primary:focus{box-shadow:0 0 0 .25rem #0d6efd80}.btn-check:checked+.btn-outline-primary,.btn-check:active+.btn-outline-primary,.btn-outline-primary:active,.btn-outline-primary.active,.btn-outline-primary.dropdown-toggle.show{color:#fff;background-color:#0d6efd;border-color:#0d6efd}.btn-check:checked+.btn-outline-primary:focus,.btn-check:active+.btn-outline-primary:focus,.btn-outline-primary:active:focus,.btn-outline-primary.active:focus,.btn-outline-primary.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #0d6efd80}.btn-outline-primary:disabled,.btn-outline-primary.disabled{color:#0d6efd;background-color:transparent}.btn-outline-secondary{color:#6c757d;border-color:#6c757d}.btn-outline-secondary:hover{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-check:focus+.btn-outline-secondary,.btn-outline-secondary:focus{box-shadow:0 0 0 .25rem #6c757d80}.btn-check:checked+.btn-outline-secondary,.btn-check:active+.btn-outline-secondary,.btn-outline-secondary:active,.btn-outline-secondary.active,.btn-outline-secondary.dropdown-toggle.show{color:#fff;background-color:#6c757d;border-color:#6c757d}.btn-check:checked+.btn-outline-secondary:focus,.btn-check:active+.btn-outline-secondary:focus,.btn-outline-secondary:active:focus,.btn-outline-secondary.active:focus,.btn-outline-secondary.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #6c757d80}.btn-outline-secondary:disabled,.btn-outline-secondary.disabled{color:#6c757d;background-color:transparent}.btn-outline-success{color:#198754;border-color:#198754}.btn-outline-success:hover{color:#fff;background-color:#198754;border-color:#198754}.btn-check:focus+.btn-outline-success,.btn-outline-success:focus{box-shadow:0 0 0 .25rem #19875480}.btn-check:checked+.btn-outline-success,.btn-check:active+.btn-outline-success,.btn-outline-success:active,.btn-outline-success.active,.btn-outline-success.dropdown-toggle.show{color:#fff;background-color:#198754;border-color:#198754}.btn-check:checked+.btn-outline-success:focus,.btn-check:active+.btn-outline-success:focus,.btn-outline-success:active:focus,.btn-outline-success.active:focus,.btn-outline-success.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #19875480}.btn-outline-success:disabled,.btn-outline-success.disabled{color:#198754;background-color:transparent}.btn-outline-info{color:#0dcaf0;border-color:#0dcaf0}.btn-outline-info:hover{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-check:focus+.btn-outline-info,.btn-outline-info:focus{box-shadow:0 0 0 .25rem #0dcaf080}.btn-check:checked+.btn-outline-info,.btn-check:active+.btn-outline-info,.btn-outline-info:active,.btn-outline-info.active,.btn-outline-info.dropdown-toggle.show{color:#000;background-color:#0dcaf0;border-color:#0dcaf0}.btn-check:checked+.btn-outline-info:focus,.btn-check:active+.btn-outline-info:focus,.btn-outline-info:active:focus,.btn-outline-info.active:focus,.btn-outline-info.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #0dcaf080}.btn-outline-info:disabled,.btn-outline-info.disabled{color:#0dcaf0;background-color:transparent}.btn-outline-warning{color:#ffc107;border-color:#ffc107}.btn-outline-warning:hover{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-check:focus+.btn-outline-warning,.btn-outline-warning:focus{box-shadow:0 0 0 .25rem #ffc10780}.btn-check:checked+.btn-outline-warning,.btn-check:active+.btn-outline-warning,.btn-outline-warning:active,.btn-outline-warning.active,.btn-outline-warning.dropdown-toggle.show{color:#000;background-color:#ffc107;border-color:#ffc107}.btn-check:checked+.btn-outline-warning:focus,.btn-check:active+.btn-outline-warning:focus,.btn-outline-warning:active:focus,.btn-outline-warning.active:focus,.btn-outline-warning.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #ffc10780}.btn-outline-warning:disabled,.btn-outline-warning.disabled{color:#ffc107;background-color:transparent}.btn-outline-danger{color:#dc3545;border-color:#dc3545}.btn-outline-danger:hover{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-check:focus+.btn-outline-danger,.btn-outline-danger:focus{box-shadow:0 0 0 .25rem #dc354580}.btn-check:checked+.btn-outline-danger,.btn-check:active+.btn-outline-danger,.btn-outline-danger:active,.btn-outline-danger.active,.btn-outline-danger.dropdown-toggle.show{color:#fff;background-color:#dc3545;border-color:#dc3545}.btn-check:checked+.btn-outline-danger:focus,.btn-check:active+.btn-outline-danger:focus,.btn-outline-danger:active:focus,.btn-outline-danger.active:focus,.btn-outline-danger.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #dc354580}.btn-outline-danger:disabled,.btn-outline-danger.disabled{color:#dc3545;background-color:transparent}.btn-outline-light{color:#f8f9fa;border-color:#f8f9fa}.btn-outline-light:hover{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-check:focus+.btn-outline-light,.btn-outline-light:focus{box-shadow:0 0 0 .25rem #f8f9fa80}.btn-check:checked+.btn-outline-light,.btn-check:active+.btn-outline-light,.btn-outline-light:active,.btn-outline-light.active,.btn-outline-light.dropdown-toggle.show{color:#000;background-color:#f8f9fa;border-color:#f8f9fa}.btn-check:checked+.btn-outline-light:focus,.btn-check:active+.btn-outline-light:focus,.btn-outline-light:active:focus,.btn-outline-light.active:focus,.btn-outline-light.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #f8f9fa80}.btn-outline-light:disabled,.btn-outline-light.disabled{color:#f8f9fa;background-color:transparent}.btn-outline-dark{color:#212529;border-color:#212529}.btn-outline-dark:hover{color:#fff;background-color:#212529;border-color:#212529}.btn-check:focus+.btn-outline-dark,.btn-outline-dark:focus{box-shadow:0 0 0 .25rem #21252980}.btn-check:checked+.btn-outline-dark,.btn-check:active+.btn-outline-dark,.btn-outline-dark:active,.btn-outline-dark.active,.btn-outline-dark.dropdown-toggle.show{color:#fff;background-color:#212529;border-color:#212529}.btn-check:checked+.btn-outline-dark:focus,.btn-check:active+.btn-outline-dark:focus,.btn-outline-dark:active:focus,.btn-outline-dark.active:focus,.btn-outline-dark.dropdown-toggle.show:focus{box-shadow:0 0 0 .25rem #21252980}.btn-outline-dark:disabled,.btn-outline-dark.disabled{color:#212529;background-color:transparent}.btn-link{font-weight:400;color:#0d6efd;text-decoration:underline}.btn-link:hover{color:#0a58ca}.btn-link:disabled,.btn-link.disabled{color:#6c757d}.btn-lg,.btn-group-lg>.btn{padding:.5rem 1rem;font-size:1.25rem;border-radius:.3rem}.btn-sm,.btn-group-sm>.btn{padding:.25rem .5rem;font-size:.875rem;border-radius:.2rem}.fade{transition:opacity .15s linear}@media (prefers-reduced-motion: reduce){.fade{transition:none}}.fade:not(.show){opacity:0}.collapse:not(.show){display:none}.collapsing{height:0;overflow:hidden;transition:height .35s ease}@media (prefers-reduced-motion: reduce){.collapsing{transition:none}}.collapsing.collapse-horizontal{width:0;height:auto;transition:width .35s ease}@media (prefers-reduced-motion: reduce){.collapsing.collapse-horizontal{transition:none}}.dropup,.dropend,.dropdown,.dropstart{position:relative}.dropdown-toggle{white-space:nowrap}.dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid;border-right:.3em solid transparent;border-bottom:0;border-left:.3em solid transparent}.dropdown-toggle:empty:after{margin-left:0}.dropdown-menu{position:absolute;z-index:1000;display:none;min-width:10rem;padding:.5rem 0;margin:0;font-size:1rem;color:#212529;text-align:left;list-style:none;background-color:#fff;background-clip:padding-box;border:1px solid rgba(0,0,0,.15);border-radius:.25rem}.dropdown-menu[data-bs-popper]{top:100%;left:0;margin-top:.125rem}.dropdown-menu-start{--bs-position: start}.dropdown-menu-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-end{--bs-position: end}.dropdown-menu-end[data-bs-popper]{right:0;left:auto}@media (min-width: 576px){.dropdown-menu-sm-start{--bs-position: start}.dropdown-menu-sm-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-sm-end{--bs-position: end}.dropdown-menu-sm-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 768px){.dropdown-menu-md-start{--bs-position: start}.dropdown-menu-md-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-md-end{--bs-position: end}.dropdown-menu-md-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 992px){.dropdown-menu-lg-start{--bs-position: start}.dropdown-menu-lg-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-lg-end{--bs-position: end}.dropdown-menu-lg-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1200px){.dropdown-menu-xl-start{--bs-position: start}.dropdown-menu-xl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xl-end{--bs-position: end}.dropdown-menu-xl-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1400px){.dropdown-menu-xxl-start{--bs-position: start}.dropdown-menu-xxl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xxl-end{--bs-position: end}.dropdown-menu-xxl-end[data-bs-popper]{right:0;left:auto}}.dropup .dropdown-menu[data-bs-popper]{top:auto;bottom:100%;margin-top:0;margin-bottom:.125rem}.dropup .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:0;border-right:.3em solid transparent;border-bottom:.3em solid;border-left:.3em solid transparent}.dropup .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-menu[data-bs-popper]{top:0;right:auto;left:100%;margin-top:0;margin-left:.125rem}.dropend .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:0;border-bottom:.3em solid transparent;border-left:.3em solid}.dropend .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-toggle:after{vertical-align:0}.dropstart .dropdown-menu[data-bs-popper]{top:0;right:100%;left:auto;margin-top:0;margin-right:.125rem}.dropstart .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:""}.dropstart .dropdown-toggle:after{display:none}.dropstart .dropdown-toggle:before{display:inline-block;margin-right:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:.3em solid;border-bottom:.3em solid transparent}.dropstart .dropdown-toggle:empty:after{margin-left:0}.dropstart .dropdown-toggle:before{vertical-align:0}.dropdown-divider{height:0;margin:.5rem 0;overflow:hidden;border-top:1px solid rgba(0,0,0,.15)}.dropdown-item{display:block;width:100%;padding:.25rem 1rem;clear:both;font-weight:400;color:#212529;text-align:inherit;text-decoration:none;white-space:nowrap;background-color:transparent;border:0}.dropdown-item:hover,.dropdown-item:focus{color:#1e2125;background-color:#e9ecef}.dropdown-item.active,.dropdown-item:active{color:#fff;text-decoration:none;background-color:#0d6efd}.dropdown-item.disabled,.dropdown-item:disabled{color:#adb5bd;pointer-events:none;background-color:transparent}.dropdown-menu.show{display:block}.dropdown-header{display:block;padding:.5rem 1rem;margin-bottom:0;font-size:.875rem;color:#6c757d;white-space:nowrap}.dropdown-item-text{display:block;padding:.25rem 1rem;color:#212529}.dropdown-menu-dark{color:#dee2e6;background-color:#343a40;border-color:#00000026}.dropdown-menu-dark .dropdown-item{color:#dee2e6}.dropdown-menu-dark .dropdown-item:hover,.dropdown-menu-dark .dropdown-item:focus{color:#fff;background-color:#ffffff26}.dropdown-menu-dark .dropdown-item.active,.dropdown-menu-dark .dropdown-item:active{color:#fff;background-color:#0d6efd}.dropdown-menu-dark .dropdown-item.disabled,.dropdown-menu-dark .dropdown-item:disabled{color:#adb5bd}.dropdown-menu-dark .dropdown-divider{border-color:#00000026}.dropdown-menu-dark .dropdown-item-text{color:#dee2e6}.dropdown-menu-dark .dropdown-header{color:#adb5bd}.btn-group,.btn-group-vertical{position:relative;display:inline-flex;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;flex:1 1 auto}.btn-group>.btn-check:checked+.btn,.btn-group>.btn-check:focus+.btn,.btn-group>.btn:hover,.btn-group>.btn:focus,.btn-group>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn-check:checked+.btn,.btn-group-vertical>.btn-check:focus+.btn,.btn-group-vertical>.btn:hover,.btn-group-vertical>.btn:focus,.btn-group-vertical>.btn:active,.btn-group-vertical>.btn.active{z-index:1}.btn-toolbar{display:flex;flex-wrap:wrap;justify-content:flex-start}.btn-toolbar .input-group{width:auto}.btn-group>.btn:not(:first-child),.btn-group>.btn-group:not(:first-child){margin-left:-1px}.btn-group>.btn:not(:last-child):not(.dropdown-toggle),.btn-group>.btn-group:not(:last-child)>.btn{border-top-right-radius:0;border-bottom-right-radius:0}.btn-group>.btn:nth-child(n+3),.btn-group>:not(.btn-check)+.btn,.btn-group>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-bottom-left-radius:0}.dropdown-toggle-split{padding-right:.5625rem;padding-left:.5625rem}.dropdown-toggle-split:after,.dropup .dropdown-toggle-split:after,.dropend .dropdown-toggle-split:after{margin-left:0}.dropstart .dropdown-toggle-split:before{margin-right:0}.btn-sm+.dropdown-toggle-split,.btn-group-sm>.btn+.dropdown-toggle-split{padding-right:.375rem;padding-left:.375rem}.btn-lg+.dropdown-toggle-split,.btn-group-lg>.btn+.dropdown-toggle-split{padding-right:.75rem;padding-left:.75rem}.btn-group-vertical{flex-direction:column;align-items:flex-start;justify-content:center}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group{width:100%}.btn-group-vertical>.btn:not(:first-child),.btn-group-vertical>.btn-group:not(:first-child){margin-top:-1px}.btn-group-vertical>.btn:not(:last-child):not(.dropdown-toggle),.btn-group-vertical>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn~.btn,.btn-group-vertical>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-top-right-radius:0}.nav{display:flex;flex-wrap:wrap;padding-left:0;margin-bottom:0;list-style:none}.nav-link{display:block;padding:.5rem 1rem;color:#0d6efd;text-decoration:none;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out}@media (prefers-reduced-motion: reduce){.nav-link{transition:none}}.nav-link:hover,.nav-link:focus{color:#0a58ca}.nav-link.disabled{color:#6c757d;pointer-events:none;cursor:default}.nav-tabs{border-bottom:1px solid #dee2e6}.nav-tabs .nav-link{margin-bottom:-1px;background:none;border:1px solid transparent;border-top-left-radius:.25rem;border-top-right-radius:.25rem}.nav-tabs .nav-link:hover,.nav-tabs .nav-link:focus{border-color:#e9ecef #e9ecef #dee2e6;isolation:isolate}.nav-tabs .nav-link.disabled{color:#6c757d;background-color:transparent;border-color:transparent}.nav-tabs .nav-link.active,.nav-tabs .nav-item.show .nav-link{color:#495057;background-color:#fff;border-color:#dee2e6 #dee2e6 #fff}.nav-tabs .dropdown-menu{margin-top:-1px;border-top-left-radius:0;border-top-right-radius:0}.nav-pills .nav-link{background:none;border:0;border-radius:.25rem}.nav-pills .nav-link.active,.nav-pills .show>.nav-link{color:#fff;background-color:#0d6efd}.nav-fill>.nav-link,.nav-fill .nav-item{flex:1 1 auto;text-align:center}.nav-justified>.nav-link,.nav-justified .nav-item{flex-basis:0;flex-grow:1;text-align:center}.nav-fill .nav-item .nav-link,.nav-justified .nav-item .nav-link{width:100%}.tab-content>.tab-pane{display:none}.tab-content>.active{display:block}.navbar{position:relative;display:flex;flex-wrap:wrap;align-items:center;justify-content:space-between;padding-top:.5rem;padding-bottom:.5rem}.navbar>.container,.navbar>.container-fluid,.navbar>.container-sm,.navbar>.container-md,.navbar>.container-lg,.navbar>.container-xl,.navbar>.container-xxl{display:flex;flex-wrap:inherit;align-items:center;justify-content:space-between}.navbar-brand{padding-top:.3125rem;padding-bottom:.3125rem;margin-right:1rem;font-size:1.25rem;text-decoration:none;white-space:nowrap}.navbar-nav{display:flex;flex-direction:column;padding-left:0;margin-bottom:0;list-style:none}.navbar-nav .nav-link{padding-right:0;padding-left:0}.navbar-nav .dropdown-menu{position:static}.navbar-text{padding-top:.5rem;padding-bottom:.5rem}.navbar-collapse{flex-basis:100%;flex-grow:1;align-items:center}.navbar-toggler{padding:.25rem .75rem;font-size:1.25rem;line-height:1;background-color:transparent;border:1px solid transparent;border-radius:.25rem;transition:box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.navbar-toggler{transition:none}}.navbar-toggler:hover{text-decoration:none}.navbar-toggler:focus{text-decoration:none;outline:0;box-shadow:0 0 0 .25rem}.navbar-toggler-icon{display:inline-block;width:1.5em;height:1.5em;vertical-align:middle;background-repeat:no-repeat;background-position:center;background-size:100%}.navbar-nav-scroll{max-height:var(--bs-scroll-height, 75vh);overflow-y:auto}@media (min-width: 576px){.navbar-expand-sm{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-sm .navbar-nav{flex-direction:row}.navbar-expand-sm .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-sm .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-sm .navbar-nav-scroll{overflow:visible}.navbar-expand-sm .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-sm .navbar-toggler,.navbar-expand-sm .offcanvas-header{display:none}.navbar-expand-sm .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-sm .offcanvas-top,.navbar-expand-sm .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-sm .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 768px){.navbar-expand-md{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-md .navbar-nav{flex-direction:row}.navbar-expand-md .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-md .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-md .navbar-nav-scroll{overflow:visible}.navbar-expand-md .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-md .navbar-toggler,.navbar-expand-md .offcanvas-header{display:none}.navbar-expand-md .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-md .offcanvas-top,.navbar-expand-md .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-md .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 992px){.navbar-expand-lg{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-lg .navbar-nav{flex-direction:row}.navbar-expand-lg .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-lg .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-lg .navbar-nav-scroll{overflow:visible}.navbar-expand-lg .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-lg .navbar-toggler,.navbar-expand-lg .offcanvas-header{display:none}.navbar-expand-lg .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-lg .offcanvas-top,.navbar-expand-lg .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-lg .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1200px){.navbar-expand-xl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xl .navbar-nav{flex-direction:row}.navbar-expand-xl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xl .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-xl .navbar-nav-scroll{overflow:visible}.navbar-expand-xl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xl .navbar-toggler,.navbar-expand-xl .offcanvas-header{display:none}.navbar-expand-xl .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-xl .offcanvas-top,.navbar-expand-xl .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-xl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1400px){.navbar-expand-xxl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xxl .navbar-nav{flex-direction:row}.navbar-expand-xxl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xxl .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand-xxl .navbar-nav-scroll{overflow:visible}.navbar-expand-xxl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xxl .navbar-toggler,.navbar-expand-xxl .offcanvas-header{display:none}.navbar-expand-xxl .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand-xxl .offcanvas-top,.navbar-expand-xxl .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand-xxl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}.navbar-expand{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand .navbar-nav{flex-direction:row}.navbar-expand .navbar-nav .dropdown-menu{position:absolute}.navbar-expand .navbar-nav .nav-link{padding-right:.5rem;padding-left:.5rem}.navbar-expand .navbar-nav-scroll{overflow:visible}.navbar-expand .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand .navbar-toggler,.navbar-expand .offcanvas-header{display:none}.navbar-expand .offcanvas{position:inherit;bottom:0;z-index:1000;flex-grow:1;visibility:visible!important;background-color:transparent;border-right:0;border-left:0;transition:none;transform:none}.navbar-expand .offcanvas-top,.navbar-expand .offcanvas-bottom{height:auto;border-top:0;border-bottom:0}.navbar-expand .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}.navbar-light .navbar-brand{color:#000000e6}.navbar-light .navbar-brand:hover,.navbar-light .navbar-brand:focus{color:#000000e6}.navbar-light .navbar-nav .nav-link{color:#0000008c}.navbar-light .navbar-nav .nav-link:hover,.navbar-light .navbar-nav .nav-link:focus{color:#000000b3}.navbar-light .navbar-nav .nav-link.disabled{color:#0000004d}.navbar-light .navbar-nav .show>.nav-link,.navbar-light .navbar-nav .nav-link.active{color:#000000e6}.navbar-light .navbar-toggler{color:#0000008c;border-color:#0000001a}.navbar-light .navbar-toggler-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%280, 0, 0, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e")}.navbar-light .navbar-text{color:#0000008c}.navbar-light .navbar-text a,.navbar-light .navbar-text a:hover,.navbar-light .navbar-text a:focus{color:#000000e6}.navbar-dark .navbar-brand{color:#fff}.navbar-dark .navbar-brand:hover,.navbar-dark .navbar-brand:focus{color:#fff}.navbar-dark .navbar-nav .nav-link{color:#ffffff8c}.navbar-dark .navbar-nav .nav-link:hover,.navbar-dark .navbar-nav .nav-link:focus{color:#ffffffbf}.navbar-dark .navbar-nav .nav-link.disabled{color:#ffffff40}.navbar-dark .navbar-nav .show>.nav-link,.navbar-dark .navbar-nav .nav-link.active{color:#fff}.navbar-dark .navbar-toggler{color:#ffffff8c;border-color:#ffffff1a}.navbar-dark .navbar-toggler-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%28255, 255, 255, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e")}.navbar-dark .navbar-text{color:#ffffff8c}.navbar-dark .navbar-text a,.navbar-dark .navbar-text a:hover,.navbar-dark .navbar-text a:focus{color:#fff}.card{position:relative;display:flex;flex-direction:column;min-width:0;word-wrap:break-word;background-color:#fff;background-clip:border-box;border:1px solid rgba(0,0,0,.125);border-radius:.25rem}.card>hr{margin-right:0;margin-left:0}.card>.list-group{border-top:inherit;border-bottom:inherit}.card>.list-group:first-child{border-top-width:0;border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.card>.list-group:last-child{border-bottom-width:0;border-bottom-right-radius:calc(.25rem - 1px);border-bottom-left-radius:calc(.25rem - 1px)}.card>.card-header+.list-group,.card>.list-group+.card-footer{border-top:0}.card-body{flex:1 1 auto;padding:1rem}.card-title{margin-bottom:.5rem}.card-subtitle{margin-top:-.25rem;margin-bottom:0}.card-text:last-child{margin-bottom:0}.card-link+.card-link{margin-left:1rem}.card-header{padding:.5rem 1rem;margin-bottom:0;background-color:#00000008;border-bottom:1px solid rgba(0,0,0,.125)}.card-header:first-child{border-radius:calc(.25rem - 1px) calc(.25rem - 1px) 0 0}.card-footer{padding:.5rem 1rem;background-color:#00000008;border-top:1px solid rgba(0,0,0,.125)}.card-footer:last-child{border-radius:0 0 calc(.25rem - 1px) calc(.25rem - 1px)}.card-header-tabs{margin-right:-.5rem;margin-bottom:-.5rem;margin-left:-.5rem;border-bottom:0}.card-header-pills{margin-right:-.5rem;margin-left:-.5rem}.card-img-overlay{position:absolute;inset:0;padding:1rem;border-radius:calc(.25rem - 1px)}.card-img,.card-img-top,.card-img-bottom{width:100%}.card-img,.card-img-top{border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.card-img,.card-img-bottom{border-bottom-right-radius:calc(.25rem - 1px);border-bottom-left-radius:calc(.25rem - 1px)}.card-group>.card{margin-bottom:.75rem}@media (min-width: 576px){.card-group{display:flex;flex-flow:row wrap}.card-group>.card{flex:1 0 0%;margin-bottom:0}.card-group>.card+.card{margin-left:0;border-left:0}.card-group>.card:not(:last-child){border-top-right-radius:0;border-bottom-right-radius:0}.card-group>.card:not(:last-child) .card-img-top,.card-group>.card:not(:last-child) .card-header{border-top-right-radius:0}.card-group>.card:not(:last-child) .card-img-bottom,.card-group>.card:not(:last-child) .card-footer{border-bottom-right-radius:0}.card-group>.card:not(:first-child){border-top-left-radius:0;border-bottom-left-radius:0}.card-group>.card:not(:first-child) .card-img-top,.card-group>.card:not(:first-child) .card-header{border-top-left-radius:0}.card-group>.card:not(:first-child) .card-img-bottom,.card-group>.card:not(:first-child) .card-footer{border-bottom-left-radius:0}}.accordion-button{position:relative;display:flex;align-items:center;width:100%;padding:1rem 1.25rem;font-size:1rem;color:#212529;text-align:left;background-color:#fff;border:0;border-radius:0;overflow-anchor:none;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out,border-radius .15s ease}@media (prefers-reduced-motion: reduce){.accordion-button{transition:none}}.accordion-button:not(.collapsed){color:#0c63e4;background-color:#e7f1ff;box-shadow:inset 0 -1px #00000020}.accordion-button:not(.collapsed):after{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%230c63e4'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");transform:rotate(-180deg)}.accordion-button:after{flex-shrink:0;width:1.25rem;height:1.25rem;margin-left:auto;content:"";background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23212529'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");background-repeat:no-repeat;background-size:1.25rem;transition:transform .2s ease-in-out}@media (prefers-reduced-motion: reduce){.accordion-button:after{transition:none}}.accordion-button:hover{z-index:2}.accordion-button:focus{z-index:3;border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.accordion-header{margin-bottom:0}.accordion-item{background-color:#fff;border:1px solid rgba(0,0,0,.125)}.accordion-item:first-of-type{border-top-left-radius:.25rem;border-top-right-radius:.25rem}.accordion-item:first-of-type .accordion-button{border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.accordion-item:not(:first-of-type){border-top:0}.accordion-item:last-of-type{border-bottom-right-radius:.25rem;border-bottom-left-radius:.25rem}.accordion-item:last-of-type .accordion-button.collapsed{border-bottom-right-radius:calc(.25rem - 1px);border-bottom-left-radius:calc(.25rem - 1px)}.accordion-item:last-of-type .accordion-collapse{border-bottom-right-radius:.25rem;border-bottom-left-radius:.25rem}.accordion-body{padding:1rem 1.25rem}.accordion-flush .accordion-collapse{border-width:0}.accordion-flush .accordion-item{border-right:0;border-left:0;border-radius:0}.accordion-flush .accordion-item:first-child{border-top:0}.accordion-flush .accordion-item:last-child{border-bottom:0}.accordion-flush .accordion-item .accordion-button{border-radius:0}.breadcrumb{display:flex;flex-wrap:wrap;padding:0;margin-bottom:1rem;list-style:none}.breadcrumb-item+.breadcrumb-item{padding-left:.5rem}.breadcrumb-item+.breadcrumb-item:before{float:left;padding-right:.5rem;color:#6c757d;content:var(--bs-breadcrumb-divider, "/")}.breadcrumb-item.active{color:#6c757d}.pagination{display:flex;padding-left:0;list-style:none}.page-link{position:relative;display:block;color:#0d6efd;text-decoration:none;background-color:#fff;border:1px solid #dee2e6;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.page-link{transition:none}}.page-link:hover{z-index:2;color:#0a58ca;background-color:#e9ecef;border-color:#dee2e6}.page-link:focus{z-index:3;color:#0a58ca;background-color:#e9ecef;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.page-item:not(:first-child) .page-link{margin-left:-1px}.page-item.active .page-link{z-index:3;color:#fff;background-color:#0d6efd;border-color:#0d6efd}.page-item.disabled .page-link{color:#6c757d;pointer-events:none;background-color:#fff;border-color:#dee2e6}.page-link{padding:.375rem .75rem}.page-item:first-child .page-link{border-top-left-radius:.25rem;border-bottom-left-radius:.25rem}.page-item:last-child .page-link{border-top-right-radius:.25rem;border-bottom-right-radius:.25rem}.pagination-lg .page-link{padding:.75rem 1.5rem;font-size:1.25rem}.pagination-lg .page-item:first-child .page-link{border-top-left-radius:.3rem;border-bottom-left-radius:.3rem}.pagination-lg .page-item:last-child .page-link{border-top-right-radius:.3rem;border-bottom-right-radius:.3rem}.pagination-sm .page-link{padding:.25rem .5rem;font-size:.875rem}.pagination-sm .page-item:first-child .page-link{border-top-left-radius:.2rem;border-bottom-left-radius:.2rem}.pagination-sm .page-item:last-child .page-link{border-top-right-radius:.2rem;border-bottom-right-radius:.2rem}.badge{display:inline-block;padding:.35em .65em;font-size:.75em;font-weight:700;line-height:1;color:#fff;text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:.25rem}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.alert{position:relative;padding:1rem;margin-bottom:1rem;border:1px solid transparent;border-radius:.25rem}.alert-heading{color:inherit}.alert-link{font-weight:700}.alert-dismissible{padding-right:3rem}.alert-dismissible .btn-close{position:absolute;top:0;right:0;z-index:2;padding:1.25rem 1rem}.alert-primary{color:#084298;background-color:#cfe2ff;border-color:#b6d4fe}.alert-primary .alert-link{color:#06357a}.alert-secondary{color:#41464b;background-color:#e2e3e5;border-color:#d3d6d8}.alert-secondary .alert-link{color:#34383c}.alert-success{color:#0f5132;background-color:#d1e7dd;border-color:#badbcc}.alert-success .alert-link{color:#0c4128}.alert-info{color:#055160;background-color:#cff4fc;border-color:#b6effb}.alert-info .alert-link{color:#04414d}.alert-warning{color:#664d03;background-color:#fff3cd;border-color:#ffecb5}.alert-warning .alert-link{color:#523e02}.alert-danger{color:#842029;background-color:#f8d7da;border-color:#f5c2c7}.alert-danger .alert-link{color:#6a1a21}.alert-light{color:#636464;background-color:#fefefe;border-color:#fdfdfe}.alert-light .alert-link{color:#4f5050}.alert-dark{color:#141619;background-color:#d3d3d4;border-color:#bcbebf}.alert-dark .alert-link{color:#101214}@-webkit-keyframes progress-bar-stripes{0%{background-position-x:1rem}}@keyframes progress-bar-stripes{0%{background-position-x:1rem}}.progress{display:flex;height:1rem;overflow:hidden;font-size:.75rem;background-color:#e9ecef;border-radius:.25rem}.progress-bar{display:flex;flex-direction:column;justify-content:center;overflow:hidden;color:#fff;text-align:center;white-space:nowrap;background-color:#0d6efd;transition:width .6s ease}@media (prefers-reduced-motion: reduce){.progress-bar{transition:none}}.progress-bar-striped{background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-size:1rem 1rem}.progress-bar-animated{-webkit-animation:1s linear infinite progress-bar-stripes;animation:1s linear infinite progress-bar-stripes}@media (prefers-reduced-motion: reduce){.progress-bar-animated{-webkit-animation:none;animation:none}}.list-group{display:flex;flex-direction:column;padding-left:0;margin-bottom:0;border-radius:.25rem}.list-group-numbered{list-style-type:none;counter-reset:section}.list-group-numbered>li:before{content:counters(section,".") ". ";counter-increment:section}.list-group-item-action{width:100%;color:#495057;text-align:inherit}.list-group-item-action:hover,.list-group-item-action:focus{z-index:1;color:#495057;text-decoration:none;background-color:#f8f9fa}.list-group-item-action:active{color:#212529;background-color:#e9ecef}.list-group-item{position:relative;display:block;padding:.5rem 1rem;color:#212529;text-decoration:none;background-color:#fff;border:1px solid rgba(0,0,0,.125)}.list-group-item:first-child{border-top-left-radius:inherit;border-top-right-radius:inherit}.list-group-item:last-child{border-bottom-right-radius:inherit;border-bottom-left-radius:inherit}.list-group-item.disabled,.list-group-item:disabled{color:#6c757d;pointer-events:none;background-color:#fff}.list-group-item.active{z-index:2;color:#fff;background-color:#0d6efd;border-color:#0d6efd}.list-group-item+.list-group-item{border-top-width:0}.list-group-item+.list-group-item.active{margin-top:-1px;border-top-width:1px}.list-group-horizontal{flex-direction:row}.list-group-horizontal>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal>.list-group-item.active{margin-top:0}.list-group-horizontal>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}@media (min-width: 576px){.list-group-horizontal-sm{flex-direction:row}.list-group-horizontal-sm>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-sm>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-sm>.list-group-item.active{margin-top:0}.list-group-horizontal-sm>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-sm>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 768px){.list-group-horizontal-md{flex-direction:row}.list-group-horizontal-md>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-md>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-md>.list-group-item.active{margin-top:0}.list-group-horizontal-md>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-md>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 992px){.list-group-horizontal-lg{flex-direction:row}.list-group-horizontal-lg>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-lg>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-lg>.list-group-item.active{margin-top:0}.list-group-horizontal-lg>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-lg>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 1200px){.list-group-horizontal-xl{flex-direction:row}.list-group-horizontal-xl>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-xl>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-xl>.list-group-item.active{margin-top:0}.list-group-horizontal-xl>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-xl>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}@media (min-width: 1400px){.list-group-horizontal-xxl{flex-direction:row}.list-group-horizontal-xxl>.list-group-item:first-child{border-bottom-left-radius:.25rem;border-top-right-radius:0}.list-group-horizontal-xxl>.list-group-item:last-child{border-top-right-radius:.25rem;border-bottom-left-radius:0}.list-group-horizontal-xxl>.list-group-item.active{margin-top:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item{border-top-width:1px;border-left-width:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item.active{margin-left:-1px;border-left-width:1px}}.list-group-flush{border-radius:0}.list-group-flush>.list-group-item{border-width:0 0 1px}.list-group-flush>.list-group-item:last-child{border-bottom-width:0}.list-group-item-primary{color:#084298;background-color:#cfe2ff}.list-group-item-primary.list-group-item-action:hover,.list-group-item-primary.list-group-item-action:focus{color:#084298;background-color:#bacbe6}.list-group-item-primary.list-group-item-action.active{color:#fff;background-color:#084298;border-color:#084298}.list-group-item-secondary{color:#41464b;background-color:#e2e3e5}.list-group-item-secondary.list-group-item-action:hover,.list-group-item-secondary.list-group-item-action:focus{color:#41464b;background-color:#cbccce}.list-group-item-secondary.list-group-item-action.active{color:#fff;background-color:#41464b;border-color:#41464b}.list-group-item-success{color:#0f5132;background-color:#d1e7dd}.list-group-item-success.list-group-item-action:hover,.list-group-item-success.list-group-item-action:focus{color:#0f5132;background-color:#bcd0c7}.list-group-item-success.list-group-item-action.active{color:#fff;background-color:#0f5132;border-color:#0f5132}.list-group-item-info{color:#055160;background-color:#cff4fc}.list-group-item-info.list-group-item-action:hover,.list-group-item-info.list-group-item-action:focus{color:#055160;background-color:#badce3}.list-group-item-info.list-group-item-action.active{color:#fff;background-color:#055160;border-color:#055160}.list-group-item-warning{color:#664d03;background-color:#fff3cd}.list-group-item-warning.list-group-item-action:hover,.list-group-item-warning.list-group-item-action:focus{color:#664d03;background-color:#e6dbb9}.list-group-item-warning.list-group-item-action.active{color:#fff;background-color:#664d03;border-color:#664d03}.list-group-item-danger{color:#842029;background-color:#f8d7da}.list-group-item-danger.list-group-item-action:hover,.list-group-item-danger.list-group-item-action:focus{color:#842029;background-color:#dfc2c4}.list-group-item-danger.list-group-item-action.active{color:#fff;background-color:#842029;border-color:#842029}.list-group-item-light{color:#636464;background-color:#fefefe}.list-group-item-light.list-group-item-action:hover,.list-group-item-light.list-group-item-action:focus{color:#636464;background-color:#e5e5e5}.list-group-item-light.list-group-item-action.active{color:#fff;background-color:#636464;border-color:#636464}.list-group-item-dark{color:#141619;background-color:#d3d3d4}.list-group-item-dark.list-group-item-action:hover,.list-group-item-dark.list-group-item-action:focus{color:#141619;background-color:#bebebf}.list-group-item-dark.list-group-item-action.active{color:#fff;background-color:#141619;border-color:#141619}.btn-close{box-sizing:content-box;width:1em;height:1em;padding:.25em;color:#000;background:transparent url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23000'%3e%3cpath d='M.293.293a1 1 0 011.414 0L8 6.586 14.293.293a1 1 0 111.414 1.414L9.414 8l6.293 6.293a1 1 0 01-1.414 1.414L8 9.414l-6.293 6.293a1 1 0 01-1.414-1.414L6.586 8 .293 1.707a1 1 0 010-1.414z'/%3e%3c/svg%3e") center/1em auto no-repeat;border:0;border-radius:.25rem;opacity:.5}.btn-close:hover{color:#000;text-decoration:none;opacity:.75}.btn-close:focus{outline:0;box-shadow:0 0 0 .25rem #0d6efd40;opacity:1}.btn-close:disabled,.btn-close.disabled{pointer-events:none;-webkit-user-select:none;-moz-user-select:none;user-select:none;opacity:.25}.btn-close-white{filter:invert(1) grayscale(100%) brightness(200%)}.toast{width:350px;max-width:100%;font-size:.875rem;pointer-events:auto;background-color:#ffffffd9;background-clip:padding-box;border:1px solid rgba(0,0,0,.1);box-shadow:0 .5rem 1rem #00000026;border-radius:.25rem}.toast.showing{opacity:0}.toast:not(.show){display:none}.toast-container{width:-webkit-max-content;width:-moz-max-content;width:max-content;max-width:100%;pointer-events:none}.toast-container>:not(:last-child){margin-bottom:.75rem}.toast-header{display:flex;align-items:center;padding:.5rem .75rem;color:#6c757d;background-color:#ffffffd9;background-clip:padding-box;border-bottom:1px solid rgba(0,0,0,.05);border-top-left-radius:calc(.25rem - 1px);border-top-right-radius:calc(.25rem - 1px)}.toast-header .btn-close{margin-right:-.375rem;margin-left:.75rem}.toast-body{padding:.75rem;word-wrap:break-word}.modal{position:fixed;top:0;left:0;z-index:1055;display:none;width:100%;height:100%;overflow-x:hidden;overflow-y:auto;outline:0}.modal-dialog{position:relative;width:auto;margin:.5rem;pointer-events:none}.modal.fade .modal-dialog{transition:transform .3s ease-out;transform:translateY(-50px)}@media (prefers-reduced-motion: reduce){.modal.fade .modal-dialog{transition:none}}.modal.show .modal-dialog{transform:none}.modal.modal-static .modal-dialog{transform:scale(1.02)}.modal-dialog-scrollable{height:calc(100% - 1rem)}.modal-dialog-scrollable .modal-content{max-height:100%;overflow:hidden}.modal-dialog-scrollable .modal-body{overflow-y:auto}.modal-dialog-centered{display:flex;align-items:center;min-height:calc(100% - 1rem)}.modal-content{position:relative;display:flex;flex-direction:column;width:100%;pointer-events:auto;background-color:#fff;background-clip:padding-box;border:1px solid rgba(0,0,0,.2);border-radius:.3rem;outline:0}.modal-backdrop{position:fixed;top:0;left:0;z-index:1050;width:100vw;height:100vh;background-color:#000}.modal-backdrop.fade{opacity:0}.modal-backdrop.show{opacity:.5}.modal-header{display:flex;flex-shrink:0;align-items:center;justify-content:space-between;padding:1rem;border-bottom:1px solid #dee2e6;border-top-left-radius:calc(.3rem - 1px);border-top-right-radius:calc(.3rem - 1px)}.modal-header .btn-close{padding:.5rem;margin:-.5rem -.5rem -.5rem auto}.modal-title{margin-bottom:0;line-height:1.5}.modal-body{position:relative;flex:1 1 auto;padding:1rem}.modal-footer{display:flex;flex-wrap:wrap;flex-shrink:0;align-items:center;justify-content:flex-end;padding:.75rem;border-top:1px solid #dee2e6;border-bottom-right-radius:calc(.3rem - 1px);border-bottom-left-radius:calc(.3rem - 1px)}.modal-footer>*{margin:.25rem}@media (min-width: 576px){.modal-dialog{max-width:500px;margin:1.75rem auto}.modal-dialog-scrollable{height:calc(100% - 3.5rem)}.modal-dialog-centered{min-height:calc(100% - 3.5rem)}.modal-sm{max-width:300px}}@media (min-width: 992px){.modal-lg,.modal-xl{max-width:800px}}@media (min-width: 1200px){.modal-xl{max-width:1140px}}.modal-fullscreen{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen .modal-header{border-radius:0}.modal-fullscreen .modal-body{overflow-y:auto}.modal-fullscreen .modal-footer{border-radius:0}@media (max-width: 575.98px){.modal-fullscreen-sm-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-sm-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-sm-down .modal-header{border-radius:0}.modal-fullscreen-sm-down .modal-body{overflow-y:auto}.modal-fullscreen-sm-down .modal-footer{border-radius:0}}@media (max-width: 767.98px){.modal-fullscreen-md-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-md-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-md-down .modal-header{border-radius:0}.modal-fullscreen-md-down .modal-body{overflow-y:auto}.modal-fullscreen-md-down .modal-footer{border-radius:0}}@media (max-width: 991.98px){.modal-fullscreen-lg-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-lg-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-lg-down .modal-header{border-radius:0}.modal-fullscreen-lg-down .modal-body{overflow-y:auto}.modal-fullscreen-lg-down .modal-footer{border-radius:0}}@media (max-width: 1199.98px){.modal-fullscreen-xl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xl-down .modal-header{border-radius:0}.modal-fullscreen-xl-down .modal-body{overflow-y:auto}.modal-fullscreen-xl-down .modal-footer{border-radius:0}}@media (max-width: 1399.98px){.modal-fullscreen-xxl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xxl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xxl-down .modal-header{border-radius:0}.modal-fullscreen-xxl-down .modal-body{overflow-y:auto}.modal-fullscreen-xxl-down .modal-footer{border-radius:0}}.tooltip{position:absolute;z-index:1080;display:block;margin:0;font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;word-spacing:normal;white-space:normal;line-break:auto;font-size:.875rem;word-wrap:break-word;opacity:0}.tooltip.show{opacity:.9}.tooltip .tooltip-arrow{position:absolute;display:block;width:.8rem;height:.4rem}.tooltip .tooltip-arrow:before{position:absolute;content:"";border-color:transparent;border-style:solid}.bs-tooltip-top,.bs-tooltip-auto[data-popper-placement^=top]{padding:.4rem 0}.bs-tooltip-top .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow{bottom:0}.bs-tooltip-top .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow:before{top:-1px;border-width:.4rem .4rem 0;border-top-color:#000}.bs-tooltip-end,.bs-tooltip-auto[data-popper-placement^=right]{padding:0 .4rem}.bs-tooltip-end .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow{left:0;width:.4rem;height:.8rem}.bs-tooltip-end .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow:before{right:-1px;border-width:.4rem .4rem .4rem 0;border-right-color:#000}.bs-tooltip-bottom,.bs-tooltip-auto[data-popper-placement^=bottom]{padding:.4rem 0}.bs-tooltip-bottom .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow{top:0}.bs-tooltip-bottom .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow:before{bottom:-1px;border-width:0 .4rem .4rem;border-bottom-color:#000}.bs-tooltip-start,.bs-tooltip-auto[data-popper-placement^=left]{padding:0 .4rem}.bs-tooltip-start .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow{right:0;width:.4rem;height:.8rem}.bs-tooltip-start .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow:before{left:-1px;border-width:.4rem 0 .4rem .4rem;border-left-color:#000}.tooltip-inner{max-width:200px;padding:.25rem .5rem;color:#fff;text-align:center;background-color:#000;border-radius:.25rem}.popover{position:absolute;top:0;left:0;z-index:1070;display:block;max-width:276px;font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;word-spacing:normal;white-space:normal;line-break:auto;font-size:.875rem;word-wrap:break-word;background-color:#fff;background-clip:padding-box;border:1px solid rgba(0,0,0,.2);border-radius:.3rem}.popover .popover-arrow{position:absolute;display:block;width:1rem;height:.5rem}.popover .popover-arrow:before,.popover .popover-arrow:after{position:absolute;display:block;content:"";border-color:transparent;border-style:solid}.bs-popover-top>.popover-arrow,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow{bottom:calc(-.5rem - 1px)}.bs-popover-top>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:before{bottom:0;border-width:.5rem .5rem 0;border-top-color:#00000040}.bs-popover-top>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:after{bottom:1px;border-width:.5rem .5rem 0;border-top-color:#fff}.bs-popover-end>.popover-arrow,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow{left:calc(-.5rem - 1px);width:.5rem;height:1rem}.bs-popover-end>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:before{left:0;border-width:.5rem .5rem .5rem 0;border-right-color:#00000040}.bs-popover-end>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:after{left:1px;border-width:.5rem .5rem .5rem 0;border-right-color:#fff}.bs-popover-bottom>.popover-arrow,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow{top:calc(-.5rem - 1px)}.bs-popover-bottom>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:before{top:0;border-width:0 .5rem .5rem .5rem;border-bottom-color:#00000040}.bs-popover-bottom>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:after{top:1px;border-width:0 .5rem .5rem .5rem;border-bottom-color:#fff}.bs-popover-bottom .popover-header:before,.bs-popover-auto[data-popper-placement^=bottom] .popover-header:before{position:absolute;top:0;left:50%;display:block;width:1rem;margin-left:-.5rem;content:"";border-bottom:1px solid #f0f0f0}.bs-popover-start>.popover-arrow,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow{right:calc(-.5rem - 1px);width:.5rem;height:1rem}.bs-popover-start>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:before{right:0;border-width:.5rem 0 .5rem .5rem;border-left-color:#00000040}.bs-popover-start>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:after{right:1px;border-width:.5rem 0 .5rem .5rem;border-left-color:#fff}.popover-header{padding:.5rem 1rem;margin-bottom:0;font-size:1rem;background-color:#f0f0f0;border-bottom:1px solid rgba(0,0,0,.2);border-top-left-radius:calc(.3rem - 1px);border-top-right-radius:calc(.3rem - 1px)}.popover-header:empty{display:none}.popover-body{padding:1rem;color:#212529}.carousel{position:relative}.carousel.pointer-event{touch-action:pan-y}.carousel-inner{position:relative;width:100%;overflow:hidden}.carousel-inner:after{display:block;clear:both;content:""}.carousel-item{position:relative;display:none;float:left;width:100%;margin-right:-100%;-webkit-backface-visibility:hidden;backface-visibility:hidden;transition:transform .6s ease-in-out}@media (prefers-reduced-motion: reduce){.carousel-item{transition:none}}.carousel-item.active,.carousel-item-next,.carousel-item-prev{display:block}.carousel-item-next:not(.carousel-item-start),.active.carousel-item-end{transform:translate(100%)}.carousel-item-prev:not(.carousel-item-end),.active.carousel-item-start{transform:translate(-100%)}.carousel-fade .carousel-item{opacity:0;transition-property:opacity;transform:none}.carousel-fade .carousel-item.active,.carousel-fade .carousel-item-next.carousel-item-start,.carousel-fade .carousel-item-prev.carousel-item-end{z-index:1;opacity:1}.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{z-index:0;opacity:0;transition:opacity 0s .6s}@media (prefers-reduced-motion: reduce){.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{transition:none}}.carousel-control-prev,.carousel-control-next{position:absolute;top:0;bottom:0;z-index:1;display:flex;align-items:center;justify-content:center;width:15%;padding:0;color:#fff;text-align:center;background:none;border:0;opacity:.5;transition:opacity .15s ease}@media (prefers-reduced-motion: reduce){.carousel-control-prev,.carousel-control-next{transition:none}}.carousel-control-prev:hover,.carousel-control-prev:focus,.carousel-control-next:hover,.carousel-control-next:focus{color:#fff;text-decoration:none;outline:0;opacity:.9}.carousel-control-prev{left:0}.carousel-control-next{right:0}.carousel-control-prev-icon,.carousel-control-next-icon{display:inline-block;width:2rem;height:2rem;background-repeat:no-repeat;background-position:50%;background-size:100% 100%}.carousel-control-prev-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M11.354 1.646a.5.5 0 0 1 0 .708L5.707 8l5.647 5.646a.5.5 0 0 1-.708.708l-6-6a.5.5 0 0 1 0-.708l6-6a.5.5 0 0 1 .708 0z'/%3e%3c/svg%3e")}.carousel-control-next-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M4.646 1.646a.5.5 0 0 1 .708 0l6 6a.5.5 0 0 1 0 .708l-6 6a.5.5 0 0 1-.708-.708L10.293 8 4.646 2.354a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e")}.carousel-indicators{position:absolute;right:0;bottom:0;left:0;z-index:2;display:flex;justify-content:center;padding:0;margin-right:15%;margin-bottom:1rem;margin-left:15%;list-style:none}.carousel-indicators [data-bs-target]{box-sizing:content-box;flex:0 1 auto;width:30px;height:3px;padding:0;margin-right:3px;margin-left:3px;text-indent:-999px;cursor:pointer;background-color:#fff;background-clip:padding-box;border:0;border-top:10px solid transparent;border-bottom:10px solid transparent;opacity:.5;transition:opacity .6s ease}@media (prefers-reduced-motion: reduce){.carousel-indicators [data-bs-target]{transition:none}}.carousel-indicators .active{opacity:1}.carousel-caption{position:absolute;right:15%;bottom:1.25rem;left:15%;padding-top:1.25rem;padding-bottom:1.25rem;color:#fff;text-align:center}.carousel-dark .carousel-control-prev-icon,.carousel-dark .carousel-control-next-icon{filter:invert(1) grayscale(100)}.carousel-dark .carousel-indicators [data-bs-target]{background-color:#000}.carousel-dark .carousel-caption{color:#000}@-webkit-keyframes spinner-border{to{transform:rotate(360deg)}}@keyframes spinner-border{to{transform:rotate(360deg)}}.spinner-border{display:inline-block;width:2rem;height:2rem;vertical-align:-.125em;border:.25em solid currentColor;border-right-color:transparent;border-radius:50%;-webkit-animation:.75s linear infinite spinner-border;animation:.75s linear infinite spinner-border}.spinner-border-sm{width:1rem;height:1rem;border-width:.2em}@-webkit-keyframes spinner-grow{0%{transform:scale(0)}50%{opacity:1;transform:none}}@keyframes spinner-grow{0%{transform:scale(0)}50%{opacity:1;transform:none}}.spinner-grow{display:inline-block;width:2rem;height:2rem;vertical-align:-.125em;background-color:currentColor;border-radius:50%;opacity:0;-webkit-animation:.75s linear infinite spinner-grow;animation:.75s linear infinite spinner-grow}.spinner-grow-sm{width:1rem;height:1rem}@media (prefers-reduced-motion: reduce){.spinner-border,.spinner-grow{-webkit-animation-duration:1.5s;animation-duration:1.5s}}.offcanvas{position:fixed;bottom:0;z-index:1045;display:flex;flex-direction:column;max-width:100%;visibility:hidden;background-color:#fff;background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}@media (prefers-reduced-motion: reduce){.offcanvas{transition:none}}.offcanvas-backdrop{position:fixed;top:0;left:0;z-index:1040;width:100vw;height:100vh;background-color:#000}.offcanvas-backdrop.fade{opacity:0}.offcanvas-backdrop.show{opacity:.5}.offcanvas-header{display:flex;align-items:center;justify-content:space-between;padding:1rem}.offcanvas-header .btn-close{padding:.5rem;margin-top:-.5rem;margin-right:-.5rem;margin-bottom:-.5rem}.offcanvas-title{margin-bottom:0;line-height:1.5}.offcanvas-body{flex-grow:1;padding:1rem;overflow-y:auto}.offcanvas-start{top:0;left:0;width:400px;border-right:1px solid rgba(0,0,0,.2);transform:translate(-100%)}.offcanvas-end{top:0;right:0;width:400px;border-left:1px solid rgba(0,0,0,.2);transform:translate(100%)}.offcanvas-top{top:0;right:0;left:0;height:30vh;max-height:100%;border-bottom:1px solid rgba(0,0,0,.2);transform:translateY(-100%)}.offcanvas-bottom{right:0;left:0;height:30vh;max-height:100%;border-top:1px solid rgba(0,0,0,.2);transform:translateY(100%)}.offcanvas.show{transform:none}.placeholder{display:inline-block;min-height:1em;vertical-align:middle;cursor:wait;background-color:currentColor;opacity:.5}.placeholder.btn:before{display:inline-block;content:""}.placeholder-xs{min-height:.6em}.placeholder-sm{min-height:.8em}.placeholder-lg{min-height:1.2em}.placeholder-glow .placeholder{-webkit-animation:placeholder-glow 2s ease-in-out infinite;animation:placeholder-glow 2s ease-in-out infinite}@-webkit-keyframes placeholder-glow{50%{opacity:.2}}@keyframes placeholder-glow{50%{opacity:.2}}.placeholder-wave{-webkit-mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);-webkit-mask-size:200% 100%;mask-size:200% 100%;-webkit-animation:placeholder-wave 2s linear infinite;animation:placeholder-wave 2s linear infinite}@-webkit-keyframes placeholder-wave{to{-webkit-mask-position:-200% 0%;mask-position:-200% 0%}}@keyframes placeholder-wave{to{-webkit-mask-position:-200% 0%;mask-position:-200% 0%}}.clearfix:after{display:block;clear:both;content:""}.link-primary{color:#0d6efd}.link-primary:hover,.link-primary:focus{color:#0a58ca}.link-secondary{color:#6c757d}.link-secondary:hover,.link-secondary:focus{color:#565e64}.link-success{color:#198754}.link-success:hover,.link-success:focus{color:#146c43}.link-info{color:#0dcaf0}.link-info:hover,.link-info:focus{color:#3dd5f3}.link-warning{color:#ffc107}.link-warning:hover,.link-warning:focus{color:#ffcd39}.link-danger{color:#dc3545}.link-danger:hover,.link-danger:focus{color:#b02a37}.link-light{color:#f8f9fa}.link-light:hover,.link-light:focus{color:#f9fafb}.link-dark{color:#212529}.link-dark:hover,.link-dark:focus{color:#1a1e21}.ratio{position:relative;width:100%}.ratio:before{display:block;padding-top:var(--bs-aspect-ratio);content:""}.ratio>*{position:absolute;top:0;left:0;width:100%;height:100%}.ratio-1x1{--bs-aspect-ratio: 100%}.ratio-4x3{--bs-aspect-ratio: 75%}.ratio-16x9{--bs-aspect-ratio: 56.25%}.ratio-21x9{--bs-aspect-ratio: 42.8571428571%}.fixed-top{position:fixed;top:0;right:0;left:0;z-index:1030}.fixed-bottom{position:fixed;right:0;bottom:0;left:0;z-index:1030}.sticky-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}@media (min-width: 576px){.sticky-sm-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 768px){.sticky-md-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 992px){.sticky-lg-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 1200px){.sticky-xl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}@media (min-width: 1400px){.sticky-xxl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}}.hstack{display:flex;flex-direction:row;align-items:center;align-self:stretch}.vstack{display:flex;flex:1 1 auto;flex-direction:column;align-self:stretch}.visually-hidden,.visually-hidden-focusable:not(:focus):not(:focus-within){position:absolute!important;width:1px!important;height:1px!important;padding:0!important;margin:-1px!important;overflow:hidden!important;clip:rect(0,0,0,0)!important;white-space:nowrap!important;border:0!important}.stretched-link:after{position:absolute;inset:0;z-index:1;content:""}.text-truncate{overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.vr{display:inline-block;align-self:stretch;width:1px;min-height:1em;background-color:currentColor;opacity:.25}.align-baseline{vertical-align:baseline!important}.align-top{vertical-align:top!important}.align-middle{vertical-align:middle!important}.align-bottom{vertical-align:bottom!important}.align-text-bottom{vertical-align:text-bottom!important}.align-text-top{vertical-align:text-top!important}.float-start{float:left!important}.float-end{float:right!important}.float-none{float:none!important}.opacity-0{opacity:0!important}.opacity-25{opacity:.25!important}.opacity-50{opacity:.5!important}.opacity-75{opacity:.75!important}.opacity-100{opacity:1!important}.overflow-auto{overflow:auto!important}.overflow-hidden{overflow:hidden!important}.overflow-visible{overflow:visible!important}.overflow-scroll{overflow:scroll!important}.d-inline{display:inline!important}.d-inline-block{display:inline-block!important}.d-block{display:block!important}.d-grid{display:grid!important}.d-table{display:table!important}.d-table-row{display:table-row!important}.d-table-cell{display:table-cell!important}.d-flex{display:flex!important}.d-inline-flex{display:inline-flex!important}.d-none{display:none!important}.shadow{box-shadow:0 .5rem 1rem #00000026!important}.shadow-sm{box-shadow:0 .125rem .25rem #00000013!important}.shadow-lg{box-shadow:0 1rem 3rem #0000002d!important}.shadow-none{box-shadow:none!important}.position-static{position:static!important}.position-relative{position:relative!important}.position-absolute{position:absolute!important}.position-fixed{position:fixed!important}.position-sticky{position:-webkit-sticky!important;position:sticky!important}.top-0{top:0!important}.top-50{top:50%!important}.top-100{top:100%!important}.bottom-0{bottom:0!important}.bottom-50{bottom:50%!important}.bottom-100{bottom:100%!important}.start-0{left:0!important}.start-50{left:50%!important}.start-100{left:100%!important}.end-0{right:0!important}.end-50{right:50%!important}.end-100{right:100%!important}.translate-middle{transform:translate(-50%,-50%)!important}.translate-middle-x{transform:translate(-50%)!important}.translate-middle-y{transform:translateY(-50%)!important}.border{border:1px solid #dee2e6!important}.border-0{border:0!important}.border-top{border-top:1px solid #dee2e6!important}.border-top-0{border-top:0!important}.border-end{border-right:1px solid #dee2e6!important}.border-end-0{border-right:0!important}.border-bottom{border-bottom:1px solid #dee2e6!important}.border-bottom-0{border-bottom:0!important}.border-start{border-left:1px solid #dee2e6!important}.border-start-0{border-left:0!important}.border-primary{border-color:#0d6efd!important}.border-secondary{border-color:#6c757d!important}.border-success{border-color:#198754!important}.border-info{border-color:#0dcaf0!important}.border-warning{border-color:#ffc107!important}.border-danger{border-color:#dc3545!important}.border-light{border-color:#f8f9fa!important}.border-dark{border-color:#212529!important}.border-white{border-color:#fff!important}.border-1{border-width:1px!important}.border-2{border-width:2px!important}.border-3{border-width:3px!important}.border-4{border-width:4px!important}.border-5{border-width:5px!important}.w-25{width:25%!important}.w-50{width:50%!important}.w-75{width:75%!important}.w-100{width:100%!important}.w-auto{width:auto!important}.mw-100{max-width:100%!important}.vw-100{width:100vw!important}.min-vw-100{min-width:100vw!important}.h-25{height:25%!important}.h-50{height:50%!important}.h-75{height:75%!important}.h-100{height:100%!important}.h-auto{height:auto!important}.mh-100{max-height:100%!important}.vh-100{height:100vh!important}.min-vh-100{min-height:100vh!important}.flex-fill{flex:1 1 auto!important}.flex-row{flex-direction:row!important}.flex-column{flex-direction:column!important}.flex-row-reverse{flex-direction:row-reverse!important}.flex-column-reverse{flex-direction:column-reverse!important}.flex-grow-0{flex-grow:0!important}.flex-grow-1{flex-grow:1!important}.flex-shrink-0{flex-shrink:0!important}.flex-shrink-1{flex-shrink:1!important}.flex-wrap{flex-wrap:wrap!important}.flex-nowrap{flex-wrap:nowrap!important}.flex-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-0{gap:0!important}.gap-1{gap:.25rem!important}.gap-2{gap:.5rem!important}.gap-3{gap:1rem!important}.gap-4{gap:1.5rem!important}.gap-5{gap:3rem!important}.justify-content-start{justify-content:flex-start!important}.justify-content-end{justify-content:flex-end!important}.justify-content-center{justify-content:center!important}.justify-content-between{justify-content:space-between!important}.justify-content-around{justify-content:space-around!important}.justify-content-evenly{justify-content:space-evenly!important}.align-items-start{align-items:flex-start!important}.align-items-end{align-items:flex-end!important}.align-items-center{align-items:center!important}.align-items-baseline{align-items:baseline!important}.align-items-stretch{align-items:stretch!important}.align-content-start{align-content:flex-start!important}.align-content-end{align-content:flex-end!important}.align-content-center{align-content:center!important}.align-content-between{align-content:space-between!important}.align-content-around{align-content:space-around!important}.align-content-stretch{align-content:stretch!important}.align-self-auto{align-self:auto!important}.align-self-start{align-self:flex-start!important}.align-self-end{align-self:flex-end!important}.align-self-center{align-self:center!important}.align-self-baseline{align-self:baseline!important}.align-self-stretch{align-self:stretch!important}.order-first{order:-1!important}.order-0{order:0!important}.order-1{order:1!important}.order-2{order:2!important}.order-3{order:3!important}.order-4{order:4!important}.order-5{order:5!important}.order-last{order:6!important}.m-0{margin:0!important}.m-1{margin:.25rem!important}.m-2{margin:.5rem!important}.m-3{margin:1rem!important}.m-4{margin:1.5rem!important}.m-5{margin:3rem!important}.m-auto{margin:auto!important}.mx-0{margin-right:0!important;margin-left:0!important}.mx-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-3{margin-right:1rem!important;margin-left:1rem!important}.mx-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-5{margin-right:3rem!important;margin-left:3rem!important}.mx-auto{margin-right:auto!important;margin-left:auto!important}.my-0{margin-top:0!important;margin-bottom:0!important}.my-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-0{margin-top:0!important}.mt-1{margin-top:.25rem!important}.mt-2{margin-top:.5rem!important}.mt-3{margin-top:1rem!important}.mt-4{margin-top:1.5rem!important}.mt-5{margin-top:3rem!important}.mt-auto{margin-top:auto!important}.me-0{margin-right:0!important}.me-1{margin-right:.25rem!important}.me-2{margin-right:.5rem!important}.me-3{margin-right:1rem!important}.me-4{margin-right:1.5rem!important}.me-5{margin-right:3rem!important}.me-auto{margin-right:auto!important}.mb-0{margin-bottom:0!important}.mb-1{margin-bottom:.25rem!important}.mb-2{margin-bottom:.5rem!important}.mb-3{margin-bottom:1rem!important}.mb-4{margin-bottom:1.5rem!important}.mb-5{margin-bottom:3rem!important}.mb-auto{margin-bottom:auto!important}.ms-0{margin-left:0!important}.ms-1{margin-left:.25rem!important}.ms-2{margin-left:.5rem!important}.ms-3{margin-left:1rem!important}.ms-4{margin-left:1.5rem!important}.ms-5{margin-left:3rem!important}.ms-auto{margin-left:auto!important}.p-0{padding:0!important}.p-1{padding:.25rem!important}.p-2{padding:.5rem!important}.p-3{padding:1rem!important}.p-4{padding:1.5rem!important}.p-5{padding:3rem!important}.px-0{padding-right:0!important;padding-left:0!important}.px-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-3{padding-right:1rem!important;padding-left:1rem!important}.px-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-5{padding-right:3rem!important;padding-left:3rem!important}.py-0{padding-top:0!important;padding-bottom:0!important}.py-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-0{padding-top:0!important}.pt-1{padding-top:.25rem!important}.pt-2{padding-top:.5rem!important}.pt-3{padding-top:1rem!important}.pt-4{padding-top:1.5rem!important}.pt-5{padding-top:3rem!important}.pe-0{padding-right:0!important}.pe-1{padding-right:.25rem!important}.pe-2{padding-right:.5rem!important}.pe-3{padding-right:1rem!important}.pe-4{padding-right:1.5rem!important}.pe-5{padding-right:3rem!important}.pb-0{padding-bottom:0!important}.pb-1{padding-bottom:.25rem!important}.pb-2{padding-bottom:.5rem!important}.pb-3{padding-bottom:1rem!important}.pb-4{padding-bottom:1.5rem!important}.pb-5{padding-bottom:3rem!important}.ps-0{padding-left:0!important}.ps-1{padding-left:.25rem!important}.ps-2{padding-left:.5rem!important}.ps-3{padding-left:1rem!important}.ps-4{padding-left:1.5rem!important}.ps-5{padding-left:3rem!important}.font-monospace{font-family:var(--bs-font-monospace)!important}.fs-1{font-size:calc(1.375rem + 1.5vw)!important}.fs-2{font-size:calc(1.325rem + .9vw)!important}.fs-3{font-size:calc(1.3rem + .6vw)!important}.fs-4{font-size:calc(1.275rem + .3vw)!important}.fs-5{font-size:1.25rem!important}.fs-6{font-size:1rem!important}.fst-italic{font-style:italic!important}.fst-normal{font-style:normal!important}.fw-light{font-weight:300!important}.fw-lighter{font-weight:lighter!important}.fw-normal{font-weight:400!important}.fw-bold{font-weight:700!important}.fw-bolder{font-weight:bolder!important}.lh-1{line-height:1!important}.lh-sm{line-height:1.25!important}.lh-base{line-height:1.5!important}.lh-lg{line-height:2!important}.text-start{text-align:left!important}.text-end{text-align:right!important}.text-center{text-align:center!important}.text-decoration-none{text-decoration:none!important}.text-decoration-underline{text-decoration:underline!important}.text-decoration-line-through{text-decoration:line-through!important}.text-lowercase{text-transform:lowercase!important}.text-uppercase{text-transform:uppercase!important}.text-capitalize{text-transform:capitalize!important}.text-wrap{white-space:normal!important}.text-nowrap{white-space:nowrap!important}.text-break{word-wrap:break-word!important;word-break:break-word!important}.text-primary{--bs-text-opacity: 1;color:rgba(var(--bs-primary-rgb),var(--bs-text-opacity))!important}.text-secondary{--bs-text-opacity: 1;color:rgba(var(--bs-secondary-rgb),var(--bs-text-opacity))!important}.text-success{--bs-text-opacity: 1;color:rgba(var(--bs-success-rgb),var(--bs-text-opacity))!important}.text-info{--bs-text-opacity: 1;color:rgba(var(--bs-info-rgb),var(--bs-text-opacity))!important}.text-warning{--bs-text-opacity: 1;color:rgba(var(--bs-warning-rgb),var(--bs-text-opacity))!important}.text-danger{--bs-text-opacity: 1;color:rgba(var(--bs-danger-rgb),var(--bs-text-opacity))!important}.text-light{--bs-text-opacity: 1;color:rgba(var(--bs-light-rgb),var(--bs-text-opacity))!important}.text-dark{--bs-text-opacity: 1;color:rgba(var(--bs-dark-rgb),var(--bs-text-opacity))!important}.text-black{--bs-text-opacity: 1;color:rgba(var(--bs-black-rgb),var(--bs-text-opacity))!important}.text-white{--bs-text-opacity: 1;color:rgba(var(--bs-white-rgb),var(--bs-text-opacity))!important}.text-body{--bs-text-opacity: 1;color:rgba(var(--bs-body-color-rgb),var(--bs-text-opacity))!important}.text-muted{--bs-text-opacity: 1;color:#6c757d!important}.text-black-50{--bs-text-opacity: 1;color:#00000080!important}.text-white-50{--bs-text-opacity: 1;color:#ffffff80!important}.text-reset{--bs-text-opacity: 1;color:inherit!important}.text-opacity-25{--bs-text-opacity: .25}.text-opacity-50{--bs-text-opacity: .5}.text-opacity-75{--bs-text-opacity: .75}.text-opacity-100{--bs-text-opacity: 1}.bg-primary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-primary-rgb),var(--bs-bg-opacity))!important}.bg-secondary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-secondary-rgb),var(--bs-bg-opacity))!important}.bg-success{--bs-bg-opacity: 1;background-color:rgba(var(--bs-success-rgb),var(--bs-bg-opacity))!important}.bg-info{--bs-bg-opacity: 1;background-color:rgba(var(--bs-info-rgb),var(--bs-bg-opacity))!important}.bg-warning{--bs-bg-opacity: 1;background-color:rgba(var(--bs-warning-rgb),var(--bs-bg-opacity))!important}.bg-danger{--bs-bg-opacity: 1;background-color:rgba(var(--bs-danger-rgb),var(--bs-bg-opacity))!important}.bg-light{--bs-bg-opacity: 1;background-color:rgba(var(--bs-light-rgb),var(--bs-bg-opacity))!important}.bg-dark{--bs-bg-opacity: 1;background-color:rgba(var(--bs-dark-rgb),var(--bs-bg-opacity))!important}.bg-black{--bs-bg-opacity: 1;background-color:rgba(var(--bs-black-rgb),var(--bs-bg-opacity))!important}.bg-white{--bs-bg-opacity: 1;background-color:rgba(var(--bs-white-rgb),var(--bs-bg-opacity))!important}.bg-body{--bs-bg-opacity: 1;background-color:rgba(var(--bs-body-bg-rgb),var(--bs-bg-opacity))!important}.bg-transparent{--bs-bg-opacity: 1;background-color:transparent!important}.bg-opacity-10{--bs-bg-opacity: .1}.bg-opacity-25{--bs-bg-opacity: .25}.bg-opacity-50{--bs-bg-opacity: .5}.bg-opacity-75{--bs-bg-opacity: .75}.bg-opacity-100{--bs-bg-opacity: 1}.bg-gradient{background-image:var(--bs-gradient)!important}.user-select-all{-webkit-user-select:all!important;-moz-user-select:all!important;user-select:all!important}.user-select-auto{-webkit-user-select:auto!important;-moz-user-select:auto!important;user-select:auto!important}.user-select-none{-webkit-user-select:none!important;-moz-user-select:none!important;user-select:none!important}.pe-none{pointer-events:none!important}.pe-auto{pointer-events:auto!important}.rounded{border-radius:.25rem!important}.rounded-0{border-radius:0!important}.rounded-1{border-radius:.2rem!important}.rounded-2{border-radius:.25rem!important}.rounded-3{border-radius:.3rem!important}.rounded-circle{border-radius:50%!important}.rounded-pill{border-radius:50rem!important}.rounded-top{border-top-left-radius:.25rem!important;border-top-right-radius:.25rem!important}.rounded-end{border-top-right-radius:.25rem!important;border-bottom-right-radius:.25rem!important}.rounded-bottom{border-bottom-right-radius:.25rem!important;border-bottom-left-radius:.25rem!important}.rounded-start{border-bottom-left-radius:.25rem!important;border-top-left-radius:.25rem!important}.visible{visibility:visible!important}.invisible{visibility:hidden!important}@media (min-width: 576px){.float-sm-start{float:left!important}.float-sm-end{float:right!important}.float-sm-none{float:none!important}.d-sm-inline{display:inline!important}.d-sm-inline-block{display:inline-block!important}.d-sm-block{display:block!important}.d-sm-grid{display:grid!important}.d-sm-table{display:table!important}.d-sm-table-row{display:table-row!important}.d-sm-table-cell{display:table-cell!important}.d-sm-flex{display:flex!important}.d-sm-inline-flex{display:inline-flex!important}.d-sm-none{display:none!important}.flex-sm-fill{flex:1 1 auto!important}.flex-sm-row{flex-direction:row!important}.flex-sm-column{flex-direction:column!important}.flex-sm-row-reverse{flex-direction:row-reverse!important}.flex-sm-column-reverse{flex-direction:column-reverse!important}.flex-sm-grow-0{flex-grow:0!important}.flex-sm-grow-1{flex-grow:1!important}.flex-sm-shrink-0{flex-shrink:0!important}.flex-sm-shrink-1{flex-shrink:1!important}.flex-sm-wrap{flex-wrap:wrap!important}.flex-sm-nowrap{flex-wrap:nowrap!important}.flex-sm-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-sm-0{gap:0!important}.gap-sm-1{gap:.25rem!important}.gap-sm-2{gap:.5rem!important}.gap-sm-3{gap:1rem!important}.gap-sm-4{gap:1.5rem!important}.gap-sm-5{gap:3rem!important}.justify-content-sm-start{justify-content:flex-start!important}.justify-content-sm-end{justify-content:flex-end!important}.justify-content-sm-center{justify-content:center!important}.justify-content-sm-between{justify-content:space-between!important}.justify-content-sm-around{justify-content:space-around!important}.justify-content-sm-evenly{justify-content:space-evenly!important}.align-items-sm-start{align-items:flex-start!important}.align-items-sm-end{align-items:flex-end!important}.align-items-sm-center{align-items:center!important}.align-items-sm-baseline{align-items:baseline!important}.align-items-sm-stretch{align-items:stretch!important}.align-content-sm-start{align-content:flex-start!important}.align-content-sm-end{align-content:flex-end!important}.align-content-sm-center{align-content:center!important}.align-content-sm-between{align-content:space-between!important}.align-content-sm-around{align-content:space-around!important}.align-content-sm-stretch{align-content:stretch!important}.align-self-sm-auto{align-self:auto!important}.align-self-sm-start{align-self:flex-start!important}.align-self-sm-end{align-self:flex-end!important}.align-self-sm-center{align-self:center!important}.align-self-sm-baseline{align-self:baseline!important}.align-self-sm-stretch{align-self:stretch!important}.order-sm-first{order:-1!important}.order-sm-0{order:0!important}.order-sm-1{order:1!important}.order-sm-2{order:2!important}.order-sm-3{order:3!important}.order-sm-4{order:4!important}.order-sm-5{order:5!important}.order-sm-last{order:6!important}.m-sm-0{margin:0!important}.m-sm-1{margin:.25rem!important}.m-sm-2{margin:.5rem!important}.m-sm-3{margin:1rem!important}.m-sm-4{margin:1.5rem!important}.m-sm-5{margin:3rem!important}.m-sm-auto{margin:auto!important}.mx-sm-0{margin-right:0!important;margin-left:0!important}.mx-sm-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-sm-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-sm-3{margin-right:1rem!important;margin-left:1rem!important}.mx-sm-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-sm-5{margin-right:3rem!important;margin-left:3rem!important}.mx-sm-auto{margin-right:auto!important;margin-left:auto!important}.my-sm-0{margin-top:0!important;margin-bottom:0!important}.my-sm-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-sm-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-sm-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-sm-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-sm-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-sm-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-sm-0{margin-top:0!important}.mt-sm-1{margin-top:.25rem!important}.mt-sm-2{margin-top:.5rem!important}.mt-sm-3{margin-top:1rem!important}.mt-sm-4{margin-top:1.5rem!important}.mt-sm-5{margin-top:3rem!important}.mt-sm-auto{margin-top:auto!important}.me-sm-0{margin-right:0!important}.me-sm-1{margin-right:.25rem!important}.me-sm-2{margin-right:.5rem!important}.me-sm-3{margin-right:1rem!important}.me-sm-4{margin-right:1.5rem!important}.me-sm-5{margin-right:3rem!important}.me-sm-auto{margin-right:auto!important}.mb-sm-0{margin-bottom:0!important}.mb-sm-1{margin-bottom:.25rem!important}.mb-sm-2{margin-bottom:.5rem!important}.mb-sm-3{margin-bottom:1rem!important}.mb-sm-4{margin-bottom:1.5rem!important}.mb-sm-5{margin-bottom:3rem!important}.mb-sm-auto{margin-bottom:auto!important}.ms-sm-0{margin-left:0!important}.ms-sm-1{margin-left:.25rem!important}.ms-sm-2{margin-left:.5rem!important}.ms-sm-3{margin-left:1rem!important}.ms-sm-4{margin-left:1.5rem!important}.ms-sm-5{margin-left:3rem!important}.ms-sm-auto{margin-left:auto!important}.p-sm-0{padding:0!important}.p-sm-1{padding:.25rem!important}.p-sm-2{padding:.5rem!important}.p-sm-3{padding:1rem!important}.p-sm-4{padding:1.5rem!important}.p-sm-5{padding:3rem!important}.px-sm-0{padding-right:0!important;padding-left:0!important}.px-sm-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-sm-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-sm-3{padding-right:1rem!important;padding-left:1rem!important}.px-sm-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-sm-5{padding-right:3rem!important;padding-left:3rem!important}.py-sm-0{padding-top:0!important;padding-bottom:0!important}.py-sm-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-sm-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-sm-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-sm-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-sm-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-sm-0{padding-top:0!important}.pt-sm-1{padding-top:.25rem!important}.pt-sm-2{padding-top:.5rem!important}.pt-sm-3{padding-top:1rem!important}.pt-sm-4{padding-top:1.5rem!important}.pt-sm-5{padding-top:3rem!important}.pe-sm-0{padding-right:0!important}.pe-sm-1{padding-right:.25rem!important}.pe-sm-2{padding-right:.5rem!important}.pe-sm-3{padding-right:1rem!important}.pe-sm-4{padding-right:1.5rem!important}.pe-sm-5{padding-right:3rem!important}.pb-sm-0{padding-bottom:0!important}.pb-sm-1{padding-bottom:.25rem!important}.pb-sm-2{padding-bottom:.5rem!important}.pb-sm-3{padding-bottom:1rem!important}.pb-sm-4{padding-bottom:1.5rem!important}.pb-sm-5{padding-bottom:3rem!important}.ps-sm-0{padding-left:0!important}.ps-sm-1{padding-left:.25rem!important}.ps-sm-2{padding-left:.5rem!important}.ps-sm-3{padding-left:1rem!important}.ps-sm-4{padding-left:1.5rem!important}.ps-sm-5{padding-left:3rem!important}.text-sm-start{text-align:left!important}.text-sm-end{text-align:right!important}.text-sm-center{text-align:center!important}}@media (min-width: 768px){.float-md-start{float:left!important}.float-md-end{float:right!important}.float-md-none{float:none!important}.d-md-inline{display:inline!important}.d-md-inline-block{display:inline-block!important}.d-md-block{display:block!important}.d-md-grid{display:grid!important}.d-md-table{display:table!important}.d-md-table-row{display:table-row!important}.d-md-table-cell{display:table-cell!important}.d-md-flex{display:flex!important}.d-md-inline-flex{display:inline-flex!important}.d-md-none{display:none!important}.flex-md-fill{flex:1 1 auto!important}.flex-md-row{flex-direction:row!important}.flex-md-column{flex-direction:column!important}.flex-md-row-reverse{flex-direction:row-reverse!important}.flex-md-column-reverse{flex-direction:column-reverse!important}.flex-md-grow-0{flex-grow:0!important}.flex-md-grow-1{flex-grow:1!important}.flex-md-shrink-0{flex-shrink:0!important}.flex-md-shrink-1{flex-shrink:1!important}.flex-md-wrap{flex-wrap:wrap!important}.flex-md-nowrap{flex-wrap:nowrap!important}.flex-md-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-md-0{gap:0!important}.gap-md-1{gap:.25rem!important}.gap-md-2{gap:.5rem!important}.gap-md-3{gap:1rem!important}.gap-md-4{gap:1.5rem!important}.gap-md-5{gap:3rem!important}.justify-content-md-start{justify-content:flex-start!important}.justify-content-md-end{justify-content:flex-end!important}.justify-content-md-center{justify-content:center!important}.justify-content-md-between{justify-content:space-between!important}.justify-content-md-around{justify-content:space-around!important}.justify-content-md-evenly{justify-content:space-evenly!important}.align-items-md-start{align-items:flex-start!important}.align-items-md-end{align-items:flex-end!important}.align-items-md-center{align-items:center!important}.align-items-md-baseline{align-items:baseline!important}.align-items-md-stretch{align-items:stretch!important}.align-content-md-start{align-content:flex-start!important}.align-content-md-end{align-content:flex-end!important}.align-content-md-center{align-content:center!important}.align-content-md-between{align-content:space-between!important}.align-content-md-around{align-content:space-around!important}.align-content-md-stretch{align-content:stretch!important}.align-self-md-auto{align-self:auto!important}.align-self-md-start{align-self:flex-start!important}.align-self-md-end{align-self:flex-end!important}.align-self-md-center{align-self:center!important}.align-self-md-baseline{align-self:baseline!important}.align-self-md-stretch{align-self:stretch!important}.order-md-first{order:-1!important}.order-md-0{order:0!important}.order-md-1{order:1!important}.order-md-2{order:2!important}.order-md-3{order:3!important}.order-md-4{order:4!important}.order-md-5{order:5!important}.order-md-last{order:6!important}.m-md-0{margin:0!important}.m-md-1{margin:.25rem!important}.m-md-2{margin:.5rem!important}.m-md-3{margin:1rem!important}.m-md-4{margin:1.5rem!important}.m-md-5{margin:3rem!important}.m-md-auto{margin:auto!important}.mx-md-0{margin-right:0!important;margin-left:0!important}.mx-md-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-md-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-md-3{margin-right:1rem!important;margin-left:1rem!important}.mx-md-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-md-5{margin-right:3rem!important;margin-left:3rem!important}.mx-md-auto{margin-right:auto!important;margin-left:auto!important}.my-md-0{margin-top:0!important;margin-bottom:0!important}.my-md-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-md-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-md-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-md-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-md-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-md-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-md-0{margin-top:0!important}.mt-md-1{margin-top:.25rem!important}.mt-md-2{margin-top:.5rem!important}.mt-md-3{margin-top:1rem!important}.mt-md-4{margin-top:1.5rem!important}.mt-md-5{margin-top:3rem!important}.mt-md-auto{margin-top:auto!important}.me-md-0{margin-right:0!important}.me-md-1{margin-right:.25rem!important}.me-md-2{margin-right:.5rem!important}.me-md-3{margin-right:1rem!important}.me-md-4{margin-right:1.5rem!important}.me-md-5{margin-right:3rem!important}.me-md-auto{margin-right:auto!important}.mb-md-0{margin-bottom:0!important}.mb-md-1{margin-bottom:.25rem!important}.mb-md-2{margin-bottom:.5rem!important}.mb-md-3{margin-bottom:1rem!important}.mb-md-4{margin-bottom:1.5rem!important}.mb-md-5{margin-bottom:3rem!important}.mb-md-auto{margin-bottom:auto!important}.ms-md-0{margin-left:0!important}.ms-md-1{margin-left:.25rem!important}.ms-md-2{margin-left:.5rem!important}.ms-md-3{margin-left:1rem!important}.ms-md-4{margin-left:1.5rem!important}.ms-md-5{margin-left:3rem!important}.ms-md-auto{margin-left:auto!important}.p-md-0{padding:0!important}.p-md-1{padding:.25rem!important}.p-md-2{padding:.5rem!important}.p-md-3{padding:1rem!important}.p-md-4{padding:1.5rem!important}.p-md-5{padding:3rem!important}.px-md-0{padding-right:0!important;padding-left:0!important}.px-md-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-md-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-md-3{padding-right:1rem!important;padding-left:1rem!important}.px-md-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-md-5{padding-right:3rem!important;padding-left:3rem!important}.py-md-0{padding-top:0!important;padding-bottom:0!important}.py-md-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-md-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-md-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-md-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-md-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-md-0{padding-top:0!important}.pt-md-1{padding-top:.25rem!important}.pt-md-2{padding-top:.5rem!important}.pt-md-3{padding-top:1rem!important}.pt-md-4{padding-top:1.5rem!important}.pt-md-5{padding-top:3rem!important}.pe-md-0{padding-right:0!important}.pe-md-1{padding-right:.25rem!important}.pe-md-2{padding-right:.5rem!important}.pe-md-3{padding-right:1rem!important}.pe-md-4{padding-right:1.5rem!important}.pe-md-5{padding-right:3rem!important}.pb-md-0{padding-bottom:0!important}.pb-md-1{padding-bottom:.25rem!important}.pb-md-2{padding-bottom:.5rem!important}.pb-md-3{padding-bottom:1rem!important}.pb-md-4{padding-bottom:1.5rem!important}.pb-md-5{padding-bottom:3rem!important}.ps-md-0{padding-left:0!important}.ps-md-1{padding-left:.25rem!important}.ps-md-2{padding-left:.5rem!important}.ps-md-3{padding-left:1rem!important}.ps-md-4{padding-left:1.5rem!important}.ps-md-5{padding-left:3rem!important}.text-md-start{text-align:left!important}.text-md-end{text-align:right!important}.text-md-center{text-align:center!important}}@media (min-width: 992px){.float-lg-start{float:left!important}.float-lg-end{float:right!important}.float-lg-none{float:none!important}.d-lg-inline{display:inline!important}.d-lg-inline-block{display:inline-block!important}.d-lg-block{display:block!important}.d-lg-grid{display:grid!important}.d-lg-table{display:table!important}.d-lg-table-row{display:table-row!important}.d-lg-table-cell{display:table-cell!important}.d-lg-flex{display:flex!important}.d-lg-inline-flex{display:inline-flex!important}.d-lg-none{display:none!important}.flex-lg-fill{flex:1 1 auto!important}.flex-lg-row{flex-direction:row!important}.flex-lg-column{flex-direction:column!important}.flex-lg-row-reverse{flex-direction:row-reverse!important}.flex-lg-column-reverse{flex-direction:column-reverse!important}.flex-lg-grow-0{flex-grow:0!important}.flex-lg-grow-1{flex-grow:1!important}.flex-lg-shrink-0{flex-shrink:0!important}.flex-lg-shrink-1{flex-shrink:1!important}.flex-lg-wrap{flex-wrap:wrap!important}.flex-lg-nowrap{flex-wrap:nowrap!important}.flex-lg-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-lg-0{gap:0!important}.gap-lg-1{gap:.25rem!important}.gap-lg-2{gap:.5rem!important}.gap-lg-3{gap:1rem!important}.gap-lg-4{gap:1.5rem!important}.gap-lg-5{gap:3rem!important}.justify-content-lg-start{justify-content:flex-start!important}.justify-content-lg-end{justify-content:flex-end!important}.justify-content-lg-center{justify-content:center!important}.justify-content-lg-between{justify-content:space-between!important}.justify-content-lg-around{justify-content:space-around!important}.justify-content-lg-evenly{justify-content:space-evenly!important}.align-items-lg-start{align-items:flex-start!important}.align-items-lg-end{align-items:flex-end!important}.align-items-lg-center{align-items:center!important}.align-items-lg-baseline{align-items:baseline!important}.align-items-lg-stretch{align-items:stretch!important}.align-content-lg-start{align-content:flex-start!important}.align-content-lg-end{align-content:flex-end!important}.align-content-lg-center{align-content:center!important}.align-content-lg-between{align-content:space-between!important}.align-content-lg-around{align-content:space-around!important}.align-content-lg-stretch{align-content:stretch!important}.align-self-lg-auto{align-self:auto!important}.align-self-lg-start{align-self:flex-start!important}.align-self-lg-end{align-self:flex-end!important}.align-self-lg-center{align-self:center!important}.align-self-lg-baseline{align-self:baseline!important}.align-self-lg-stretch{align-self:stretch!important}.order-lg-first{order:-1!important}.order-lg-0{order:0!important}.order-lg-1{order:1!important}.order-lg-2{order:2!important}.order-lg-3{order:3!important}.order-lg-4{order:4!important}.order-lg-5{order:5!important}.order-lg-last{order:6!important}.m-lg-0{margin:0!important}.m-lg-1{margin:.25rem!important}.m-lg-2{margin:.5rem!important}.m-lg-3{margin:1rem!important}.m-lg-4{margin:1.5rem!important}.m-lg-5{margin:3rem!important}.m-lg-auto{margin:auto!important}.mx-lg-0{margin-right:0!important;margin-left:0!important}.mx-lg-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-lg-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-lg-3{margin-right:1rem!important;margin-left:1rem!important}.mx-lg-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-lg-5{margin-right:3rem!important;margin-left:3rem!important}.mx-lg-auto{margin-right:auto!important;margin-left:auto!important}.my-lg-0{margin-top:0!important;margin-bottom:0!important}.my-lg-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-lg-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-lg-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-lg-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-lg-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-lg-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-lg-0{margin-top:0!important}.mt-lg-1{margin-top:.25rem!important}.mt-lg-2{margin-top:.5rem!important}.mt-lg-3{margin-top:1rem!important}.mt-lg-4{margin-top:1.5rem!important}.mt-lg-5{margin-top:3rem!important}.mt-lg-auto{margin-top:auto!important}.me-lg-0{margin-right:0!important}.me-lg-1{margin-right:.25rem!important}.me-lg-2{margin-right:.5rem!important}.me-lg-3{margin-right:1rem!important}.me-lg-4{margin-right:1.5rem!important}.me-lg-5{margin-right:3rem!important}.me-lg-auto{margin-right:auto!important}.mb-lg-0{margin-bottom:0!important}.mb-lg-1{margin-bottom:.25rem!important}.mb-lg-2{margin-bottom:.5rem!important}.mb-lg-3{margin-bottom:1rem!important}.mb-lg-4{margin-bottom:1.5rem!important}.mb-lg-5{margin-bottom:3rem!important}.mb-lg-auto{margin-bottom:auto!important}.ms-lg-0{margin-left:0!important}.ms-lg-1{margin-left:.25rem!important}.ms-lg-2{margin-left:.5rem!important}.ms-lg-3{margin-left:1rem!important}.ms-lg-4{margin-left:1.5rem!important}.ms-lg-5{margin-left:3rem!important}.ms-lg-auto{margin-left:auto!important}.p-lg-0{padding:0!important}.p-lg-1{padding:.25rem!important}.p-lg-2{padding:.5rem!important}.p-lg-3{padding:1rem!important}.p-lg-4{padding:1.5rem!important}.p-lg-5{padding:3rem!important}.px-lg-0{padding-right:0!important;padding-left:0!important}.px-lg-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-lg-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-lg-3{padding-right:1rem!important;padding-left:1rem!important}.px-lg-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-lg-5{padding-right:3rem!important;padding-left:3rem!important}.py-lg-0{padding-top:0!important;padding-bottom:0!important}.py-lg-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-lg-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-lg-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-lg-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-lg-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-lg-0{padding-top:0!important}.pt-lg-1{padding-top:.25rem!important}.pt-lg-2{padding-top:.5rem!important}.pt-lg-3{padding-top:1rem!important}.pt-lg-4{padding-top:1.5rem!important}.pt-lg-5{padding-top:3rem!important}.pe-lg-0{padding-right:0!important}.pe-lg-1{padding-right:.25rem!important}.pe-lg-2{padding-right:.5rem!important}.pe-lg-3{padding-right:1rem!important}.pe-lg-4{padding-right:1.5rem!important}.pe-lg-5{padding-right:3rem!important}.pb-lg-0{padding-bottom:0!important}.pb-lg-1{padding-bottom:.25rem!important}.pb-lg-2{padding-bottom:.5rem!important}.pb-lg-3{padding-bottom:1rem!important}.pb-lg-4{padding-bottom:1.5rem!important}.pb-lg-5{padding-bottom:3rem!important}.ps-lg-0{padding-left:0!important}.ps-lg-1{padding-left:.25rem!important}.ps-lg-2{padding-left:.5rem!important}.ps-lg-3{padding-left:1rem!important}.ps-lg-4{padding-left:1.5rem!important}.ps-lg-5{padding-left:3rem!important}.text-lg-start{text-align:left!important}.text-lg-end{text-align:right!important}.text-lg-center{text-align:center!important}}@media (min-width: 1200px){.float-xl-start{float:left!important}.float-xl-end{float:right!important}.float-xl-none{float:none!important}.d-xl-inline{display:inline!important}.d-xl-inline-block{display:inline-block!important}.d-xl-block{display:block!important}.d-xl-grid{display:grid!important}.d-xl-table{display:table!important}.d-xl-table-row{display:table-row!important}.d-xl-table-cell{display:table-cell!important}.d-xl-flex{display:flex!important}.d-xl-inline-flex{display:inline-flex!important}.d-xl-none{display:none!important}.flex-xl-fill{flex:1 1 auto!important}.flex-xl-row{flex-direction:row!important}.flex-xl-column{flex-direction:column!important}.flex-xl-row-reverse{flex-direction:row-reverse!important}.flex-xl-column-reverse{flex-direction:column-reverse!important}.flex-xl-grow-0{flex-grow:0!important}.flex-xl-grow-1{flex-grow:1!important}.flex-xl-shrink-0{flex-shrink:0!important}.flex-xl-shrink-1{flex-shrink:1!important}.flex-xl-wrap{flex-wrap:wrap!important}.flex-xl-nowrap{flex-wrap:nowrap!important}.flex-xl-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-xl-0{gap:0!important}.gap-xl-1{gap:.25rem!important}.gap-xl-2{gap:.5rem!important}.gap-xl-3{gap:1rem!important}.gap-xl-4{gap:1.5rem!important}.gap-xl-5{gap:3rem!important}.justify-content-xl-start{justify-content:flex-start!important}.justify-content-xl-end{justify-content:flex-end!important}.justify-content-xl-center{justify-content:center!important}.justify-content-xl-between{justify-content:space-between!important}.justify-content-xl-around{justify-content:space-around!important}.justify-content-xl-evenly{justify-content:space-evenly!important}.align-items-xl-start{align-items:flex-start!important}.align-items-xl-end{align-items:flex-end!important}.align-items-xl-center{align-items:center!important}.align-items-xl-baseline{align-items:baseline!important}.align-items-xl-stretch{align-items:stretch!important}.align-content-xl-start{align-content:flex-start!important}.align-content-xl-end{align-content:flex-end!important}.align-content-xl-center{align-content:center!important}.align-content-xl-between{align-content:space-between!important}.align-content-xl-around{align-content:space-around!important}.align-content-xl-stretch{align-content:stretch!important}.align-self-xl-auto{align-self:auto!important}.align-self-xl-start{align-self:flex-start!important}.align-self-xl-end{align-self:flex-end!important}.align-self-xl-center{align-self:center!important}.align-self-xl-baseline{align-self:baseline!important}.align-self-xl-stretch{align-self:stretch!important}.order-xl-first{order:-1!important}.order-xl-0{order:0!important}.order-xl-1{order:1!important}.order-xl-2{order:2!important}.order-xl-3{order:3!important}.order-xl-4{order:4!important}.order-xl-5{order:5!important}.order-xl-last{order:6!important}.m-xl-0{margin:0!important}.m-xl-1{margin:.25rem!important}.m-xl-2{margin:.5rem!important}.m-xl-3{margin:1rem!important}.m-xl-4{margin:1.5rem!important}.m-xl-5{margin:3rem!important}.m-xl-auto{margin:auto!important}.mx-xl-0{margin-right:0!important;margin-left:0!important}.mx-xl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xl-auto{margin-right:auto!important;margin-left:auto!important}.my-xl-0{margin-top:0!important;margin-bottom:0!important}.my-xl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xl-0{margin-top:0!important}.mt-xl-1{margin-top:.25rem!important}.mt-xl-2{margin-top:.5rem!important}.mt-xl-3{margin-top:1rem!important}.mt-xl-4{margin-top:1.5rem!important}.mt-xl-5{margin-top:3rem!important}.mt-xl-auto{margin-top:auto!important}.me-xl-0{margin-right:0!important}.me-xl-1{margin-right:.25rem!important}.me-xl-2{margin-right:.5rem!important}.me-xl-3{margin-right:1rem!important}.me-xl-4{margin-right:1.5rem!important}.me-xl-5{margin-right:3rem!important}.me-xl-auto{margin-right:auto!important}.mb-xl-0{margin-bottom:0!important}.mb-xl-1{margin-bottom:.25rem!important}.mb-xl-2{margin-bottom:.5rem!important}.mb-xl-3{margin-bottom:1rem!important}.mb-xl-4{margin-bottom:1.5rem!important}.mb-xl-5{margin-bottom:3rem!important}.mb-xl-auto{margin-bottom:auto!important}.ms-xl-0{margin-left:0!important}.ms-xl-1{margin-left:.25rem!important}.ms-xl-2{margin-left:.5rem!important}.ms-xl-3{margin-left:1rem!important}.ms-xl-4{margin-left:1.5rem!important}.ms-xl-5{margin-left:3rem!important}.ms-xl-auto{margin-left:auto!important}.p-xl-0{padding:0!important}.p-xl-1{padding:.25rem!important}.p-xl-2{padding:.5rem!important}.p-xl-3{padding:1rem!important}.p-xl-4{padding:1.5rem!important}.p-xl-5{padding:3rem!important}.px-xl-0{padding-right:0!important;padding-left:0!important}.px-xl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xl-0{padding-top:0!important;padding-bottom:0!important}.py-xl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xl-0{padding-top:0!important}.pt-xl-1{padding-top:.25rem!important}.pt-xl-2{padding-top:.5rem!important}.pt-xl-3{padding-top:1rem!important}.pt-xl-4{padding-top:1.5rem!important}.pt-xl-5{padding-top:3rem!important}.pe-xl-0{padding-right:0!important}.pe-xl-1{padding-right:.25rem!important}.pe-xl-2{padding-right:.5rem!important}.pe-xl-3{padding-right:1rem!important}.pe-xl-4{padding-right:1.5rem!important}.pe-xl-5{padding-right:3rem!important}.pb-xl-0{padding-bottom:0!important}.pb-xl-1{padding-bottom:.25rem!important}.pb-xl-2{padding-bottom:.5rem!important}.pb-xl-3{padding-bottom:1rem!important}.pb-xl-4{padding-bottom:1.5rem!important}.pb-xl-5{padding-bottom:3rem!important}.ps-xl-0{padding-left:0!important}.ps-xl-1{padding-left:.25rem!important}.ps-xl-2{padding-left:.5rem!important}.ps-xl-3{padding-left:1rem!important}.ps-xl-4{padding-left:1.5rem!important}.ps-xl-5{padding-left:3rem!important}.text-xl-start{text-align:left!important}.text-xl-end{text-align:right!important}.text-xl-center{text-align:center!important}}@media (min-width: 1400px){.float-xxl-start{float:left!important}.float-xxl-end{float:right!important}.float-xxl-none{float:none!important}.d-xxl-inline{display:inline!important}.d-xxl-inline-block{display:inline-block!important}.d-xxl-block{display:block!important}.d-xxl-grid{display:grid!important}.d-xxl-table{display:table!important}.d-xxl-table-row{display:table-row!important}.d-xxl-table-cell{display:table-cell!important}.d-xxl-flex{display:flex!important}.d-xxl-inline-flex{display:inline-flex!important}.d-xxl-none{display:none!important}.flex-xxl-fill{flex:1 1 auto!important}.flex-xxl-row{flex-direction:row!important}.flex-xxl-column{flex-direction:column!important}.flex-xxl-row-reverse{flex-direction:row-reverse!important}.flex-xxl-column-reverse{flex-direction:column-reverse!important}.flex-xxl-grow-0{flex-grow:0!important}.flex-xxl-grow-1{flex-grow:1!important}.flex-xxl-shrink-0{flex-shrink:0!important}.flex-xxl-shrink-1{flex-shrink:1!important}.flex-xxl-wrap{flex-wrap:wrap!important}.flex-xxl-nowrap{flex-wrap:nowrap!important}.flex-xxl-wrap-reverse{flex-wrap:wrap-reverse!important}.gap-xxl-0{gap:0!important}.gap-xxl-1{gap:.25rem!important}.gap-xxl-2{gap:.5rem!important}.gap-xxl-3{gap:1rem!important}.gap-xxl-4{gap:1.5rem!important}.gap-xxl-5{gap:3rem!important}.justify-content-xxl-start{justify-content:flex-start!important}.justify-content-xxl-end{justify-content:flex-end!important}.justify-content-xxl-center{justify-content:center!important}.justify-content-xxl-between{justify-content:space-between!important}.justify-content-xxl-around{justify-content:space-around!important}.justify-content-xxl-evenly{justify-content:space-evenly!important}.align-items-xxl-start{align-items:flex-start!important}.align-items-xxl-end{align-items:flex-end!important}.align-items-xxl-center{align-items:center!important}.align-items-xxl-baseline{align-items:baseline!important}.align-items-xxl-stretch{align-items:stretch!important}.align-content-xxl-start{align-content:flex-start!important}.align-content-xxl-end{align-content:flex-end!important}.align-content-xxl-center{align-content:center!important}.align-content-xxl-between{align-content:space-between!important}.align-content-xxl-around{align-content:space-around!important}.align-content-xxl-stretch{align-content:stretch!important}.align-self-xxl-auto{align-self:auto!important}.align-self-xxl-start{align-self:flex-start!important}.align-self-xxl-end{align-self:flex-end!important}.align-self-xxl-center{align-self:center!important}.align-self-xxl-baseline{align-self:baseline!important}.align-self-xxl-stretch{align-self:stretch!important}.order-xxl-first{order:-1!important}.order-xxl-0{order:0!important}.order-xxl-1{order:1!important}.order-xxl-2{order:2!important}.order-xxl-3{order:3!important}.order-xxl-4{order:4!important}.order-xxl-5{order:5!important}.order-xxl-last{order:6!important}.m-xxl-0{margin:0!important}.m-xxl-1{margin:.25rem!important}.m-xxl-2{margin:.5rem!important}.m-xxl-3{margin:1rem!important}.m-xxl-4{margin:1.5rem!important}.m-xxl-5{margin:3rem!important}.m-xxl-auto{margin:auto!important}.mx-xxl-0{margin-right:0!important;margin-left:0!important}.mx-xxl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xxl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xxl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xxl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xxl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xxl-auto{margin-right:auto!important;margin-left:auto!important}.my-xxl-0{margin-top:0!important;margin-bottom:0!important}.my-xxl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xxl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xxl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xxl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xxl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xxl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xxl-0{margin-top:0!important}.mt-xxl-1{margin-top:.25rem!important}.mt-xxl-2{margin-top:.5rem!important}.mt-xxl-3{margin-top:1rem!important}.mt-xxl-4{margin-top:1.5rem!important}.mt-xxl-5{margin-top:3rem!important}.mt-xxl-auto{margin-top:auto!important}.me-xxl-0{margin-right:0!important}.me-xxl-1{margin-right:.25rem!important}.me-xxl-2{margin-right:.5rem!important}.me-xxl-3{margin-right:1rem!important}.me-xxl-4{margin-right:1.5rem!important}.me-xxl-5{margin-right:3rem!important}.me-xxl-auto{margin-right:auto!important}.mb-xxl-0{margin-bottom:0!important}.mb-xxl-1{margin-bottom:.25rem!important}.mb-xxl-2{margin-bottom:.5rem!important}.mb-xxl-3{margin-bottom:1rem!important}.mb-xxl-4{margin-bottom:1.5rem!important}.mb-xxl-5{margin-bottom:3rem!important}.mb-xxl-auto{margin-bottom:auto!important}.ms-xxl-0{margin-left:0!important}.ms-xxl-1{margin-left:.25rem!important}.ms-xxl-2{margin-left:.5rem!important}.ms-xxl-3{margin-left:1rem!important}.ms-xxl-4{margin-left:1.5rem!important}.ms-xxl-5{margin-left:3rem!important}.ms-xxl-auto{margin-left:auto!important}.p-xxl-0{padding:0!important}.p-xxl-1{padding:.25rem!important}.p-xxl-2{padding:.5rem!important}.p-xxl-3{padding:1rem!important}.p-xxl-4{padding:1.5rem!important}.p-xxl-5{padding:3rem!important}.px-xxl-0{padding-right:0!important;padding-left:0!important}.px-xxl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xxl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xxl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xxl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xxl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xxl-0{padding-top:0!important;padding-bottom:0!important}.py-xxl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xxl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xxl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xxl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xxl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xxl-0{padding-top:0!important}.pt-xxl-1{padding-top:.25rem!important}.pt-xxl-2{padding-top:.5rem!important}.pt-xxl-3{padding-top:1rem!important}.pt-xxl-4{padding-top:1.5rem!important}.pt-xxl-5{padding-top:3rem!important}.pe-xxl-0{padding-right:0!important}.pe-xxl-1{padding-right:.25rem!important}.pe-xxl-2{padding-right:.5rem!important}.pe-xxl-3{padding-right:1rem!important}.pe-xxl-4{padding-right:1.5rem!important}.pe-xxl-5{padding-right:3rem!important}.pb-xxl-0{padding-bottom:0!important}.pb-xxl-1{padding-bottom:.25rem!important}.pb-xxl-2{padding-bottom:.5rem!important}.pb-xxl-3{padding-bottom:1rem!important}.pb-xxl-4{padding-bottom:1.5rem!important}.pb-xxl-5{padding-bottom:3rem!important}.ps-xxl-0{padding-left:0!important}.ps-xxl-1{padding-left:.25rem!important}.ps-xxl-2{padding-left:.5rem!important}.ps-xxl-3{padding-left:1rem!important}.ps-xxl-4{padding-left:1.5rem!important}.ps-xxl-5{padding-left:3rem!important}.text-xxl-start{text-align:left!important}.text-xxl-end{text-align:right!important}.text-xxl-center{text-align:center!important}}@media (min-width: 1200px){.fs-1{font-size:2.5rem!important}.fs-2{font-size:2rem!important}.fs-3{font-size:1.75rem!important}.fs-4{font-size:1.5rem!important}}@media print{.d-print-inline{display:inline!important}.d-print-inline-block{display:inline-block!important}.d-print-block{display:block!important}.d-print-grid{display:grid!important}.d-print-table{display:table!important}.d-print-table-row{display:table-row!important}.d-print-table-cell{display:table-cell!important}.d-print-flex{display:flex!important}.d-print-inline-flex{display:inline-flex!important}.d-print-none{display:none!important}}:root{--bg-color: #edf2f7;--rstudio-blue-h: 209;--rstudio-blue-s: 59%;--rstudio-blue-l: 66%;--rstudio-blue-hsl: var(--rstudio-blue-h) var(--rstudio-blue-s) var(--rstudio-blue-l);--rstudio-blue: hsl(var(--rstudio-blue-hsl));--rstudio-blue-transparent: hsl(var(--rstudio-blue-hsl) / .5);--rstudio-grey-h: 0;--rstudio-grey-s: 0%;--rstudio-grey-l: 25%;--rstudio-grey-hsl: var(--rstudio-grey-h) var(--rstudio-grey-s) var(--rstudio-grey-l);--rstudio-grey: hsl(var(--rstudio-grey-hsl));--rstudio-grey-transparent: hsl(var(--rstudio-grey-hsl) / .5);--rstudio-white-h: 0;--rstudio-white-s: 0%;--rstudio-white-l: 100%;--rstudio-white-hsl: var(--rstudio-white-h) var(--rstudio-white-s) var(--rstudio-white-l);--rstudio-white: hsl(var(--rstudio-white-hsl));--rstudio-white-transparent: hsl(var(--rstudio-white-hsl) / .9);--grey: hsl(211 19% 70%);--light-grey: #e9edf3;--dark-grey: hsl(211 19% 50%);--divider-color: #a5b3c2;--icon-color: #76838f;--background-grey: var(--light-grey);--header-grey: var(--grey);--red: rgb(250, 83, 22);--font-color: hsl(214 9% 15%);--font-color-disabled: hsl(214 9% 15% / .5);--selected-border-color: var(--rstudio-blue);--outline-color: var(--grey);--disabled-color: hsl(var(--rstudio-grey-hsl) / .5);--disabled-outline: 1px solid hsl(var(--rstudio-grey-hsl) / .15);--corner-radius: 8px;--vertical-spacing: 10px;--horizontal-spacing: 15px;--selected-border-width: 3px;--animation-speed: .2s;--animation-curve: ease-in-out;--outline: 1px solid var(--outline-color);--input-vertical-padding: 1px;--input-horizontal-padding: 5px;--fonts: "Lucida Sans", "DejaVu Sans", "Lucida Grande", "Segoe UI", -apple-system, BlinkMacSystemFont, Verdana, Helvetica, sans-serif;--mono-fonts: Consolas, "Lucida Console", Monaco, monospace;--shadow-color: 0deg 0% 13%;--shadow-elevation-medium: .3px .5px .7px hsl(var(--shadow-color) / .36), .8px 1.6px 2px -.8px hsl(var(--shadow-color) / .36), 2.1px 4.1px 5.2px -1.7px hsl(var(--shadow-color) / .36), 5px 10px 12.6px -2.5px hsl(var(--shadow-color) / .36)}*{box-sizing:border-box}html{height:100%}body{overflow:hidden}body,input{font-family:var(--fonts);line-height:1.5;color:var(--font-color);margin:0;font-size:13px}h1,h2,h3{margin:0;color:var(--rstudio-grey)}.disable-text-selection *{user-select:none}button{border:none;background:none;cursor:pointer}h1,h2,h3{font-weight:unset;line-height:unset}code{color:unset;font-family:unset;font-size:unset}img._icon_1467k_1{height:30px;display:block}._button_1dliw_1{--background-color: var(--rstudio-white);--text-color: var(--font-color);--outline-color: transparent;--outline-width: 1px;padding:.5rem 1rem;border:var(--outline-width) solid var(--outline-color);background-color:var(--background-color);color:var(--text-color);border-radius:var(--corner-radius);align-self:center;display:flex;align-items:center;justify-content:center;gap:4px}._button_1dliw_1:disabled{--text-color: var(--font-color-disabled);cursor:not-allowed}._regular_1dliw_26{--outline-color: var(--rstudio-blue)}._delete_1dliw_30{--outline-color: var(--red)}._icon_1dliw_34{--outline-width: 0px;display:grid;place-content:center;padding:8px;aspect-ratio:1}._transparent_1dliw_42{--outline-color: transparent;--background-color: transparent}._icon_1dliw_34>svg{margin-bottom:-2px}._deleteButton_1en02_1{color:var(--red);display:flex;align-items:center;justify-content:flex-start}._deleteButton_1en02_1>svg{font-size:1.5rem}._leaf_1yzht_1{outline:1px solid forestgreen}div._selectedOverlay_1yzht_5{position:absolute;width:100%;height:100%;top:0;left:0;pointer-events:none;outline:var(--selected-border-width) solid var(--selected-border-color, pink)}._container_1yzht_15,._leaf_1yzht_1{position:relative}._container_rm196_1{position:relative;height:100%;width:100%;min-width:0;background-color:var(--rstudio-white, white);--card-padding: 6px;isolation:isolate}._container_rm196_1._withTitle_rm196_13{display:grid;grid-template-areas:"title" "contentHolder";grid-template-rows:min-content minmax(0,1fr)}._panelTitle_rm196_22{grid-area:title;padding:var(--card-padding) calc(var(--card-padding) * 1.5)}._contentHolder_rm196_27{grid-area:contentHolder;--spacing: var(--item-gap, 1rem);position:relative;height:100%;width:100%;min-width:0;display:flex;flex-direction:column;align-items:center;padding:var(--card-padding)}._contentHolder_rm196_27[data-alignment=top]{justify-content:top}._contentHolder_rm196_27[data-alignment=center]{justify-content:center}._contentHolder_rm196_27[data-alignment=spread]{justify-content:space-evenly}._contentHolder_rm196_27[data-alignment=bottom]{justify-content:end}._contentHolder_rm196_27>div{position:relative}div._dropWatcher_rm196_67{height:var(--spacing);width:100%;z-index:2}._contentHolder_rm196_27[data-alignment=top]>div._lastDropWatcher_rm196_75,._contentHolder_rm196_27[data-alignment=bottom]>div._firstDropWatcher_rm196_78,._contentHolder_rm196_27[data-alignment=center]>div._firstDropWatcher_rm196_78,._contentHolder_rm196_27[data-alignment=center]>div._lastDropWatcher_rm196_75,._contentHolder_rm196_27[data-alignment=spread]>div._lastDropWatcher_rm196_75,._contentHolder_rm196_27[data-alignment=spread]>div._firstDropWatcher_rm196_78,._contentHolder_rm196_27[data-alignment=spread]>div._middleDropWatcher_rm196_89,div._onlyDropWatcher_rm196_93{flex-grow:1;height:unset}._hoveringOverSwap_rm196_98,._availableToSwap_rm196_99{--highlight-color: var(--rstudio-blue, pink)}div._hoveringOverSwap_rm196_98:after{content:"Swap positions";position:absolute;background-color:var(--highlight-color);color:var(--rstudio-white);bottom:100%;inset-inline:20px;z-index:2;text-align:center;padding-block:4px}div._availableToSwap_rm196_99{--outline-start-width: 2px;--outline-end-width: 5px;--start-shadow: inset 0px 0 0px var(--outline-start-width) var(--highlight-color);--end-shadow: inset 0px 0 0px var(--outline-end-width) var(--highlight-color);box-shadow:var(--start-shadow);animation-duration:3s;animation-name:_pulse_rm196_1;animation-timing-function:ease-in-out;animation-iteration-count:infinite}@keyframes _pulse_rm196_1{0%{box-shadow:var(--start-shadow)}50%{box-shadow:var(--end-shadow)}to{box-shadow:var(--start-shadow)}}div._emptyGridCard_rm196_143{position:absolute;inset:0;display:grid;place-content:center;justify-items:center;gap:var(--vertical-spacing);z-index:2;pointer-events:none}div._emptyGridCard_rm196_143>button{pointer-events:initial}._emptyMessage_rm196_160{font-style:italic;opacity:.5}._canAcceptDrop_1oxcd_1{--outline-start-width: 2px;--outline-end-width: 5px;--start-shadow: inset 0px 0 0px var(--outline-start-width) var(--red);--end-shadow: inset 0px 0 0px var(--outline-end-width) var(--red);box-shadow:var(--start-shadow);animation-duration:3s;animation-name:_pulse_1oxcd_1;animation-timing-function:ease-in-out;animation-iteration-count:infinite}@keyframes _pulse_1oxcd_1{0%{box-shadow:var(--start-shadow)}50%{box-shadow:var(--end-shadow)}to{box-shadow:var(--start-shadow)}}div._canAcceptDrop_1oxcd_1._hoveringOver_1oxcd_32{background-color:var(--red);z-index:10}._marker_rkm38_1{font-weight:lighter;font-style:italic;padding:2px;position:relative;pointer-events:none;z-index:1}._marker_rkm38_1:hover{outline:2px solid var(--rstudio-blue)}._marker_rkm38_1:not(.dragging){grid-area:var(--grid-area)}._marker_rkm38_1.dragging{grid-row-start:var(--drag-grid-row-start);grid-row-end:var(--drag-grid-row-end);grid-column-start:var(--drag-grid-column-start);grid-column-end:var(--drag-grid-column-end);background-color:var(--rstudio-blue-transparent)}._dragger_rkm38_30{--dragger-short: 12px;--dragger-aspect: 2;--dragger-long: calc(var(--dragger-short) * var(--dragger-aspect));--offset-long: calc(50% - var(--dragger-long) / 2);display:grid;place-content:center;position:absolute;opacity:.2;background-color:var(--rstudio-blue);color:var(--rstudio-white);pointer-events:auto}._dragger_rkm38_30:hover{opacity:1}._dragger_rkm38_30._move_rkm38_50{height:var(--dragger-long);width:var(--dragger-long);left:var(--offset-long);top:var(--offset-long);cursor:grab}._dragger_rkm38_30.up,._dragger_rkm38_30.down{height:var(--dragger-short);width:var(--dragger-long);left:var(--offset-long);cursor:ns-resize}._dragger_rkm38_30.right,._dragger_rkm38_30.left{width:var(--dragger-short);height:var(--dragger-long);top:var(--offset-long);cursor:ew-resize}._dragger_rkm38_30.up{top:0}._dragger_rkm38_30.down{bottom:0}._dragger_rkm38_30.right{right:0}._dragger_rkm38_30.left{left:0}._ResizableGrid_i4cq9_1{--grid-gap: 5px;--grid-pad: var(--pad, 10px);height:100%;width:100%;min-height:80px;min-width:400px;display:grid;padding:var(--grid-pad);gap:var(--grid-gap);position:relative;isolation:isolate}._ResizableGrid_i4cq9_1>*{min-width:0;min-height:0}div#_size-detection-cell_i4cq9_1{width:100%;height:100%;grid-row:1/-1;grid-column:1/-1}input{padding:var(--input-vertical-padding) var(--input-horizontal-padding);border:1px solid var(--light-grey);border-radius:var(--corner-radius)}._container_jk9tt_8{--vertical-pad: calc(var(--vertical-spacing) * 1.5);margin-top:var(--vertical-pad);margin-bottom:var(--vertical-pad);max-width:100%;min-width:0;position:relative;isolation:isolate;display:block}._container_jk9tt_8[data-width-setting=fit]{width:fit-content}._container_jk9tt_8[data-width-setting=full]{width:100%}._label_jk9tt_26{display:block;padding-bottom:3px;width:auto;display:flex;justify-items:flex-start;align-items:center;gap:8px;text-transform:capitalize}._label_jk9tt_26 input[type=checkbox]{width:fit-content;margin-bottom:-2px}._container_jk9tt_8 input{max-width:100%}input:disabled,select:disabled{outline:var(--disabled-outline);opacity:.25;cursor:not-allowed}._container_jk9tt_8[data-disabled=true]{color:var(--disabled-color)}._mainInput_jk9tt_59{position:relative}._container_jk9tt_8[data-disabled=true] ._mainInput_jk9tt_59:before{content:"";position:absolute;inset:0;border-radius:var(--corner-radius);border:var(--disabled-outline);background-color:var(--rstudio-white);z-index:1;pointer-events:none}._container_jk9tt_8[data-disabled=true] ._mainInput_jk9tt_59:after{content:"Default";position:absolute;left:50%;top:50%;transform:translate(-50%,-50%);pointer-events:none;z-index:2}._mainInput_jk9tt_59>input[type=checkbox]{width:fit-content}input[type=number]._numericInput_n1lnu_1{border:1px solid var(--light-grey);border-radius:var(--corner-radius);flex-grow:1;text-align:end;--incrementer-pad: 5px;width:62px;padding-right:19px;-moz-appearance:textfield}input[type=number]._numericInput_n1lnu_1::-webkit-inner-spin-button,input[type=number]._numericInput_n1lnu_1::-webkit-outer-spin-button{-webkit-appearance:none;background-image:url(data:image/svg+xml,%3Csvg%20width%3D%2218%22%20height%3D%2220%22%20viewBox%3D%220%200%2018%2020%22%20fill%3D%22none%22%20xmlns%3D%22http%3A%2F%2Fwww.w3.org%2F2000%2Fsvg%22%3E%0A%3Cpath%20d%3D%22M8.89765%200.384033L15.9496%207.16973H1.84573L8.89765%200.384033Z%22%20fill%3D%22%2375A8DB%22%2F%3E%0A%3Cpath%20d%3D%22M8.89765%2019.384L15.9496%2012.5983H1.84573L8.89765%2019.384Z%22%20fill%3D%22%2375A8DB%22%2F%3E%0A%3C%2Fsvg%3E);background-size:contain;background-repeat:no-repeat;background-position:left;width:1em;opacity:1;position:absolute;top:4px;right:2px;bottom:4.5px}._popover_m2pq3_1{pointer-events:none;opacity:0;border-radius:var(--corner-radius);background-color:var(--rstudio-white);filter:drop-shadow(1px 1px 4px hsl(0deg 0% 0% / .25));padding:5px}._textContent_m2pq3_11{padding:5px;font-style:italic;width:max-content;max-width:200px}._popover_m2pq3_1[data-show]{opacity:1;z-index:9999;transition-property:opacity;transition-duration:10ms;transition-timing-function:ease-in}._popperArrow_m2pq3_26,._popperArrow_m2pq3_26:before{position:absolute;width:8px;height:8px;background:inherit}._popperArrow_m2pq3_26{visibility:hidden}._popperArrow_m2pq3_26:before{visibility:visible;content:"";transform:rotate(45deg)}._popover_m2pq3_1[data-popper-placement^=top]>._popperArrow_m2pq3_26{bottom:-4px}._popover_m2pq3_1[data-popper-placement^=bottom]>._popperArrow_m2pq3_26{top:-4px}._popover_m2pq3_1[data-popper-placement^=left]>._popperArrow_m2pq3_26{right:-4px}._popover_m2pq3_1[data-popper-placement^=right]>._popperArrow_m2pq3_26{left:-4px}._popoverMarkdown_m2pq3_60{max-width:300px}._popoverMarkdown_m2pq3_60 p:last-of-type{margin-bottom:0}._popoverMarkdown_m2pq3_60 code{font-family:var(--mono-fonts)}._infoIcon_15ri6_1{width:24px;color:var(--rstudio-blue);background-color:transparent;font-size:19px;display:grid;place-content:center}._container_15ri6_10{width:min(100%,max-content);padding:4px}._header_15ri6_15{border-bottom:1px solid var(--divider-color, pink);margin-bottom:3px;padding-bottom:3px}._info_15ri6_1{display:grid;grid-template-columns:auto auto;gap:4px}._unit_15ri6_27{text-align:end;font-weight:700}._description_15ri6_31{font-style:italic}._wrapper_13r28_1{position:relative;display:flex;max-width:125px;padding-block:2px;gap:2px;--incrementerSize: 10px}._unitSelector_13r28_10{--dropdown-width: 13px;text-align:center;padding:3px;padding-right:var(--dropdown-width);border:1px solid var(--light-grey);border-radius:var(--corner-radius);position:relative;appearance:none;background-image:url(data:image/svg+xml,%3Csvg%20width%3D%2218%22%20height%3D%2210%22%20viewBox%3D%220%200%2018%2010%22%20fill%3D%22none%22%20xmlns%3D%22http%3A%2F%2Fwww.w3.org%2F2000%2Fsvg%22%3E%3Cpath%20d%3D%22M8.87703%209.38397L15.929%202.59828H1.82511L8.87703%209.38397Z%22%20fill%3D%22%2375A8DB%22%2F%3E%3C%2Fsvg%3E%0A);background-size:var(--dropdown-width);background-repeat:no-repeat;background-position:right}._wrapper_13r28_1>input[type=number]{max-width:90px;min-width:40px}._tractInfoDisplay_9993b_1{--transition-delay: .1s;--transition-speed: .1s;--transition-ease: ease-in-out;--expand-transition: none;--offset: calc(-1 * var(--grid-pad));--scale: 0;--size-widget-bg-color: hsla(220, 27%, 94%, .9);--size-widget-spacing: 5px;--add-button-diameter: 19px;--add-button-color: var(--icon-color);--delete-button-height: 20px;position:relative;z-index:1;isolation:isolate;grid-column:1;grid-row:1}._tractInfoDisplay_9993b_1:focus-within,._tractInfoDisplay_9993b_1:hover{--scale: 100%;--expand-transition: transform var(--transition-speed) var(--transition-ease) var(--transition-delay);z-index:3}._tractInfoDisplay_9993b_1[data-drag-dir=rows]{grid-row:var(--tract-index);margin-left:var(--offset);width:fit-content}._tractInfoDisplay_9993b_1[data-drag-dir=cols]{grid-column:var(--tract-index);margin-top:var(--offset);height:fit-content}._sizeWidget_9993b_61{position:absolute;transition:var(--expand-transition);padding:2px;display:flex;align-items:center;gap:var(--size-widget-spacing);background-color:var(--size-widget-bg-color);height:100%;width:100%}._tractInfoDisplay_9993b_1[data-drag-dir=rows]>._sizeWidget_9993b_61{width:fit-content;border-radius:0 var(--corner-radius) var(--corner-radius) 0;transform:scaleX(var(--scale));transform-origin:left;padding-right:var(--size-widget-spacing)}._tractInfoDisplay_9993b_1[data-drag-dir=cols]>._sizeWidget_9993b_61{height:fit-content;flex-direction:column;border-radius:0 0 var(--corner-radius) var(--corner-radius);transform:scaleY(var(--scale));transform-origin:top;padding-bottom:var(--size-widget-spacing)}._hoverListener_9993b_88{position:absolute;--thickness: calc(2 * var(--grid-pad));--offset: calc(-1 * var(--grid-pad));inset:calc(4px - var(--grid-pad))}._tractInfoDisplay_9993b_1[data-drag-dir=rows] ._hoverListener_9993b_88{width:var(--thickness);left:var(--offset)}._tractInfoDisplay_9993b_1[data-drag-dir=cols] ._hoverListener_9993b_88{height:var(--thickness);top:var(--offset)}._buttons_9993b_108{display:flex;justify-content:space-between}._tractInfoDisplay_9993b_1[data-drag-dir=cols] ._buttons_9993b_108{width:100%;flex-direction:row}._tractInfoDisplay_9993b_1[data-drag-dir=rows] ._buttons_9993b_108{height:100%;flex-direction:column}._tractAddButton_9993b_121,._deleteButton_9993b_122{--offset_amnt: 2px;--offset: calc(var(--offset_amnt) - var(--add-button-diameter));width:var(--add-button-diameter);height:var(--add-button-diameter);aspect-ratio:1/1;display:grid;place-content:center;border-radius:50%}._tractAddButton_9993b_121{background-color:var(--add-button-color);color:var(--rstudio-white)}._deleteButton_9993b_122{background-color:transparent;font-size:var(--delete-button-height)}._deleteButton_9993b_122[data-enabled=true]{color:var(--red)}._deleteButton_9993b_122[data-enabled=false]{color:var(--disabled-color);cursor:not-allowed}div._columnSizer_3i83d_1,div._rowSizer_3i83d_2{--sizer-color: #c9e2f3;--sizer-expansion-amnt: 1.3;--sizer-margin-offset: calc(-1 * var(--grid-gap));--sizer-thickness: 2px;--sizer-hang-over: 16px;--sizer-offset: calc(var(--grid-pad) + var(--sizer-hang-over));--sizer-length: calc(100% + var(--sizer-offset) + var(--grid-pad));--sizer-main-axis-offset: calc(-1 * var(--sizer-offset));--sizer-off-axis-offset: calc(50% - var(--sizer-thickness) / 2);z-index:-1;background-color:transparent;opacity:1;position:relative;transition:transform 1s .5s}._columnSizer_3i83d_1{grid-row:1/-1;width:var(--grid-gap);margin-left:var(--sizer-margin-offset);height:var(--sizer-length);cursor:ew-resize}._rowSizer_3i83d_2{grid-column:1/-1;height:var(--grid-gap);margin-top:var(--sizer-margin-offset);width:var(--sizer-length);cursor:ns-resize}div._columnSizer_3i83d_1:after,div._rowSizer_3i83d_2:after{content:"";position:absolute;background-color:var(--sizer-color)}div._columnSizer_3i83d_1:after{height:100%;width:var(--sizer-thickness);left:var(--sizer-off-axis-offset);top:var(--sizer-main-axis-offset)}div._rowSizer_3i83d_2:after{width:100%;height:var(--sizer-thickness);top:var(--sizer-off-axis-offset);left:var(--sizer-main-axis-offset)}._columnSizer_3i83d_1:hover,._rowSizer_3i83d_2:hover{transition:transform 0s}._columnSizer_3i83d_1:hover{transform:scaleX(var(--sizer-expansion-amnt))}._rowSizer_3i83d_2:hover{transform:scaleY(var(--sizer-expansion-amnt))}._container_16q2n_1{display:flex;gap:.5rem;flex-wrap:wrap;align-items:center;margin-bottom:1rem;width:100%}._label_16q2n_10{font-style:italic;width:auto}._input_16q2n_15{border:1px solid var(--light-grey);border-radius:var(--corner-radius);width:100%}._portalHolder_18ua3_1{background-color:#fffb;position:absolute;inset:0;display:grid;place-content:center;z-index:2}._portalModal_18ua3_11{outline:1px solid grey;width:450px;background-color:var(--rstudio-white);display:flex;flex-direction:column;border-radius:var(--corner-radius);overflow:scroll}._title_18ua3_21{padding:8px}._body_18ua3_25{flex-grow:1;padding:1rem}._portalForm_18ua3_30{display:flex;flex-direction:column}._portalFormInputs_18ua3_35{flex-grow:1;display:flex;justify-content:center;flex-direction:column}._portalFormFooter_18ua3_42{padding-top:1rem;display:flex;justify-content:space-around}._validationMsg_18ua3_48{color:var(--red);font-style:italic}._infoText_18ua3_53{font-style:italic}._portalHolder_18ua3_1{background-color:#fffb;position:absolute;inset:0;display:grid;place-content:center;z-index:2}._portalModal_18ua3_11{outline:1px solid grey;width:450px;background-color:var(--rstudio-white);display:flex;flex-direction:column;border-radius:var(--corner-radius);overflow:scroll}._title_18ua3_21{padding:8px}._body_18ua3_25{flex-grow:1;padding:1rem}._portalForm_18ua3_30{display:flex;flex-direction:column}._portalFormInputs_18ua3_35{flex-grow:1;display:flex;justify-content:center;flex-direction:column}._portalFormFooter_18ua3_42{padding-top:1rem;display:flex;justify-content:space-around}._validationMsg_18ua3_48{color:var(--red);font-style:italic}._infoText_18ua3_53{font-style:italic}._container_1hvsg_1{display:grid;outline:var(--outline);position:relative;height:100%;width:100%}._container_1rlbk_1{max-height:100%}._plotPlaceholder_1rlbk_5{--pad: 15px;--label-height: 30px;--plot-offset: calc(2 * var(--pad) + var(--label-height));padding:var(--pad);height:100%;max-height:100%;display:flex;flex-direction:column;justify-content:space-evenly;align-items:center;background-color:var(--light-grey)}._plotPlaceholder_1rlbk_5 ._label_1rlbk_19{height:var(--label-height);line-height:var(--label-height)}._plotPlaceholder_1rlbk_5>svg{margin-inline:auto}._gridCardPlot_1a94v_1{background-color:var(--rstudio-white);width:100%;height:100%;max-width:100%;max-height:100%;position:relative}._gridCardPlot_1a94v_1>h1{font-size:2rem}._textPanel_525i2_1{background-color:var(--rstudio-white);display:grid;align-items:center;width:100%;height:100%;padding:1rem;position:relative}._textPanel_525i2_1>h1{font-size:2rem}._checkboxInput_12wa8_1{height:0;width:0;visibility:hidden;position:absolute}label._checkboxLabel_12wa8_10{--height: 30px;--aspect-ratio: 2.8;--animation-speed: .2s;--toggle-inset: 2px;--on-color: var(--rstudio-blue, pink);--off-color: var(--grey);--width: calc(var(--height) * var(--aspect-ratio));--toggle-h: calc(var(--height) - var(--toggle-inset) * 2);--toggle-w: calc(var(--width) * .5);font-size:12px;cursor:pointer;color:transparent;width:var(--width);height:var(--height);border-radius:var(--corner-radius);background:var(--off-color);display:block;position:relative;margin-inline:4px}._checkboxLabel_12wa8_10:after{content:attr(data-value);color:var(--dark-grey);text-align:center;position:absolute;display:grid;place-content:center;top:var(--toggle-inset);left:var(--toggle-inset);width:var(--toggle-w);height:var(--toggle-h);border-radius:calc(var(--corner-radius) - var(--toggle-inset));background:var(--rstudio-white);transition:var(--animation-speed)}._checkboxInput_12wa8_1:checked+._checkboxLabel_12wa8_10{background:var(--on-color)}._checkboxInput_12wa8_1:checked+._checkboxLabel_12wa8_10:after{left:calc(100% - var(--toggle-inset));transform:translate(-100%)}._checkboxLabel_12wa8_10:active:after{width:calc(var(--toggle-w) * 1.2)}._radioContainer_1regb_1{display:grid;gap:5px;justify-content:space-around;align-content:center;border:none;max-width:100%;min-width:0;grid-template-columns:repeat(auto-fill,minmax(40px,1fr));padding:0}._option_1regb_15{height:25px;width:100%}._option_1regb_15>._radioInput_1regb_22{display:none}._radioLabel_1regb_26{display:flex;justify-content:center;align-items:center;border:1px solid var(--light-grey);border-radius:var(--corner-radius);background-color:var(--rstudio-white);max-height:105px;height:100%;padding:2px;color:var(--rstudio-blue);position:relative}._icon_1regb_41{height:100%;display:block}._radioLabel_1regb_26 svg{height:1.65rem;padding:1px;font-size:1.6rem}._radioInput_1regb_22:checked+._radioLabel_1regb_26{outline:3px solid var(--rstudio-blue);outline-offset:-2px;font-weight:700}._radioInput_1regb_22:hover:not(:checked)+._radioLabel_1regb_26{outline:2px solid var(--rstudio-blue)}._radioInput_1regb_22:hover+._radioLabel_1regb_26:after,._radioInput_1regb_22:hover+._radioLabel_1regb_26 ._icon_1regb_41{transition-property:opacity;transition-duration:1.5s;transition-delay:.15s}._radioInput_1regb_22+._radioLabel_1regb_26:after{content:attr(data-name);opacity:0;position:absolute;pointer-events:none}._radioInput_1regb_22:hover+._radioLabel_1regb_26:after{transition-timing-function:ease-in;opacity:1}._radioInput_1regb_22:hover+._radioLabel_1regb_26 ._icon_1regb_41{transition-timing-function:ease-out;opacity:0}._container_tyghz_1{display:grid;grid-template-rows:1fr;grid-template-columns:1fr;place-content:center;padding:5px;max-height:100%}._categoryDivider_8d7ls_1{display:block;position:relative;isolation:isolate;height:var(--vertical-spacing);display:flex;align-items:center}._categoryDivider_8d7ls_1>span{text-transform:capitalize;background-color:var(--light-grey)}._categoryDivider_8d7ls_1:before{content:"";position:absolute;top:50%;left:0;width:100%;height:1px;background-color:var(--divider-color);z-index:-1;opacity:.5}._container_xt7ji_1{--gap-size: 4px;margin-top:21px}._list_xt7ji_6{width:fit-content;display:flex;flex-direction:column;align-items:center;margin-block:calc(2 * var(--gap-size));--border: 1px solid var(--grey)}._item_xt7ji_15{width:100%;display:grid;grid-template-columns:15px 1fr auto 1fr 15px;grid-template-areas:"drag key colon value delete";gap:var(--gap-size);align-items:center;padding:var(--gap-size)}._item_xt7ji_15.sortable-chosen{outline:2px solid var(--rstudio-blue)}._keyField_xt7ji_29{grid-area:key;min-width:0}._valueField_xt7ji_34{grid-area:value;min-width:0}._header_xt7ji_39{margin-top:-5px;margin-bottom:-5px;text-align:center}._dragHandle_xt7ji_45{grid-area:drag;cursor:ns-resize;transform:translateY(2px)}._item_xt7ji_15 svg{width:16px}._deleteButton_xt7ji_55{grid-area:delete;--offset: 4px;background-color:transparent;transform:translate(-2px,-2px);outline:none}._addItemButton_xt7ji_65{color:var(--icon-color);font-size:14px;padding:4px;transform:translateY(-2px)}._separator_xt7ji_72{transform:translateY(-1px)}._deleteButton_xt7ji_55:hover>svg{stroke-width:3}._container_162lp_1{position:relative;padding:4px}._container_162lp_1>input{width:100%}._container_162lp_1>label{font-weight:700}._checkbox_162lp_14{display:flex;align-items:center;gap:4px}._container_1x0tz_1{position:relative;padding:4px}._container_1x0tz_1>input{width:100%}._label_1x0tz_10{margin-left:5px}._wrappedSection_1dn9g_1{display:flex;border:none;flex-wrap:wrap;justify-content:space-between;margin-block-end:var(--vertical-spacing)}._sectionContainer_1dn9g_9{margin-block-start:25px}._wrappedSection_1dn9g_1>*{margin-bottom:0}._wrappedSection_1dn9g_1 input{max-width:unset}._container_sgn7c_1{position:relative;padding:4px}._container_sgn7c_1>input{width:100%}._container_sgn7c_1>label{font-weight:700}._container_1e5dd_1{position:relative;padding:4px}._container_1e5dd_1>input{width:100%}._container_1e5dd_1>label{font-weight:700}._container_1e5dd_1>select{display:block;width:100%;height:40px}._container_1f2js_1{padding:6px;--tract-thickness: 12px;--handle-diameter: 17px;--tract-color: var(--rstudio-blue);--handle-color: var(--light-grey);--handle-outline: 1px solid var(--grey)}._sliderWrapper_1f2js_11{padding-top:var(--tract-thickness);padding-right:3px}input[type=range]._sliderInput_1f2js_16{-webkit-appearance:none;appearance:none;width:100%;height:var(--tract-thickness);background-color:var(--tract-color);padding:0;margin-top:15px;position:relative;border-radius:var(--tract-thickness)}input[type=range]._sliderInput_1f2js_16::-webkit-slider-thumb{-webkit-appearance:none;appearance:none;width:var(--handle-diameter);height:var(--handle-diameter);border-radius:50%;background:var(--handle-color);outline:var(--handle-outline);cursor:pointer}._sliderInput_1f2js_16:before,._sliderInput_1f2js_16:after{position:absolute;bottom:calc(50% + var(--handle-diameter) / 2 + 2px);background-color:var(--light-grey);padding-inline:4px;padding-block:2px;font-size:12px;border-radius:2px}._sliderInput_1f2js_16:before{content:attr(data-min);left:0}._sliderInput_1f2js_16:after{content:attr(data-max);right:0}._container_yicbr_1{position:relative;padding:4px}._container_yicbr_1>input{width:100%}._container_1i6yi_1{padding:1rem;max-height:100%;background-color:var(--light-grey);border-radius:var(--corner-radius)}._container_1xnzo_1{display:grid;grid-template-rows:1fr;grid-template-columns:1fr;place-content:center;padding:1rem;max-height:100%;min-height:200px;background-color:var(--light-grey);border-radius:var(--corner-radius)}._container_p6wnj_1{--gap: 10px;width:calc(100% - var(--gap));margin:auto;height:min(calc(100% - var(--gap)),75px);padding:4px;background-color:var(--light-grey);border-radius:var(--corner-radius);position:relative;display:grid;place-content:center}._infoMsg_p6wnj_14>svg{color:var(--rstudio-blue);margin-right:4px;margin-bottom:-2px}._codeHolder_p6wnj_19{overflow:auto;font-family:var(--mono-fonts);border:1px solid var(--rstudio-grey);background-color:var(--rstudio-white);padding:5px}div._appViewerHolder_wu0cb_1{--app-scale-amnt: .24;--animation-speed: .25s;--animation-speed-timing: var(--animation-speed) ease;--expand-btn-size: 1rem;--logs-font-size: .65rem;--logs-padding: var(--vertical-spacing);--expanded-inset-horizontal: 70px;--expanded-inset-top: 70px;--expanded-inset-bottom: calc(70px + var(--logs-offset-expanded));--preview-inset-horizontal: 10px;--preview-inset-top: 10px;--preview-inset-bottom: calc( var(--preview-inset-top) + var(--logs-button-h) + var(--logs-offset) );--logs-button-h: 28px;--logs-offset: 0px;--logs-offset-expanded: 30px;--app-expanded-w: calc(100vw - var(--expanded-inset-horizontal) * 2);--app-expanded-h: calc( 100vh - var(--expanded-inset-top) - var(--expanded-inset-bottom) );--app-preview-w: calc(var(--app-expanded-w) * var(--app-scale-amnt));--app-preview-h: calc(var(--app-expanded-h) * var(--app-scale-amnt));height:calc(var(--app-preview-h) + var(--preview-inset-top) + var(--preview-inset-bottom));position:relative;overflow:hidden}._title_wu0cb_55{position:relative}._appViewerHolder_wu0cb_1[data-expanded=true]{--expand-btn-size: 1.5rem;--logs-font-size: .9rem;--logs-padding: 32px;--viewer-h: 1fr;--logs-button-h: 30px;--logs-offset: 35px;position:fixed;inset:0;width:100vw;height:100vh;z-index:10;background-color:hsl(var(--rstudio-grey-hsl) / .15);backdrop-filter:blur(6px);transition:all var(--animation-speed-timing);transition-property:backdrop-filter background-color}._appContainer_wu0cb_89{display:grid;place-content:center}._appViewerHolder_wu0cb_1[data-expanded=false]>._appContainer_wu0cb_89{position:absolute;top:var(--preview-inset-top);right:var(--preview-inset-horizontal);width:var(--app-preview-w);height:var(--app-preview-h)}._appViewerHolder_wu0cb_1[data-expanded=true]>._appContainer_wu0cb_89{position:absolute;inset-inline:var(--expanded-inset-horizontal);top:var(--expanded-inset-top);height:var(--app-expanded-h)}._previewFrame_wu0cb_109{background-color:var(--rstudio-white);width:var(--app-expanded-w);height:var(--app-expanded-h);transform:scale(var(--app-scale-amnt));border:1px solid var(--outline-color);display:block;border-radius:2px}._appViewerHolder_wu0cb_1[data-expanded=true] ._previewFrame_wu0cb_109{transform:scale(1);transition:transform var(--animation-speed-timing);border:none;box-shadow:var(--shadow-elevation-medium)}._appViewerHolder_wu0cb_1[data-expanded=false] ._previewFrame_wu0cb_109{transition:none}._expandButton_wu0cb_134,._reloadButton_wu0cb_135{position:absolute;background-color:transparent;outline:none;border:none;transition-property:opacity,color,transform;transition-duration:.25s;transition-timing-function:ease-in}._reloadButton_wu0cb_135{top:0;bottom:0;color:currentColor;font-size:1.5rem;--normal-transform: scaleY(-1) var(--expand-scale, scale(1)) rotate(90deg);transform:var(--normal-transform)}._reloadButton_wu0cb_135:hover{--expand-scale: scale(1.1)}._spin_wu0cb_160{animation-duration:1s;animation-name:_spin_wu0cb_160;--at-rest-transform: var(--normal-transform, scale(1))}@keyframes _spin_wu0cb_160{0%{transform:var(--at-rest-transform) rotate(0)}to{transform:var(--at-rest-transform) rotate(-360deg);animation-timing-function:ease-out}}._appViewerHolder_wu0cb_1 ._reloadButton_wu0cb_135{display:none}._expandButton_wu0cb_134{width:100%;height:100%;font-size:50px;opacity:0;color:transparent}._expandButton_wu0cb_134:hover{color:inherit;opacity:1;transform:scale(1.1)}._restartButton_wu0cb_198{width:fit-content;margin-inline:auto}._appViewerHolder_wu0cb_1[data-expanded=true] ._expandButton_wu0cb_134,._appViewerHolder_wu0cb_1[data-expanded=true] ._reloadButton_wu0cb_135{width:var(--expanded-inset-left);height:var(--expanded-inset-top);font-size:2.5rem;opacity:1;position:fixed;top:0;display:block}._appViewerHolder_wu0cb_1[data-expanded=true] ._expandButton_wu0cb_134{color:inherit;right:0}._appViewerHolder_wu0cb_1>h2{color:var(--rstudio-grey);text-align:center;font-style:italic}._loadingMessage_wu0cb_225{display:grid;place-content:center;width:100%;height:100%;padding:1rem}._loadingMessage_wu0cb_225>h2{text-align:center}h2._error_wu0cb_236{color:var(--red)}._fakeApp_t3dh1_1{display:grid;place-content:center;font-size:4rem}._fakeDashboard_t3dh1_7{display:grid;gap:5px;grid:"header header" 100px "sidebar top " 2fr "sidebar bottom" 1fr / 150px 1fr}._fakeDashboard_t3dh1_7>div{width:100%;height:100%}._fakeDashboard_t3dh1_7>._header_t3dh1_22{grid-area:header;background-color:#ba55d3b3;display:grid;place-content:center}._header_t3dh1_22>h1{color:#fff}._fakeDashboard_t3dh1_7>._sidebar_t3dh1_31{grid-area:sidebar;background-color:#ce8740b3}._fakeDashboard_t3dh1_7>._top_t3dh1_35{grid-area:top;background-color:#228c22b3}._fakeDashboard_t3dh1_7>._bottom_t3dh1_39{grid-area:bottom;background-color:#4682b4b3}._logs_xjp5l_2{--tab-height: var(--logs-button-h, 20px);--background-color: var(--rstudio-white);--outline-color: var(--rstudio-grey, red);--side-offset: 8px;position:absolute;bottom:0;left:var(--side-offset);right:var(--side-offset);top:0;grid-area:logs;isolation:isolate;transform:translateY(calc(100% - var(--tab-height) - var(--logs-offset, 0px)));transition:transform var(--animation-speed, .25s) ease-in}._logs_xjp5l_2[data-expanded=true]{transform:translateY(5px)}._logs_xjp5l_2[data-expanded=true] ._logsContents_xjp5l_25{overflow:auto}button._expandTab_xjp5l_29,._logsContents_xjp5l_25{background-color:var(--background-color)}button._expandTab_xjp5l_29{z-index:2;border-radius:var(--corner-radius) var(--corner-radius) 0 0!important;width:fit-content;height:var(--tab-height);margin-inline:auto;gap:5px;padding-inline:10px;justify-content:center;background-color:var(--background-color);outline:var(--outline);display:flex;align-items:center;position:relative}button._expandTab_xjp5l_29:after{position:absolute;content:"";width:100%;height:3px;bottom:-2px;background-color:var(--background-color)}._logsContents_xjp5l_25{z-index:1;border:var(--outline);height:calc(100% - var(--tab-height));padding:var(--logs-padding);position:relative}._clearLogsButton_xjp5l_69{outline:none;position:absolute;top:0;right:0}p._logLine_xjp5l_75{font-family:var(--mono-fonts);font-size:var(--logs-font-size);margin:0}._noLogsMsg_xjp5l_81{opacity:.8;height:100%;text-align:center;font-size:1rem}._expandedLogs_xjp5l_93 ._logsContents_xjp5l_25{overflow:auto}._expandLogsButton_xjp5l_101{flex-grow:1;text-align:center;font-size:calc(var(--logs-font-size) * 1.3);height:100%}._unseenLogsNotification_xjp5l_108{color:var(--red);right:0;opacity:0;font-size:9px}._unseenLogsNotification_xjp5l_108[data-show=true]{opacity:1;animation-duration:2s;animation-name:_slidein_xjp5l_1;animation-iteration-count:3;animation-timing-function:ease-in-out;transition:opacity 1s}@keyframes _slidein_xjp5l_1{0%{transform:scale(1)}50%{transform:scale(1.5)}to{transform:scale(1)}}._container_1d7pe_1{display:flex;position:relative}._container_1d7pe_1>button>svg{color:var(--icon-color, silver)}._container_1d7pe_1>button{height:var(--header-height, 100%);padding:0;position:relative;font-size:2rem}._container_1d7pe_1>button:disabled{color:var(--disabled-color);opacity:.2}._elementsPalette_qmlez_1{--icon-size: 75px;--padding: 8px;height:100%;overflow:auto;padding:var(--padding);display:grid;align-items:start;grid-template-columns:repeat(2,var(--icon-size));justify-content:center;justify-items:center;align-content:start;gap:var(--padding)}._OptionContainer_qmlez_18{width:var(--icon-size);height:75px;position:relative}._OptionItem_qmlez_24{height:100%;border-radius:var(--corner-radius);position:absolute;inset:0;cursor:grab;text-align:center}._OptionIcon_qmlez_33{margin:-12px 0 0;display:block;width:100%;pointer-events:none}._OptionLabel_qmlez_41{margin-top:-18px;display:block;line-height:15px}._OptionItem_qmlez_24:hover{outline:var(--outline)}._OptionItem_qmlez_24:active{cursor:grabbing}._OptionItem_qmlez_24>svg{color:var(--rstudio-blue)}._container_17s66_1{--header-height: 31px;--padding: var(--horizontal-spacing);height:100%;width:100%;background-color:var(--background-grey, #edf2f7);display:grid;grid-template-rows:var(--header-height) 1fr;grid-template-columns:auto 1fr var(--properties-panel-width);grid-template-areas:"header header header " "elements editor properties"}._container_17s66_1 *{min-height:0}._container_17s66_1>div{outline:1px solid var(--header-grey);min-width:0;isolation:isolate}._elementsPanel_17s66_28{grid-area:elements;overflow:auto;z-index:2}._propertiesPanel_17s66_37{grid-area:properties;display:flex;flex-direction:column;justify-content:space-between;z-index:3}._propertiesPanel_17s66_37>.properties-panel{flex:1}._propertiesPanel_17s66_37>.app-preview{flex-grow:0}._editorHolder_17s66_52{grid-area:editor;background-color:var(--rstudio-white);padding:32px;height:100%;width:100%;position:relative;z-index:1}._titledPanel_17s66_65{display:grid;grid-template-rows:var(--header-height) 1fr;background-color:var(--background-grey);isolation:isolate}._titledPanel_17s66_65>*{min-width:0}._panelTitleHeader_17s66_77{text-align:center;line-height:var(--header-height);background-color:var(--header-grey, forestgreen);font-size:1.05rem;font-weight:lighter;color:var(--rstudio-white)}._header_17s66_86{grid-area:header;gap:var(--padding);display:flex;justify-content:flex-start;align-items:center}._rightSide_17s66_94{margin-left:auto;width:var(--properties-panel-width);display:inherit;align-items:center;gap:14px}._rightSide_17s66_94>:first-child{margin-left:-6px}._rightSide_17s66_94 .react-joyride{display:none}._rightSide_17s66_94>.undo-redo-buttons{transform:translate(-1px,-1px)}._divider_17s66_115{height:20px;background-color:var(--divider-color);width:2px}._title_17s66_65{font-size:1.15rem;color:var(--rstudio-blue)}._shinyLogo_17s66_126{display:inline-block;height:100%;border-radius:0 15px 15px 0;padding-block:3px;padding-inline:5px}._header_17s66_86 button{padding:0}._container_1fh41_1{--flex-gap: 8px;padding:var(--vertical-spacing);display:flex;flex-direction:column;gap:var(--flex-gap);position:relative;width:fit-content;max-width:100%}._node_1fh41_12{padding:var(--input-vertical-padding) var(--input-horizontal-padding);width:100%;max-width:100%;overflow-wrap:break-word;position:relative;cursor:pointer;background-color:var(--rstudio-white);border-radius:var(--corner-radius)}._node_1fh41_12:last-child{background-color:var(--rstudio-blue);color:var(--rstudio-white)}._node_1fh41_12:before,._node_1fh41_12:after{--dot-size: 6px;--line-width: 2px;--offset: 5px;--color: var(--header-grey);content:"";position:absolute}._node_1fh41_12:after{width:var(--dot-size);height:var(--dot-size);background-color:var(--background-grey);outline-width:var(--line-width);outline-style:solid;outline-color:var(--color);border-radius:50%;left:calc(-1 * (var(--input-horizontal-padding) + var(--dot-size) / 2 + var(--offset)));top:calc(50% - var(--dot-size) / 2)}._node_1fh41_12:first-child:after{border-radius:0}._node_1fh41_12:before{background-color:var(--color);width:var(--line-width);height:calc(100% + var(--flex-gap));left:calc(-1 * (var(--input-horizontal-padding) + var(--line-width) / 2 + var(--offset)));top:calc(-1 * var(--flex-gap) / 2)}._node_1fh41_12:only-child:before{display:none}._node_1fh41_12:first-child:before,._node_1fh41_12:last-child:before{height:calc(50% + var(--flex-gap) / 2)}._node_1fh41_12:first-child:before{top:50%}._settingsPanel_zsgzt_1{--vertical-gap: var(--vertical-spacing);display:flex;flex-direction:column;padding-inline:var(--horizontal-spacing);padding-block:var(--vertical-gap);height:100%}._currentElementAbout_zsgzt_10{flex-shrink:0}form._settingsForm_zsgzt_17{flex:1;height:100%;overflow:auto;isolation:isolate}._settingsInputs_zsgzt_24{overflow:auto}._buttonsHolder_zsgzt_28{margin-top:auto;background-color:var(--light-grey);padding-block:var(--vertical-gap);display:flex;flex-direction:column;justify-content:space-around;align-items:center;gap:var(--vertical-spacing)}._buttonsHolder_zsgzt_28>Button{height:40px;width:100%;border:none}._validationErrorMsg_zsgzt_45{padding:.5rem;color:var(--red);font-family:var(--mono-fonts)} diff --git a/docs/articles/demo-app/assets/index.e182d711.js b/docs/articles/demo-app/assets/index.e182d711.js deleted file mode 100644 index 6edf1514f..000000000 --- a/docs/articles/demo-app/assets/index.e182d711.js +++ /dev/null @@ -1,145 +0,0 @@ -var bS=Object.defineProperty,ES=Object.defineProperties;var CS=Object.getOwnPropertyDescriptors;var fs=Object.getOwnPropertySymbols;var Sh=Object.prototype.hasOwnProperty,bh=Object.prototype.propertyIsEnumerable;var wh=(e,t,n)=>t in e?bS(e,t,{enumerable:!0,configurable:!0,writable:!0,value:n}):e[t]=n,F=(e,t)=>{for(var n in t||(t={}))Sh.call(t,n)&&wh(e,n,t[n]);if(fs)for(var n of fs(t))bh.call(t,n)&&wh(e,n,t[n]);return e},$=(e,t)=>ES(e,CS(t));var $t=(e,t)=>{var n={};for(var r in e)Sh.call(e,r)&&t.indexOf(r)<0&&(n[r]=e[r]);if(e!=null&&fs)for(var r of fs(e))t.indexOf(r)<0&&bh.call(e,r)&&(n[r]=e[r]);return n};var Eh=(e,t,n)=>new Promise((r,o)=>{var i=l=>{try{s(n.next(l))}catch(u){o(u)}},a=l=>{try{s(n.throw(l))}catch(u){o(u)}},s=l=>l.done?r(l.value):Promise.resolve(l.value).then(i,a);s((n=n.apply(e,t)).next())});const AS=function(){const t=document.createElement("link").relList;if(t&&t.supports&&t.supports("modulepreload"))return;for(const o of document.querySelectorAll('link[rel="modulepreload"]'))r(o);new MutationObserver(o=>{for(const i of o)if(i.type==="childList")for(const a of i.addedNodes)a.tagName==="LINK"&&a.rel==="modulepreload"&&r(a)}).observe(document,{childList:!0,subtree:!0});function n(o){const i={};return o.integrity&&(i.integrity=o.integrity),o.referrerpolicy&&(i.referrerPolicy=o.referrerpolicy),o.crossorigin==="use-credentials"?i.credentials="include":o.crossorigin==="anonymous"?i.credentials="omit":i.credentials="same-origin",i}function r(o){if(o.ep)return;o.ep=!0;const i=n(o);fetch(o.href,i)}};AS();var Fg=typeof globalThis!="undefined"?globalThis:typeof window!="undefined"?window:typeof global!="undefined"?global:typeof self!="undefined"?self:{};function Ug(e){return e&&e.__esModule&&Object.prototype.hasOwnProperty.call(e,"default")?e.default:e}function Bg(e){var t=e.default;if(typeof t=="function"){var n=function(){return t.apply(this,arguments)};n.prototype=t.prototype}else n={};return Object.defineProperty(n,"__esModule",{value:!0}),Object.keys(e).forEach(function(r){var o=Object.getOwnPropertyDescriptor(e,r);Object.defineProperty(n,r,o.get?o:{enumerable:!0,get:function(){return e[r]}})}),n}var j={exports:{}},se={};/* -object-assign -(c) Sindre Sorhus -@license MIT -*/var Ch=Object.getOwnPropertySymbols,xS=Object.prototype.hasOwnProperty,OS=Object.prototype.propertyIsEnumerable;function _S(e){if(e==null)throw new TypeError("Object.assign cannot be called with null or undefined");return Object(e)}function PS(){try{if(!Object.assign)return!1;var e=new String("abc");if(e[5]="de",Object.getOwnPropertyNames(e)[0]==="5")return!1;for(var t={},n=0;n<10;n++)t["_"+String.fromCharCode(n)]=n;var r=Object.getOwnPropertyNames(t).map(function(i){return t[i]});if(r.join("")!=="0123456789")return!1;var o={};return"abcdefghijklmnopqrst".split("").forEach(function(i){o[i]=i}),Object.keys(Object.assign({},o)).join("")==="abcdefghijklmnopqrst"}catch(i){return!1}}var jg=PS()?Object.assign:function(e,t){for(var n,r=_S(e),o,i=1;i=w},o=function(){},e.unstable_forceFrameRate=function(R){0>R||125>>1,ue=R[le];if(ue!==void 0&&0b(Fe,V))rt!==void 0&&0>b(rt,Fe)?(R[le]=rt,R[Ue]=V,le=Ue):(R[le]=Fe,R[ze]=V,le=ze);else if(rt!==void 0&&0>b(rt,V))R[le]=rt,R[Ue]=V,le=Ue;else break e}}return Y}return null}function b(R,Y){var V=R.sortIndex-Y.sortIndex;return V!==0?V:R.id-Y.id}var E=[],x=[],_=1,k=null,D=3,B=!1,q=!1,H=!1;function ce(R){for(var Y=C(x);Y!==null;){if(Y.callback===null)O(x);else if(Y.startTime<=R)O(x),Y.sortIndex=Y.expirationTime,T(E,Y);else break;Y=C(x)}}function he(R){if(H=!1,ce(R),!q)if(C(E)!==null)q=!0,t(ye);else{var Y=C(x);Y!==null&&n(he,Y.startTime-R)}}function ye(R,Y){q=!1,H&&(H=!1,r()),B=!0;var V=D;try{for(ce(Y),k=C(E);k!==null&&(!(k.expirationTime>Y)||R&&!e.unstable_shouldYield());){var le=k.callback;if(typeof le=="function"){k.callback=null,D=k.priorityLevel;var ue=le(k.expirationTime<=Y);Y=e.unstable_now(),typeof ue=="function"?k.callback=ue:k===C(E)&&O(E),ce(Y)}else O(E);k=C(E)}if(k!==null)var ze=!0;else{var Fe=C(x);Fe!==null&&n(he,Fe.startTime-Y),ze=!1}return ze}finally{k=null,D=V,B=!1}}var ne=o;e.unstable_IdlePriority=5,e.unstable_ImmediatePriority=1,e.unstable_LowPriority=4,e.unstable_NormalPriority=3,e.unstable_Profiling=null,e.unstable_UserBlockingPriority=2,e.unstable_cancelCallback=function(R){R.callback=null},e.unstable_continueExecution=function(){q||B||(q=!0,t(ye))},e.unstable_getCurrentPriorityLevel=function(){return D},e.unstable_getFirstCallbackNode=function(){return C(E)},e.unstable_next=function(R){switch(D){case 1:case 2:case 3:var Y=3;break;default:Y=D}var V=D;D=Y;try{return R()}finally{D=V}},e.unstable_pauseExecution=function(){},e.unstable_requestPaint=ne,e.unstable_runWithPriority=function(R,Y){switch(R){case 1:case 2:case 3:case 4:case 5:break;default:R=3}var V=D;D=R;try{return Y()}finally{D=V}},e.unstable_scheduleCallback=function(R,Y,V){var le=e.unstable_now();switch(typeof V=="object"&&V!==null?(V=V.delay,V=typeof V=="number"&&0le?(R.sortIndex=V,T(x,R),C(E)===null&&R===C(x)&&(H?r():H=!0,n(he,V-le))):(R.sortIndex=ue,T(E,R),q||B||(q=!0,t(ye))),R},e.unstable_wrapCallback=function(R){var Y=D;return function(){var V=D;D=Y;try{return R.apply(this,arguments)}finally{D=V}}}})(ty);(function(e){e.exports=ty})(ey);/** @license React v17.0.2 - * react-dom.production.min.js - * - * Copyright (c) Facebook, Inc. and its affiliates. - * - * This source code is licensed under the MIT license found in the - * LICENSE file in the root directory of this source tree. - */var Xl=j.exports,xe=jg,je=ey.exports;function L(e){for(var t="https://reactjs.org/docs/error-decoder.html?invariant="+e,n=1;nt}return!1}function st(e,t,n,r,o,i,a){this.acceptsBooleans=t===2||t===3||t===4,this.attributeName=r,this.attributeNamespace=o,this.mustUseProperty=n,this.propertyName=e,this.type=t,this.sanitizeURL=i,this.removeEmptyString=a}var Je={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(e){Je[e]=new st(e,0,!1,e,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(e){var t=e[0];Je[t]=new st(t,1,!1,e[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(e){Je[e]=new st(e,2,!1,e.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(e){Je[e]=new st(e,2,!1,e,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(e){Je[e]=new st(e,3,!1,e.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(e){Je[e]=new st(e,3,!0,e,null,!1,!1)});["capture","download"].forEach(function(e){Je[e]=new st(e,4,!1,e,null,!1,!1)});["cols","rows","size","span"].forEach(function(e){Je[e]=new st(e,6,!1,e,null,!1,!1)});["rowSpan","start"].forEach(function(e){Je[e]=new st(e,5,!1,e.toLowerCase(),null,!1,!1)});var md=/[\-:]([a-z])/g;function vd(e){return e[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(e){var t=e.replace(md,vd);Je[t]=new st(t,1,!1,e,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!1,!1)});Je.xlinkHref=new st("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(e){Je[e]=new st(e,1,!1,e.toLowerCase(),null,!0,!0)});function gd(e,t,n,r){var o=Je.hasOwnProperty(t)?Je[t]:null,i=o!==null?o.type===0:r?!1:!(!(2s||o[a]!==i[s])return` -`+o[a].replace(" at new "," at ");while(1<=a&&0<=s);break}}}finally{Vu=!1,Error.prepareStackTrace=n}return(e=e?e.displayName||e.name:"")?Ii(e):""}function US(e){switch(e.tag){case 5:return Ii(e.type);case 16:return Ii("Lazy");case 13:return Ii("Suspense");case 19:return Ii("SuspenseList");case 0:case 2:case 15:return e=ps(e.type,!1),e;case 11:return e=ps(e.type.render,!1),e;case 22:return e=ps(e.type._render,!1),e;case 1:return e=ps(e.type,!0),e;default:return""}}function po(e){if(e==null)return null;if(typeof e=="function")return e.displayName||e.name||null;if(typeof e=="string")return e;switch(e){case Bn:return"Fragment";case Or:return"Portal";case ji:return"Profiler";case yd:return"StrictMode";case Wi:return"Suspense";case tl:return"SuspenseList"}if(typeof e=="object")switch(e.$$typeof){case Sd:return(e.displayName||"Context")+".Consumer";case wd:return(e._context.displayName||"Context")+".Provider";case Kl:var t=e.render;return t=t.displayName||t.name||"",e.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case ql:return po(e.type);case Ed:return po(e._render);case bd:t=e._payload,e=e._init;try{return po(e(t))}catch(n){}}return null}function ir(e){switch(typeof e){case"boolean":case"number":case"object":case"string":case"undefined":return e;default:return""}}function oy(e){var t=e.type;return(e=e.nodeName)&&e.toLowerCase()==="input"&&(t==="checkbox"||t==="radio")}function BS(e){var t=oy(e)?"checked":"value",n=Object.getOwnPropertyDescriptor(e.constructor.prototype,t),r=""+e[t];if(!e.hasOwnProperty(t)&&typeof n!="undefined"&&typeof n.get=="function"&&typeof n.set=="function"){var o=n.get,i=n.set;return Object.defineProperty(e,t,{configurable:!0,get:function(){return o.call(this)},set:function(a){r=""+a,i.call(this,a)}}),Object.defineProperty(e,t,{enumerable:n.enumerable}),{getValue:function(){return r},setValue:function(a){r=""+a},stopTracking:function(){e._valueTracker=null,delete e[t]}}}}function hs(e){e._valueTracker||(e._valueTracker=BS(e))}function iy(e){if(!e)return!1;var t=e._valueTracker;if(!t)return!0;var n=t.getValue(),r="";return e&&(r=oy(e)?e.checked?"true":"false":e.value),e=r,e!==n?(t.setValue(e),!0):!1}function nl(e){if(e=e||(typeof document!="undefined"?document:void 0),typeof e=="undefined")return null;try{return e.activeElement||e.body}catch(t){return e.body}}function Gc(e,t){var n=t.checked;return xe({},t,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:n!=null?n:e._wrapperState.initialChecked})}function Th(e,t){var n=t.defaultValue==null?"":t.defaultValue,r=t.checked!=null?t.checked:t.defaultChecked;n=ir(t.value!=null?t.value:n),e._wrapperState={initialChecked:r,initialValue:n,controlled:t.type==="checkbox"||t.type==="radio"?t.checked!=null:t.value!=null}}function ay(e,t){t=t.checked,t!=null&&gd(e,"checked",t,!1)}function $c(e,t){ay(e,t);var n=ir(t.value),r=t.type;if(n!=null)r==="number"?(n===0&&e.value===""||e.value!=n)&&(e.value=""+n):e.value!==""+n&&(e.value=""+n);else if(r==="submit"||r==="reset"){e.removeAttribute("value");return}t.hasOwnProperty("value")?Hc(e,t.type,n):t.hasOwnProperty("defaultValue")&&Hc(e,t.type,ir(t.defaultValue)),t.checked==null&&t.defaultChecked!=null&&(e.defaultChecked=!!t.defaultChecked)}function Ih(e,t,n){if(t.hasOwnProperty("value")||t.hasOwnProperty("defaultValue")){var r=t.type;if(!(r!=="submit"&&r!=="reset"||t.value!==void 0&&t.value!==null))return;t=""+e._wrapperState.initialValue,n||t===e.value||(e.value=t),e.defaultValue=t}n=e.name,n!==""&&(e.name=""),e.defaultChecked=!!e._wrapperState.initialChecked,n!==""&&(e.name=n)}function Hc(e,t,n){(t!=="number"||nl(e.ownerDocument)!==e)&&(n==null?e.defaultValue=""+e._wrapperState.initialValue:e.defaultValue!==""+n&&(e.defaultValue=""+n))}function jS(e){var t="";return Xl.Children.forEach(e,function(n){n!=null&&(t+=n)}),t}function Vc(e,t){return e=xe({children:void 0},t),(t=jS(t.children))&&(e.children=t),e}function ho(e,t,n,r){if(e=e.options,t){t={};for(var o=0;o=n.length))throw Error(L(93));n=n[0]}t=n}t==null&&(t=""),n=t}e._wrapperState={initialValue:ir(n)}}function sy(e,t){var n=ir(t.value),r=ir(t.defaultValue);n!=null&&(n=""+n,n!==e.value&&(e.value=n),t.defaultValue==null&&e.defaultValue!==n&&(e.defaultValue=n)),r!=null&&(e.defaultValue=""+r)}function Dh(e){var t=e.textContent;t===e._wrapperState.initialValue&&t!==""&&t!==null&&(e.value=t)}var Qc={html:"http://www.w3.org/1999/xhtml",mathml:"http://www.w3.org/1998/Math/MathML",svg:"http://www.w3.org/2000/svg"};function ly(e){switch(e){case"svg":return"http://www.w3.org/2000/svg";case"math":return"http://www.w3.org/1998/Math/MathML";default:return"http://www.w3.org/1999/xhtml"}}function Xc(e,t){return e==null||e==="http://www.w3.org/1999/xhtml"?ly(t):e==="http://www.w3.org/2000/svg"&&t==="foreignObject"?"http://www.w3.org/1999/xhtml":e}var ms,uy=function(e){return typeof MSApp!="undefined"&&MSApp.execUnsafeLocalFunction?function(t,n,r,o){MSApp.execUnsafeLocalFunction(function(){return e(t,n,r,o)})}:e}(function(e,t){if(e.namespaceURI!==Qc.svg||"innerHTML"in e)e.innerHTML=t;else{for(ms=ms||document.createElement("div"),ms.innerHTML=""+t.valueOf().toString()+"",t=ms.firstChild;e.firstChild;)e.removeChild(e.firstChild);for(;t.firstChild;)e.appendChild(t.firstChild)}});function la(e,t){if(t){var n=e.firstChild;if(n&&n===e.lastChild&&n.nodeType===3){n.nodeValue=t;return}}e.textContent=t}var Yi={animationIterationCount:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},WS=["Webkit","ms","Moz","O"];Object.keys(Yi).forEach(function(e){WS.forEach(function(t){t=t+e.charAt(0).toUpperCase()+e.substring(1),Yi[t]=Yi[e]})});function cy(e,t,n){return t==null||typeof t=="boolean"||t===""?"":n||typeof t!="number"||t===0||Yi.hasOwnProperty(e)&&Yi[e]?(""+t).trim():t+"px"}function fy(e,t){e=e.style;for(var n in t)if(t.hasOwnProperty(n)){var r=n.indexOf("--")===0,o=cy(n,t[n],r);n==="float"&&(n="cssFloat"),r?e.setProperty(n,o):e[n]=o}}var YS=xe({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Kc(e,t){if(t){if(YS[e]&&(t.children!=null||t.dangerouslySetInnerHTML!=null))throw Error(L(137,e));if(t.dangerouslySetInnerHTML!=null){if(t.children!=null)throw Error(L(60));if(!(typeof t.dangerouslySetInnerHTML=="object"&&"__html"in t.dangerouslySetInnerHTML))throw Error(L(61))}if(t.style!=null&&typeof t.style!="object")throw Error(L(62))}}function qc(e,t){if(e.indexOf("-")===-1)return typeof t.is=="string";switch(e){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}function xd(e){return e=e.target||e.srcElement||window,e.correspondingUseElement&&(e=e.correspondingUseElement),e.nodeType===3?e.parentNode:e}var Zc=null,mo=null,vo=null;function Rh(e){if(e=Ra(e)){if(typeof Zc!="function")throw Error(L(280));var t=e.stateNode;t&&(t=ou(t),Zc(e.stateNode,e.type,t))}}function dy(e){mo?vo?vo.push(e):vo=[e]:mo=e}function py(){if(mo){var e=mo,t=vo;if(vo=mo=null,Rh(e),t)for(e=0;er?0:1<n;n++)t.push(e);return t}function eu(e,t,n){e.pendingLanes|=t;var r=t-1;e.suspendedLanes&=r,e.pingedLanes&=r,e=e.eventTimes,t=31-ar(t),e[t]=n}var ar=Math.clz32?Math.clz32:ob,nb=Math.log,rb=Math.LN2;function ob(e){return e===0?32:31-(nb(e)/rb|0)|0}var ib=je.unstable_UserBlockingPriority,ab=je.unstable_runWithPriority,Ls=!0;function sb(e,t,n,r){_r||_d();var o=Nd,i=_r;_r=!0;try{hy(o,e,t,n,r)}finally{(_r=i)||Pd()}}function lb(e,t,n,r){ab(ib,Nd.bind(null,e,t,n,r))}function Nd(e,t,n,r){if(Ls){var o;if((o=(t&4)===0)&&0=Gi),Gh=String.fromCharCode(32),$h=!1;function Iy(e,t){switch(e){case"keyup":return Ib.indexOf(t.keyCode)!==-1;case"keydown":return t.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function Ny(e){return e=e.detail,typeof e=="object"&&"data"in e?e.data:null}var io=!1;function Db(e,t){switch(e){case"compositionend":return Ny(t);case"keypress":return t.which!==32?null:($h=!0,Gh);case"textInput":return e=t.data,e===Gh&&$h?null:e;default:return null}}function Rb(e,t){if(io)return e==="compositionend"||!Fd&&Iy(e,t)?(e=ky(),Ms=Rd=zn=null,io=!1,e):null;switch(e){case"paste":return null;case"keypress":if(!(t.ctrlKey||t.altKey||t.metaKey)||t.ctrlKey&&t.altKey){if(t.char&&1=t)return{node:n,offset:t-e};e=r}e:{for(;n;){if(n.nextSibling){n=n.nextSibling;break e}n=n.parentNode}n=void 0}n=Qh(n)}}function My(e,t){return e&&t?e===t?!0:e&&e.nodeType===3?!1:t&&t.nodeType===3?My(e,t.parentNode):"contains"in e?e.contains(t):e.compareDocumentPosition?!!(e.compareDocumentPosition(t)&16):!1:!1}function Kh(){for(var e=window,t=nl();t instanceof e.HTMLIFrameElement;){try{var n=typeof t.contentWindow.location.href=="string"}catch(r){n=!1}if(n)e=t.contentWindow;else break;t=nl(e.document)}return t}function of(e){var t=e&&e.nodeName&&e.nodeName.toLowerCase();return t&&(t==="input"&&(e.type==="text"||e.type==="search"||e.type==="tel"||e.type==="url"||e.type==="password")||t==="textarea"||e.contentEditable==="true")}var Gb=In&&"documentMode"in document&&11>=document.documentMode,ao=null,af=null,Hi=null,sf=!1;function qh(e,t,n){var r=n.window===n?n.document:n.nodeType===9?n:n.ownerDocument;sf||ao==null||ao!==nl(r)||(r=ao,"selectionStart"in r&&of(r)?r={start:r.selectionStart,end:r.selectionEnd}:(r=(r.ownerDocument&&r.ownerDocument.defaultView||window).getSelection(),r={anchorNode:r.anchorNode,anchorOffset:r.anchorOffset,focusNode:r.focusNode,focusOffset:r.focusOffset}),Hi&&ha(Hi,r)||(Hi=r,r=al(af,"onSelect"),0lo||(e.current=uf[lo],uf[lo]=null,lo--)}function Ne(e,t){lo++,uf[lo]=e.current,e.current=t}var sr={},nt=hr(sr),gt=hr(!1),Rr=sr;function ko(e,t){var n=e.type.contextTypes;if(!n)return sr;var r=e.stateNode;if(r&&r.__reactInternalMemoizedUnmaskedChildContext===t)return r.__reactInternalMemoizedMaskedChildContext;var o={},i;for(i in n)o[i]=t[i];return r&&(e=e.stateNode,e.__reactInternalMemoizedUnmaskedChildContext=t,e.__reactInternalMemoizedMaskedChildContext=o),o}function yt(e){return e=e.childContextTypes,e!=null}function ul(){Se(gt),Se(nt)}function sm(e,t,n){if(nt.current!==sr)throw Error(L(168));Ne(nt,t),Ne(gt,n)}function Gy(e,t,n){var r=e.stateNode;if(e=t.childContextTypes,typeof r.getChildContext!="function")return n;r=r.getChildContext();for(var o in r)if(!(o in e))throw Error(L(108,po(t)||"Unknown",o));return xe({},n,r)}function Us(e){return e=(e=e.stateNode)&&e.__reactInternalMemoizedMergedChildContext||sr,Rr=nt.current,Ne(nt,e),Ne(gt,gt.current),!0}function lm(e,t,n){var r=e.stateNode;if(!r)throw Error(L(169));n?(e=Gy(e,t,Rr),r.__reactInternalMemoizedMergedChildContext=e,Se(gt),Se(nt),Ne(nt,e)):Se(gt),Ne(gt,n)}var Bd=null,Ir=null,Vb=je.unstable_runWithPriority,jd=je.unstable_scheduleCallback,cf=je.unstable_cancelCallback,Jb=je.unstable_shouldYield,um=je.unstable_requestPaint,ff=je.unstable_now,Qb=je.unstable_getCurrentPriorityLevel,iu=je.unstable_ImmediatePriority,$y=je.unstable_UserBlockingPriority,Hy=je.unstable_NormalPriority,Vy=je.unstable_LowPriority,Jy=je.unstable_IdlePriority,ac={},Xb=um!==void 0?um:function(){},En=null,Bs=null,sc=!1,cm=ff(),et=1e4>cm?ff:function(){return ff()-cm};function To(){switch(Qb()){case iu:return 99;case $y:return 98;case Hy:return 97;case Vy:return 96;case Jy:return 95;default:throw Error(L(332))}}function Qy(e){switch(e){case 99:return iu;case 98:return $y;case 97:return Hy;case 96:return Vy;case 95:return Jy;default:throw Error(L(332))}}function Lr(e,t){return e=Qy(e),Vb(e,t)}function va(e,t,n){return e=Qy(e),jd(e,t,n)}function Sn(){if(Bs!==null){var e=Bs;Bs=null,cf(e)}Xy()}function Xy(){if(!sc&&En!==null){sc=!0;var e=0;try{var t=En;Lr(99,function(){for(;eO?(b=C,C=null):b=C.sibling;var E=d(h,C,w[O],S);if(E===null){C===null&&(C=b);break}e&&C&&E.alternate===null&&t(h,C),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E,C=b}if(O===w.length)return n(h,C),A;if(C===null){for(;OO?(b=C,C=null):b=C.sibling;var x=d(h,C,E.value,S);if(x===null){C===null&&(C=b);break}e&&C&&x.alternate===null&&t(h,C),v=i(x,v,O),T===null?A=x:T.sibling=x,T=x,C=b}if(E.done)return n(h,C),A;if(C===null){for(;!E.done;O++,E=w.next())E=f(h,E.value,S),E!==null&&(v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return A}for(C=r(h,C);!E.done;O++,E=w.next())E=p(C,h,O,E.value,S),E!==null&&(e&&E.alternate!==null&&C.delete(E.key===null?O:E.key),v=i(E,v,O),T===null?A=E:T.sibling=E,T=E);return e&&C.forEach(function(_){return t(h,_)}),A}return function(h,v,w,S){var A=typeof w=="object"&&w!==null&&w.type===Bn&&w.key===null;A&&(w=w.props.children);var T=typeof w=="object"&&w!==null;if(T)switch(w.$$typeof){case Ti:e:{for(T=w.key,A=v;A!==null;){if(A.key===T){switch(A.tag){case 7:if(w.type===Bn){n(h,A.sibling),v=o(A,w.props.children),v.return=h,h=v;break e}break;default:if(A.elementType===w.type){n(h,A.sibling),v=o(A,w.props),v.ref=ci(h,A,w),v.return=h,h=v;break e}}n(h,A);break}else t(h,A);A=A.sibling}w.type===Bn?(v=Eo(w.props.children,h.mode,S,w.key),v.return=h,h=v):(S=zs(w.type,w.key,w.props,null,h.mode,S),S.ref=ci(h,v,w),S.return=h,h=S)}return a(h);case Or:e:{for(A=w.key;v!==null;){if(v.key===A)if(v.tag===4&&v.stateNode.containerInfo===w.containerInfo&&v.stateNode.implementation===w.implementation){n(h,v.sibling),v=o(v,w.children||[]),v.return=h,h=v;break e}else{n(h,v);break}else t(h,v);v=v.sibling}v=pc(w,h.mode,S),v.return=h,h=v}return a(h)}if(typeof w=="string"||typeof w=="number")return w=""+w,v!==null&&v.tag===6?(n(h,v.sibling),v=o(v,w),v.return=h,h=v):(n(h,v),v=dc(w,h.mode,S),v.return=h,h=v),a(h);if(ys(w))return m(h,v,w,S);if(oi(w))return y(h,v,w,S);if(T&&ws(h,w),typeof w=="undefined"&&!A)switch(h.tag){case 1:case 22:case 0:case 11:case 15:throw Error(L(152,po(h.type)||"Component"))}return n(h,v)}}var hl=t0(!0),n0=t0(!1),La={},fn=hr(La),ya=hr(La),wa=hr(La);function kr(e){if(e===La)throw Error(L(174));return e}function pf(e,t){switch(Ne(wa,t),Ne(ya,e),Ne(fn,La),e=t.nodeType,e){case 9:case 11:t=(t=t.documentElement)?t.namespaceURI:Xc(null,"");break;default:e=e===8?t.parentNode:t,t=e.namespaceURI||null,e=e.tagName,t=Xc(t,e)}Se(fn),Ne(fn,t)}function Io(){Se(fn),Se(ya),Se(wa)}function mm(e){kr(wa.current);var t=kr(fn.current),n=Xc(t,e.type);t!==n&&(Ne(ya,e),Ne(fn,n))}function Gd(e){ya.current===e&&(Se(fn),Se(ya))}var Ie=hr(0);function ml(e){for(var t=e;t!==null;){if(t.tag===13){var n=t.memoizedState;if(n!==null&&(n=n.dehydrated,n===null||n.data==="$?"||n.data==="$!"))return t}else if(t.tag===19&&t.memoizedProps.revealOrder!==void 0){if((t.flags&64)!==0)return t}else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===e)break;for(;t.sibling===null;){if(t.return===null||t.return===e)return null;t=t.return}t.sibling.return=t.return,t=t.sibling}return null}var xn=null,$n=null,dn=!1;function r0(e,t){var n=Lt(5,null,null,0);n.elementType="DELETED",n.type="DELETED",n.stateNode=t,n.return=e,n.flags=8,e.lastEffect!==null?(e.lastEffect.nextEffect=n,e.lastEffect=n):e.firstEffect=e.lastEffect=n}function vm(e,t){switch(e.tag){case 5:var n=e.type;return t=t.nodeType!==1||n.toLowerCase()!==t.nodeName.toLowerCase()?null:t,t!==null?(e.stateNode=t,!0):!1;case 6:return t=e.pendingProps===""||t.nodeType!==3?null:t,t!==null?(e.stateNode=t,!0):!1;case 13:return!1;default:return!1}}function hf(e){if(dn){var t=$n;if(t){var n=t;if(!vm(e,t)){if(t=go(n.nextSibling),!t||!vm(e,t)){e.flags=e.flags&-1025|2,dn=!1,xn=e;return}r0(xn,n)}xn=e,$n=go(t.firstChild)}else e.flags=e.flags&-1025|2,dn=!1,xn=e}}function gm(e){for(e=e.return;e!==null&&e.tag!==5&&e.tag!==3&&e.tag!==13;)e=e.return;xn=e}function Ss(e){if(e!==xn)return!1;if(!dn)return gm(e),dn=!0,!1;var t=e.type;if(e.tag!==5||t!=="head"&&t!=="body"&&!lf(t,e.memoizedProps))for(t=$n;t;)r0(e,t),t=go(t.nextSibling);if(gm(e),e.tag===13){if(e=e.memoizedState,e=e!==null?e.dehydrated:null,!e)throw Error(L(317));e:{for(e=e.nextSibling,t=0;e;){if(e.nodeType===8){var n=e.data;if(n==="/$"){if(t===0){$n=go(e.nextSibling);break e}t--}else n!=="$"&&n!=="$!"&&n!=="$?"||t++}e=e.nextSibling}$n=null}}else $n=xn?go(e.stateNode.nextSibling):null;return!0}function lc(){$n=xn=null,dn=!1}var wo=[];function $d(){for(var e=0;ei))throw Error(L(301));i+=1,He=Ke=null,t.updateQueue=null,Vi.current=tE,e=n(r,o)}while(Ji)}if(Vi.current=Sl,t=Ke!==null&&Ke.next!==null,Sa=0,He=Ke=De=null,vl=!1,t)throw Error(L(300));return e}function Tr(){var e={memoizedState:null,baseState:null,baseQueue:null,queue:null,next:null};return He===null?De.memoizedState=He=e:He=He.next=e,He}function Gr(){if(Ke===null){var e=De.alternate;e=e!==null?e.memoizedState:null}else e=Ke.next;var t=He===null?De.memoizedState:He.next;if(t!==null)He=t,Ke=e;else{if(e===null)throw Error(L(310));Ke=e,e={memoizedState:Ke.memoizedState,baseState:Ke.baseState,baseQueue:Ke.baseQueue,queue:Ke.queue,next:null},He===null?De.memoizedState=He=e:He=He.next=e}return He}function ln(e,t){return typeof t=="function"?t(e):t}function fi(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=Ke,o=r.baseQueue,i=n.pending;if(i!==null){if(o!==null){var a=o.next;o.next=i.next,i.next=a}r.baseQueue=o=i,n.pending=null}if(o!==null){o=o.next,r=r.baseState;var s=a=i=null,l=o;do{var u=l.lane;if((Sa&u)===u)s!==null&&(s=s.next={lane:0,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null}),r=l.eagerReducer===e?l.eagerState:e(r,l.action);else{var c={lane:u,action:l.action,eagerReducer:l.eagerReducer,eagerState:l.eagerState,next:null};s===null?(a=s=c,i=r):s=s.next=c,De.lanes|=u,Ma|=u}l=l.next}while(l!==null&&l!==o);s===null?i=r:s.next=a,Rt(r,t.memoizedState)||(Zt=!0),t.memoizedState=r,t.baseState=i,t.baseQueue=s,n.lastRenderedState=r}return[t.memoizedState,n.dispatch]}function di(e){var t=Gr(),n=t.queue;if(n===null)throw Error(L(311));n.lastRenderedReducer=e;var r=n.dispatch,o=n.pending,i=t.memoizedState;if(o!==null){n.pending=null;var a=o=o.next;do i=e(i,a.action),a=a.next;while(a!==o);Rt(i,t.memoizedState)||(Zt=!0),t.memoizedState=i,t.baseQueue===null&&(t.baseState=i),n.lastRenderedState=i}return[i,r]}function ym(e,t,n){var r=t._getVersion;r=r(t._source);var o=t._workInProgressVersionPrimary;if(o!==null?e=o===r:(e=e.mutableReadLanes,(e=(Sa&e)===e)&&(t._workInProgressVersionPrimary=r,wo.push(t))),e)return n(t._source);throw wo.push(t),Error(L(350))}function o0(e,t,n,r){var o=at;if(o===null)throw Error(L(349));var i=t._getVersion,a=i(t._source),s=Vi.current,l=s.useState(function(){return ym(o,t,n)}),u=l[1],c=l[0];l=He;var f=e.memoizedState,d=f.refs,p=d.getSnapshot,m=f.source;f=f.subscribe;var y=De;return e.memoizedState={refs:d,source:t,subscribe:r},s.useEffect(function(){d.getSnapshot=n,d.setSnapshot=u;var h=i(t._source);if(!Rt(a,h)){h=n(t._source),Rt(c,h)||(u(h),h=Zn(y),o.mutableReadLanes|=h&o.pendingLanes),h=o.mutableReadLanes,o.entangledLanes|=h;for(var v=o.entanglements,w=h;0n?98:n,function(){e(!0)}),Lr(97<\/script>",e=e.removeChild(e.firstChild)):typeof r.is=="string"?e=a.createElement(n,{is:r.is}):(e=a.createElement(n),n==="select"&&(a=e,r.multiple?a.multiple=!0:r.size&&(a.size=r.size))):e=a.createElementNS(e,n),e[Gn]=t,e[ll]=r,p0(e,t,!1,!1),t.stateNode=e,a=qc(n,r),n){case"dialog":we("cancel",e),we("close",e),o=r;break;case"iframe":case"object":case"embed":we("load",e),o=r;break;case"video":case"audio":for(o=0;oAf&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432)}else{if(!i)if(e=ml(a),e!==null){if(t.flags|=64,i=!0,n=e.updateQueue,n!==null&&(t.updateQueue=n,t.flags|=4),hi(r,!0),r.tail===null&&r.tailMode==="hidden"&&!a.alternate&&!dn)return t=t.lastEffect=r.lastEffect,t!==null&&(t.nextEffect=null),null}else 2*et()-r.renderingStartTime>Af&&n!==1073741824&&(t.flags|=64,i=!0,hi(r,!1),t.lanes=33554432);r.isBackwards?(a.sibling=t.child,t.child=a):(n=r.last,n!==null?n.sibling=a:t.child=a,r.last=a)}return r.tail!==null?(n=r.tail,r.rendering=n,r.tail=n.sibling,r.lastEffect=t.lastEffect,r.renderingStartTime=et(),n.sibling=null,t=Ie.current,Ne(Ie,i?t&1|2:t&1),n):null;case 23:case 24:return tp(),e!==null&&e.memoizedState!==null!=(t.memoizedState!==null)&&r.mode!=="unstable-defer-without-hiding"&&(t.flags|=4),null}throw Error(L(156,t.tag))}function oE(e){switch(e.tag){case 1:yt(e.type)&&ul();var t=e.flags;return t&4096?(e.flags=t&-4097|64,e):null;case 3:if(Io(),Se(gt),Se(nt),$d(),t=e.flags,(t&64)!==0)throw Error(L(285));return e.flags=t&-4097|64,e;case 5:return Gd(e),null;case 13:return Se(Ie),t=e.flags,t&4096?(e.flags=t&-4097|64,e):null;case 19:return Se(Ie),null;case 4:return Io(),null;case 10:return Yd(e),null;case 23:case 24:return tp(),null;default:return null}}function Kd(e,t){try{var n="",r=t;do n+=US(r),r=r.return;while(r);var o=n}catch(i){o=` -Error generating stack: `+i.message+` -`+i.stack}return{value:e,source:t,stack:o}}function wf(e,t){try{console.error(t.value)}catch(n){setTimeout(function(){throw n})}}var iE=typeof WeakMap=="function"?WeakMap:Map;function v0(e,t,n){n=Kn(-1,n),n.tag=3,n.payload={element:null};var r=t.value;return n.callback=function(){El||(El=!0,xf=r),wf(e,t)},n}function g0(e,t,n){n=Kn(-1,n),n.tag=3;var r=e.type.getDerivedStateFromError;if(typeof r=="function"){var o=t.value;n.payload=function(){return wf(e,t),r(o)}}var i=e.stateNode;return i!==null&&typeof i.componentDidCatch=="function"&&(n.callback=function(){typeof r!="function"&&(un===null?un=new Set([this]):un.add(this),wf(e,t));var a=t.stack;this.componentDidCatch(t.value,{componentStack:a!==null?a:""})}),n}var aE=typeof WeakSet=="function"?WeakSet:Set;function Im(e){var t=e.ref;if(t!==null)if(typeof t=="function")try{t(null)}catch(n){tr(e,n)}else t.current=null}function sE(e,t){switch(t.tag){case 0:case 11:case 15:case 22:return;case 1:if(t.flags&256&&e!==null){var n=e.memoizedProps,r=e.memoizedState;e=t.stateNode,t=e.getSnapshotBeforeUpdate(t.elementType===t.type?n:Qt(t.type,n),r),e.__reactInternalSnapshotBeforeUpdate=t}return;case 3:t.flags&256&&Ud(t.stateNode.containerInfo);return;case 5:case 6:case 4:case 17:return}throw Error(L(163))}function lE(e,t,n){switch(n.tag){case 0:case 11:case 15:case 22:if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{if((e.tag&3)===3){var r=e.create;e.destroy=r()}e=e.next}while(e!==t)}if(t=n.updateQueue,t=t!==null?t.lastEffect:null,t!==null){e=t=t.next;do{var o=e;r=o.next,o=o.tag,(o&4)!==0&&(o&1)!==0&&(O0(n,e),vE(n,e)),e=r}while(e!==t)}return;case 1:e=n.stateNode,n.flags&4&&(t===null?e.componentDidMount():(r=n.elementType===n.type?t.memoizedProps:Qt(n.type,t.memoizedProps),e.componentDidUpdate(r,t.memoizedState,e.__reactInternalSnapshotBeforeUpdate))),t=n.updateQueue,t!==null&&dm(n,t,e);return;case 3:if(t=n.updateQueue,t!==null){if(e=null,n.child!==null)switch(n.child.tag){case 5:e=n.child.stateNode;break;case 1:e=n.child.stateNode}dm(n,t,e)}return;case 5:e=n.stateNode,t===null&&n.flags&4&&Yy(n.type,n.memoizedProps)&&e.focus();return;case 6:return;case 4:return;case 12:return;case 13:n.memoizedState===null&&(n=n.alternate,n!==null&&(n=n.memoizedState,n!==null&&(n=n.dehydrated,n!==null&&by(n))));return;case 19:case 17:case 20:case 21:case 23:case 24:return}throw Error(L(163))}function Nm(e,t){for(var n=e;;){if(n.tag===5){var r=n.stateNode;if(t)r=r.style,typeof r.setProperty=="function"?r.setProperty("display","none","important"):r.display="none";else{r=n.stateNode;var o=n.memoizedProps.style;o=o!=null&&o.hasOwnProperty("display")?o.display:null,r.style.display=cy("display",o)}}else if(n.tag===6)n.stateNode.nodeValue=t?"":n.memoizedProps;else if((n.tag!==23&&n.tag!==24||n.memoizedState===null||n===e)&&n.child!==null){n.child.return=n,n=n.child;continue}if(n===e)break;for(;n.sibling===null;){if(n.return===null||n.return===e)return;n=n.return}n.sibling.return=n.return,n=n.sibling}}function Dm(e,t){if(Ir&&typeof Ir.onCommitFiberUnmount=="function")try{Ir.onCommitFiberUnmount(Bd,t)}catch(i){}switch(t.tag){case 0:case 11:case 14:case 15:case 22:if(e=t.updateQueue,e!==null&&(e=e.lastEffect,e!==null)){var n=e=e.next;do{var r=n,o=r.destroy;if(r=r.tag,o!==void 0)if((r&4)!==0)O0(t,n);else{r=t;try{o()}catch(i){tr(r,i)}}n=n.next}while(n!==e)}break;case 1:if(Im(t),e=t.stateNode,typeof e.componentWillUnmount=="function")try{e.props=t.memoizedProps,e.state=t.memoizedState,e.componentWillUnmount()}catch(i){tr(t,i)}break;case 5:Im(t);break;case 4:y0(e,t)}}function Rm(e){e.alternate=null,e.child=null,e.dependencies=null,e.firstEffect=null,e.lastEffect=null,e.memoizedProps=null,e.memoizedState=null,e.pendingProps=null,e.return=null,e.updateQueue=null}function Lm(e){return e.tag===5||e.tag===3||e.tag===4}function Mm(e){e:{for(var t=e.return;t!==null;){if(Lm(t))break e;t=t.return}throw Error(L(160))}var n=t;switch(t=n.stateNode,n.tag){case 5:var r=!1;break;case 3:t=t.containerInfo,r=!0;break;case 4:t=t.containerInfo,r=!0;break;default:throw Error(L(161))}n.flags&16&&(la(t,""),n.flags&=-17);e:t:for(n=e;;){for(;n.sibling===null;){if(n.return===null||Lm(n.return)){n=null;break e}n=n.return}for(n.sibling.return=n.return,n=n.sibling;n.tag!==5&&n.tag!==6&&n.tag!==18;){if(n.flags&2||n.child===null||n.tag===4)continue t;n.child.return=n,n=n.child}if(!(n.flags&2)){n=n.stateNode;break e}}r?Sf(e,n,t):bf(e,n,t)}function Sf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.nodeType===8?n.parentNode.insertBefore(e,t):n.insertBefore(e,t):(n.nodeType===8?(t=n.parentNode,t.insertBefore(e,n)):(t=n,t.appendChild(e)),n=n._reactRootContainer,n!=null||t.onclick!==null||(t.onclick=sl));else if(r!==4&&(e=e.child,e!==null))for(Sf(e,t,n),e=e.sibling;e!==null;)Sf(e,t,n),e=e.sibling}function bf(e,t,n){var r=e.tag,o=r===5||r===6;if(o)e=o?e.stateNode:e.stateNode.instance,t?n.insertBefore(e,t):n.appendChild(e);else if(r!==4&&(e=e.child,e!==null))for(bf(e,t,n),e=e.sibling;e!==null;)bf(e,t,n),e=e.sibling}function y0(e,t){for(var n=t,r=!1,o,i;;){if(!r){r=n.return;e:for(;;){if(r===null)throw Error(L(160));switch(o=r.stateNode,r.tag){case 5:i=!1;break e;case 3:o=o.containerInfo,i=!0;break e;case 4:o=o.containerInfo,i=!0;break e}r=r.return}r=!0}if(n.tag===5||n.tag===6){e:for(var a=e,s=n,l=s;;)if(Dm(a,l),l.child!==null&&l.tag!==4)l.child.return=l,l=l.child;else{if(l===s)break e;for(;l.sibling===null;){if(l.return===null||l.return===s)break e;l=l.return}l.sibling.return=l.return,l=l.sibling}i?(a=o,s=n.stateNode,a.nodeType===8?a.parentNode.removeChild(s):a.removeChild(s)):o.removeChild(n.stateNode)}else if(n.tag===4){if(n.child!==null){o=n.stateNode.containerInfo,i=!0,n.child.return=n,n=n.child;continue}}else if(Dm(e,n),n.child!==null){n.child.return=n,n=n.child;continue}if(n===t)break;for(;n.sibling===null;){if(n.return===null||n.return===t)return;n=n.return,n.tag===4&&(r=!1)}n.sibling.return=n.return,n=n.sibling}}function fc(e,t){switch(t.tag){case 0:case 11:case 14:case 15:case 22:var n=t.updateQueue;if(n=n!==null?n.lastEffect:null,n!==null){var r=n=n.next;do(r.tag&3)===3&&(e=r.destroy,r.destroy=void 0,e!==void 0&&e()),r=r.next;while(r!==n)}return;case 1:return;case 5:if(n=t.stateNode,n!=null){r=t.memoizedProps;var o=e!==null?e.memoizedProps:r;e=t.type;var i=t.updateQueue;if(t.updateQueue=null,i!==null){for(n[ll]=r,e==="input"&&r.type==="radio"&&r.name!=null&&ay(n,r),qc(e,o),t=qc(e,r),o=0;oo&&(o=a),n&=~i}if(n=o,n=et()-n,n=(120>n?120:480>n?480:1080>n?1080:1920>n?1920:3e3>n?3e3:4320>n?4320:1960*cE(n/1960))-n,10 component higher in the tree to provide a loading indicator or placeholder to display.`)}Ve!==5&&(Ve=2),l=Kd(l,s),d=a;do{switch(d.tag){case 3:i=l,d.flags|=4096,t&=-t,d.lanes|=t;var T=v0(d,i,t);fm(d,T);break e;case 1:i=l;var C=d.type,O=d.stateNode;if((d.flags&64)===0&&(typeof C.getDerivedStateFromError=="function"||O!==null&&typeof O.componentDidCatch=="function"&&(un===null||!un.has(O)))){d.flags|=4096,t&=-t,d.lanes|=t;var b=g0(d,i,t);fm(d,b);break e}}d=d.return}while(d!==null)}x0(n)}catch(E){t=E,Le===n&&n!==null&&(Le=n=n.return);continue}break}while(1)}function C0(){var e=bl.current;return bl.current=Sl,e===null?Sl:e}function Ri(e,t){var n=X;X|=16;var r=C0();at===e&&tt===t||bo(e,t);do try{dE();break}catch(o){E0(e,o)}while(1);if(Wd(),X=n,bl.current=r,Le!==null)throw Error(L(261));return at=null,tt=0,Ve}function dE(){for(;Le!==null;)A0(Le)}function pE(){for(;Le!==null&&!Jb();)A0(Le)}function A0(e){var t=_0(e.alternate,e,Mr);e.memoizedProps=e.pendingProps,t===null?x0(e):Le=t,qd.current=null}function x0(e){var t=e;do{var n=t.alternate;if(e=t.return,(t.flags&2048)===0){if(n=rE(n,t,Mr),n!==null){Le=n;return}if(n=t,n.tag!==24&&n.tag!==23||n.memoizedState===null||(Mr&1073741824)!==0||(n.mode&4)===0){for(var r=0,o=n.child;o!==null;)r|=o.lanes|o.childLanes,o=o.sibling;n.childLanes=r}e!==null&&(e.flags&2048)===0&&(e.firstEffect===null&&(e.firstEffect=t.firstEffect),t.lastEffect!==null&&(e.lastEffect!==null&&(e.lastEffect.nextEffect=t.firstEffect),e.lastEffect=t.lastEffect),1a&&(s=a,a=T,T=s),s=Xh(w,T),i=Xh(w,a),s&&i&&(A.rangeCount!==1||A.anchorNode!==s.node||A.anchorOffset!==s.offset||A.focusNode!==i.node||A.focusOffset!==i.offset)&&(S=S.createRange(),S.setStart(s.node,s.offset),A.removeAllRanges(),T>a?(A.addRange(S),A.extend(i.node,i.offset)):(S.setEnd(i.node,i.offset),A.addRange(S)))))),S=[],A=w;A=A.parentNode;)A.nodeType===1&&S.push({element:A,left:A.scrollLeft,top:A.scrollTop});for(typeof w.focus=="function"&&w.focus(),w=0;wet()-ep?bo(e,0):Zd|=n),jt(e,t)}function wE(e,t){var n=e.stateNode;n!==null&&n.delete(t),t=0,t===0&&(t=e.mode,(t&2)===0?t=1:(t&4)===0?t=To()===99?1:2:(An===0&&(An=Qo),t=eo(62914560&~An),t===0&&(t=4194304))),n=Ot(),e=lu(e,t),e!==null&&(eu(e,t,n),jt(e,n))}var _0;_0=function(e,t,n){var r=t.lanes;if(e!==null)if(e.memoizedProps!==t.pendingProps||gt.current)Zt=!0;else if((n&r)!==0)Zt=(e.flags&16384)!==0;else{switch(Zt=!1,t.tag){case 3:Am(t),lc();break;case 5:mm(t);break;case 1:yt(t.type)&&Us(t);break;case 4:pf(t,t.stateNode.containerInfo);break;case 10:r=t.memoizedProps.value;var o=t.type._context;Ne(cl,o._currentValue),o._currentValue=r;break;case 13:if(t.memoizedState!==null)return(n&t.child.childLanes)!==0?xm(e,t,n):(Ne(Ie,Ie.current&1),t=On(e,t,n),t!==null?t.sibling:null);Ne(Ie,Ie.current&1);break;case 19:if(r=(n&t.childLanes)!==0,(e.flags&64)!==0){if(r)return Tm(e,t,n);t.flags|=64}if(o=t.memoizedState,o!==null&&(o.rendering=null,o.tail=null,o.lastEffect=null),Ne(Ie,Ie.current),r)break;return null;case 23:case 24:return t.lanes=0,uc(e,t,n)}return On(e,t,n)}else Zt=!1;switch(t.lanes=0,t.tag){case 2:if(r=t.type,e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,o=ko(t,nt.current),yo(t,n),o=Vd(null,t,r,e,o,n),t.flags|=1,typeof o=="object"&&o!==null&&typeof o.render=="function"&&o.$$typeof===void 0){if(t.tag=1,t.memoizedState=null,t.updateQueue=null,yt(r)){var i=!0;Us(t)}else i=!1;t.memoizedState=o.state!==null&&o.state!==void 0?o.state:null,zd(t);var a=r.getDerivedStateFromProps;typeof a=="function"&&pl(t,r,a,e),o.updater=au,t.stateNode=o,o._reactInternals=t,df(t,r,e,n),t=gf(null,t,r,!0,i,n)}else t.tag=0,ht(null,t,o,n),t=t.child;return t;case 16:o=t.elementType;e:{switch(e!==null&&(e.alternate=null,t.alternate=null,t.flags|=2),e=t.pendingProps,i=o._init,o=i(o._payload),t.type=o,i=t.tag=bE(o),e=Qt(o,e),i){case 0:t=vf(null,t,o,e,n);break e;case 1:t=Cm(null,t,o,e,n);break e;case 11:t=bm(null,t,o,e,n);break e;case 14:t=Em(null,t,o,Qt(o.type,e),r,n);break e}throw Error(L(306,o,""))}return t;case 0:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),vf(e,t,r,o,n);case 1:return r=t.type,o=t.pendingProps,o=t.elementType===r?o:Qt(r,o),Cm(e,t,r,o,n);case 3:if(Am(t),r=t.updateQueue,e===null||r===null)throw Error(L(282));if(r=t.pendingProps,o=t.memoizedState,o=o!==null?o.element:null,qy(e,t),ga(t,r,null,n),r=t.memoizedState.element,r===o)lc(),t=On(e,t,n);else{if(o=t.stateNode,(i=o.hydrate)&&($n=go(t.stateNode.containerInfo.firstChild),xn=t,i=dn=!0),i){if(e=o.mutableSourceEagerHydrationData,e!=null)for(o=0;o1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:cp(e)?2:fp(e)?3:0}function Co(e,t){return qo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function cC(e,t){return qo(e)===2?e.get(t):e[t]}function H0(e,t,n){var r=qo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function V0(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function cp(e){return vC&&e instanceof Map}function fp(e){return gC&&e instanceof Set}function Cr(e){return e.o||e.t}function dp(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=Q0(e);delete t[Ce];for(var n=Ao(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=fC),Object.freeze(e),t&&Fr(e,function(n,r){return pp(r,!0)},!0)),e}function fC(){Kt(2)}function hp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function Pn(e){var t=Rf[e];return t||Kt(18,e),t}function dC(e,t){Rf[e]||(Rf[e]=t)}function If(){return ba}function mc(e,t){t&&(Pn("Patches"),e.u=[],e.s=[],e.v=t)}function Al(e){Nf(e),e.p.forEach(pC),e.p=null}function Nf(e){e===ba&&(ba=e.l)}function Ym(e){return ba={p:[],l:ba,h:e,m:!0,_:0}}function pC(e){var t=e[Ce];t.i===0||t.i===1?t.j():t.O=!0}function vc(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||Pn("ES5").S(t,e,r),r?(n[Ce].P&&(Al(t),Kt(4)),dr(e)&&(e=xl(t,e),t.l||Ol(t,e)),t.u&&Pn("Patches").M(n[Ce],e,t.u,t.s)):e=xl(t,n,[]),Al(t),t.u&&t.v(t.u,t.s),e!==J0?e:void 0}function xl(e,t,n){if(hp(t))return t;var r=t[Ce];if(!r)return Fr(t,function(i,a){return zm(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Ol(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=dp(r.k):r.o;Fr(r.i===3?new Set(o):o,function(i,a){return zm(e,r,o,i,a,n)}),Ol(e,o,!1),n&&e.u&&Pn("Patches").R(r,n,e.u,e.s)}return r.o}function zm(e,t,n,r,o,i){if(fr(o)){var a=xl(e,o,i&&t&&t.i!==3&&!Co(t.D,r)?i.concat(r):void 0);if(H0(n,r,a),!fr(a))return;e.m=!1}if(dr(o)&&!hp(o)){if(!e.h.F&&e._<1)return;xl(e,o),t&&t.A.l||Ol(e,o)}}function Ol(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&pp(t,n)}function gc(e,t){var n=e[Ce];return(n?Cr(n):e)[t]}function Gm(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function jn(e){e.P||(e.P=!0,e.l&&jn(e.l))}function yc(e){e.o||(e.o=dp(e.t))}function Df(e,t,n){var r=cp(t)?Pn("MapSet").N(t,n):fp(t)?Pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:If(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=xo;a&&(l=[s],u=Gs);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):Pn("ES5").J(t,n);return(n?n.A:If()).p.push(r),r}function hC(e){return fr(e)||Kt(22,e),function t(n){if(!dr(n))return n;var r,o=n[Ce],i=qo(n);if(o){if(!o.P&&(o.i<4||!Pn("ES5").K(o)))return o.t;o.I=!0,r=$m(n,i),o.I=!1}else r=$m(n,i);return Fr(r,function(a,s){o&&cC(o.t,a)===s||H0(r,a,t(s))}),i===3?new Set(r):r}(e)}function $m(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return dp(e)}function mC(){function e(i,a){var s=o[i];return s?s.enumerable=a:o[i]=s={configurable:!0,enumerable:a,get:function(){var l=this[Ce];return xo.get(l,i)},set:function(l){var u=this[Ce];xo.set(u,i,l)}},s}function t(i){for(var a=i.length-1;a>=0;a--){var s=i[a][Ce];if(!s.P)switch(s.i){case 5:r(s)&&jn(s);break;case 4:n(s)&&jn(s)}}}function n(i){for(var a=i.t,s=i.k,l=Ao(s),u=l.length-1;u>=0;u--){var c=l[u];if(c!==Ce){var f=a[c];if(f===void 0&&!Co(a,c))return!0;var d=s[c],p=d&&d[Ce];if(p?p.t!==f:!V0(d,f))return!0}}var m=!!a[Ce];return l.length!==Ao(a).length+(m?0:1)}function r(i){var a=i.k;if(a.length!==i.t.length)return!0;var s=Object.getOwnPropertyDescriptor(a,a.length-1);return!(!s||s.get)}var o={};dC("ES5",{J:function(i,a){var s=Array.isArray(i),l=function(c,f){if(c){for(var d=Array(f.length),p=0;p1?y-1:0),v=1;v1?u-1:0),f=1;f=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=Pn("Patches").$;return fr(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),_t=new wC,SC=_t.produce;_t.produceWithPatches.bind(_t);_t.setAutoFreeze.bind(_t);_t.setUseProxies.bind(_t);_t.applyPatches.bind(_t);_t.createDraft.bind(_t);_t.finishDraft.bind(_t);const $s=SC;function bC(e,t,n){return t in e?Object.defineProperty(e,t,{value:n,enumerable:!0,configurable:!0,writable:!0}):e[t]=n,e}function Qm(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Xm(e){for(var t=1;t0&&i[i.length-1])&&(u[0]===6||u[0]===2)){n=0;continue}if(u[0]===3&&(!i||u[1]>i[0]&&u[1]0)for(var S=p.getState(),A=Array.from(n.values()),T=0,C=A;T!1}}),iA=()=>{const e=vr();return I.useCallback(()=>{e(aA())},[e])},{DISCONNECTED_FROM_SERVER:aA}=s1.actions,sA=s1.reducer;function Xa(e,t){if(e===t)return!0;if(e.length!==t.length)return!1;for(let n=0;n!n.includes(i)),o=Object.keys(t).filter(i=>!n.includes(i));if(!Xa(r,o))return!1;for(let i of r)if(e[i]!==t[i])return!1;return!0}function l1(e,t,n){return n===0?!0:Xa(e.slice(0,n),t.slice(0,n))}function uA(e,t){const n=Math.min(e.length,t.length)-1;return n<=0?!0:l1(e,t,n)}const u1=vp({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(e,t)=>t.payload.path,RESET_SELECTION:e=>null,STEP_BACK_SELECTION:e=>e===null||e.length===0?null:(e.pop(),e)}}),{SET_SELECTION:c1,RESET_SELECTION:a5,STEP_BACK_SELECTION:cA}=u1.actions,fA=u1.reducer,dA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";function pA(e){const t=vr();return j.exports.useCallback(()=>{e!==null&&t(bw({path:e}))},[t,e])}const hA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==",mA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==",vA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==",Mf="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==",f1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=",d1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=",gA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==",yA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==",wA="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==",SA="_icon_1467k_1",bA={icon:SA},EA={undo:wA,redo:gA,tour:yA,alignTop:vA,alignBottom:mA,alignCenter:hA,alignSpread:Mf,alignTextCenter:Mf,alignTextLeft:f1,alignTextRight:d1};function CA({id:e,alt:t=e,size:n}){return g("img",{src:EA[e],alt:t,className:bA.icon,style:n?{height:n}:{}})}var p1={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},rv=j.exports.createContext&&j.exports.createContext(p1),Ur=globalThis&&globalThis.__assign||function(){return Ur=Object.assign||function(e){for(var t,n=1,r=arguments.length;ng("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})})),Sp=e=>N("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em"},e),{children:[g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),g("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]})),PA=e=>g("svg",$(F({xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em"},e),{children:g("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})})),kA="_button_1dliw_1",TA="_regular_1dliw_26",IA="_icon_1dliw_34",NA="_transparent_1dliw_42",Sc={button:kA,regular:TA,delete:"_delete_1dliw_30",icon:IA,transparent:NA},wt=o=>{var i=o,{children:e,variant:t="regular",className:n}=i,r=$t(i,["children","variant","className"]);const a=t?Array.isArray(t)?t.map(s=>Sc[s]).join(" "):Sc[t]:"";return g("button",$(F({className:Sc.button+" "+a+(n?" "+n:"")},r),{children:e}))},DA="_deleteButton_1en02_1",RA={deleteButton:DA};function m1({path:e,justIcon:t=!1,label:n="Delete Node"}){const r=pA(e);return N(wt,{className:RA.deleteButton,onClick:o=>{o.stopPropagation(),r()},"aria-label":n,title:n,variant:t?"icon":"delete",type:"button",children:[g(Sp,{}),t?null:"Delete Element"]})}function v1(){const e=vr(),t=Ja(r=>r.selectedPath),n=j.exports.useCallback(r=>{e(c1({path:r}))},[e]);return[t,n]}const bp=I.createContext([null,e=>{}]),LA=({children:e})=>{const t=I.useState(null);return g(bp.Provider,{value:t,children:e})};function MA(){return I.useContext(bp)}function g1({ref:e,nodeInfo:t,immovable:n=!1}){const r=I.useRef(!1),[,o]=I.useContext(bp),i=I.useCallback(()=>{r.current===!1||n||(o(null),r.current=!1,document.body.removeEventListener("dragover",ov),document.body.removeEventListener("drop",i))},[n,o]),a=I.useCallback(s=>{s.stopPropagation(),o(t),r.current=!0,document.body.addEventListener("dragover",ov),document.body.addEventListener("drop",i)},[i,t,o]);I.useEffect(()=>{var l;if(((l=t.currentPath)==null?void 0:l.length)===0||n)return;const s=e.current;if(!!s)return s.setAttribute("draggable","true"),s.addEventListener("dragstart",a),s.addEventListener("dragend",i),()=>{s.removeEventListener("dragstart",a),s.removeEventListener("dragend",i)}},[i,n,t.currentPath,a,e])}function ov(e){e.preventDefault()}const FA="_leaf_1yzht_1",UA="_selectedOverlay_1yzht_5",BA="_container_1yzht_15",iv={leaf:FA,selectedOverlay:UA,container:BA};function jA({ref:e,path:t}){I.useEffect(()=>{!e.current||(e.current.dataset.suePath=t.join("-"))},[e,t])}const Ep=r=>{var o=r,{path:e=[],canMove:t=!0}=o,n=$t(o,["path","canMove"]);const i=I.useRef(null),{uiName:a,uiArguments:s,uiChildren:l}=n,[u,c]=v1(),f=u?Xa(e,u):!1,d=en[a],p=y=>{y.stopPropagation(),c(e)};if(g1({ref:i,nodeInfo:{node:n,currentPath:e},immovable:!t}),jA({ref:i,path:e}),d.acceptsChildren===!0){const y=d.UiComponent;return g(y,{uiArguments:s,uiChildren:l!=null?l:[],compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})}const m=d.UiComponent;return g(m,{uiArguments:s,compRef:i,eventHandlers:{onClick:p},nodeInfo:{path:e},children:f?g("div",{className:iv.selectedOverlay}):null})},Cp=I.forwardRef((o,r)=>{var i=o,{className:e="",children:t}=i,n=$t(i,["className","children"]);const a=e+" card";return g("div",$(F({ref:r,className:a},n),{children:t}))}),WA=I.forwardRef((r,n)=>{var o=r,{className:e=""}=o,t=$t(o,["className"]);const i=e+" card-header";return g("div",F({ref:n,className:i},t))}),YA="_container_rm196_1",zA="_withTitle_rm196_13",GA="_panelTitle_rm196_22",$A="_contentHolder_rm196_27",HA="_dropWatcher_rm196_67",VA="_lastDropWatcher_rm196_75",JA="_firstDropWatcher_rm196_78",QA="_middleDropWatcher_rm196_89",XA="_onlyDropWatcher_rm196_93",KA="_hoveringOverSwap_rm196_98",qA="_availableToSwap_rm196_99",ZA="_pulse_rm196_1",ex="_emptyGridCard_rm196_143",tx="_emptyMessage_rm196_160",xt={container:YA,withTitle:zA,panelTitle:GA,contentHolder:$A,dropWatcher:HA,lastDropWatcher:VA,firstDropWatcher:JA,middleDropWatcher:QA,onlyDropWatcher:XA,hoveringOverSwap:KA,availableToSwap:qA,pulse:ZA,emptyGridCard:ex,emptyMessage:tx};function qt(e){for(var t=arguments.length,n=Array(t>1?t-1:0),r=1;r3?t.i-4:t.i:Array.isArray(e)?1:Ap(e)?2:xp(e)?3:0}function Ff(e,t){return Zo(e)===2?e.has(t):Object.prototype.hasOwnProperty.call(e,t)}function nx(e,t){return Zo(e)===2?e.get(t):e[t]}function y1(e,t,n){var r=Zo(e);r===2?e.set(t,n):r===3?(e.delete(t),e.add(n)):e[t]=n}function rx(e,t){return e===t?e!==0||1/e==1/t:e!=e&&t!=t}function Ap(e){return sx&&e instanceof Map}function xp(e){return lx&&e instanceof Set}function Ar(e){return e.o||e.t}function Op(e){if(Array.isArray(e))return Array.prototype.slice.call(e);var t=cx(e);delete t[Pt];for(var n=Tp(t),r=0;r1&&(e.set=e.add=e.clear=e.delete=ox),Object.freeze(e),t&&Aa(e,function(n,r){return _p(r,!0)},!0)),e}function ox(){qt(2)}function Pp(e){return e==null||typeof e!="object"||Object.isFrozen(e)}function pn(e){var t=fx[e];return t||qt(18,e),t}function av(){return xa}function bc(e,t){t&&(pn("Patches"),e.u=[],e.s=[],e.v=t)}function Tl(e){Uf(e),e.p.forEach(ix),e.p=null}function Uf(e){e===xa&&(xa=e.l)}function sv(e){return xa={p:[],l:xa,h:e,m:!0,_:0}}function ix(e){var t=e[Pt];t.i===0||t.i===1?t.j():t.O=!0}function Ec(e,t){t._=t.p.length;var n=t.p[0],r=e!==void 0&&e!==n;return t.h.g||pn("ES5").S(t,e,r),r?(n[Pt].P&&(Tl(t),qt(4)),Br(e)&&(e=Il(t,e),t.l||Nl(t,e)),t.u&&pn("Patches").M(n[Pt].t,e,t.u,t.s)):e=Il(t,n,[]),Tl(t),t.u&&t.v(t.u,t.s),e!==w1?e:void 0}function Il(e,t,n){if(Pp(t))return t;var r=t[Pt];if(!r)return Aa(t,function(i,a){return lv(e,r,t,i,a,n)},!0),t;if(r.A!==e)return t;if(!r.P)return Nl(e,r.t,!0),r.t;if(!r.I){r.I=!0,r.A._--;var o=r.i===4||r.i===5?r.o=Op(r.k):r.o;Aa(r.i===3?new Set(o):o,function(i,a){return lv(e,r,o,i,a,n)}),Nl(e,o,!1),n&&e.u&&pn("Patches").R(r,n,e.u,e.s)}return r.o}function lv(e,t,n,r,o,i){if(Do(o)){var a=Il(e,o,i&&t&&t.i!==3&&!Ff(t.D,r)?i.concat(r):void 0);if(y1(n,r,a),!Do(a))return;e.m=!1}if(Br(o)&&!Pp(o)){if(!e.h.F&&e._<1)return;Il(e,o),t&&t.A.l||Nl(e,o)}}function Nl(e,t,n){n===void 0&&(n=!1),e.h.F&&e.m&&_p(t,n)}function Cc(e,t){var n=e[Pt];return(n?Ar(n):e)[t]}function uv(e,t){if(t in e)for(var n=Object.getPrototypeOf(e);n;){var r=Object.getOwnPropertyDescriptor(n,t);if(r)return r;n=Object.getPrototypeOf(n)}}function Bf(e){e.P||(e.P=!0,e.l&&Bf(e.l))}function Ac(e){e.o||(e.o=Op(e.t))}function jf(e,t,n){var r=Ap(t)?pn("MapSet").N(t,n):xp(t)?pn("MapSet").T(t,n):e.g?function(o,i){var a=Array.isArray(o),s={i:a?1:0,A:i?i.A:av(),P:!1,I:!1,D:{},l:i,t:o,k:null,o:null,j:null,C:!1},l=s,u=Wf;a&&(l=[s],u=Li);var c=Proxy.revocable(l,u),f=c.revoke,d=c.proxy;return s.k=d,s.j=f,d}(t,n):pn("ES5").J(t,n);return(n?n.A:av()).p.push(r),r}function ax(e){return Do(e)||qt(22,e),function t(n){if(!Br(n))return n;var r,o=n[Pt],i=Zo(n);if(o){if(!o.P&&(o.i<4||!pn("ES5").K(o)))return o.t;o.I=!0,r=cv(n,i),o.I=!1}else r=cv(n,i);return Aa(r,function(a,s){o&&nx(o.t,a)===s||y1(r,a,t(s))}),i===3?new Set(r):r}(e)}function cv(e,t){switch(t){case 2:return new Map(e);case 3:return Array.from(e)}return Op(e)}var fv,xa,kp=typeof Symbol!="undefined"&&typeof Symbol("x")=="symbol",sx=typeof Map!="undefined",lx=typeof Set!="undefined",dv=typeof Proxy!="undefined"&&Proxy.revocable!==void 0&&typeof Reflect!="undefined",w1=kp?Symbol.for("immer-nothing"):((fv={})["immer-nothing"]=!0,fv),pv=kp?Symbol.for("immer-draftable"):"__$immer_draftable",Pt=kp?Symbol.for("immer-state"):"__$immer_state",ux=""+Object.prototype.constructor,Tp=typeof Reflect!="undefined"&&Reflect.ownKeys?Reflect.ownKeys:Object.getOwnPropertySymbols!==void 0?function(e){return Object.getOwnPropertyNames(e).concat(Object.getOwnPropertySymbols(e))}:Object.getOwnPropertyNames,cx=Object.getOwnPropertyDescriptors||function(e){var t={};return Tp(e).forEach(function(n){t[n]=Object.getOwnPropertyDescriptor(e,n)}),t},fx={},Wf={get:function(e,t){if(t===Pt)return e;var n=Ar(e);if(!Ff(n,t))return function(o,i,a){var s,l=uv(i,a);return l?"value"in l?l.value:(s=l.get)===null||s===void 0?void 0:s.call(o.k):void 0}(e,n,t);var r=n[t];return e.I||!Br(r)?r:r===Cc(e.t,t)?(Ac(e),e.o[t]=jf(e.A.h,r,e)):r},has:function(e,t){return t in Ar(e)},ownKeys:function(e){return Reflect.ownKeys(Ar(e))},set:function(e,t,n){var r=uv(Ar(e),t);if(r!=null&&r.set)return r.set.call(e.k,n),!0;if(!e.P){var o=Cc(Ar(e),t),i=o==null?void 0:o[Pt];if(i&&i.t===n)return e.o[t]=n,e.D[t]=!1,!0;if(rx(n,o)&&(n!==void 0||Ff(e.t,t)))return!0;Ac(e),Bf(e)}return e.o[t]===n&&typeof n!="number"&&(n!==void 0||t in e.o)||(e.o[t]=n,e.D[t]=!0,!0)},deleteProperty:function(e,t){return Cc(e.t,t)!==void 0||t in e.t?(e.D[t]=!1,Ac(e),Bf(e)):delete e.D[t],e.o&&delete e.o[t],!0},getOwnPropertyDescriptor:function(e,t){var n=Ar(e),r=Reflect.getOwnPropertyDescriptor(n,t);return r&&{writable:!0,configurable:e.i!==1||t!=="length",enumerable:r.enumerable,value:n[t]}},defineProperty:function(){qt(11)},getPrototypeOf:function(e){return Object.getPrototypeOf(e.t)},setPrototypeOf:function(){qt(12)}},Li={};Aa(Wf,function(e,t){Li[e]=function(){return arguments[0]=arguments[0][0],t.apply(this,arguments)}}),Li.deleteProperty=function(e,t){return Li.set.call(this,e,t,void 0)},Li.set=function(e,t,n){return Wf.set.call(this,e[0],t,n,e[0])};var dx=function(){function e(n){var r=this;this.g=dv,this.F=!0,this.produce=function(o,i,a){if(typeof o=="function"&&typeof i!="function"){var s=i;i=o;var l=r;return function(y){var h=this;y===void 0&&(y=s);for(var v=arguments.length,w=Array(v>1?v-1:0),S=1;S1?c-1:0),d=1;d=0;o--){var i=r[o];if(i.path.length===0&&i.op==="replace"){n=i.value;break}}o>-1&&(r=r.slice(o+1));var a=pn("Patches").$;return Do(n)?a(n,r):this.produce(n,function(s){return a(s,r)})},e}(),kt=new dx,px=kt.produce;kt.produceWithPatches.bind(kt);kt.setAutoFreeze.bind(kt);kt.setUseProxies.bind(kt);kt.applyPatches.bind(kt);kt.createDraft.bind(kt);kt.finishDraft.bind(kt);const ei=px,Dl=(e,t)=>{const n=Math.abs(t-e)+1,r=ee+i*r)};function hv(e){let t=1/0,n=-1/0;for(let i of e)in&&(n=i);const r=n-t,o=Array.isArray(e)?e.length:e.size;return{minVal:t,maxVal:n,span:r,isSequence:r===o-1}}function S1(e,t){return[...new Array(t)].fill(e)}function hx(e,t){return e.filter(n=>!t.includes(n))}function Yf(e,t){return[...e.slice(0,t),...e.slice(t+1)]}function Oa(e,t,n){if(t<0)throw new Error("Can't add item at a negative index");const r=[...e];return t>r.length-1&&(r.length=t),r.splice(t,0,n),r}function mx(e,t,n){if(n<0)throw new Error("Can't add item at a negative index");if(t<0||t>e.length)throw new Error("Requested to move an element that is not in array");let r=[...e];const o=r[t];return r[t]=void 0,r=Oa(r,n,o),r.filter(i=>typeof i!="undefined")}function vx(e,t=", ",n=" and "){const r=e.length;if(r===1)return e[0];const o=e[r-1];return[...e].splice(0,r-1).join(t)+n+o}function Ip(e){return e.uiChildren!==void 0}function rr(e,t){let n=e,r;for(r of t){if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n=n.uiChildren[r]}return n}function b1(e,t){return l1(e,t,Math.min(e.length,t.length))}function Np(e,t){const n=e.length,r=t.length;if(n!==r)return!1;const o=n-1;return Xa(e.slice(0,o),t.slice(0,o))?e.slice(-1)[0]!==t.slice(-1)[0]:!1}function E1(e,{path:t}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.DELETE_NODE;a&&a(e,{path:t})}const{parentNode:n,indexToNode:r}=gx(e,t);if(!Ip(n))throw new Error("Somehow trying to enter a leaf node");n.uiChildren.splice(r,1)}function gx(e,t){const n=[...t],r=n.pop();if(typeof r=="undefined")throw new Error("Path to node must have at least one element");const o=n.length===0?e:rr(e,n);if(!Ip(o))throw new Error("Somehow trying to enter a leaf node");return{parentNode:o,indexToNode:r}}function yx(e,{parentPath:t,node:n,positionInChildren:r="last",currentPath:o}){const i=rr(e,t);if(!en[i.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(i.uiChildren)||(i.uiChildren=[]);const a=r==="last"?i.uiChildren.length:r;if(o!==void 0){const s=[...t,a];if(b1(o,s))throw new Error("Invalid move request");if(Np(o,s)){const l=o[o.length-1];i.uiChildren=mx(i.uiChildren,l,a);return}E1(e,{path:o})}i.uiChildren=Oa(i.uiChildren,a,n)}function wx({fromPath:e,toPath:t}){if(e==null)return!0;if(b1(e,t))return!1;if(Np(e,t)){const n=e.length,r=e[n-1],o=t[n-1];if(r===o||r===o-1)return!1}return!0}const Sx="_canAcceptDrop_1oxcd_1",bx="_pulse_1oxcd_1",Ex="_hoveringOver_1oxcd_32",zf={canAcceptDrop:Sx,pulse:bx,hoveringOver:Ex};function Dp({watcherRef:e,getCanAcceptDrop:t=()=>!0,onDrop:n,onDragOver:r,canAcceptDropClass:o=zf.canAcceptDrop,hoveringOverClass:i=zf.hoveringOver}){const[a,s]=MA(),{addCanAcceptDropHighlight:l,addHoveredOverHighlight:u,removeHoveredOverHighlight:c,removeAllHighlights:f}=Cx({watcherRef:e,canAcceptDropClass:o,hoveringOverClass:i}),d=a?t(a):!1,p=I.useCallback(h=>{h.preventDefault(),h.stopPropagation(),u(),r==null||r()},[u,r]),m=I.useCallback(h=>{h.preventDefault(),c()},[c]),y=I.useCallback(h=>{if(h.stopPropagation(),c(),!a){console.error("No dragged node in context but a drop was detected...");return}d?n(a):console.error("Incompatable drag pairing"),s(null)},[d,a,n,c,s]);I.useEffect(()=>{const h=e.current;if(!!h)return d&&(l(),h.addEventListener("dragenter",p),h.addEventListener("dragleave",m),h.addEventListener("dragover",p),h.addEventListener("drop",y)),()=>{f(),h.removeEventListener("dragenter",p),h.removeEventListener("dragleave",m),h.removeEventListener("dragover",p),h.removeEventListener("drop",y)}},[l,d,m,p,y,f,e])}function Cx({watcherRef:e,canAcceptDropClass:t,hoveringOverClass:n}){const r=I.useCallback(()=>{!e.current||e.current.classList.add(t)},[t,e]),o=I.useCallback(()=>{!e.current||e.current.classList.add(n)},[n,e]),i=I.useCallback(()=>{!e.current||e.current.classList.remove(n)},[n,e]),a=I.useCallback(()=>{!e.current||(e.current.classList.remove(n),e.current.classList.remove(t))},[t,n,e]);return{addCanAcceptDropHighlight:r,addHoveredOverHighlight:o,removeHoveredOverHighlight:i,removeAllHighlights:a}}function Ax({watcherRef:e,positionInChildren:t,parentPath:n}){const r=Ew(),o=I.useCallback(({node:a,currentPath:s})=>mv(a)!==null&&wx({fromPath:s,toPath:[...n,t]}),[t,n]),i=I.useCallback(({node:a,currentPath:s})=>{const l=mv(a);if(!l)throw new Error("No node to place...");r({node:l,currentPath:s,parentPath:n,positionInChildren:t})},[t,n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i})}function mv(e){var n;const t=e.uiName;return t==="gridlayout::grid_card"&&((n=e.uiChildren)==null?void 0:n.length)===1?e.uiChildren[0]:t.includes("gridlayout::grid_card")?null:e}function xx(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M0 180V56c0-13.3 10.7-24 24-24h124c6.6 0 12 5.4 12 12v40c0 6.6-5.4 12-12 12H64v84c0 6.6-5.4 12-12 12H12c-6.6 0-12-5.4-12-12zM288 44v40c0 6.6 5.4 12 12 12h84v84c0 6.6 5.4 12 12 12h40c6.6 0 12-5.4 12-12V56c0-13.3-10.7-24-24-24H300c-6.6 0-12 5.4-12 12zm148 276h-40c-6.6 0-12 5.4-12 12v84h-84c-6.6 0-12 5.4-12 12v40c0 6.6 5.4 12 12 12h124c13.3 0 24-10.7 24-24V332c0-6.6-5.4-12-12-12zM160 468v-40c0-6.6-5.4-12-12-12H64v-84c0-6.6-5.4-12-12-12H12c-6.6 0-12 5.4-12 12v124c0 13.3 10.7 24 24 24h124c6.6 0 12-5.4 12-12z"}}]})(e)}function vv(e){return Et({tag:"svg",attr:{viewBox:"0 0 256 512"},child:[{tag:"path",attr:{d:"M96 496V16c0-8.8-7.2-16-16-16H48c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16zm128 0V16c0-8.8-7.2-16-16-16h-32c-8.8 0-16 7.2-16 16v480c0 8.8 7.2 16 16 16h32c8.8 0 16-7.2 16-16z"}}]})(e)}function gv(e){return Et({tag:"svg",attr:{viewBox:"0 0 512 512"},child:[{tag:"path",attr:{d:"M496 288H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16zm0-128H16c-8.8 0-16 7.2-16 16v32c0 8.8 7.2 16 16 16h480c8.8 0 16-7.2 16-16v-32c0-8.8-7.2-16-16-16z"}}]})(e)}function C1(e){return Et({tag:"svg",attr:{viewBox:"0 0 448 512"},child:[{tag:"path",attr:{d:"M416 208H272V64c0-17.67-14.33-32-32-32h-32c-17.67 0-32 14.33-32 32v144H32c-17.67 0-32 14.33-32 32v32c0 17.67 14.33 32 32 32h144v144c0 17.67 14.33 32 32 32h32c17.67 0 32-14.33 32-32V304h144c17.67 0 32-14.33 32-32v-32c0-17.67-14.33-32-32-32z"}}]})(e)}var Ou=A1;function A1(e){if(typeof e=="function")return e;var t=Array.isArray(e)?[]:{};for(var n in e){var r=e[n],o={}.toString.call(r).slice(8,-1);o=="Array"||o=="Object"?t[n]=A1(r):o=="Date"?t[n]=new Date(r.getTime()):o=="RegExp"?t[n]=RegExp(r.source,Ox(r)):t[n]=r}return t}function Ox(e){if(typeof e.source.flags=="string")return e.source.flags;var t=[];return e.global&&t.push("g"),e.ignoreCase&&t.push("i"),e.multiline&&t.push("m"),e.sticky&&t.push("y"),e.unicode&&t.push("u"),t.join("")}function Ka(e){const t=e.length,n=e[0].length;for(let r of e)if(r.length!==n)throw new Error("Inconsistant number of columns in matrix");return{numRows:t,numCols:n}}function _x(e,t={}){const n=new Set;for(let r of e)for(let o of r)t.ignore&&t.ignore.includes(o)||n.add(o);return[...n]}function Px(e,{index:t,arr:n,dir:r}){const o=Ou(e);switch(r){case"rows":return Oa(o,t,n);case"cols":return o.map((i,a)=>Oa(i,t,n[a]))}}function kx(e,{index:t,dir:n}){const r=Ou(e);switch(n){case"rows":return Yf(r,t);case"cols":return r.map((o,i)=>Yf(o,t))}}const vn=".";function Rp(e){const t=new Map;return Tx(e).forEach(({itemRows:n,itemCols:r},o)=>{if(o===vn)return;const i=hv(n),a=hv(r);t.set(o,{colStart:a.minVal,rowStart:i.minVal,colSpan:a.span+1,rowSpan:i.span+1,isValid:i.isSequence&&a.isSequence})}),t}function Tx(e){var o;const t=new Map,{numRows:n,numCols:r}=Ka(e);for(let i=0;i1,c=r>1,f=[];return(yv({colRange:l,rowIndex:e-1,layoutAreas:o})||u)&&f.push("up"),(yv({colRange:l,rowIndex:i+1,layoutAreas:o})||u)&&f.push("down"),(wv({rowRange:s,colIndex:n-1,layoutAreas:o})||c)&&f.push("left"),(wv({rowRange:s,colIndex:a+1,layoutAreas:o})||c)&&f.push("right"),f}function yv({colRange:e,rowIndex:t,layoutAreas:n}){return t<1||t>n.length?!1:e.every(r=>n[t-1][r-1]===vn)}function wv({rowRange:e,colIndex:t,layoutAreas:n}){return t<1||t>n[0].length?!1:e.every(r=>n[r-1][t-1]===vn)}const Nx="_marker_rkm38_1",Dx="_dragger_rkm38_30",Rx="_move_rkm38_50",Sv={marker:Nx,dragger:Dx,move:Rx};function _a({rowStart:e,rowSpan:t,colStart:n,colSpan:r}){return{rowStart:e,rowEnd:e+t-1,colStart:n,colEnd:n+r-1}}function Lx(e,t){return typeof e=="undefined"&&typeof t=="undefined"?!0:typeof e=="undefined"||typeof t=="undefined"?!1:("colSpan"in e&&(e=_a(e)),"colSpan"in t&&(t=_a(t)),e.colStart===t.colStart&&e.colEnd===t.colEnd&&e.rowStart===t.rowStart&&e.rowEnd===t.rowEnd)}function Mx({row:e,col:t}){return`row${e}-col${t}`}function Fx({dragDirection:e,gridLocation:t,layoutAreas:n}){const{rowStart:r,rowEnd:o,colStart:i,colEnd:a}=_a(t),s=n.length,l=n[0].length;let u,c,f;switch(e){case"up":if(r===1)return{shrinkExtent:o,growExtent:1};u=r-1,c=1,f=o;break;case"left":if(i===1)return{shrinkExtent:a,growExtent:1};u=i-1,c=1,f=a;break;case"down":if(o===s)return{shrinkExtent:r,growExtent:s};u=o+1,c=s,f=r;break;case"right":if(a===l)return{shrinkExtent:i,growExtent:l};u=a+1,c=l,f=i;break}const d=e==="up"||e==="down",p=e==="left"||e==="up",[m,y]=d?[i,a]:[r,o],h=(S,A)=>{const[T,C]=d?[S,A]:[A,S];return n[T-1][C-1]!==vn},v=Dl(m,y),w=Dl(u,c);for(let S of w)for(let A of v)if(h(S,A))return{shrinkExtent:f,growExtent:S+(p?1:-1)};return{shrinkExtent:f,growExtent:c}}function x1(e,t,n){const r=t=r&&e<=o}function Ux({dir:e,gridContainerStyles:t,gridContainerBoundingRect:n}){const r=Gf(t.getPropertyValue("gap")),i=Gf(t.getPropertyValue("padding"))+r/2,a=n[e==="rows"?"y":"x"],s=Bx(t,e),l=s.length,u=[];for(let c=0;cx1(i,l,u));if(a===void 0)return;const s=Wx[n];return o[s]=a.index,o}const Wx={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function Yx({overlayRef:e,gridLocation:t,layoutAreas:n,onDragEnd:r}){const o=_a(t),i=I.useRef(null),a=I.useCallback(u=>{const c=e.current,f=i.current;if(!c||!f)throw new Error("For some reason we are observing dragging when we shouldn't");const d=jx({mousePos:u,dragState:f});d&&Ev(c,d)},[e]),s=I.useCallback(()=>{const u=e.current,c=i.current;if(!u||!c)return;const f=c.gridItemExtent;Lx(f,o)||r(f),u.classList.remove("dragging"),document.removeEventListener("mousemove",a),bv("on")},[o,a,r,e]);return I.useCallback(u=>{const c=e.current;if(!c)return;const f=c.parentElement;if(!f)return;const d=getComputedStyle(c.parentElement),p=f.getBoundingClientRect(),m=u==="down"||u==="up"?"rows":"cols",{shrinkExtent:y,growExtent:h}=Fx({dragDirection:u,gridLocation:t,layoutAreas:n});i.current={dragHandle:u,gridItemExtent:_a(t),tractExtents:Ux({dir:m,gridContainerStyles:d,gridContainerBoundingRect:p}).filter(({index:v})=>x1(v,y,h))},Ev(e.current,i.current.gridItemExtent),c.classList.add("dragging"),document.addEventListener("mousemove",a),document.addEventListener("mouseup",s,{once:!0}),bv("off")},[s,t,n,a,e])}function bv(e){var n;const t=(n=document.querySelector("body"))==null?void 0:n.classList;e==="off"?t==null||t.add("disable-text-selection"):t==null||t.remove("disable-text-selection")}function Ev(e,{rowStart:t,rowEnd:n,colStart:r,colEnd:o}){e.style.setProperty("--drag-grid-row-start",String(t)),e.style.setProperty("--drag-grid-row-end",String(n+1)),e.style.setProperty("--drag-grid-column-start",String(r)),e.style.setProperty("--drag-grid-column-end",String(o+1))}function zx({area:e,gridLocation:t,areas:n,onNewPos:r}){if(typeof t=="undefined")throw new Error(`Item in ${e} is not in the location map`);const o=I.useRef(null),i=Yx({overlayRef:o,gridLocation:t,layoutAreas:n,onDragEnd:r}),a=I.useMemo(()=>Ix({gridLocation:t,layoutAreas:n}),[t,n]),s=I.useMemo(()=>{let l=[];for(let u of a)l.push(g("div",{className:Sv.dragger+" "+u,onMouseDown:c=>{Gx(c),i(u)},children:$x[u]},u));return l},[a,i]);return I.useEffect(()=>{var l;(l=o.current)==null||l.style.setProperty("--grid-area",e)},[e]),g("div",{ref:o,className:Sv.marker+" grid-area-overlay",children:s})}function Gx(e){e.preventDefault(),e.stopPropagation()}const $x={up:g(gv,{}),down:g(gv,{}),left:g(vv,{}),right:g(vv,{})};function Hx({gridRow:e,gridColumn:t,onDroppedNode:n}){const r=I.useRef(null);return Dp({watcherRef:r,onDrop:o=>{n($(F({},o),{pos:{rowStart:e,rowEnd:e,colStart:t,colEnd:t}}))}}),g("div",{className:"grid-cell",ref:r,"data-cell-pos":e+"-"+t,style:{gridRow:e,gridColumn:t,margin:"2px"}})}function Vx(e,t){const{numRows:n,numCols:r}=Ka(e),o=[];for(let i=0;i{const i=r==="rows"?"cols":"rows",a=O1(o);if(t>a[r].length)throw new Error(`Can't add a tract after index ${t}. Not enought tracts.`);if(t<0)throw new Error("Cant add a tract at a negative index");const s=Rp(o.areas);let l=S1(vn,a[i].length);s.forEach((u,c)=>{const{itemStart:f,itemEnd:d}=Hf(u,r);if(f<=t&&d>t){const m=Hf(u,i);for(let y=m.itemStart-1;y1}function Kx(e,{index:t,dir:n}){let r=[];return e.forEach((o,i)=>{const{itemStart:a,itemEnd:s}=Hf(o,n);a===t&&a===s&&r.push(i)}),r}const qx="_ResizableGrid_i4cq9_1",Zx={ResizableGrid:qx,"size-detection-cell":"_size-detection-cell_i4cq9_1"};function T1(e){var o,i;const t=((o=e.match(/(px|\%|rem|fr|auto)/g))==null?void 0:o[0])||"px",n=(i=e.match(/^[\d|\.]*/g))==null?void 0:i[0],r=n?Number(n):null;if(t==="auto"){if(r!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(r===null)throw new Error("You must have a count for non-auto units.");if(t==="fr"&&r<0)throw new Error(`Can't have a negative count with ${t} units.`);return{count:r,unit:t}}function Wn(e){return e.unit==="auto"?"auto":`${e.count}${e.unit}`}const e2="_container_jk9tt_8",t2="_label_jk9tt_26",n2="_mainInput_jk9tt_59",kn={container:e2,label:t2,mainInput:n2},I1=I.createContext(null);function $r(e){const t=I.useContext(I1);if(e)return e;if(t)return t;throw new Error("No onChange context or fallback provided.")}const r2=({onChange:e,children:t})=>g(I1.Provider,{value:e,children:t});function o2({name:e,isDisabled:t,defaultValue:n}){const r=$r(),o=`Click to ${t?"set":"unset"} ${e} property`;return g("input",{"aria-label":o,type:"checkbox",checked:!t,title:o,onChange:i=>{r({name:e,value:i.target.checked?n:void 0})}})}function Lp({name:e,label:t,optional:n,isDisabled:r,defaultValue:o,mainInput:i,width_setting:a="full"}){return N("label",{className:kn.container,"data-disabled":r,"data-width-setting":a,children:[N("div",{className:kn.label,children:[n?g(o2,{name:e,isDisabled:r,defaultValue:o}):null,t!=null?t:e,":"]}),g("div",{className:kn.mainInput,children:i})]})}const i2="_numericInput_n1lnu_1",a2={numericInput:i2};function Mp({value:e,ariaLabel:t,onChange:n,min:r,max:o,disabled:i=!1}){var s;const a=I.useCallback((l=1,u=!1)=>{const c=u?10:1;let f=(e!=null?e:0)+l*c;r&&(f=Math.max(f,r)),o&&(f=Math.min(f,o)),n(f)},[o,r,n,e]);return g("input",{className:a2.numericInput,"aria-label":t!=null?t:"Numeric Input",type:"number",disabled:i,value:(s=e==null?void 0:e.toString())!=null?s:"",onChange:l=>n(Number(l.target.value)),min:r,onKeyDown:l=>{(l.key==="ArrowUp"||l.key==="ArrowDown")&&(l.preventDefault(),a(l.key==="ArrowUp"?1:-1,l.shiftKey))}})}function Hn({name:e,label:t,value:n,min:r=0,max:o,onChange:i,optional:a=!1,defaultValue:s=1,disabled:l=n===void 0}){const u=$r(i);return g(Lp,{name:e,label:t,optional:a,isDisabled:l,defaultValue:s,width_setting:"fit",mainInput:g(Mp,{ariaLabel:t!=null?t:e,disabled:l,value:n,onChange:c=>u({name:e,value:c}),min:r,max:o})})}var Fp=s2;function s2(e,t,n){var r=null,o=null,i=function(){r&&(clearTimeout(r),o=null,r=null)},a=function(){var l=o;i(),l&&l()},s=function(){if(!t)return e.apply(this,arguments);var l=this,u=arguments,c=n&&!r;if(i(),o=function(){e.apply(l,u)},r=setTimeout(function(){if(r=null,!c){var f=o;return o=null,f()}},t),c)return o()};return s.cancel=i,s.flush=a,s}var Av=function(t){return t.reduce(function(n,r){var o=r[0],i=r[1];return n[o]=i,n},{})},xv=typeof window!="undefined"&&window.document&&window.document.createElement?j.exports.useLayoutEffect:j.exports.useEffect,St="top",Wt="bottom",Yt="right",bt="left",Up="auto",qa=[St,Wt,Yt,bt],Ro="start",Pa="end",l2="clippingParents",N1="viewport",vi="popper",u2="reference",Ov=qa.reduce(function(e,t){return e.concat([t+"-"+Ro,t+"-"+Pa])},[]),D1=[].concat(qa,[Up]).reduce(function(e,t){return e.concat([t,t+"-"+Ro,t+"-"+Pa])},[]),c2="beforeRead",f2="read",d2="afterRead",p2="beforeMain",h2="main",m2="afterMain",v2="beforeWrite",g2="write",y2="afterWrite",w2=[c2,f2,d2,p2,h2,m2,v2,g2,y2];function gn(e){return e?(e.nodeName||"").toLowerCase():null}function nn(e){if(e==null)return window;if(e.toString()!=="[object Window]"){var t=e.ownerDocument;return t&&t.defaultView||window}return e}function Lo(e){var t=nn(e).Element;return e instanceof t||e instanceof Element}function Ut(e){var t=nn(e).HTMLElement;return e instanceof t||e instanceof HTMLElement}function R1(e){if(typeof ShadowRoot=="undefined")return!1;var t=nn(e).ShadowRoot;return e instanceof t||e instanceof ShadowRoot}function S2(e){var t=e.state;Object.keys(t.elements).forEach(function(n){var r=t.styles[n]||{},o=t.attributes[n]||{},i=t.elements[n];!Ut(i)||!gn(i)||(Object.assign(i.style,r),Object.keys(o).forEach(function(a){var s=o[a];s===!1?i.removeAttribute(a):i.setAttribute(a,s===!0?"":s)}))})}function b2(e){var t=e.state,n={popper:{position:t.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(t.elements.popper.style,n.popper),t.styles=n,t.elements.arrow&&Object.assign(t.elements.arrow.style,n.arrow),function(){Object.keys(t.elements).forEach(function(r){var o=t.elements[r],i=t.attributes[r]||{},a=Object.keys(t.styles.hasOwnProperty(r)?t.styles[r]:n[r]),s=a.reduce(function(l,u){return l[u]="",l},{});!Ut(o)||!gn(o)||(Object.assign(o.style,s),Object.keys(i).forEach(function(l){o.removeAttribute(l)}))})}}const E2={name:"applyStyles",enabled:!0,phase:"write",fn:S2,effect:b2,requires:["computeStyles"]};function hn(e){return e.split("-")[0]}var Nr=Math.max,Rl=Math.min,Mo=Math.round;function Fo(e,t){t===void 0&&(t=!1);var n=e.getBoundingClientRect(),r=1,o=1;if(Ut(e)&&t){var i=e.offsetHeight,a=e.offsetWidth;a>0&&(r=Mo(n.width)/a||1),i>0&&(o=Mo(n.height)/i||1)}return{width:n.width/r,height:n.height/o,top:n.top/o,right:n.right/r,bottom:n.bottom/o,left:n.left/r,x:n.left/r,y:n.top/o}}function Bp(e){var t=Fo(e),n=e.offsetWidth,r=e.offsetHeight;return Math.abs(t.width-n)<=1&&(n=t.width),Math.abs(t.height-r)<=1&&(r=t.height),{x:e.offsetLeft,y:e.offsetTop,width:n,height:r}}function L1(e,t){var n=t.getRootNode&&t.getRootNode();if(e.contains(t))return!0;if(n&&R1(n)){var r=t;do{if(r&&e.isSameNode(r))return!0;r=r.parentNode||r.host}while(r)}return!1}function Nn(e){return nn(e).getComputedStyle(e)}function C2(e){return["table","td","th"].indexOf(gn(e))>=0}function gr(e){return((Lo(e)?e.ownerDocument:e.document)||window.document).documentElement}function _u(e){return gn(e)==="html"?e:e.assignedSlot||e.parentNode||(R1(e)?e.host:null)||gr(e)}function _v(e){return!Ut(e)||Nn(e).position==="fixed"?null:e.offsetParent}function A2(e){var t=navigator.userAgent.toLowerCase().indexOf("firefox")!==-1,n=navigator.userAgent.indexOf("Trident")!==-1;if(n&&Ut(e)){var r=Nn(e);if(r.position==="fixed")return null}for(var o=_u(e);Ut(o)&&["html","body"].indexOf(gn(o))<0;){var i=Nn(o);if(i.transform!=="none"||i.perspective!=="none"||i.contain==="paint"||["transform","perspective"].indexOf(i.willChange)!==-1||t&&i.willChange==="filter"||t&&i.filter&&i.filter!=="none")return o;o=o.parentNode}return null}function Za(e){for(var t=nn(e),n=_v(e);n&&C2(n)&&Nn(n).position==="static";)n=_v(n);return n&&(gn(n)==="html"||gn(n)==="body"&&Nn(n).position==="static")?t:n||A2(e)||t}function jp(e){return["top","bottom"].indexOf(e)>=0?"x":"y"}function qi(e,t,n){return Nr(e,Rl(t,n))}function x2(e,t,n){var r=qi(e,t,n);return r>n?n:r}function M1(){return{top:0,right:0,bottom:0,left:0}}function F1(e){return Object.assign({},M1(),e)}function U1(e,t){return t.reduce(function(n,r){return n[r]=e,n},{})}var O2=function(t,n){return t=typeof t=="function"?t(Object.assign({},n.rects,{placement:n.placement})):t,F1(typeof t!="number"?t:U1(t,qa))};function _2(e){var t,n=e.state,r=e.name,o=e.options,i=n.elements.arrow,a=n.modifiersData.popperOffsets,s=hn(n.placement),l=jp(s),u=[bt,Yt].indexOf(s)>=0,c=u?"height":"width";if(!(!i||!a)){var f=O2(o.padding,n),d=Bp(i),p=l==="y"?St:bt,m=l==="y"?Wt:Yt,y=n.rects.reference[c]+n.rects.reference[l]-a[l]-n.rects.popper[c],h=a[l]-n.rects.reference[l],v=Za(i),w=v?l==="y"?v.clientHeight||0:v.clientWidth||0:0,S=y/2-h/2,A=f[p],T=w-d[c]-f[m],C=w/2-d[c]/2+S,O=qi(A,C,T),b=l;n.modifiersData[r]=(t={},t[b]=O,t.centerOffset=O-C,t)}}function P2(e){var t=e.state,n=e.options,r=n.element,o=r===void 0?"[data-popper-arrow]":r;o!=null&&(typeof o=="string"&&(o=t.elements.popper.querySelector(o),!o)||!L1(t.elements.popper,o)||(t.elements.arrow=o))}const k2={name:"arrow",enabled:!0,phase:"main",fn:_2,effect:P2,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function Uo(e){return e.split("-")[1]}var T2={top:"auto",right:"auto",bottom:"auto",left:"auto"};function I2(e){var t=e.x,n=e.y,r=window,o=r.devicePixelRatio||1;return{x:Mo(t*o)/o||0,y:Mo(n*o)/o||0}}function Pv(e){var t,n=e.popper,r=e.popperRect,o=e.placement,i=e.variation,a=e.offsets,s=e.position,l=e.gpuAcceleration,u=e.adaptive,c=e.roundOffsets,f=e.isFixed,d=a.x,p=d===void 0?0:d,m=a.y,y=m===void 0?0:m,h=typeof c=="function"?c({x:p,y}):{x:p,y};p=h.x,y=h.y;var v=a.hasOwnProperty("x"),w=a.hasOwnProperty("y"),S=bt,A=St,T=window;if(u){var C=Za(n),O="clientHeight",b="clientWidth";if(C===nn(n)&&(C=gr(n),Nn(C).position!=="static"&&s==="absolute"&&(O="scrollHeight",b="scrollWidth")),C=C,o===St||(o===bt||o===Yt)&&i===Pa){A=Wt;var E=f&&T.visualViewport?T.visualViewport.height:C[O];y-=E-r.height,y*=l?1:-1}if(o===bt||(o===St||o===Wt)&&i===Pa){S=Yt;var x=f&&T.visualViewport?T.visualViewport.width:C[b];p-=x-r.width,p*=l?1:-1}}var _=Object.assign({position:s},u&&T2),k=c===!0?I2({x:p,y}):{x:p,y};if(p=k.x,y=k.y,l){var D;return Object.assign({},_,(D={},D[A]=w?"0":"",D[S]=v?"0":"",D.transform=(T.devicePixelRatio||1)<=1?"translate("+p+"px, "+y+"px)":"translate3d("+p+"px, "+y+"px, 0)",D))}return Object.assign({},_,(t={},t[A]=w?y+"px":"",t[S]=v?p+"px":"",t.transform="",t))}function N2(e){var t=e.state,n=e.options,r=n.gpuAcceleration,o=r===void 0?!0:r,i=n.adaptive,a=i===void 0?!0:i,s=n.roundOffsets,l=s===void 0?!0:s,u={placement:hn(t.placement),variation:Uo(t.placement),popper:t.elements.popper,popperRect:t.rects.popper,gpuAcceleration:o,isFixed:t.options.strategy==="fixed"};t.modifiersData.popperOffsets!=null&&(t.styles.popper=Object.assign({},t.styles.popper,Pv(Object.assign({},u,{offsets:t.modifiersData.popperOffsets,position:t.options.strategy,adaptive:a,roundOffsets:l})))),t.modifiersData.arrow!=null&&(t.styles.arrow=Object.assign({},t.styles.arrow,Pv(Object.assign({},u,{offsets:t.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:l})))),t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-placement":t.placement})}const D2={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:N2,data:{}};var As={passive:!0};function R2(e){var t=e.state,n=e.instance,r=e.options,o=r.scroll,i=o===void 0?!0:o,a=r.resize,s=a===void 0?!0:a,l=nn(t.elements.popper),u=[].concat(t.scrollParents.reference,t.scrollParents.popper);return i&&u.forEach(function(c){c.addEventListener("scroll",n.update,As)}),s&&l.addEventListener("resize",n.update,As),function(){i&&u.forEach(function(c){c.removeEventListener("scroll",n.update,As)}),s&&l.removeEventListener("resize",n.update,As)}}const L2={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:R2,data:{}};var M2={left:"right",right:"left",bottom:"top",top:"bottom"};function Hs(e){return e.replace(/left|right|bottom|top/g,function(t){return M2[t]})}var F2={start:"end",end:"start"};function kv(e){return e.replace(/start|end/g,function(t){return F2[t]})}function Wp(e){var t=nn(e),n=t.pageXOffset,r=t.pageYOffset;return{scrollLeft:n,scrollTop:r}}function Yp(e){return Fo(gr(e)).left+Wp(e).scrollLeft}function U2(e){var t=nn(e),n=gr(e),r=t.visualViewport,o=n.clientWidth,i=n.clientHeight,a=0,s=0;return r&&(o=r.width,i=r.height,/^((?!chrome|android).)*safari/i.test(navigator.userAgent)||(a=r.offsetLeft,s=r.offsetTop)),{width:o,height:i,x:a+Yp(e),y:s}}function B2(e){var t,n=gr(e),r=Wp(e),o=(t=e.ownerDocument)==null?void 0:t.body,i=Nr(n.scrollWidth,n.clientWidth,o?o.scrollWidth:0,o?o.clientWidth:0),a=Nr(n.scrollHeight,n.clientHeight,o?o.scrollHeight:0,o?o.clientHeight:0),s=-r.scrollLeft+Yp(e),l=-r.scrollTop;return Nn(o||n).direction==="rtl"&&(s+=Nr(n.clientWidth,o?o.clientWidth:0)-i),{width:i,height:a,x:s,y:l}}function zp(e){var t=Nn(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/auto|scroll|overlay|hidden/.test(n+o+r)}function B1(e){return["html","body","#document"].indexOf(gn(e))>=0?e.ownerDocument.body:Ut(e)&&zp(e)?e:B1(_u(e))}function Zi(e,t){var n;t===void 0&&(t=[]);var r=B1(e),o=r===((n=e.ownerDocument)==null?void 0:n.body),i=nn(r),a=o?[i].concat(i.visualViewport||[],zp(r)?r:[]):r,s=t.concat(a);return o?s:s.concat(Zi(_u(a)))}function Vf(e){return Object.assign({},e,{left:e.x,top:e.y,right:e.x+e.width,bottom:e.y+e.height})}function j2(e){var t=Fo(e);return t.top=t.top+e.clientTop,t.left=t.left+e.clientLeft,t.bottom=t.top+e.clientHeight,t.right=t.left+e.clientWidth,t.width=e.clientWidth,t.height=e.clientHeight,t.x=t.left,t.y=t.top,t}function Tv(e,t){return t===N1?Vf(U2(e)):Lo(t)?j2(t):Vf(B2(gr(e)))}function W2(e){var t=Zi(_u(e)),n=["absolute","fixed"].indexOf(Nn(e).position)>=0,r=n&&Ut(e)?Za(e):e;return Lo(r)?t.filter(function(o){return Lo(o)&&L1(o,r)&&gn(o)!=="body"}):[]}function Y2(e,t,n){var r=t==="clippingParents"?W2(e):[].concat(t),o=[].concat(r,[n]),i=o[0],a=o.reduce(function(s,l){var u=Tv(e,l);return s.top=Nr(u.top,s.top),s.right=Rl(u.right,s.right),s.bottom=Rl(u.bottom,s.bottom),s.left=Nr(u.left,s.left),s},Tv(e,i));return a.width=a.right-a.left,a.height=a.bottom-a.top,a.x=a.left,a.y=a.top,a}function j1(e){var t=e.reference,n=e.element,r=e.placement,o=r?hn(r):null,i=r?Uo(r):null,a=t.x+t.width/2-n.width/2,s=t.y+t.height/2-n.height/2,l;switch(o){case St:l={x:a,y:t.y-n.height};break;case Wt:l={x:a,y:t.y+t.height};break;case Yt:l={x:t.x+t.width,y:s};break;case bt:l={x:t.x-n.width,y:s};break;default:l={x:t.x,y:t.y}}var u=o?jp(o):null;if(u!=null){var c=u==="y"?"height":"width";switch(i){case Ro:l[u]=l[u]-(t[c]/2-n[c]/2);break;case Pa:l[u]=l[u]+(t[c]/2-n[c]/2);break}}return l}function ka(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=r===void 0?e.placement:r,i=n.boundary,a=i===void 0?l2:i,s=n.rootBoundary,l=s===void 0?N1:s,u=n.elementContext,c=u===void 0?vi:u,f=n.altBoundary,d=f===void 0?!1:f,p=n.padding,m=p===void 0?0:p,y=F1(typeof m!="number"?m:U1(m,qa)),h=c===vi?u2:vi,v=e.rects.popper,w=e.elements[d?h:c],S=Y2(Lo(w)?w:w.contextElement||gr(e.elements.popper),a,l),A=Fo(e.elements.reference),T=j1({reference:A,element:v,strategy:"absolute",placement:o}),C=Vf(Object.assign({},v,T)),O=c===vi?C:A,b={top:S.top-O.top+y.top,bottom:O.bottom-S.bottom+y.bottom,left:S.left-O.left+y.left,right:O.right-S.right+y.right},E=e.modifiersData.offset;if(c===vi&&E){var x=E[o];Object.keys(b).forEach(function(_){var k=[Yt,Wt].indexOf(_)>=0?1:-1,D=[St,Wt].indexOf(_)>=0?"y":"x";b[_]+=x[D]*k})}return b}function z2(e,t){t===void 0&&(t={});var n=t,r=n.placement,o=n.boundary,i=n.rootBoundary,a=n.padding,s=n.flipVariations,l=n.allowedAutoPlacements,u=l===void 0?D1:l,c=Uo(r),f=c?s?Ov:Ov.filter(function(m){return Uo(m)===c}):qa,d=f.filter(function(m){return u.indexOf(m)>=0});d.length===0&&(d=f);var p=d.reduce(function(m,y){return m[y]=ka(e,{placement:y,boundary:o,rootBoundary:i,padding:a})[hn(y)],m},{});return Object.keys(p).sort(function(m,y){return p[m]-p[y]})}function G2(e){if(hn(e)===Up)return[];var t=Hs(e);return[kv(e),t,kv(t)]}function $2(e){var t=e.state,n=e.options,r=e.name;if(!t.modifiersData[r]._skip){for(var o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!0:a,l=n.fallbackPlacements,u=n.padding,c=n.boundary,f=n.rootBoundary,d=n.altBoundary,p=n.flipVariations,m=p===void 0?!0:p,y=n.allowedAutoPlacements,h=t.options.placement,v=hn(h),w=v===h,S=l||(w||!m?[Hs(h)]:G2(h)),A=[h].concat(S).reduce(function(le,ue){return le.concat(hn(ue)===Up?z2(t,{placement:ue,boundary:c,rootBoundary:f,padding:u,flipVariations:m,allowedAutoPlacements:y}):ue)},[]),T=t.rects.reference,C=t.rects.popper,O=new Map,b=!0,E=A[0],x=0;x=0,q=B?"width":"height",H=ka(t,{placement:_,boundary:c,rootBoundary:f,altBoundary:d,padding:u}),ce=B?D?Yt:bt:D?Wt:St;T[q]>C[q]&&(ce=Hs(ce));var he=Hs(ce),ye=[];if(i&&ye.push(H[k]<=0),s&&ye.push(H[ce]<=0,H[he]<=0),ye.every(function(le){return le})){E=_,b=!1;break}O.set(_,ye)}if(b)for(var ne=m?3:1,R=function(ue){var ze=A.find(function(Fe){var Ue=O.get(Fe);if(Ue)return Ue.slice(0,ue).every(function(rt){return rt})});if(ze)return E=ze,"break"},Y=ne;Y>0;Y--){var V=R(Y);if(V==="break")break}t.placement!==E&&(t.modifiersData[r]._skip=!0,t.placement=E,t.reset=!0)}}const H2={name:"flip",enabled:!0,phase:"main",fn:$2,requiresIfExists:["offset"],data:{_skip:!1}};function Iv(e,t,n){return n===void 0&&(n={x:0,y:0}),{top:e.top-t.height-n.y,right:e.right-t.width+n.x,bottom:e.bottom-t.height+n.y,left:e.left-t.width-n.x}}function Nv(e){return[St,Yt,Wt,bt].some(function(t){return e[t]>=0})}function V2(e){var t=e.state,n=e.name,r=t.rects.reference,o=t.rects.popper,i=t.modifiersData.preventOverflow,a=ka(t,{elementContext:"reference"}),s=ka(t,{altBoundary:!0}),l=Iv(a,r),u=Iv(s,o,i),c=Nv(l),f=Nv(u);t.modifiersData[n]={referenceClippingOffsets:l,popperEscapeOffsets:u,isReferenceHidden:c,hasPopperEscaped:f},t.attributes.popper=Object.assign({},t.attributes.popper,{"data-popper-reference-hidden":c,"data-popper-escaped":f})}const J2={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:V2};function Q2(e,t,n){var r=hn(e),o=[bt,St].indexOf(r)>=0?-1:1,i=typeof n=="function"?n(Object.assign({},t,{placement:e})):n,a=i[0],s=i[1];return a=a||0,s=(s||0)*o,[bt,Yt].indexOf(r)>=0?{x:s,y:a}:{x:a,y:s}}function X2(e){var t=e.state,n=e.options,r=e.name,o=n.offset,i=o===void 0?[0,0]:o,a=D1.reduce(function(c,f){return c[f]=Q2(f,t.rects,i),c},{}),s=a[t.placement],l=s.x,u=s.y;t.modifiersData.popperOffsets!=null&&(t.modifiersData.popperOffsets.x+=l,t.modifiersData.popperOffsets.y+=u),t.modifiersData[r]=a}const K2={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:X2};function q2(e){var t=e.state,n=e.name;t.modifiersData[n]=j1({reference:t.rects.reference,element:t.rects.popper,strategy:"absolute",placement:t.placement})}const Z2={name:"popperOffsets",enabled:!0,phase:"read",fn:q2,data:{}};function eO(e){return e==="x"?"y":"x"}function tO(e){var t=e.state,n=e.options,r=e.name,o=n.mainAxis,i=o===void 0?!0:o,a=n.altAxis,s=a===void 0?!1:a,l=n.boundary,u=n.rootBoundary,c=n.altBoundary,f=n.padding,d=n.tether,p=d===void 0?!0:d,m=n.tetherOffset,y=m===void 0?0:m,h=ka(t,{boundary:l,rootBoundary:u,padding:f,altBoundary:c}),v=hn(t.placement),w=Uo(t.placement),S=!w,A=jp(v),T=eO(A),C=t.modifiersData.popperOffsets,O=t.rects.reference,b=t.rects.popper,E=typeof y=="function"?y(Object.assign({},t.rects,{placement:t.placement})):y,x=typeof E=="number"?{mainAxis:E,altAxis:E}:Object.assign({mainAxis:0,altAxis:0},E),_=t.modifiersData.offset?t.modifiersData.offset[t.placement]:null,k={x:0,y:0};if(!!C){if(i){var D,B=A==="y"?St:bt,q=A==="y"?Wt:Yt,H=A==="y"?"height":"width",ce=C[A],he=ce+h[B],ye=ce-h[q],ne=p?-b[H]/2:0,R=w===Ro?O[H]:b[H],Y=w===Ro?-b[H]:-O[H],V=t.elements.arrow,le=p&&V?Bp(V):{width:0,height:0},ue=t.modifiersData["arrow#persistent"]?t.modifiersData["arrow#persistent"].padding:M1(),ze=ue[B],Fe=ue[q],Ue=qi(0,O[H],le[H]),rt=S?O[H]/2-ne-Ue-ze-x.mainAxis:R-Ue-ze-x.mainAxis,us=S?-O[H]/2+ne+Ue+Fe+x.mainAxis:Y+Ue+Fe+x.mainAxis,zu=t.elements.arrow&&Za(t.elements.arrow),vS=zu?A==="y"?zu.clientTop||0:zu.clientLeft||0:0,ch=(D=_==null?void 0:_[A])!=null?D:0,gS=ce+rt-ch-vS,yS=ce+us-ch,fh=qi(p?Rl(he,gS):he,ce,p?Nr(ye,yS):ye);C[A]=fh,k[A]=fh-ce}if(s){var dh,wS=A==="x"?St:bt,SS=A==="x"?Wt:Yt,yr=C[T],cs=T==="y"?"height":"width",ph=yr+h[wS],hh=yr-h[SS],Gu=[St,bt].indexOf(v)!==-1,mh=(dh=_==null?void 0:_[T])!=null?dh:0,vh=Gu?ph:yr-O[cs]-b[cs]-mh+x.altAxis,gh=Gu?yr+O[cs]+b[cs]-mh-x.altAxis:hh,yh=p&&Gu?x2(vh,yr,gh):qi(p?vh:ph,yr,p?gh:hh);C[T]=yh,k[T]=yh-yr}t.modifiersData[r]=k}}const nO={name:"preventOverflow",enabled:!0,phase:"main",fn:tO,requiresIfExists:["offset"]};function rO(e){return{scrollLeft:e.scrollLeft,scrollTop:e.scrollTop}}function oO(e){return e===nn(e)||!Ut(e)?Wp(e):rO(e)}function iO(e){var t=e.getBoundingClientRect(),n=Mo(t.width)/e.offsetWidth||1,r=Mo(t.height)/e.offsetHeight||1;return n!==1||r!==1}function aO(e,t,n){n===void 0&&(n=!1);var r=Ut(t),o=Ut(t)&&iO(t),i=gr(t),a=Fo(e,o),s={scrollLeft:0,scrollTop:0},l={x:0,y:0};return(r||!r&&!n)&&((gn(t)!=="body"||zp(i))&&(s=oO(t)),Ut(t)?(l=Fo(t,!0),l.x+=t.clientLeft,l.y+=t.clientTop):i&&(l.x=Yp(i))),{x:a.left+s.scrollLeft-l.x,y:a.top+s.scrollTop-l.y,width:a.width,height:a.height}}function sO(e){var t=new Map,n=new Set,r=[];e.forEach(function(i){t.set(i.name,i)});function o(i){n.add(i.name);var a=[].concat(i.requires||[],i.requiresIfExists||[]);a.forEach(function(s){if(!n.has(s)){var l=t.get(s);l&&o(l)}}),r.push(i)}return e.forEach(function(i){n.has(i.name)||o(i)}),r}function lO(e){var t=sO(e);return w2.reduce(function(n,r){return n.concat(t.filter(function(o){return o.phase===r}))},[])}function uO(e){var t;return function(){return t||(t=new Promise(function(n){Promise.resolve().then(function(){t=void 0,n(e())})})),t}}function cO(e){var t=e.reduce(function(n,r){var o=n[r.name];return n[r.name]=o?Object.assign({},o,r,{options:Object.assign({},o.options,r.options),data:Object.assign({},o.data,r.data)}):r,n},{});return Object.keys(t).map(function(n){return t[n]})}var Dv={placement:"bottom",modifiers:[],strategy:"absolute"};function Rv(){for(var e=arguments.length,t=new Array(e),n=0;n{var l=s,{children:e,placement:t="right",showOn:n="hover",popoverContent:r,bgColor:o,openDelayMs:i=0}=l,a=$t(l,["children","placement","showOn","popoverContent","bgColor","openDelayMs"]);const[u,c]=I.useState(null),[f,d]=I.useState(null),[p,m]=I.useState(null),{styles:y,attributes:h,update:v}=SO(u,f,{placement:t,modifiers:[{name:"arrow",options:{element:p}},{name:"offset",options:{offset:[0,5]}}],strategy:"fixed"}),w=I.useMemo(()=>$(F({},y.popper),{backgroundColor:o}),[o,y.popper]),S=I.useMemo(()=>{let T;function C(){T=setTimeout(()=>{v==null||v(),f==null||f.setAttribute("data-show","")},i)}function O(){clearTimeout(T),f==null||f.removeAttribute("data-show")}return{[n==="hover"?"onMouseEnter":"onClick"]:()=>C(),onMouseLeave:()=>O()}},[i,f,n,v]),A=typeof r=="string";return N(Me,{children:[g("button",$(F(F({},a),S),{ref:c,children:e})),N("div",$(F({ref:d,className:xc.popover,style:w},h.popper),{children:[A?g("div",{className:xc.textContent,children:r}):r,g("div",{ref:m,className:xc.popperArrow,style:y.arrow})]}))]})},AO="_infoIcon_15ri6_1",xO="_container_15ri6_10",OO="_header_15ri6_15",_O="_info_15ri6_1",PO="_unit_15ri6_27",kO="_description_15ri6_31",to={infoIcon:AO,container:xO,header:OO,info:_O,unit:PO,description:kO},W1=({units:e})=>g(Gp,{className:to.infoIcon,popoverContent:g(TO,{units:e}),openDelayMs:500,placement:"auto",children:g(OA,{})});function TO({units:e}){return N("div",{className:to.container,children:[g("div",{className:to.header,children:"CSS size options"}),g("div",{className:to.info,children:e.map(t=>N(I.Fragment,{children:[g("div",{className:to.unit,children:t}),g("div",{className:to.description,children:IO[t]})]},t))})]})}const IO={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."},NO="_wrapper_13r28_1",DO="_unitSelector_13r28_10",Ll={wrapper:NO,unitSelector:DO};function RO(e){const[t,n]=j.exports.useState(T1(e)),r=j.exports.useCallback(i=>{if(i===void 0){if(t.unit!=="auto")throw new Error("Undefined count with auto units");n({unit:t.unit,count:null});return}if(t.unit==="auto"){console.error("How did you change the count of an auto unit?");return}n({unit:t.unit,count:i})},[t.unit]),o=j.exports.useCallback(i=>{n(a=>{const s=a.unit;return i==="auto"?{unit:i,count:null}:s==="auto"?{unit:i,count:Y1[i]}:{unit:i,count:a.count}})},[]);return{cssValue:t,updateCount:r,updateUnit:o}}const Y1={fr:1,px:10,rem:1,"%":100};function LO({value:e,onChange:t,units:n=["fr","px","rem","auto"],disabled:r=!1}){const{cssValue:o,updateCount:i,updateUnit:a}=RO(e!=null?e:"auto"),s=I.useMemo(()=>Fp(u=>{t(u)},500),[t]);if(I.useEffect(()=>{const u=Wn(o);if(e!==u)return s(Wn(o)),()=>s.cancel()},[o,s,e]),e===void 0&&!r)return null;const l=r||o.count===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",onKeyDown:u=>{u.key==="Enter"&&t(Wn(o))},children:[g(Mp,{ariaLabel:"value-count",value:l?void 0:o.count,disabled:l,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o.unit,disabled:r,onChange:u=>a(u.target.value),children:n.map(u=>g("option",{value:u,children:u},u))}),g(W1,{units:n})]})}function yn(s){var l=s,{name:e,label:t,onChange:n,optional:r,value:o,defaultValue:i="10px"}=l,a=$t(l,["name","label","onChange","optional","value","defaultValue"]);const u=$r(n),c=o===void 0;return g(Lp,{name:e,label:t,optional:r,isDisabled:c,defaultValue:i,width_setting:"fit",mainInput:g(LO,$(F({value:o!=null?o:i},a),{disabled:c,onChange:f=>{u({name:e,value:f})}}))})}function MO({value:e,onChange:t,units:n=["fr","px","rem","auto"]}){const{count:r,unit:o}=T1(e),i=I.useCallback(l=>{if(l===void 0){if(o!=="auto")throw new Error("Undefined count with auto units");t(Wn({unit:o,count:null}));return}if(o==="auto"){console.error("How did you change the count of an auto unit?");return}t(Wn({unit:o,count:l}))},[t,o]),a=I.useCallback(l=>{if(l==="auto"){t(Wn({unit:l,count:null}));return}if(o==="auto"){t(Wn({unit:l,count:Y1[l]}));return}t(Wn({unit:l,count:r}))},[r,t,o]),s=r===null;return N("div",{className:Ll.wrapper,"aria-label":"Css Unit Input",children:[g(Mp,{ariaLabel:"value-count",value:s?void 0:r,disabled:s,onChange:i,min:0}),g("select",{className:Ll.unitSelector,"aria-label":"value-unit",name:"value-unit",value:o,onChange:l=>a(l.target.value),children:n.map(l=>g("option",{value:l,children:l},l))}),g(W1,{units:n})]})}const FO="_tractInfoDisplay_9993b_1",UO="_sizeWidget_9993b_61",BO="_hoverListener_9993b_88",jO="_buttons_9993b_108",WO="_tractAddButton_9993b_121",YO="_deleteButton_9993b_122",co={tractInfoDisplay:FO,sizeWidget:UO,hoverListener:BO,buttons:jO,tractAddButton:WO,deleteButton:YO},zO=["fr","px"];function GO({dir:e,index:t,size:n,onUpdate:r,deletionConflicts:o}){const i=j.exports.useCallback(c=>r({type:"RESIZE",dir:e,index:t,size:c}),[e,t,r]),a=j.exports.useCallback(c=>r({type:"ADD",dir:e,index:c}),[e,r]),s=j.exports.useCallback(()=>a(t),[a,t]),l=j.exports.useCallback(()=>a(t+1),[a,t]),u=j.exports.useCallback(()=>r({type:"DELETE",dir:e,index:t+1}),[e,t,r]);return N("div",{className:co.tractInfoDisplay,"data-drag-dir":e,style:{"--tract-index":t+1},children:[g("div",{className:co.hoverListener}),N("div",{className:co.sizeWidget,onClick:HO,children:[N("div",{className:co.buttons,children:[g(Lv,{dir:e,onClick:s}),g($O,{onClick:u,deletionConflicts:o}),g(Lv,{dir:e,onClick:l})]}),g(MO,{value:n,units:zO,onChange:i})]})]})}const z1=200;function $O({onClick:e,deletionConflicts:t}){const n=t.length===0,r=n?"Delete tract":`Can't delete because the items ${t.join(",")} are entirely contained in tract`;return g(Gp,{className:co.deleteButton,onClick:G1(n?e:void 0),popoverContent:r,"data-enabled":n,openDelayMs:z1,children:g(Sp,{})})}function Lv({dir:e,onClick:t}){const n=e==="rows"?"right":"bottom",r=e==="rows"?"Add row":"Add column";return g(Gp,{className:co.tractAddButton,placement:n,"aria-label":r,popoverContent:r,onClick:G1(t),openDelayMs:z1,children:g(C1,{})})}function G1(e){return function(t){t.currentTarget.blur(),e==null||e()}}function Mv({dir:e,sizes:t,areas:n,onUpdate:r}){const o=j.exports.useCallback(({dir:i,index:a})=>k1(n,{dir:i,index:a+1}),[n]);return g(Me,{children:t.map((i,a)=>g(GO,{index:a,dir:e,size:i,onUpdate:r,deletionConflicts:o({dir:e,index:a})},e+a))})}function HO(e){e.stopPropagation()}const VO="_columnSizer_3i83d_1",JO="_rowSizer_3i83d_2",Fv={columnSizer:VO,rowSizer:JO};function Uv({dir:e,index:t,onStartDrag:n}){return g("div",{className:e==="rows"?Fv.rowSizer:Fv.columnSizer,onMouseDown:r=>n({e:r,dir:e,index:t}),style:{[e==="rows"?"gridRow":"gridColumn"]:t}})}function QO(e,t="Ref is not yet initialized"){if(e.current===null)throw new Error(t);return e.current}const Ml=40,XO=.15,$1=e=>t=>Math.round(t/e)*e,KO=5,$p=$1(KO),qO=.01,ZO=$1(qO),Bv=e=>Number(e.toFixed(4));function e3(e,{pixelToFrRatio:t,beforeInfo:n,afterInfo:r}){const o=ZO(e*t),i=n.count+o,a=r.count-o;return(o<0?i/a:a/i)=i.length?null:i[u];if(c==="auto"||f==="auto"){const m=getComputedStyle(r).getPropertyValue(t==="rows"?"grid-template-rows":"grid-template-columns").split(" ");c==="auto"&&(c=m[l],i[l]=c),f==="auto"&&(f=m[u],i[u]=f),r.style[o]=m.join(" ")}const d=o3(c,f);if(d.type==="unsupported")throw new Error("Unsupported drag type");r.classList.add("been-dragged");const p=$(F({dir:t,mouseStart:V1(e,t),originalSizes:i,currentSizes:[...i],beforeIndex:l,afterIndex:u},d),{pixelToFrRatio:1});return d.type==="both-relative"&&(p.pixelToFrRatio=i3({container:r,index:n,dir:t,frCounts:{before:d.beforeInfo.count,after:d.afterInfo.count}})),p}function s3({mousePosition:e,drag:t,container:n}){const o=V1(e,t.dir)-t.mouseStart,i=[...t.originalSizes];let a;switch(t.type){case"before-pixel":a=n3(o,t);break;case"after-pixel":a=r3(o,t);break;case"both-pixel":a=t3(o,t);break;case"both-relative":a=e3(o,t);break}a!=="no-change"&&(a.beforeSize&&(i[t.beforeIndex]=a.beforeSize),a.afterSize&&(i[t.afterIndex]=a.afterSize),t.currentSizes=i,t.dir==="cols"?n.style.gridTemplateColumns=i.join(" "):n.style.gridTemplateRows=i.join(" "))}function l3(e){return e.match(/[0-9|.]+px/)!==null}function H1(e){return e.match(/[0-9|.]+fr/)!==null}function Fl(e){if(H1(e))return{type:"fr",count:Number(e.replace("fr","")),value:e};if(l3(e))return{type:"pixel",count:Number(e.replace("px","")),value:e};throw new Error("Unknown tract sizing unit: "+e)}function V1(e,t){return t==="rows"?e.clientY:e.clientX}function u3(e){return e.some(t=>H1(t))}function c3(e){return e.some(t=>t==="auto")}function jv(e,t){const n=Math.abs(t-e)+1,r=ee+i*r)}function f3({areas:e,row_sizes:t,col_sizes:n,gap_size:r}){return{gridTemplateAreas:e.map(o=>`"${o.join(" ")}"`).join(` - `),gridTemplateRows:t.join(" "),gridTemplateColumns:n.join(" "),"--grid-gap":r}}function Wv(e){return e.split(" ")}function d3(e){const t=e.match(/"([.\w\s]+)"/g);if(!t)throw new Error("Can't parse area definition");return t.map(n=>n.replaceAll('"',"").split(" "))}function p3(e){const t=Wv(e.style.gridTemplateRows),n=Wv(e.style.gridTemplateColumns),r=d3(e.style.gridTemplateAreas),o=e.style.getPropertyValue("--grid-gap");return{row_sizes:t,col_sizes:n,areas:r,gap_size:o}}function h3({containerRef:e,onDragEnd:t}){return I.useCallback(({e:r,dir:o,index:i})=>{const a=QO(e,"How are you dragging on an element without a container?");r.preventDefault();const s=a3({mousePosition:r,dir:o,index:i,container:a}),{beforeIndex:l,afterIndex:u}=s,c=Yv(a,{dir:o,index:l,size:s.currentSizes[l]}),f=Yv(a,{dir:o,index:u,size:s.currentSizes[u]});m3(a,s.dir,{move:d=>{s3({mousePosition:d,drag:s,container:a}),c.update(s.currentSizes[l]),f.update(s.currentSizes[u])},end:()=>{c.remove(),f.remove(),t&&t(p3(a))}})},[e,t])}function Yv(e,{dir:t,index:n,size:r}){const o=document.createElement("div"),i=t==="rows"?{gridRow:String(n+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(n+1),gridRow:"1",flexDirection:"column"};Object.assign(o.style,i,{zIndex:"1",display:"flex",alignItems:"center"});const a=document.createElement("div");return Object.assign(a.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),a.innerHTML=r,o.appendChild(a),e.appendChild(o),{remove:()=>o.remove(),update:s=>{a.innerHTML=s}}}function m3(e,t,n){const r=document.createElement("div");Object.assign(r.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:t==="rows"?"ns-resize":"ew-resize"}),e.appendChild(r);const o=()=>{i(),n.end()};r.addEventListener("mousemove",n.move),r.addEventListener("mouseup",o),r.addEventListener("mouseleave",o);function i(){r.removeEventListener("mousemove",n.move),r.removeEventListener("mouseup",o),r.removeEventListener("mouseleave",o),r.remove()}}const v3="1fr";function g3(o){var i=o,{className:e,children:t,onNewLayout:n}=i,r=$t(i,["className","children","onNewLayout"]);const{row_sizes:a,col_sizes:s}=r,l=j.exports.useRef(null),u=f3(r),c=jv(2,s.length),f=jv(2,a.length),d=h3({containerRef:l,onDragEnd:n}),p=[Zx.ResizableGrid];e&&p.push(e);const m=j.exports.useCallback(h=>{switch(h.type){case"ADD":return _1(r,{afterIndex:h.index,dir:h.dir,size:v3});case"RESIZE":return y3(r,h);case"DELETE":return P1(r,h)}},[r]),y=j.exports.useCallback(h=>n(m(h)),[m,n]);return N("div",{className:p.join(" "),ref:l,style:u,children:[c.map(h=>g(Uv,{dir:"cols",index:h,onStartDrag:d},"cols"+h)),f.map(h=>g(Uv,{dir:"rows",index:h,onStartDrag:d},"rows"+h)),t,g(Mv,{dir:"cols",sizes:s,areas:r.areas,onUpdate:y}),g(Mv,{dir:"rows",sizes:a,areas:r.areas,onUpdate:y})]})}function y3(e,{dir:t,index:n,size:r}){return ei(e,o=>{o[t==="rows"?"row_sizes":"col_sizes"][n]=r})}function w3(e,r){var o=r,{name:t}=o,n=$t(o,["name"]);const{rowStart:i,colStart:a}=n,s="rowEnd"in n?n.rowEnd:i+n.rowSpan-1,l="colEnd"in n?n.colEnd:a+n.colSpan-1,u=Ou(e.areas);for(let c=0;c=i-1&&c=a-1&&d{for(let o of n)S3(r,o)})}function b3(e,t){return J1(e,t)}function E3(e,t,n){return ei(e,({areas:r})=>{const{numRows:o,numCols:i}=Ka(r);for(let a=0;a{const i=n==="rows"?"row_sizes":"col_sizes";o[i][t-1]=r})}function A3(e,{item_a:t,item_b:n}){return t===n?e:ei(e,r=>{const{n_rows:o,n_cols:i}=x3(r.areas);let a=!1,s=!1;for(let l=0;l{a.current&&r&&setTimeout(()=>{var s;return(s=a==null?void 0:a.current)==null?void 0:s.focus()},1)},[r]),g("input",{ref:a,className:k3.input,type:"text","aria-label":t!=null?t:"Text Input",value:e!=null?e:"",placeholder:i,onChange:s=>n(s.target.value),disabled:o})}function pe({name:e,label:t,value:n,placeholder:r,onChange:o,autoFocus:i=!1,optional:a=!1,defaultValue:s="my-text"}){const l=$r(o),u=n===void 0,c=I.useRef(null);return I.useEffect(()=>{c.current&&i&&setTimeout(()=>{var f;return(f=c==null?void 0:c.current)==null?void 0:f.focus()},1)},[i]),g(Lp,{name:e,label:t,optional:a,isDisabled:u,defaultValue:s,width_setting:"full",mainInput:g(T3,{ariaLabel:"input for "+e,value:n,placeholder:r,onChange:f=>l({name:e,value:f}),autoFocus:i,disabled:u})})}const I3="_container_1ehu8_1",N3="_elementsPanel_1ehu8_28",D3="_propertiesPanel_1ehu8_33",R3="_editorHolder_1ehu8_47",L3="_titledPanel_1ehu8_59",M3="_panelTitleHeader_1ehu8_71",F3="_header_1ehu8_80",U3="_rightSide_1ehu8_88",B3="_divider_1ehu8_109",j3="_title_1ehu8_59",W3="_shinyLogo_1ehu8_120",Q1={container:I3,elementsPanel:N3,propertiesPanel:D3,editorHolder:R3,titledPanel:L3,panelTitleHeader:M3,header:F3,rightSide:U3,divider:B3,title:j3,shinyLogo:W3},Y3="_portalHolder_18ua3_1",z3="_portalModal_18ua3_11",G3="_title_18ua3_21",$3="_body_18ua3_25",H3="_portalForm_18ua3_30",V3="_portalFormInputs_18ua3_35",J3="_portalFormFooter_18ua3_42",Q3="_validationMsg_18ua3_48",X3="_infoText_18ua3_53",xs={portalHolder:Y3,portalModal:z3,title:G3,body:$3,portalForm:H3,portalFormInputs:V3,portalFormFooter:J3,validationMsg:Q3,infoText:X3},K3=({children:e,el:t="div"})=>{const[n]=j.exports.useState(document.createElement(t));return j.exports.useEffect(()=>(document.body.appendChild(n),()=>{document.body.removeChild(n)}),[n]),Na.exports.createPortal(e,n)},X1=({children:e,title:t,label:n,onConfirm:r,onCancel:o})=>g(K3,{children:g("div",{className:xs.portalHolder,onClick:()=>o(),onKeyDown:i=>{i.key==="Escape"&&o()},children:N("div",{className:xs.portalModal,onClick:i=>i.stopPropagation(),"aria-label":n!=null?n:"popup modal",children:[t?g("div",{className:xs.title+" "+Q1.panelTitleHeader,children:t}):null,g("div",{className:xs.body,children:e})]})})}),q3="_portalHolder_18ua3_1",Z3="_portalModal_18ua3_11",e_="_title_18ua3_21",t_="_body_18ua3_25",n_="_portalForm_18ua3_30",r_="_portalFormInputs_18ua3_35",o_="_portalFormFooter_18ua3_42",i_="_validationMsg_18ua3_48",a_="_infoText_18ua3_53",gi={portalHolder:q3,portalModal:Z3,title:e_,body:t_,portalForm:n_,portalFormInputs:r_,portalFormFooter:o_,validationMsg:i_,infoText:a_};function s_({onCancel:e,onDone:t,existingAreaNames:n}){const r=`area${n.length}`,[o,i]=I.useState(r),[a,s]=I.useState(null),l=I.useCallback(c=>{c&&c.preventDefault();const f=l_({name:o,existingAreaNames:n});if(f){s(f);return}t(o)},[n,o,t]),u=I.useCallback(({value:c})=>{s(null),i(c!=null?c:r)},[r]);return N(X1,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>t(o),onCancel:e,children:[g("form",{className:gi.portalForm,onSubmit:l,children:N("div",{className:gi.portalFormInputs,children:[g("span",{className:gi.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),g(pe,{label:"Name of new grid area",name:"New-Item-Name",value:o,placeholder:"Name of grid area",onChange:u,autoFocus:!0}),a?g("div",{className:gi.validationMsg,children:a}):null]})}),N("div",{className:gi.portalFormFooter,children:[g(wt,{variant:"delete",onClick:e,children:"Cancel"}),g(wt,{onClick:()=>l(),children:"Done"})]})]})}function l_({name:e,existingAreaNames:t}){return e===""?"A name is needed for the grid area":t.includes(e)?`You already have an item with the name "${e}", all names - need to be unique.`:e.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":e.match(/\s/g)?"Spaces not allowed in grid area names":e.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}const u_="_container_1hvsg_1",c_={container:u_},K1=I.createContext(null),f_=({uiArguments:e,uiChildren:t,children:n,eventHandlers:r,nodeInfo:o,compRef:i})=>{const a=vr(),s=Ew(),{onClick:l}=r,{uniqueAreas:u}=Qx(e),T=e,{areas:c}=T,f=$t(T,["areas"]),d=C=>{a(Sw({path:[],node:{uiName:"gridlayout::grid_page",uiArguments:F(F({},f),C)}}))},p=I.useMemo(()=>Rp(c),[c]),[m,y]=I.useState(null),h=C=>{const{node:O,currentPath:b,pos:E}=C,x=b!==void 0,_=$f.includes(O.uiName);if(x&&_&&"area"in O.uiArguments&&O.uiArguments.area){const k=O.uiArguments.area;v({type:"MOVE_ITEM",name:k,pos:E});return}y(C)},v=C=>{d(Hp(e,C))},w=u.map(C=>g(zx,{area:C,areas:c,gridLocation:p.get(C),onNewPos:O=>v({type:"MOVE_ITEM",name:C,pos:O})},C)),S={"--gap":e.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},A=(C,{node:O,currentPath:b,pos:E})=>{if($f.includes(O.uiName)){const x=$(F({},O.uiArguments),{area:C});O.uiArguments=x}else O={uiName:"gridlayout::grid_card",uiArguments:{area:C},uiChildren:[O]};s({parentPath:[],node:O,currentPath:b}),v({type:"ADD_ITEM",name:C,pos:E}),y(null)};return N(K1.Provider,{value:v,children:[g("div",{ref:i,style:S,className:c_.container,onClick:l,draggable:!1,onDragStart:()=>{},children:N(g3,$(F({},e),{onNewLayout:d,children:[Jx(c).map(({row:C,col:O})=>g(Hx,{gridRow:C,gridColumn:O,onDroppedNode:h},Mx({row:C,col:O}))),t==null?void 0:t.map((C,O)=>g(Ep,F({path:[...o.path,O]},C),o.path.join(".")+O)),n,w]}))}),m?g(s_,{info:m,onCancel:()=>y(null),onDone:C=>A(C,m),existingAreaNames:u}):null]})};function d_(e){let t=[];return e.forEach(n=>{if("area"in n.uiArguments&&n.uiArguments.area!==void 0){const r=n.uiArguments.area;t.push(r)}}),t}function p_(){return I.useContext(K1)}function Vp({containerRef:e,path:t,area:n}){const r=p_(),o=I.useCallback(({node:a,currentPath:s})=>s===void 0||!$f.includes(a.uiName)?!1:Np(s,t),[t]),i=I.useCallback(a=>{var l;if(!("area"in a.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:a});return}const s=(l=a.node.uiArguments.area)!=null?l:"__BAD_DROP__";r==null||r({type:"SWAP_ITEMS",item_a:n,item_b:s})},[n,r]);Dp({watcherRef:e,getCanAcceptDrop:o,onDrop:i,canAcceptDropClass:xt.availableToSwap,hoveringOverClass:xt.hoveringOverSwap})}const h_=({uiArguments:{area:e,item_gap:t,title:n},uiChildren:r,nodeInfo:{path:o},children:i,eventHandlers:a,compRef:s})=>{const l=r.length>0;return Vp({containerRef:s,area:e,path:o}),N(Cp,{className:xt.container+" "+(n?xt.withTitle:""),ref:s,style:{gridArea:e,"--item-gap":t},onClick:a.onClick,children:[n?g(WA,{className:xt.panelTitle,children:n}):null,N("div",{className:xt.contentHolder,"data-alignment":"top",children:[g(zv,{index:0,parentPath:o,numChildren:r.length}),l?r==null?void 0:r.map((u,c)=>N(I.Fragment,{children:[g(Ep,F({path:[...o,c]},u)),g(zv,{index:c+1,numChildren:r.length,parentPath:o})]},o.join(".")+c)):g(v_,{path:o})]}),i]})};function zv({index:e,numChildren:t,parentPath:n}){const r=I.useRef(null);Ax({watcherRef:r,positionInChildren:e,parentPath:n});const o=m_(e,t);return g("div",{ref:r,className:xt.dropWatcher+" "+o,"aria-label":"drop watcher"})}function m_(e,t){return e===0&&t===0?xt.onlyDropWatcher:e===0?xt.firstDropWatcher:e===t?xt.lastDropWatcher:xt.middleDropWatcher}function v_({path:e}){return N("div",{className:xt.emptyGridCard,children:[g("span",{className:xt.emptyMessage,children:"Empty grid card"}),g(m1,{path:e,justIcon:!0,label:"Delete empty grid card"})]})}const g_=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e.area}),g(pe,{name:"title",label:"Panel title",value:e.title,optional:!0,defaultValue:e.area}),g(yn,{name:"item_gap",value:(t=e.item_gap)!=null?t:"15px",label:"Gap Size",units:["px","rem"]})]})},y_={area:"default-area",item_gap:"12px"},w_={title:"Grid Card",UiComponent:h_,SettingsComponent:g_,acceptsChildren:!0,defaultSettings:y_,iconSrc:dA,category:"gridlayout"},q1="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";function S_(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(e)}const Z1=({type:e,name:t,className:n})=>N("code",{className:n,children:[N("span",{style:{opacity:.55},children:[e,"$"]}),g("span",{children:t})]}),b_="_container_1rlbk_1",E_="_plotPlaceholder_1rlbk_5",C_="_label_1rlbk_19",Jf={container:b_,plotPlaceholder:E_,label:C_};function ew({outputId:e}){const t=j.exports.useRef(null),n=A_(t),r=n===null?100:Math.min(n.width,n.height);return N("div",{ref:t,className:Jf.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[g(Z1,{className:Jf.label,type:"output",name:e}),g(S_,{size:`calc(${r}px - 80px)`})]})}function A_(e){const[t,n]=j.exports.useState(null);return j.exports.useEffect(()=>{if(typeof ResizeObserver=="undefined")return;const r=new ResizeObserver(o=>{if(!e.current)return;const{offsetHeight:i,offsetWidth:a}=e.current;n({width:a,height:i})});return e.current&&r.observe(e.current),()=>r.disconnect()},[e]),t}const x_="_gridCardPlot_1a94v_1",O_={gridCardPlot:x_},__=({uiArguments:{outputId:e,area:t},children:n,nodeInfo:{path:r},eventHandlers:o,compRef:i})=>(Vp({containerRef:i,area:t,path:r}),N(Cp,$(F({ref:i,style:{gridArea:t},className:O_.gridCardPlot+" gridlayout-gridCardPlot","aria-label":"gridlayout-gridCardPlot"},o),{children:[g(ew,{outputId:e!=null?e:t}),n]}))),P_=({settings:{area:e,outputId:t}})=>N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:e}),g(pe,{label:"Output ID",name:"outputId",value:t,optional:!0,defaultValue:e})]}),k_={title:"Grid Plot Card",UiComponent:__,SettingsComponent:P_,acceptsChildren:!1,defaultSettings:{area:"plot"},iconSrc:q1,category:"gridlayout"},T_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=",I_="_textPanel_525i2_1",N_={textPanel:I_},D_=({uiArguments:{content:e,area:t,alignment:n},children:r,nodeInfo:{path:o},eventHandlers:i,compRef:a})=>(Vp({containerRef:a,area:t,path:o}),N(Cp,$(F({ref:a,className:N_.textPanel+" gridlayout-textPanel",style:{gridArea:t,justifyItems:n},"aria-label":"gridlayout-textPanel"},i),{children:[g("h1",{children:e}),r]}))),R_="_checkboxInput_12wa8_1",L_="_checkboxLabel_12wa8_10",Gv={checkboxInput:R_,checkboxLabel:L_};function tw({name:e,label:t,value:n,onChange:r,disabled:o,noLabel:i}){const a=$r(r),s=i?void 0:t!=null?t:e,l=`${e}-checkbox-input`,u=N(Me,{children:[g("input",{className:Gv.checkboxInput,id:l,"aria-label":t!=null?t:e+"Checkbox Input",type:"checkbox",disabled:o,checked:n,onChange:c=>a({name:e,value:c.target.checked})}),g("label",{className:Gv.checkboxLabel,htmlFor:l,"data-value":n?"TRUE":"FALSE",children:"Toggle"})]});return s!==void 0?N("div",{className:kn.container,children:[N("label",{className:kn.label,children:[s,":"]}),u]}):u}const M_="_radioContainer_1regb_1",F_="_option_1regb_15",U_="_radioInput_1regb_22",B_="_radioLabel_1regb_26",j_="_icon_1regb_41",yi={radioContainer:M_,option:F_,radioInput:U_,radioLabel:B_,icon:j_};function W_({name:e,label:t,options:n,currentSelection:r,onChange:o,optionsPerColumn:i}){const a=Object.keys(n),s=$r(o),l=j.exports.useMemo(()=>({gridTemplateColumns:i?`repeat(${i}, 1fr)`:void 0}),[i]);return N("div",{className:kn.container,"data-full-width":"true",children:[N("label",{htmlFor:e,className:kn.label,children:[t!=null?t:e,":"]}),g("fieldset",{className:yi.radioContainer,id:e,style:l,children:a.map(u=>{var d;const{icon:c,label:f=u}=(d=n[u])!=null?d:{};return N("div",{className:yi.option,children:[g("input",{className:yi.radioInput,name:e,id:e+u,type:"radio",value:u,onChange:()=>s({name:e,value:u}),checked:u===r}),g("label",{className:yi.radioLabel,htmlFor:e+u,"data-name":f,children:typeof c=="string"?g("img",{src:c,alt:f,className:yi.icon}):c})]},u)})})]})}const Y_={start:{icon:f1,label:"left"},center:{icon:Mf,label:"center"},end:{icon:d1,label:"right"}},z_=({settings:e})=>{var t;return N(Me,{children:[g(pe,{name:"area",label:"Name of grid area",value:(t=e.area)!=null?t:"empty grid area"}),g(pe,{name:"content",label:"Panel content",value:e.content}),g(W_,{name:"alignment",label:"Text Alignment",options:Y_,currentSelection:e.alignment,optionsPerColumn:3}),g(tw,{name:"is_title",label:"Use text as app title",value:e.is_title})]})},G_={title:"Grid Text Card",UiComponent:D_,SettingsComponent:z_,acceptsChildren:!1,defaultSettings:{area:"text_panel",content:"Text from Chooser",alignment:"start"},iconSrc:T_,category:"gridlayout"},$_=({settings:e})=>g(Me,{children:g(yn,{name:"gap_size",label:"Gap between panels",value:e.gap_size,units:["px","rem"]})});function H_(e,{path:t,node:n}){var s;const r=nw({tree:e,pathToGridItem:t});if(r===null)return;const{gridPageNode:o}=r,i=d_(o.uiChildren)[t[0]],a=(s=n.uiArguments.area)!=null?s:vn;i!==a&&(o.uiArguments=Hp(o.uiArguments,{type:"RENAME_ITEM",oldName:i,newName:a}))}function V_(e,{path:t}){const n=nw({tree:e,pathToGridItem:t});if(n===null)return;const{gridPageNode:r,gridItemNode:o}=n,i=o.uiArguments.area;if(!i){console.error("Deleted node appears to not have a grid area, ignoring");return}r.uiArguments=Hp(r.uiArguments,{type:"REMOVE_ITEM",name:i})}function nw({tree:e,pathToGridItem:t}){if(t.length!==1)return null;const n=rr(e,t.slice(0,-1));if(n.uiName!=="gridlayout::grid_page"||n.uiChildren===void 0)return null;const r=n.uiChildren[t[t.length-1]];return"area"in r.uiArguments?{gridPageNode:n,gridItemNode:r}:null}const J_={title:"Grid Page",UiComponent:f_,SettingsComponent:$_,acceptsChildren:!0,defaultSettings:{areas:[["header","header"],["sidebar","main"]],row_sizes:["100px","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},stateUpdateSubscribers:{UPDATE_NODE:H_,DELETE_NODE:V_},category:"gridlayout"},Q_="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=",X_=({settings:e})=>{const{inputId:t,label:n}=e;return N(Me,{children:[g(pe,{label:"inputId",name:"inputId",value:t!=null?t:"defaultActionButton"}),g(pe,{label:"input label",name:"label",value:n!=null?n:"default actionButton label"})]})},K_="_container_tyghz_1",q_={container:K_},Z_=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{label:o="My Action Button",width:i}=e;return N("div",$(F({className:q_.container,ref:r,"aria-label":"shiny::actionButton placeholder"},n),{children:[g(wt,{style:i?{width:i}:void 0,children:o}),t]}))},e4={title:"Action Button",UiComponent:Z_,SettingsComponent:X_,acceptsChildren:!1,defaultSettings:{inputId:"myButton",label:"My Button"},iconSrc:Q_,category:"Inputs"},t4="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=",n4="_categoryDivider_8d7ls_1",r4={categoryDivider:n4};function ti({category:e}){return g("div",{className:r4.categoryDivider,children:g("span",{children:e?`${e}:`:null})})}function o4(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(e)}var rw={exports:{}};/**! - * Sortable 1.15.0 - * @author RubaXa - * @author owenm - * @license MIT - */function $v(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function wn(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function s4(e,t){if(e==null)return{};var n=a4(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function l4(e){return u4(e)||c4(e)||f4(e)||d4()}function u4(e){if(Array.isArray(e))return Qf(e)}function c4(e){if(typeof Symbol!="undefined"&&e[Symbol.iterator]!=null||e["@@iterator"]!=null)return Array.from(e)}function f4(e,t){if(!!e){if(typeof e=="string")return Qf(e,t);var n=Object.prototype.toString.call(e).slice(8,-1);if(n==="Object"&&e.constructor&&(n=e.constructor.name),n==="Map"||n==="Set")return Array.from(e);if(n==="Arguments"||/^(?:Ui|I)nt(?:8|16|32)(?:Clamped)?Array$/.test(n))return Qf(e,t)}}function Qf(e,t){(t==null||t>e.length)&&(t=e.length);for(var n=0,r=new Array(t);n"&&(t=t.substring(1)),e)try{if(e.matches)return e.matches(t);if(e.msMatchesSelector)return e.msMatchesSelector(t);if(e.webkitMatchesSelector)return e.webkitMatchesSelector(t)}catch(n){return!1}return!1}}function h4(e){return e.host&&e!==document&&e.host.nodeType?e.host:e.parentNode}function Xt(e,t,n,r){if(e){n=n||document;do{if(t!=null&&(t[0]===">"?e.parentNode===n&&Ul(e,t):Ul(e,t))||r&&e===n)return e;if(e===n)break}while(e=h4(e))}return null}var Vv=/\s+/g;function _e(e,t,n){if(e&&t)if(e.classList)e.classList[n?"add":"remove"](t);else{var r=(" "+e.className+" ").replace(Vv," ").replace(" "+t+" "," ");e.className=(r+(n?" "+t:"")).replace(Vv," ")}}function G(e,t,n){var r=e&&e.style;if(r){if(n===void 0)return document.defaultView&&document.defaultView.getComputedStyle?n=document.defaultView.getComputedStyle(e,""):e.currentStyle&&(n=e.currentStyle),t===void 0?n:n[t];!(t in r)&&t.indexOf("webkit")===-1&&(t="-webkit-"+t),r[t]=n+(typeof n=="string"?"":"px")}}function Dr(e,t){var n="";if(typeof e=="string")n=e;else do{var r=G(e,"transform");r&&r!=="none"&&(n=r+" "+n)}while(!t&&(e=e.parentNode));var o=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return o&&new o(n)}function sw(e,t,n){if(e){var r=e.getElementsByTagName(t),o=0,i=r.length;if(n)for(;o=i:a=o<=i,!a)return r;if(r===mn())break;r=Vn(r,!1)}return!1}function Bo(e,t,n,r){for(var o=0,i=0,a=e.children;i2&&arguments[2]!==void 0?arguments[2]:{},o=r.evt,i=s4(r,b4);ts.pluginEvent.bind(Q)(t,n,wn({dragEl:U,parentEl:ke,ghostEl:Z,rootEl:be,nextEl:xr,lastDownEl:Qs,cloneEl:Oe,cloneHidden:Yn,dragStarted:Fi,putSortable:$e,activeSortable:Q.active,originalEvent:o,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un,hideGhostForTarget:pw,unhideGhostForTarget:hw,cloneNowHidden:function(){Yn=!0},cloneNowShown:function(){Yn=!1},dispatchSortableEvent:function(s){ot({sortable:n,name:s,originalEvent:o})}},i))};function ot(e){Mi(wn({putSortable:$e,cloneEl:Oe,targetEl:U,rootEl:be,oldIndex:fo,oldDraggableIndex:na,newIndex:At,newDraggableIndex:Un},e))}var U,ke,Z,be,xr,Qs,Oe,Yn,fo,At,na,Un,Os,$e,no=!1,Bl=!1,jl=[],wr,Vt,kc,Tc,Kv,qv,Fi,Kr,ra,oa=!1,_s=!1,Xs,Qe,Ic=[],Xf=!1,Wl=[],Pu=typeof document!="undefined",Ps=ow,Zv=es||Rn?"cssFloat":"float",E4=Pu&&!iw&&!ow&&"draggable"in document.createElement("div"),cw=function(){if(!!Pu){if(Rn)return!1;var e=document.createElement("x");return e.style.cssText="pointer-events:auto",e.style.pointerEvents==="auto"}}(),fw=function(t,n){var r=G(t),o=parseInt(r.width)-parseInt(r.paddingLeft)-parseInt(r.paddingRight)-parseInt(r.borderLeftWidth)-parseInt(r.borderRightWidth),i=Bo(t,0,n),a=Bo(t,1,n),s=i&&G(i),l=a&&G(a),u=s&&parseInt(s.marginLeft)+parseInt(s.marginRight)+Ae(i).width,c=l&&parseInt(l.marginLeft)+parseInt(l.marginRight)+Ae(a).width;if(r.display==="flex")return r.flexDirection==="column"||r.flexDirection==="column-reverse"?"vertical":"horizontal";if(r.display==="grid")return r.gridTemplateColumns.split(" ").length<=1?"vertical":"horizontal";if(i&&s.float&&s.float!=="none"){var f=s.float==="left"?"left":"right";return a&&(l.clear==="both"||l.clear===f)?"vertical":"horizontal"}return i&&(s.display==="block"||s.display==="flex"||s.display==="table"||s.display==="grid"||u>=o&&r[Zv]==="none"||a&&r[Zv]==="none"&&u+c>o)?"vertical":"horizontal"},C4=function(t,n,r){var o=r?t.left:t.top,i=r?t.right:t.bottom,a=r?t.width:t.height,s=r?n.left:n.top,l=r?n.right:n.bottom,u=r?n.width:n.height;return o===s||i===l||o+a/2===s+u/2},A4=function(t,n){var r;return jl.some(function(o){var i=o[Ze].options.emptyInsertThreshold;if(!(!i||Jp(o))){var a=Ae(o),s=t>=a.left-i&&t<=a.right+i,l=n>=a.top-i&&n<=a.bottom+i;if(s&&l)return r=o}}),r},dw=function(t){function n(i,a){return function(s,l,u,c){var f=s.options.group.name&&l.options.group.name&&s.options.group.name===l.options.group.name;if(i==null&&(a||f))return!0;if(i==null||i===!1)return!1;if(a&&i==="clone")return i;if(typeof i=="function")return n(i(s,l,u,c),a)(s,l,u,c);var d=(a?s:l).options.group.name;return i===!0||typeof i=="string"&&i===d||i.join&&i.indexOf(d)>-1}}var r={},o=t.group;(!o||Js(o)!="object")&&(o={name:o}),r.name=o.name,r.checkPull=n(o.pull,!0),r.checkPut=n(o.put),r.revertClone=o.revertClone,t.group=r},pw=function(){!cw&&Z&&G(Z,"display","none")},hw=function(){!cw&&Z&&G(Z,"display","")};Pu&&!iw&&document.addEventListener("click",function(e){if(Bl)return e.preventDefault(),e.stopPropagation&&e.stopPropagation(),e.stopImmediatePropagation&&e.stopImmediatePropagation(),Bl=!1,!1},!0);var Sr=function(t){if(U){t=t.touches?t.touches[0]:t;var n=A4(t.clientX,t.clientY);if(n){var r={};for(var o in t)t.hasOwnProperty(o)&&(r[o]=t[o]);r.target=r.rootEl=n,r.preventDefault=void 0,r.stopPropagation=void 0,n[Ze]._onDragOver(r)}}},x4=function(t){U&&U.parentNode[Ze]._isOutsideThisEl(t.target)};function Q(e,t){if(!(e&&e.nodeType&&e.nodeType===1))throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(e));this.el=e,this.options=t=zt({},t),e[Ze]=this;var n={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(e.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return fw(e,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(a,s){a.setData("Text",s.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:Q.supportPointer!==!1&&"PointerEvent"in window&&!ea,emptyInsertThreshold:5};ts.initializePlugins(this,e,n);for(var r in n)!(r in t)&&(t[r]=n[r]);dw(t);for(var o in this)o.charAt(0)==="_"&&typeof this[o]=="function"&&(this[o]=this[o].bind(this));this.nativeDraggable=t.forceFallback?!1:E4,this.nativeDraggable&&(this.options.touchStartThreshold=1),t.supportPointer?ie(e,"pointerdown",this._onTapStart):(ie(e,"mousedown",this._onTapStart),ie(e,"touchstart",this._onTapStart)),this.nativeDraggable&&(ie(e,"dragover",this),ie(e,"dragenter",this)),jl.push(this.el),t.store&&t.store.get&&this.sort(t.store.get(this)||[]),zt(this,y4())}Q.prototype={constructor:Q,_isOutsideThisEl:function(t){!this.el.contains(t)&&t!==this.el&&(Kr=null)},_getDirection:function(t,n){return typeof this.options.direction=="function"?this.options.direction.call(this,t,n,U):this.options.direction},_onTapStart:function(t){if(!!t.cancelable){var n=this,r=this.el,o=this.options,i=o.preventOnFilter,a=t.type,s=t.touches&&t.touches[0]||t.pointerType&&t.pointerType==="touch"&&t,l=(s||t).target,u=t.target.shadowRoot&&(t.path&&t.path[0]||t.composedPath&&t.composedPath()[0])||l,c=o.filter;if(D4(r),!U&&!(/mousedown|pointerdown/.test(a)&&t.button!==0||o.disabled)&&!u.isContentEditable&&!(!this.nativeDraggable&&ea&&l&&l.tagName.toUpperCase()==="SELECT")&&(l=Xt(l,o.draggable,r,!1),!(l&&l.animated)&&Qs!==l)){if(fo=Te(l),na=Te(l,o.draggable),typeof c=="function"){if(c.call(this,t,l,this)){ot({sortable:n,rootEl:u,name:"filter",targetEl:l,toEl:r,fromEl:r}),ut("filter",n,{evt:t}),i&&t.cancelable&&t.preventDefault();return}}else if(c&&(c=c.split(",").some(function(f){if(f=Xt(u,f.trim(),r,!1),f)return ot({sortable:n,rootEl:f,name:"filter",targetEl:l,fromEl:r,toEl:r}),ut("filter",n,{evt:t}),!0}),c)){i&&t.cancelable&&t.preventDefault();return}o.handle&&!Xt(u,o.handle,r,!1)||this._prepareDragStart(t,s,l)}}},_prepareDragStart:function(t,n,r){var o=this,i=o.el,a=o.options,s=i.ownerDocument,l;if(r&&!U&&r.parentNode===i){var u=Ae(r);if(be=i,U=r,ke=U.parentNode,xr=U.nextSibling,Qs=r,Os=a.group,Q.dragged=U,wr={target:U,clientX:(n||t).clientX,clientY:(n||t).clientY},Kv=wr.clientX-u.left,qv=wr.clientY-u.top,this._lastX=(n||t).clientX,this._lastY=(n||t).clientY,U.style["will-change"]="all",l=function(){if(ut("delayEnded",o,{evt:t}),Q.eventCanceled){o._onDrop();return}o._disableDelayedDragEvents(),!Hv&&o.nativeDraggable&&(U.draggable=!0),o._triggerDragStart(t,n),ot({sortable:o,name:"choose",originalEvent:t}),_e(U,a.chosenClass,!0)},a.ignore.split(",").forEach(function(c){sw(U,c.trim(),Nc)}),ie(s,"dragover",Sr),ie(s,"mousemove",Sr),ie(s,"touchmove",Sr),ie(s,"mouseup",o._onDrop),ie(s,"touchend",o._onDrop),ie(s,"touchcancel",o._onDrop),Hv&&this.nativeDraggable&&(this.options.touchStartThreshold=4,U.draggable=!0),ut("delayStart",this,{evt:t}),a.delay&&(!a.delayOnTouchOnly||n)&&(!this.nativeDraggable||!(es||Rn))){if(Q.eventCanceled){this._onDrop();return}ie(s,"mouseup",o._disableDelayedDrag),ie(s,"touchend",o._disableDelayedDrag),ie(s,"touchcancel",o._disableDelayedDrag),ie(s,"mousemove",o._delayedDragTouchMoveHandler),ie(s,"touchmove",o._delayedDragTouchMoveHandler),a.supportPointer&&ie(s,"pointermove",o._delayedDragTouchMoveHandler),o._dragStartTimer=setTimeout(l,a.delay)}else l()}},_delayedDragTouchMoveHandler:function(t){var n=t.touches?t.touches[0]:t;Math.max(Math.abs(n.clientX-this._lastX),Math.abs(n.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){U&&Nc(U),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var t=this.el.ownerDocument;te(t,"mouseup",this._disableDelayedDrag),te(t,"touchend",this._disableDelayedDrag),te(t,"touchcancel",this._disableDelayedDrag),te(t,"mousemove",this._delayedDragTouchMoveHandler),te(t,"touchmove",this._delayedDragTouchMoveHandler),te(t,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(t,n){n=n||t.pointerType=="touch"&&t,!this.nativeDraggable||n?this.options.supportPointer?ie(document,"pointermove",this._onTouchMove):n?ie(document,"touchmove",this._onTouchMove):ie(document,"mousemove",this._onTouchMove):(ie(U,"dragend",this),ie(be,"dragstart",this._onDragStart));try{document.selection?Ks(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch(r){}},_dragStarted:function(t,n){if(no=!1,be&&U){ut("dragStarted",this,{evt:n}),this.nativeDraggable&&ie(document,"dragover",x4);var r=this.options;!t&&_e(U,r.dragClass,!1),_e(U,r.ghostClass,!0),Q.active=this,t&&this._appendGhost(),ot({sortable:this,name:"start",originalEvent:n})}else this._nulling()},_emulateDragOver:function(){if(Vt){this._lastX=Vt.clientX,this._lastY=Vt.clientY,pw();for(var t=document.elementFromPoint(Vt.clientX,Vt.clientY),n=t;t&&t.shadowRoot&&(t=t.shadowRoot.elementFromPoint(Vt.clientX,Vt.clientY),t!==n);)n=t;if(U.parentNode[Ze]._isOutsideThisEl(t),n)do{if(n[Ze]){var r=void 0;if(r=n[Ze]._onDragOver({clientX:Vt.clientX,clientY:Vt.clientY,target:t,rootEl:n}),r&&!this.options.dragoverBubble)break}t=n}while(n=n.parentNode);hw()}},_onTouchMove:function(t){if(wr){var n=this.options,r=n.fallbackTolerance,o=n.fallbackOffset,i=t.touches?t.touches[0]:t,a=Z&&Dr(Z,!0),s=Z&&a&&a.a,l=Z&&a&&a.d,u=Ps&&Qe&&Qv(Qe),c=(i.clientX-wr.clientX+o.x)/(s||1)+(u?u[0]-Ic[0]:0)/(s||1),f=(i.clientY-wr.clientY+o.y)/(l||1)+(u?u[1]-Ic[1]:0)/(l||1);if(!Q.active&&!no){if(r&&Math.max(Math.abs(i.clientX-this._lastX),Math.abs(i.clientY-this._lastY))=0&&(ot({rootEl:ke,name:"add",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"remove",toEl:ke,originalEvent:t}),ot({rootEl:ke,name:"sort",toEl:ke,fromEl:be,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),$e&&$e.save()):At!==fo&&At>=0&&(ot({sortable:this,name:"update",toEl:ke,originalEvent:t}),ot({sortable:this,name:"sort",toEl:ke,originalEvent:t})),Q.active&&((At==null||At===-1)&&(At=fo,Un=na),ot({sortable:this,name:"end",toEl:ke,originalEvent:t}),this.save()))),this._nulling()},_nulling:function(){ut("nulling",this),be=U=ke=Z=xr=Oe=Qs=Yn=wr=Vt=Fi=At=Un=fo=na=Kr=ra=$e=Os=Q.dragged=Q.ghost=Q.clone=Q.active=null,Wl.forEach(function(t){t.checked=!0}),Wl.length=kc=Tc=0},handleEvent:function(t){switch(t.type){case"drop":case"dragend":this._onDrop(t);break;case"dragenter":case"dragover":U&&(this._onDragOver(t),O4(t));break;case"selectstart":t.preventDefault();break}},toArray:function(){for(var t=[],n,r=this.el.children,o=0,i=r.length,a=this.options;or.right+o||e.clientX<=r.right&&e.clientY>r.bottom&&e.clientX>=r.left:e.clientX>r.right&&e.clientY>r.top||e.clientX<=r.right&&e.clientY>r.bottom+o}function T4(e,t,n,r,o,i,a,s){var l=r?e.clientY:e.clientX,u=r?n.height:n.width,c=r?n.top:n.left,f=r?n.bottom:n.right,d=!1;if(!a){if(s&&Xsc+u*i/2:lf-Xs)return-ra}else if(l>c+u*(1-o)/2&&lf-u*i/2)?l>c+u/2?1:-1:0}function I4(e){return Te(U)1&&(K.forEach(function(s){i.addAnimationState({target:s,rect:ct?Ae(s):a}),_c(s),s.fromRect=a,r.removeAnimationState(s)}),ct=!1,U4(!this.options.removeCloneOnHide,o))},dragOverCompleted:function(n){var r=n.sortable,o=n.isOwner,i=n.insertion,a=n.activeSortable,s=n.parentEl,l=n.putSortable,u=this.options;if(i){if(o&&a._hideClone(),Si=!1,u.animation&&K.length>1&&(ct||!o&&!a.options.sort&&!l)){var c=Ae(ve,!1,!0,!0);K.forEach(function(d){d!==ve&&(Xv(d,c),s.appendChild(d))}),ct=!0}if(!o)if(ct||Is(),K.length>1){var f=Ts;a._showClone(r),a.options.animation&&!Ts&&f&&Ct.forEach(function(d){a.addAnimationState({target:d,rect:bi}),d.fromRect=bi,d.thisAnimationDuration=null})}else a._showClone(r)}},dragOverAnimationCapture:function(n){var r=n.dragRect,o=n.isOwner,i=n.activeSortable;if(K.forEach(function(s){s.thisAnimationDuration=null}),i.options.animation&&!o&&i.multiDrag.isMultiDrag){bi=zt({},r);var a=Dr(ve,!0);bi.top-=a.f,bi.left-=a.e}},dragOverAnimationComplete:function(){ct&&(ct=!1,Is())},drop:function(n){var r=n.originalEvent,o=n.rootEl,i=n.parentEl,a=n.sortable,s=n.dispatchSortableEvent,l=n.oldIndex,u=n.putSortable,c=u||this.sortable;if(!!r){var f=this.options,d=i.children;if(!qr)if(f.multiDragKey&&!this.multiDragKeyDown&&this._deselectMultiDrag(),_e(ve,f.selectedClass,!~K.indexOf(ve)),~K.indexOf(ve))K.splice(K.indexOf(ve),1),wi=null,Mi({sortable:a,rootEl:o,name:"deselect",targetEl:ve,originalEvent:r});else{if(K.push(ve),Mi({sortable:a,rootEl:o,name:"select",targetEl:ve,originalEvent:r}),r.shiftKey&&wi&&a.el.contains(wi)){var p=Te(wi),m=Te(ve);if(~p&&~m&&p!==m){var y,h;for(m>p?(h=p,y=m):(h=m,y=p+1);h1){var v=Ae(ve),w=Te(ve,":not(."+this.options.selectedClass+")");if(!Si&&f.animation&&(ve.thisAnimationDuration=null),c.captureAnimationState(),!Si&&(f.animation&&(ve.fromRect=v,K.forEach(function(A){if(A.thisAnimationDuration=null,A!==ve){var T=ct?Ae(A):v;A.fromRect=T,c.addAnimationState({target:A,rect:T})}})),Is(),K.forEach(function(A){d[w]?i.insertBefore(A,d[w]):i.appendChild(A),w++}),l===Te(ve))){var S=!1;K.forEach(function(A){if(A.sortableIndex!==Te(A)){S=!0;return}}),S&&s("update")}K.forEach(function(A){_c(A)}),c.animateAll()}Jt=c}(o===i||u&&u.lastPutMode!=="clone")&&Ct.forEach(function(A){A.parentNode&&A.parentNode.removeChild(A)})}},nullingGlobal:function(){this.isMultiDrag=qr=!1,Ct.length=0},destroyGlobal:function(){this._deselectMultiDrag(),te(document,"pointerup",this._deselectMultiDrag),te(document,"mouseup",this._deselectMultiDrag),te(document,"touchend",this._deselectMultiDrag),te(document,"keydown",this._checkKeyDown),te(document,"keyup",this._checkKeyUp)},_deselectMultiDrag:function(n){if(!(typeof qr!="undefined"&&qr)&&Jt===this.sortable&&!(n&&Xt(n.target,this.options.draggable,this.sortable.el,!1))&&!(n&&n.button!==0))for(;K.length;){var r=K[0];_e(r,this.options.selectedClass,!1),K.shift(),Mi({sortable:this.sortable,rootEl:this.sortable.el,name:"deselect",targetEl:r,originalEvent:n})}},_checkKeyDown:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!0)},_checkKeyUp:function(n){n.key===this.options.multiDragKey&&(this.multiDragKeyDown=!1)}},zt(e,{pluginName:"multiDrag",utils:{select:function(n){var r=n.parentNode[Ze];!r||!r.options.multiDrag||~K.indexOf(n)||(Jt&&Jt!==r&&(Jt.multiDrag._deselectMultiDrag(),Jt=r),_e(n,r.options.selectedClass,!0),K.push(n))},deselect:function(n){var r=n.parentNode[Ze],o=K.indexOf(n);!r||!r.options.multiDrag||!~o||(_e(n,r.options.selectedClass,!1),K.splice(o,1))}},eventProperties:function(){var n=this,r=[],o=[];return K.forEach(function(i){r.push({multiDragElement:i,index:i.sortableIndex});var a;ct&&i!==ve?a=-1:ct?a=Te(i,":not(."+n.options.selectedClass+")"):a=Te(i),o.push({multiDragElement:i,index:a})}),{items:l4(K),clones:[].concat(Ct),oldIndicies:r,newIndicies:o}},optionListeners:{multiDragKey:function(n){return n=n.toLowerCase(),n==="ctrl"?n="Control":n.length>1&&(n=n.charAt(0).toUpperCase()+n.substr(1)),n}}})}function U4(e,t){K.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function tg(e,t){Ct.forEach(function(n,r){var o=t.children[n.sortableIndex+(e?Number(r):0)];o?t.insertBefore(n,o):t.appendChild(n)})}function Is(){K.forEach(function(e){e!==ve&&e.parentNode&&e.parentNode.removeChild(e)})}Q.mount(new R4);Q.mount(Kp,Xp);const B4=Object.freeze(Object.defineProperty({__proto__:null,default:Q,MultiDrag:F4,Sortable:Q,Swap:L4},Symbol.toStringTag,{value:"Module"})),j4=Bg(B4);var vw={exports:{}};/*! - Copyright (c) 2018 Jed Watson. - Licensed under the MIT License (MIT), see - http://jedwatson.github.io/classnames -*/(function(e){(function(){var t={}.hasOwnProperty;function n(){for(var r=[],o=0;o$882b6d93070905b3$re_export$Sortable),a(e.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction),a(e.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect),a(e.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions),a(e.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent),a(e.exports,"Options",()=>$882b6d93070905b3$re_export$Options),a(e.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult),a(e.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult),a(e.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent),a(e.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions),a(e.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils),a(e.exports,"ReactSortable",()=>A);function l(C){C.parentElement!==null&&C.parentElement.removeChild(C)}function u(C,O,b){const E=C.children[b]||null;C.insertBefore(O,E)}function c(C){C.forEach(O=>l(O.element))}function f(C){C.forEach(O=>{u(O.parentElement,O.element,O.oldIndex)})}function d(C,O){const b=h(C),E={parentElement:C.from};let x=[];switch(b){case"normal":x=[{element:C.item,newIndex:C.newIndex,oldIndex:C.oldIndex,parentElement:C.from}];break;case"swap":const D=F({element:C.item,oldIndex:C.oldIndex,newIndex:C.newIndex},E),B=F({element:C.swapItem,oldIndex:C.newIndex,newIndex:C.oldIndex},E);x=[D,B];break;case"multidrag":x=C.oldIndicies.map((q,H)=>F({element:q.multiDragElement,oldIndex:q.index,newIndex:C.newIndicies[H].index},E));break}return v(x,O)}function p(C,O){const b=m(C,O);return y(C,b)}function m(C,O){const b=[...O];return C.concat().reverse().forEach(E=>b.splice(E.oldIndex,1)),b}function y(C,O,b,E){const x=[...O];return C.forEach(_=>{const k=E&&b&&E(_.item,b);x.splice(_.newIndex,0,k||_.item)}),x}function h(C){return C.oldIndicies&&C.oldIndicies.length>0?"multidrag":C.swapItem?"swap":"normal"}function v(C,O){return C.map(E=>$(F({},E),{item:O[E.oldIndex]})).sort((E,x)=>E.oldIndex-x.oldIndex)}function w(C){const us=C,{list:O,setList:b,children:E,tag:x,style:_,className:k,clone:D,onAdd:B,onChange:q,onChoose:H,onClone:ce,onEnd:he,onFilter:ye,onRemove:ne,onSort:R,onStart:Y,onUnchoose:V,onUpdate:le,onMove:ue,onSpill:ze,onSelect:Fe,onDeselect:Ue}=us;return $t(us,["list","setList","children","tag","style","className","clone","onAdd","onChange","onChoose","onClone","onEnd","onFilter","onRemove","onSort","onStart","onUnchoose","onUpdate","onMove","onSpill","onSelect","onDeselect"])}const S={dragging:null};class A extends r.Component{constructor(O){super(O),this.ref=r.createRef();const b=[...O.list].map(E=>Object.assign(E,{chosen:!1,selected:!1}));O.setList(b,this.sortable,S),i(o)(!O.plugins,` - Plugins prop is no longer supported. - Instead, mount it with "Sortable.mount(new MultiDrag())" - Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;const O=this.makeOptions();i(t).create(this.ref.current,O)}componentDidUpdate(O){O.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){const{tag:O,style:b,className:E,id:x}=this.props,_={style:b,className:E,id:x},k=!O||O===null?"div":O;return r.createElement(k,F({ref:this.ref},_),this.getChildren())}getChildren(){const{children:O,dataIdAttr:b,selectedClass:E="sortable-selected",chosenClass:x="sortable-chosen",dragClass:_="sortable-drag",fallbackClass:k="sortable-falback",ghostClass:D="sortable-ghost",swapClass:B="sortable-swap-highlight",filter:q="sortable-filter",list:H}=this.props;if(!O||O==null)return null;const ce=b||"data-id";return r.Children.map(O,(he,ye)=>{if(he===void 0)return;const ne=H[ye]||{},{className:R}=he.props,Y=typeof q=="string"&&{[q.replace(".","")]:!!ne.filtered},V=i(n)(R,F({[E]:ne.selected,[x]:ne.chosen},Y));return r.cloneElement(he,{[ce]:he.key,className:V})})}get sortable(){const O=this.ref.current;if(O===null)return null;const b=Object.keys(O).find(E=>E.includes("Sortable"));return b?O[b]:null}makeOptions(){const O=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],b=["onChange","onClone","onFilter","onSort"],E=w(this.props);O.forEach(_=>E[_]=this.prepareOnHandlerPropAndDOM(_)),b.forEach(_=>E[_]=this.prepareOnHandlerProp(_));const x=(_,k)=>{const{onMove:D}=this.props,B=_.willInsertAfter||-1;if(!D)return B;const q=D(_,k,this.sortable,S);return typeof q=="undefined"?!1:q};return $(F({},E),{onMove:x})}prepareOnHandlerPropAndDOM(O){return b=>{this.callOnHandlerProp(b,O),this[O](b)}}prepareOnHandlerProp(O){return b=>{this.callOnHandlerProp(b,O)}}callOnHandlerProp(O,b){const E=this.props[b];E&&E(O,this.sortable,S)}onAdd(O){const{list:b,setList:E,clone:x}=this.props,_=[...S.dragging.props.list],k=d(O,_);c(k);const D=y(k,b,O,x).map(B=>Object.assign(B,{selected:!1}));E(D,this.sortable,S)}onRemove(O){const{list:b,setList:E}=this.props,x=h(O),_=d(O,b);f(_);let k=[...b];if(O.pullMode!=="clone")k=m(_,k);else{let D=_;switch(x){case"multidrag":D=_.map((B,q)=>$(F({},B),{element:O.clones[q]}));break;case"normal":D=_.map(B=>$(F({},B),{element:O.clone}));break;case"swap":default:i(o)(!0,`mode "${x}" cannot clone. Please remove "props.clone" from when using the "${x}" plugin`)}c(D),_.forEach(B=>{const q=B.oldIndex,H=this.props.clone(B.item,O);k.splice(q,1,H)})}k=k.map(D=>Object.assign(D,{selected:!1})),E(k,this.sortable,S)}onUpdate(O){const{list:b,setList:E}=this.props,x=d(O,b);c(x),f(x);const _=p(x,b);return E(_,this.sortable,S)}onStart(){S.dragging=this}onEnd(){S.dragging=null}onChoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(_,{chosen:!0})),D});E(x,this.sortable,S)}onUnchoose(O){const{list:b,setList:E}=this.props,x=b.map((_,k)=>{let D=_;return k===O.oldIndex&&(D=Object.assign(D,{chosen:!1})),D});E(x,this.sortable,S)}onSpill(O){const{removeOnSpill:b,revertOnSpill:E}=this.props;b&&!E&&l(O.item)}onSelect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;if(k===-1){console.log(`"${O.type}" had indice of "${_.index}", which is probably -1 and doesn't usually happen here.`),console.log(O);return}x[k].selected=!0}),E(x,this.sortable,S)}onDeselect(O){const{list:b,setList:E}=this.props,x=b.map(_=>Object.assign(_,{selected:!1}));O.newIndicies.forEach(_=>{const k=_.index;k!==-1&&(x[k].selected=!0)}),E(x,this.sortable,S)}}A.defaultProps={clone:C=>C};var T={};s(e.exports,T)})(rw);const $4="_container_xt7ji_1",H4="_list_xt7ji_6",V4="_item_xt7ji_15",J4="_keyField_xt7ji_29",Q4="_valueField_xt7ji_34",X4="_header_xt7ji_39",K4="_dragHandle_xt7ji_45",q4="_deleteButton_xt7ji_55",Z4="_addItemButton_xt7ji_65",eP="_separator_xt7ji_72",ft={container:$4,list:H4,item:V4,keyField:J4,valueField:Q4,header:X4,dragHandle:K4,deleteButton:q4,addItemButton:Z4,separator:eP};function qp({name:e,label:t,value:n,onChange:r,optional:o=!1,newItemValue:i={key:"myKey",value:"myValue"}}){const[a,s]=I.useState(n!==void 0?Object.keys(n).map((f,d)=>({id:d,key:f,value:n[f]})):[]),l=$r(r);I.useEffect(()=>{const f=tP(a);lA(f,n!=null?n:{})||l({name:e,value:f})},[e,l,a,n]);const u=I.useCallback(f=>{s(d=>d.filter(({id:p})=>p!==f))},[]),c=I.useCallback(()=>{s(f=>[...f,F({id:-1},i)].map((d,p)=>$(F({},d),{id:p})))},[i]);return N("div",{className:ft.container,children:[g(ti,{category:e!=null?e:t}),N("div",{className:ft.list,children:[N("div",{className:ft.item+" "+ft.header,children:[g("span",{className:ft.keyField,children:"Key"}),g("span",{className:ft.valueField,children:"Value"})]}),g(rw.exports.ReactSortable,{list:a,setList:s,handle:`.${ft.dragHandle}`,children:a.map((f,d)=>N("div",{className:ft.item,children:[g("div",{className:ft.dragHandle,title:"Reorder list",children:g(o4,{})}),g("input",{className:ft.keyField,type:"text",value:f.key,onChange:p=>{const m=[...a];m[d]=$(F({},f),{key:p.target.value}),s(m)}}),g("span",{className:ft.separator,children:":"}),g("input",{className:ft.valueField,type:"text",value:f.value,onChange:p=>{const m=[...a];m[d]=$(F({},f),{value:p.target.value}),s(m)}}),g(wt,{className:ft.deleteButton,onClick:()=>u(f.id),variant:["icon","transparent"],title:`Delete ${f.value}`,children:g(Sp,{})})]},f.id))}),g(wt,{className:ft.addItemButton,onClick:()=>c(),variant:["icon","transparent"],title:"Add new item",children:g(C1,{})})]})]})}function tP(e){return e.reduce((n,{key:r,value:o})=>(n[r]=o,n),{})}const nP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),rP="_container_162lp_1",oP="_checkbox_162lp_14",Mc={container:rP,checkbox:oP},iP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices;return N("div",$(F({ref:r,className:Mc.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:Object.keys(o).map((i,a)=>g("div",{className:Mc.radio,children:N("label",{className:Mc.checkbox,children:[g("input",{type:"checkbox",name:o[i],value:o[i],defaultChecked:a===0}),g("span",{children:i})]})},i))}),e]}))},aP={inputId:"myCheckboxGroup",label:"Checkbox Group",choices:{"choice a":"a","choice b":"b"}},sP={title:"Checkbox Group",UiComponent:iP,SettingsComponent:nP,acceptsChildren:!1,defaultSettings:aP,iconSrc:t4,category:"Inputs"},lP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=",uP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(tw,{label:"Starting value",name:"value",value:e.value}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),cP="_container_1x0tz_1",fP="_label_1x0tz_10",ng={container:cP,label:fP},dP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=(l=t.width)!=null?l:"auto",i=F({},t),[a,s]=j.exports.useState(i.value);return j.exports.useEffect(()=>{s(i.value)},[i.value]),N("div",$(F({className:ng.container+" shiny::checkbox",style:{width:o},"aria-label":"shiny::checkbox",ref:r},n),{children:[N("label",{htmlFor:i.inputId,children:[g("input",{id:i.inputId,type:"checkbox",checked:a,onChange:u=>s(u.target.checked)}),g("span",{className:ng.label,children:i.label})]}),e]}))},pP={inputId:"myCheckboxInput",label:"Checkbox Input",value:!1},hP={title:"Checkbox Input",UiComponent:dP,SettingsComponent:uP,acceptsChildren:!1,defaultSettings:pP,iconSrc:lP,category:"Inputs"},mP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==",vP="_wrappedSection_1dn9g_1",gP="_sectionContainer_1dn9g_9",zl={wrappedSection:vP,sectionContainer:gP},gw=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.wrappedSection,children:t})]}),yP=({name:e,children:t})=>N("div",{className:zl.sectionContainer,children:[g(ti,{category:e}),g("div",{className:zl.inputSection,children:t})]}),wP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(gw,{name:"Values",children:[g(Hn,{name:"value",value:e.value}),g(Hn,{name:"min",value:e.min,optional:!0,defaultValue:0}),g(Hn,{name:"max",value:e.max,optional:!0,defaultValue:10}),g(Hn,{name:"step",value:e.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),SP="_container_yicbr_1",bP={container:SP},EP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{var l;const o=F({},t),i=(l=o.width)!=null?l:"200px",[a,s]=j.exports.useState(o.value);return j.exports.useEffect(()=>{s(o.value)},[o.value]),N("div",$(F({className:bP.container+" shiny::numericInput",style:{width:i},"aria-label":"shiny::numericInput",ref:r},n),{children:[g("span",{children:o.label}),g("input",{type:"number",value:a,onChange:u=>s(Number(u.target.value)),min:o.min,max:o.max,step:o.step}),e]}))},CP={inputId:"myNumericInput",label:"Numeric Input",value:10},AP={title:"Numeric Input",UiComponent:EP,SettingsComponent:wP,acceptsChildren:!1,defaultSettings:CP,iconSrc:mP,category:"Inputs"},xP=({settings:{outputId:e,width:t="100%",height:n="400px"}})=>N(Me,{children:[g(pe,{label:"Output ID",name:"outputId",value:e!=null?e:"defaultPlotOutput"}),g(yn,{name:"width",units:["px","%"],value:t}),g(yn,{name:"height",units:["px","%"],value:n})]}),OP=({uiArguments:{outputId:e,width:t="300px",height:n="200px"},children:r,eventHandlers:o,compRef:i})=>N("div",$(F({className:Jf.container,ref:i,style:{height:n,width:t},"aria-label":"shiny::plotOutput placeholder"},o),{children:[g(ew,{outputId:e}),r]})),_P={title:"Plot Output",UiComponent:OP,SettingsComponent:xP,acceptsChildren:!1,defaultSettings:{outputId:"plot",width:"100%",height:"400px"},iconSrc:q1,category:"Outputs"},PP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==",kP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]}),TP="_container_sgn7c_1",rg={container:TP},IP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=Object.keys(o),a=Object.values(o),[s,l]=I.useState(a[0]);return I.useEffect(()=>{a.includes(s)||l(a[0])},[s,a]),N("div",$(F({ref:r,className:rg.container,style:{width:t.width}},n),{children:[g("label",{children:t.label}),g("div",{children:a.map((u,c)=>g("div",{className:rg.radio,children:N("label",{children:[g("input",{type:"radio",name:t.inputId,value:u,onChange:f=>l(f.target.value),checked:u===s}),g("span",{children:i[c]})]})},u))}),e]}))},NP={inputId:"myRadioButtons",label:"Radio Buttons",choices:{"choice a":"a","choice b":"b"}},DP={title:"Radio Buttons",UiComponent:IP,SettingsComponent:kP,acceptsChildren:!1,defaultSettings:NP,iconSrc:PP,category:"Inputs"},RP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==",LP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),g(qp,{name:"choices",value:e.choices,newItemValue:{key:"choice",value:"value"}})]}),MP="_container_1e5dd_1",FP={container:MP},UP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=t.choices,i=t.inputId;return N("div",$(F({ref:r,className:FP.container},n),{children:[g("label",{htmlFor:i,children:t.label}),g("select",{id:i,children:Object.keys(o).map((a,s)=>g("option",{value:o[a],children:a},a))}),e]}))},BP={inputId:"mySelectInput",label:"Select Input",choices:{"choice a":"a","choice b":"b"}},jP={title:"Select Input",UiComponent:UP,SettingsComponent:LP,acceptsChildren:!1,defaultSettings:BP,iconSrc:RP,category:"Inputs"},WP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==",YP=({settings:e})=>{const t=F({},e);return N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:t.inputId}),g(pe,{name:"label",value:t.label}),N(gw,{name:"Values",children:[g(Hn,{name:"min",value:t.min}),g(Hn,{name:"max",value:t.max}),g(Hn,{name:"value",label:"start",value:t.value}),g(Hn,{name:"step",value:t.step,optional:!0,defaultValue:1})]}),g(ti,{}),g(yn,{name:"width",value:t.width,optional:!0,units:["px","%","auto"],defaultValue:"100%"})]})},zP="_container_1f2js_1",GP="_sliderWrapper_1f2js_11",$P="_sliderInput_1f2js_16",Fc={container:zP,sliderWrapper:GP,sliderInput:$P},HP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o=F({},t),{width:i="200px"}=o,[a,s]=j.exports.useState(o.value);return N("div",$(F({className:Fc.container+" shiny::sliderInput",style:{width:i},"aria-label":"shiny::sliderInput",ref:r},n),{children:[g("div",{children:o.label}),g("div",{className:Fc.sliderWrapper,children:g("input",{type:"range",min:o.min,max:o.max,value:a,onChange:l=>s(Number(l.target.value)),className:"slider "+Fc.sliderInput,"aria-label":"slider input","data-min":o.min,"data-max":o.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),N("div",{children:[g(Z1,{type:"input",name:o.inputId})," = ",a]}),e]}))},VP={inputId:"mySlider",label:"Slider Input",min:0,max:10,value:5,width:"100%"},JP={title:"Slider Input",UiComponent:HP,SettingsComponent:YP,acceptsChildren:!1,defaultSettings:VP,iconSrc:WP,category:"Inputs"},QP="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==",XP=({settings:e})=>N(Me,{children:[g(pe,{name:"inputId",label:"Input ID",value:e.inputId}),g(pe,{name:"label",value:e.label}),N(yP,{name:"Values",children:[g(pe,{name:"value",value:e.value}),g(pe,{name:"placeholder",value:e.placeholder,optional:!0,defaultValue:"placeholder text"})]}),g(yn,{name:"width",value:e.width,optional:!0,units:["px","%","auto"],defaultValue:"400px"})]}),KP="_container_yicbr_1",qP={container:KP},ZP=({children:e,uiArguments:t,eventHandlers:n,compRef:r})=>{const o="200px",i="auto",a=F({},t),[s,l]=j.exports.useState(a.value);return j.exports.useEffect(()=>{l(a.value)},[a.value]),N("div",$(F({className:qP.container+" shiny::textInput",style:{height:i,width:o},"aria-label":"shiny::textInput",ref:r},n),{children:[g("label",{htmlFor:a.inputId,children:a.label}),g("input",{id:a.inputId,type:"text",value:s,onChange:u=>l(u.target.value),placeholder:a.placeholder}),e]}))},ek={inputId:"myTextInput",label:"Text Input",value:""},tk={title:"Text Input",UiComponent:ZP,SettingsComponent:XP,acceptsChildren:!1,defaultSettings:ek,iconSrc:QP,category:"Inputs"},nk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC",rk=({settings:e})=>g(pe,{label:"Output ID",name:"outputId",value:e.outputId}),ok="_container_1i6yi_1",ik={container:ok},ak=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>N("div",$(F({className:ik.container,ref:r,"aria-label":"shiny::textOutput placeholder"},n),{children:["Dynamic text from ",N("code",{children:["output$",e.outputId]}),t]})),sk={title:"Text Output",UiComponent:ak,SettingsComponent:rk,acceptsChildren:!1,defaultSettings:{outputId:"myText"},iconSrc:nk,category:"Outputs"},lk="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==",uk=({settings:e})=>{var t;return g(pe,{label:"Output ID",name:"outputId",value:(t=e.outputId)!=null?t:"defaultUiOutput"})},ck="_container_1xnzo_1",fk={container:ck},dk=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const{outputId:o="shiny-ui-output"}=e;return N("div",$(F({className:fk.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",o,"!"]}),t]}))},pk={title:"Dynamic UI Output",UiComponent:dk,SettingsComponent:uk,acceptsChildren:!1,defaultSettings:{outputId:"myUi"},iconSrc:lk,category:"Outputs"};function hk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(e)}function mk(e){return Et({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(e)}function vk(e){return e.replaceAll(/\(/g,`( - `).replaceAll(/\)/g,` -)`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}const gk="_container_p6wnj_1",yk="_infoMsg_p6wnj_14",wk="_codeHolder_p6wnj_19",ed={container:gk,infoMsg:yk,codeHolder:wk},Sk=({settings:e})=>N("div",{children:[g("div",{className:kn.container,children:N("span",{className:ed.infoMsg,children:[g(hk,{}),"Unknown function call. Can't modify with visual editor."]})}),g(ti,{category:"Code"}),g("div",{className:kn.container,children:g("pre",{className:ed.codeHolder,children:vk(e.text)})})]}),bk=20,Ek=({uiArguments:e,children:t,eventHandlers:n,compRef:r})=>{const o=e.text.slice(0,bk).replaceAll(/\s$/g,"")+"...";return N("div",$(F({className:ed.container,ref:r,"aria-label":"shiny::uiOutput placeholder"},n),{children:[N("div",{children:["unknown ui output: ",g("code",{children:o})]}),t]}))},Ck={title:"Unknown UI Function",UiComponent:Ek,SettingsComponent:Sk,acceptsChildren:!1,defaultSettings:{text:"unknownUiFunction()"}},en={"shiny::actionButton":e4,"shiny::numericInput":AP,"shiny::sliderInput":JP,"shiny::textInput":tk,"shiny::checkboxInput":hP,"shiny::checkboxGroupInput":sP,"shiny::selectInput":jP,"shiny::radioButtons":DP,"shiny::plotOutput":_P,"shiny::textOutput":sk,"shiny::uiOutput":pk,"gridlayout::grid_page":J_,"gridlayout::grid_card":w_,"gridlayout::grid_card_text":G_,"gridlayout::grid_card_plot":k_,unknownUiFunction:Ck};function Ak(e,{path:t,node:n}){var o;for(let i of Object.values(en)){const a=(o=i==null?void 0:i.stateUpdateSubscribers)==null?void 0:o.UPDATE_NODE;a&&a(e,{path:t,node:n})}const r=rr(e,t);Object.assign(r,n)}const Zp={uiName:"gridlayout::grid_page",uiArguments:{areas:[["msg"]],row_sizes:["1fr"],col_sizes:["1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"msg",content:"Loading App...",alignment:"center"}}]},yw=vp({name:"uiTree",initialState:Zp,reducers:{SET_FULL_STATE:(e,t)=>t.payload.state,INIT_STATE:(e,t)=>ww(t.payload.initialState),UPDATE_NODE:(e,t)=>{Ak(e,t.payload)},PLACE_NODE:(e,t)=>{yx(e,t.payload)},DELETE_NODE:(e,t)=>{E1(e,t.payload)}}});function ww(e){const t=en[e.uiName].defaultSettings,n=Object.keys(e.uiArguments),r=Object.keys(t);return hx(r,n).length>0&&(e.uiArguments=F(F({},t),e.uiArguments)),e.uiChildren&&e.uiChildren.forEach(i=>ww(i)),e}const{UPDATE_NODE:Sw,PLACE_NODE:xk,DELETE_NODE:bw,INIT_STATE:Ok,SET_FULL_STATE:_k}=yw.actions;function Ew(){const e=vr();return I.useCallback(n=>{e(xk(n))},[e])}const Pk=yw.reducer,Cw=oA();Cw.startListening({actionCreator:bw,effect:(e,t)=>Eh(void 0,null,function*(){const n=e.payload.path,r=t.getState().selectedPath;if(r===null||r.length===0||(Xa(n,r)&&t.dispatch(cA()),r.lengthi)return;const a=[...r];a[n.length-1]=i-1,t.dispatch(c1({path:a}))})});const kk=Cw.middleware,Tk=FC({reducer:{uiTree:Pk,selectedPath:fA,connectedToServer:sA},middleware:e=>e().concat(kk)}),Ik=({children:e})=>g(jE,{store:Tk,children:e}),Nk=!1,Dk=!0;console.log("Env Vars",{VITE_PREBUILT_TREE:"true",VITE_SHOW_FAKE_PREVIEW:"true",BASE_URL:"./",MODE:"production",DEV:!1,PROD:!0});const Zs={ws:null,msg:null},Aw=$(F({},Zs),{status:"connecting"});function Rk(e,t){switch(t.type){case"CONNECTED":return $(F({},Zs),{status:"connected",ws:t.ws});case"FAILED":return $(F({},Zs),{status:"failed-to-open"});case"CLOSED":return $(F({},Zs),{status:"closed",msg:t.msg});default:throw new Error("Unknown action")}}function Lk(){const[e,t]=I.useReducer(Rk,Aw),n=I.useRef(!1);return I.useEffect(()=>{try{if(!document.location.host)throw new Error("Not on a served site!");const r=Nk?"localhost:8888":window.location.host,o=new WebSocket(`ws://${r}`);return o.onerror=i=>{console.error("Error with httpuv websocket connection",i)},o.onopen=i=>{n.current=!0,t({type:"CONNECTED",ws:o})},o.onclose=i=>{n.current?t({type:"CLOSED",msg:"Error connecting to websocket"}):t({type:"FAILED"}),console.warn("Lost connection to httpuv.")},()=>o.close()}catch(r){console.warn("Failure to initialize websocket at all. Probably on netlify",r),t({type:"FAILED"})}},[]),e}const xw=I.createContext(Aw),Mk=({children:e})=>{const t=Lk();return g(xw.Provider,{value:t,children:e})};function Ow(){return I.useContext(xw)}function Fk(e){return JSON.parse(e.data)}function _w(e,t){e.addEventListener("message",n=>{t(Fk(n))})}function td(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(e)}const Uk="_appViewerHolder_wu0cb_1",Bk="_title_wu0cb_55",jk="_appContainer_wu0cb_89",Wk="_previewFrame_wu0cb_109",Yk="_expandButton_wu0cb_134",zk="_reloadButton_wu0cb_135",Gk="_spin_wu0cb_160",$k="_restartButton_wu0cb_198",Hk="_loadingMessage_wu0cb_225",Vk="_error_wu0cb_236",mt={appViewerHolder:Uk,title:Bk,appContainer:jk,previewFrame:Wk,expandButton:Yk,reloadButton:zk,spin:Gk,restartButton:$k,loadingMessage:Hk,error:Vk},Jk="_fakeApp_t3dh1_1",Qk="_fakeDashboard_t3dh1_7",Xk="_header_t3dh1_22",Kk="_sidebar_t3dh1_31",qk="_top_t3dh1_35",Zk="_bottom_t3dh1_39",Ei={fakeApp:Jk,fakeDashboard:Qk,header:Xk,sidebar:Kk,top:qk,bottom:Zk},eT=()=>g("div",{className:mt.appContainer,children:N("div",{className:Ei.fakeDashboard+" "+mt.previewFrame,children:[g("div",{className:Ei.header,children:g("h1",{children:"App preview not available"})}),g("div",{className:Ei.sidebar}),g("div",{className:Ei.top}),g("div",{className:Ei.bottom})]})});function tT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 01.708 0L8 10.293l5.646-5.647a.5.5 0 01.708.708l-6 6a.5.5 0 01-.708 0l-6-6a.5.5 0 010-.708z",clipRule:"evenodd"}}]})(e)}function nT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 01.708 0l6 6a.5.5 0 01-.708.708L8 5.707l-5.646 5.647a.5.5 0 01-.708-.708l6-6z",clipRule:"evenodd"}}]})(e)}function rT(e){return Et({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(e)}function oT(e){return Et({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(e)}const iT="_logs_xjp5l_2",aT="_logsContents_xjp5l_25",sT="_expandTab_xjp5l_29",lT="_clearLogsButton_xjp5l_69",uT="_logLine_xjp5l_75",cT="_noLogsMsg_xjp5l_81",fT="_expandedLogs_xjp5l_93",dT="_expandLogsButton_xjp5l_101",pT="_unseenLogsNotification_xjp5l_108",hT="_slidein_xjp5l_1",br={logs:iT,logsContents:aT,expandTab:sT,clearLogsButton:lT,logLine:uT,noLogsMsg:cT,expandedLogs:fT,expandLogsButton:dT,unseenLogsNotification:pT,slidein:hT};function mT({appLogs:e,clearLogs:t}){const{logsExpanded:n,toggleLogExpansion:r,unseenLogs:o}=vT(e),i=e.length===0;return N("div",{className:br.logs,"data-expanded":n,children:[N("button",{className:br.expandTab,title:n?"hide logs":"show logs",onClick:r,children:[g(rT,{className:br.unseenLogsNotification,"data-show":o}),"App Logs",n?g(tT,{}):g(nT,{})]}),N("div",{className:br.logsContents,children:[i?g("p",{className:br.noLogsMsg,children:"No recent logs"}):e.map((a,s)=>g("p",{className:br.logLine,children:a},s)),i?null:g(wt,{variant:"icon",title:"clear logs",className:br.clearLogsButton,onClick:t,children:g(oT,{})})]})]})}function vT(e){const[t,n]=I.useState(!1),[r,o]=I.useState(!1),[i,a]=I.useState(null),[s,l]=I.useState(new Date),u=I.useCallback(()=>{if(t){n(!1),a(new Date);return}n(!0),o(!1)},[t]);return I.useEffect(()=>{l(new Date)},[e]),I.useEffect(()=>{if(t||e.length===0){o(!1);return}if(i===null||i{u==="connected"&&(ia(c,{path:"APP-PREVIEW-CONNECTED"}),d(()=>()=>ia(c,{path:"APP-PREVIEW-RESTART"})),m(()=>()=>ia(c,{path:"APP-PREVIEW-STOP"})),_w(c,w=>{if(!gT(w))return;const{path:S,payload:A}=w;switch(S){case"SHINY_READY":l(!1),a(!1),n(A);break;case"SHINY_LOGS":o(wT(A));break;case"SHINY_CRASH":l(A);break;default:console.warn("Unknown message from websocket. Ignoring",{msg:w})}})),u==="closed"&&e(),u==="failed-to-open"&&a(!0)},[e,u,c]);const[f,d]=I.useState(()=>()=>console.log("No app running to reset")),[p,m]=I.useState(()=>()=>console.log("No app running to stop")),y=I.useCallback(()=>{o([])},[]),h={appLogs:r,clearLogs:y,restartApp:f,stopApp:p};return i?Object.assign(h,{status:"no-preview",appLoc:null}):s?Object.assign(h,{status:"crashed",error:s,appLoc:null}):t?Object.assign(h,{status:"finished",appLoc:t,error:null}):Object.assign(h,{status:"loading",appLoc:null,error:null})}function wT(e){return Array.isArray(e)?e:[e]}function ST(){const[e,t]=I.useState(.2),n=xT();return I.useEffect(()=>{!n||t(bT(n.width))},[n]),e}function bT(e){const t=mS-Pw*2,n=e-kw*2;return t/n}const Pw=16,kw=55;function ET(){const e=I.useRef(null),[t,n]=I.useState(!1),r=I.useCallback(()=>{n(f=>!f)},[]),{status:o,appLoc:i,appLogs:a,clearLogs:s,restartApp:l}=yT(),u=ST(),c=I.useCallback(f=>{!e.current||!i||(e.current.src=i,OT(f.currentTarget))},[i]);return o==="no-preview"&&!Dk?null:N(Me,{children:[N("h3",{className:mt.title+" "+Q1.panelTitleHeader,children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),"App Preview"]}),g("div",{className:mt.appViewerHolder,"data-expanded":t,style:{"--app-scale-amnt":u,"--preview-inset-horizontal":`${Pw}px`,"--expanded-inset-horizontal":`${kw}px`},children:o==="loading"?g(AT,{}):o==="crashed"?g(CT,{onClick:l}):N(Me,{children:[g(wt,{variant:["transparent","icon"],className:mt.reloadButton,title:"Reload app session",onClick:c,children:g(td,{})}),N("div",{className:mt.appContainer,children:[o==="no-preview"?g(eT,{}):g("iframe",{className:mt.previewFrame,src:i,title:"Application Preview",ref:e}),g(wt,{variant:"icon",className:mt.expandButton,title:t?"Shrink app preview":"Expand app preview",onClick:r,children:t?g(mk,{}):g(xx,{})})]}),g(mT,{appLogs:a,clearLogs:s})]})})]})}function CT({onClick:e}){return N("div",{className:mt.appContainer,children:[N("p",{children:["App preview crashed.",g("br",{})," Try and restart?"]}),N(wt,{className:mt.restartButton,title:"Restart app preview",onClick:e,children:["Restart app preview ",g(td,{})]})]})}function AT(){return g("div",{className:mt.loadingMessage,children:g("h2",{children:"Loading app preview..."})})}function xT(){const[e,t]=I.useState(null),n=I.useMemo(()=>Fp(()=>{const{innerWidth:r,innerHeight:o}=window;t({width:r,height:o})},500),[]);return I.useEffect(()=>(n(),window.addEventListener("resize",n),()=>window.removeEventListener("resize",n)),[n]),e}function OT(e){e.classList.add(mt.spin),e.addEventListener("animationend",()=>e.classList.remove(mt.spin),!1)}const _T=e=>g("svg",$(F({viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo"},e),{children:g("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}));class PT{constructor({comparisonFn:t}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=t}isEntryFromHistory(t){return this.lastRequested?this.isSameFn(t,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(t){return this.isSameFn(t,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(t){this.isEntryFromHistory(t)||this.isDuplicateOfLastEntry(t)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,t])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(t){this.stepsBack-=t;const n=this.stack.length,r=n-this.stepsBack-1;if(r<0)throw new Error("Requested history entry too far backwards.");if(r>n)throw new Error(`Not enough entries in history to go ${t} steps forward`);return this.lastRequested=this.stack[r],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}}function kT(){const e=Ja(c=>c.uiTree),t=vr(),[n,r]=I.useState(!1),[o,i]=I.useState(!1),a=I.useRef(new PT({comparisonFn:TT}));I.useEffect(()=>{if(!e||e===Zp)return;const c=a.current;c.addEntry(e),i(c.canGoBackwards()),r(c.canGoForwards())},[e]);const s=I.useCallback(c=>{t(_k({state:c}))},[t]),l=I.useCallback(()=>{console.log("Navigating backwards"),s(a.current.goBackwards())},[s]),u=I.useCallback(()=>{console.log("Navigating forwards"),s(a.current.goForwards())},[s]);return{goBackward:l,goForward:u,canGoBackward:o,canGoForward:n}}function TT(e,t){return typeof t=="undefined"?!1:e===t}const IT="_container_1d7pe_1",NT={container:IT};function DT(){const{goBackward:e,goForward:t,canGoBackward:n,canGoForward:r}=kT();return N("div",{className:NT.container+" undo-redo-buttons",children:[g(wt,{variant:["transparent","icon"],disabled:!n,"aria-label":"Undo last change",title:"Undo last change",onClick:e,children:g(PA,{height:"100%"})}),g(wt,{variant:["transparent","icon"],disabled:!r,"aria-label":"Redo last change",title:"Redo last change",onClick:t,children:g(_A,{height:"100%"})})]})}const RT="_elementsPalette_zecez_1",LT="_OptionItem_zecez_18",MT="_OptionIcon_zecez_27",FT="_OptionLabel_zecez_35",el={elementsPalette:RT,OptionItem:LT,OptionIcon:MT,OptionLabel:FT},og=["Inputs","Outputs","gridlayout","uncategorized"];function UT(e,t){var o,i;const n=og.indexOf(((o=en[e])==null?void 0:o.category)||"uncategorized"),r=og.indexOf(((i=en[t])==null?void 0:i.category)||"uncategorized");return nr?1:0}function BT({availableUi:e=en}){const t=j.exports.useMemo(()=>Object.keys(e).sort(UT),[e]);return g("div",{className:el.elementsPalette,children:t.map(n=>g(jT,{uiName:n},n))})}function jT({uiName:e}){const{iconSrc:t,title:n,defaultSettings:r}=en[e],o={uiName:e,uiArguments:r},i=j.exports.useRef(null);return g1({ref:i,nodeInfo:{node:o}}),t===void 0?null:N("div",{ref:i,className:el.OptionItem,"data-ui-name":e,children:[g("img",{src:t,alt:n,className:el.OptionIcon}),g("label",{className:el.OptionLabel,children:n})]})}function Tw(e){return function(t){return typeof t===e}}var WT=Tw("function"),YT=function(e){return e===null},ig=function(e){return Object.prototype.toString.call(e).slice(8,-1)==="RegExp"},ag=function(e){return!zT(e)&&!YT(e)&&(WT(e)||typeof e=="object")},zT=Tw("undefined"),nd=globalThis&&globalThis.__values||function(e){var t=typeof Symbol=="function"&&Symbol.iterator,n=t&&e[t],r=0;if(n)return n.call(e);if(e&&typeof e.length=="number")return{next:function(){return e&&r>=e.length&&(e=void 0),{value:e&&e[r++],done:!e}}};throw new TypeError(t?"Object is not iterable.":"Symbol.iterator is not defined.")};function GT(e,t){var n=e.length;if(n!==t.length)return!1;for(var r=n;r--!==0;)if(!vt(e[r],t[r]))return!1;return!0}function $T(e,t){if(e.byteLength!==t.byteLength)return!1;for(var n=new DataView(e.buffer),r=new DataView(t.buffer),o=e.byteLength;o--;)if(n.getUint8(o)!==r.getUint8(o))return!1;return!0}function HT(e,t){var n,r,o,i;if(e.size!==t.size)return!1;try{for(var a=nd(e.entries()),s=a.next();!s.done;s=a.next()){var l=s.value;if(!t.has(l[0]))return!1}}catch(f){n={error:f}}finally{try{s&&!s.done&&(r=a.return)&&r.call(a)}finally{if(n)throw n.error}}try{for(var u=nd(e.entries()),c=u.next();!c.done;c=u.next()){var l=c.value;if(!vt(l[1],t.get(l[0])))return!1}}catch(f){o={error:f}}finally{try{c&&!c.done&&(i=u.return)&&i.call(u)}finally{if(o)throw o.error}}return!0}function VT(e,t){var n,r;if(e.size!==t.size)return!1;try{for(var o=nd(e.entries()),i=o.next();!i.done;i=o.next()){var a=i.value;if(!t.has(a[0]))return!1}}catch(s){n={error:s}}finally{try{i&&!i.done&&(r=o.return)&&r.call(o)}finally{if(n)throw n.error}}return!0}function vt(e,t){if(e===t)return!0;if(e&&ag(e)&&t&&ag(t)){if(e.constructor!==t.constructor)return!1;if(Array.isArray(e)&&Array.isArray(t))return GT(e,t);if(e instanceof Map&&t instanceof Map)return HT(e,t);if(e instanceof Set&&t instanceof Set)return VT(e,t);if(ArrayBuffer.isView(e)&&ArrayBuffer.isView(t))return $T(e,t);if(ig(e)&&ig(t))return e.source===t.source&&e.flags===t.flags;if(e.valueOf!==Object.prototype.valueOf)return e.valueOf()===t.valueOf();if(e.toString!==Object.prototype.toString)return e.toString()===t.toString();var n=Object.keys(e),r=Object.keys(t);if(n.length!==r.length)return!1;for(var o=n.length;o--!==0;)if(!Object.prototype.hasOwnProperty.call(t,n[o]))return!1;for(var o=n.length;o--!==0;){var i=n[o];if(!(i==="_owner"&&e.$$typeof)&&!vt(e[i],t[i]))return!1}return!0}return Number.isNaN(e)&&Number.isNaN(t)?!0:e===t}var JT=["innerHTML","ownerDocument","style","attributes","nodeValue"],QT=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],XT=["bigint","boolean","null","number","string","symbol","undefined"];function ku(e){var t=Object.prototype.toString.call(e).slice(8,-1);if(/HTML\w+Element/.test(t))return"HTMLElement";if(KT(t))return t}function rn(e){return function(t){return ku(t)===e}}function KT(e){return QT.includes(e)}function ni(e){return function(t){return typeof t===e}}function qT(e){return XT.includes(e)}function P(e){if(e===null)return"null";switch(typeof e){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined"}if(P.array(e))return"Array";if(P.plainFunction(e))return"Function";var t=ku(e);return t||"Object"}P.array=Array.isArray;P.arrayOf=function(e,t){return!P.array(e)&&!P.function(t)?!1:e.every(function(n){return t(n)})};P.asyncGeneratorFunction=function(e){return ku(e)==="AsyncGeneratorFunction"};P.asyncFunction=rn("AsyncFunction");P.bigint=ni("bigint");P.boolean=function(e){return e===!0||e===!1};P.date=rn("Date");P.defined=function(e){return!P.undefined(e)};P.domElement=function(e){return P.object(e)&&!P.plainObject(e)&&e.nodeType===1&&P.string(e.nodeName)&&JT.every(function(t){return t in e})};P.empty=function(e){return P.string(e)&&e.length===0||P.array(e)&&e.length===0||P.object(e)&&!P.map(e)&&!P.set(e)&&Object.keys(e).length===0||P.set(e)&&e.size===0||P.map(e)&&e.size===0};P.error=rn("Error");P.function=ni("function");P.generator=function(e){return P.iterable(e)&&P.function(e.next)&&P.function(e.throw)};P.generatorFunction=rn("GeneratorFunction");P.instanceOf=function(e,t){return!e||!t?!1:Object.getPrototypeOf(e)===t.prototype};P.iterable=function(e){return!P.nullOrUndefined(e)&&P.function(e[Symbol.iterator])};P.map=rn("Map");P.nan=function(e){return Number.isNaN(e)};P.null=function(e){return e===null};P.nullOrUndefined=function(e){return P.null(e)||P.undefined(e)};P.number=function(e){return ni("number")(e)&&!P.nan(e)};P.numericString=function(e){return P.string(e)&&e.length>0&&!Number.isNaN(Number(e))};P.object=function(e){return!P.nullOrUndefined(e)&&(P.function(e)||typeof e=="object")};P.oneOf=function(e,t){return P.array(e)?e.indexOf(t)>-1:!1};P.plainFunction=rn("Function");P.plainObject=function(e){if(ku(e)!=="Object")return!1;var t=Object.getPrototypeOf(e);return t===null||t===Object.getPrototypeOf({})};P.primitive=function(e){return P.null(e)||qT(typeof e)};P.promise=rn("Promise");P.propertyOf=function(e,t,n){if(!P.object(e)||!t)return!1;var r=e[t];return P.function(n)?n(r):P.defined(r)};P.regexp=rn("RegExp");P.set=rn("Set");P.string=ni("string");P.symbol=ni("symbol");P.undefined=ni("undefined");P.weakMap=rn("WeakMap");P.weakSet=rn("WeakSet");function ZT(){for(var e=[],t=0;tl);return P.undefined(r)||(u=u&&l===r),P.undefined(i)||(u=u&&s===i),u}function lg(e,t,n){var r=n.key,o=n.type,i=n.value,a=cn(e,r),s=cn(t,r),l=o==="added"?a:s,u=o==="added"?s:a;if(!P.nullOrUndefined(i)){if(P.defined(l)){if(P.array(l)||P.plainObject(l))return e6(l,u,i)}else return vt(u,i);return!1}return[a,s].every(P.array)?!u.every(eh(l)):[a,s].every(P.plainObject)?t6(Object.keys(l),Object.keys(u)):![a,s].every(function(c){return P.primitive(c)&&P.defined(c)})&&(o==="added"?!P.defined(a)&&P.defined(s):P.defined(a)&&!P.defined(s))}function ug(e,t,n){var r=n===void 0?{}:n,o=r.key,i=cn(e,o),a=cn(t,o);if(!Iw(i,a))throw new TypeError("Inputs have different types");if(!ZT(i,a))throw new TypeError("Inputs don't have length");return[i,a].every(P.plainObject)&&(i=Object.keys(i),a=Object.keys(a)),[i,a]}function cg(e){return function(t){var n=t[0],r=t[1];return P.array(e)?vt(e,r)||e.some(function(o){return vt(o,r)||P.array(r)&&eh(r)(o)}):P.plainObject(e)&&e[n]?!!e[n]&&vt(e[n],r):vt(e,r)}}function t6(e,t){return t.some(function(n){return!e.includes(n)})}function fg(e){return function(t){return P.array(e)?e.some(function(n){return vt(n,t)||P.array(t)&&eh(t)(n)}):vt(e,t)}}function Ci(e,t){return P.array(e)?e.some(function(n){return vt(n,t)}):vt(e,t)}function eh(e){return function(t){return e.some(function(n){return vt(n,t)})}}function Iw(){for(var e=[],t=0;t=0)return 1;return 0}();function R6(e){var t=!1;return function(){t||(t=!0,window.Promise.resolve().then(function(){t=!1,e()}))}}function L6(e){var t=!1;return function(){t||(t=!0,setTimeout(function(){t=!1,e()},D6))}}var M6=ns&&window.Promise,F6=M6?R6:L6;function Bw(e){var t={};return e&&t.toString.call(e)==="[object Function]"}function Hr(e,t){if(e.nodeType!==1)return[];var n=e.ownerDocument.defaultView,r=n.getComputedStyle(e,null);return t?r[t]:r}function oh(e){return e.nodeName==="HTML"?e:e.parentNode||e.host}function rs(e){if(!e)return document.body;switch(e.nodeName){case"HTML":case"BODY":return e.ownerDocument.body;case"#document":return e.body}var t=Hr(e),n=t.overflow,r=t.overflowX,o=t.overflowY;return/(auto|scroll|overlay)/.test(n+o+r)?e:rs(oh(e))}function jw(e){return e&&e.referenceNode?e.referenceNode:e}var vg=ns&&!!(window.MSInputMethodContext&&document.documentMode),gg=ns&&/MSIE 10/.test(navigator.userAgent);function ri(e){return e===11?vg:e===10?gg:vg||gg}function Wo(e){if(!e)return document.documentElement;for(var t=ri(10)?document.body:null,n=e.offsetParent||null;n===t&&e.nextElementSibling;)n=(e=e.nextElementSibling).offsetParent;var r=n&&n.nodeName;return!r||r==="BODY"||r==="HTML"?e?e.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(n.nodeName)!==-1&&Hr(n,"position")==="static"?Wo(n):n}function U6(e){var t=e.nodeName;return t==="BODY"?!1:t==="HTML"||Wo(e.firstElementChild)===e}function rd(e){return e.parentNode!==null?rd(e.parentNode):e}function $l(e,t){if(!e||!e.nodeType||!t||!t.nodeType)return document.documentElement;var n=e.compareDocumentPosition(t)&Node.DOCUMENT_POSITION_FOLLOWING,r=n?e:t,o=n?t:e,i=document.createRange();i.setStart(r,0),i.setEnd(o,0);var a=i.commonAncestorContainer;if(e!==a&&t!==a||r.contains(o))return U6(a)?a:Wo(a);var s=rd(e);return s.host?$l(s.host,t):$l(e,rd(t).host)}function Yo(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",n=t==="top"?"scrollTop":"scrollLeft",r=e.nodeName;if(r==="BODY"||r==="HTML"){var o=e.ownerDocument.documentElement,i=e.ownerDocument.scrollingElement||o;return i[n]}return e[n]}function B6(e,t){var n=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,r=Yo(t,"top"),o=Yo(t,"left"),i=n?-1:1;return e.top+=r*i,e.bottom+=r*i,e.left+=o*i,e.right+=o*i,e}function yg(e,t){var n=t==="x"?"Left":"Top",r=n==="Left"?"Right":"Bottom";return parseFloat(e["border"+n+"Width"])+parseFloat(e["border"+r+"Width"])}function wg(e,t,n,r){return Math.max(t["offset"+e],t["scroll"+e],n["client"+e],n["offset"+e],n["scroll"+e],ri(10)?parseInt(n["offset"+e])+parseInt(r["margin"+(e==="Height"?"Top":"Left")])+parseInt(r["margin"+(e==="Height"?"Bottom":"Right")]):0)}function Ww(e){var t=e.body,n=e.documentElement,r=ri(10)&&getComputedStyle(n);return{height:wg("Height",t,n,r),width:wg("Width",t,n,r)}}var j6=function(e,t){if(!(e instanceof t))throw new TypeError("Cannot call a class as a function")},W6=function(){function e(t,n){for(var r=0;r2&&arguments[2]!==void 0?arguments[2]:!1,r=ri(10),o=t.nodeName==="HTML",i=od(e),a=od(t),s=rs(e),l=Hr(t),u=parseFloat(l.borderTopWidth),c=parseFloat(l.borderLeftWidth);n&&o&&(a.top=Math.max(a.top,0),a.left=Math.max(a.left,0));var f=pr({top:i.top-a.top-u,left:i.left-a.left-c,width:i.width,height:i.height});if(f.marginTop=0,f.marginLeft=0,!r&&o){var d=parseFloat(l.marginTop),p=parseFloat(l.marginLeft);f.top-=u-d,f.bottom-=u-d,f.left-=c-p,f.right-=c-p,f.marginTop=d,f.marginLeft=p}return(r&&!n?t.contains(s):t===s&&s.nodeName!=="BODY")&&(f=B6(f,t)),f}function Y6(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=e.ownerDocument.documentElement,r=ih(e,n),o=Math.max(n.clientWidth,window.innerWidth||0),i=Math.max(n.clientHeight,window.innerHeight||0),a=t?0:Yo(n),s=t?0:Yo(n,"left"),l={top:a-r.top+r.marginTop,left:s-r.left+r.marginLeft,width:o,height:i};return pr(l)}function Yw(e){var t=e.nodeName;if(t==="BODY"||t==="HTML")return!1;if(Hr(e,"position")==="fixed")return!0;var n=oh(e);return n?Yw(n):!1}function zw(e){if(!e||!e.parentElement||ri())return document.documentElement;for(var t=e.parentElement;t&&Hr(t,"transform")==="none";)t=t.parentElement;return t||document.documentElement}function ah(e,t,n,r){var o=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,i={top:0,left:0},a=o?zw(e):$l(e,jw(t));if(r==="viewport")i=Y6(a,o);else{var s=void 0;r==="scrollParent"?(s=rs(oh(t)),s.nodeName==="BODY"&&(s=e.ownerDocument.documentElement)):r==="window"?s=e.ownerDocument.documentElement:s=r;var l=ih(s,a,o);if(s.nodeName==="HTML"&&!Yw(a)){var u=Ww(e.ownerDocument),c=u.height,f=u.width;i.top+=l.top-l.marginTop,i.bottom=c+l.top,i.left+=l.left-l.marginLeft,i.right=f+l.left}else i=l}n=n||0;var d=typeof n=="number";return i.left+=d?n:n.left||0,i.top+=d?n:n.top||0,i.right-=d?n:n.right||0,i.bottom-=d?n:n.bottom||0,i}function z6(e){var t=e.width,n=e.height;return t*n}function Gw(e,t,n,r,o){var i=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(e.indexOf("auto")===-1)return e;var a=ah(n,r,i,o),s={top:{width:a.width,height:t.top-a.top},right:{width:a.right-t.right,height:a.height},bottom:{width:a.width,height:a.bottom-t.bottom},left:{width:t.left-a.left,height:a.height}},l=Object.keys(s).map(function(d){return Mt({key:d},s[d],{area:z6(s[d])})}).sort(function(d,p){return p.area-d.area}),u=l.filter(function(d){var p=d.width,m=d.height;return p>=n.clientWidth&&m>=n.clientHeight}),c=u.length>0?u[0].key:l[0].key,f=e.split("-")[1];return c+(f?"-"+f:"")}function $w(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,o=r?zw(t):$l(t,jw(n));return ih(n,o,r)}function Hw(e){var t=e.ownerDocument.defaultView,n=t.getComputedStyle(e),r=parseFloat(n.marginTop||0)+parseFloat(n.marginBottom||0),o=parseFloat(n.marginLeft||0)+parseFloat(n.marginRight||0),i={width:e.offsetWidth+o,height:e.offsetHeight+r};return i}function Hl(e){var t={left:"right",right:"left",bottom:"top",top:"bottom"};return e.replace(/left|right|bottom|top/g,function(n){return t[n]})}function Vw(e,t,n){n=n.split("-")[0];var r=Hw(e),o={width:r.width,height:r.height},i=["right","left"].indexOf(n)!==-1,a=i?"top":"left",s=i?"left":"top",l=i?"height":"width",u=i?"width":"height";return o[a]=t[a]+t[l]/2-r[l]/2,n===s?o[s]=t[s]-r[u]:o[s]=t[Hl(s)],o}function os(e,t){return Array.prototype.find?e.find(t):e.filter(t)[0]}function G6(e,t,n){if(Array.prototype.findIndex)return e.findIndex(function(o){return o[t]===n});var r=os(e,function(o){return o[t]===n});return e.indexOf(r)}function Jw(e,t,n){var r=n===void 0?e:e.slice(0,G6(e,"name",n));return r.forEach(function(o){o.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var i=o.function||o.fn;o.enabled&&Bw(i)&&(t.offsets.popper=pr(t.offsets.popper),t.offsets.reference=pr(t.offsets.reference),t=i(t,o))}),t}function $6(){if(!this.state.isDestroyed){var e={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};e.offsets.reference=$w(this.state,this.popper,this.reference,this.options.positionFixed),e.placement=Gw(this.options.placement,e.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),e.originalPlacement=e.placement,e.positionFixed=this.options.positionFixed,e.offsets.popper=Vw(this.popper,e.offsets.reference,e.placement),e.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",e=Jw(this.modifiers,e),this.state.isCreated?this.options.onUpdate(e):(this.state.isCreated=!0,this.options.onCreate(e))}}function Qw(e,t){return e.some(function(n){var r=n.name,o=n.enabled;return o&&r===t})}function sh(e){for(var t=[!1,"ms","Webkit","Moz","O"],n=e.charAt(0).toUpperCase()+e.slice(1),r=0;ra[p]&&(e.offsets.popper[f]+=s[f]+m-a[p]),e.offsets.popper=pr(e.offsets.popper);var y=s[f]+s[u]/2-m/2,h=Hr(e.instance.popper),v=parseFloat(h["margin"+c]),w=parseFloat(h["border"+c+"Width"]),S=y-e.offsets.popper[f]-v-w;return S=Math.max(Math.min(a[u]-m,S),0),e.arrowElement=r,e.offsets.arrow=(n={},zo(n,f,Math.round(S)),zo(n,d,""),n),e}function oI(e){return e==="end"?"start":e==="start"?"end":e}var Zw=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],Uc=Zw.slice(3);function Sg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,n=Uc.indexOf(e),r=Uc.slice(n+1).concat(Uc.slice(0,n));return t?r.reverse():r}var Bc={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function iI(e,t){if(Qw(e.instance.modifiers,"inner")||e.flipped&&e.placement===e.originalPlacement)return e;var n=ah(e.instance.popper,e.instance.reference,t.padding,t.boundariesElement,e.positionFixed),r=e.placement.split("-")[0],o=Hl(r),i=e.placement.split("-")[1]||"",a=[];switch(t.behavior){case Bc.FLIP:a=[r,o];break;case Bc.CLOCKWISE:a=Sg(r);break;case Bc.COUNTERCLOCKWISE:a=Sg(r,!0);break;default:a=t.behavior}return a.forEach(function(s,l){if(r!==s||a.length===l+1)return e;r=e.placement.split("-")[0],o=Hl(r);var u=e.offsets.popper,c=e.offsets.reference,f=Math.floor,d=r==="left"&&f(u.right)>f(c.left)||r==="right"&&f(u.left)f(c.top)||r==="bottom"&&f(u.top)f(n.right),y=f(u.top)f(n.bottom),v=r==="left"&&p||r==="right"&&m||r==="top"&&y||r==="bottom"&&h,w=["top","bottom"].indexOf(r)!==-1,S=!!t.flipVariations&&(w&&i==="start"&&p||w&&i==="end"&&m||!w&&i==="start"&&y||!w&&i==="end"&&h),A=!!t.flipVariationsByContent&&(w&&i==="start"&&m||w&&i==="end"&&p||!w&&i==="start"&&h||!w&&i==="end"&&y),T=S||A;(d||v||T)&&(e.flipped=!0,(d||v)&&(r=a[l+1]),T&&(i=oI(i)),e.placement=r+(i?"-"+i:""),e.offsets.popper=Mt({},e.offsets.popper,Vw(e.instance.popper,e.offsets.reference,e.placement)),e=Jw(e.instance.modifiers,e,"flip"))}),e}function aI(e){var t=e.offsets,n=t.popper,r=t.reference,o=e.placement.split("-")[0],i=Math.floor,a=["top","bottom"].indexOf(o)!==-1,s=a?"right":"bottom",l=a?"left":"top",u=a?"width":"height";return n[s]i(r[s])&&(e.offsets.popper[l]=i(r[s])),e}function sI(e,t,n,r){var o=e.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),i=+o[1],a=o[2];if(!i)return e;if(a.indexOf("%")===0){var s=void 0;switch(a){case"%p":s=n;break;case"%":case"%r":default:s=r}var l=pr(s);return l[t]/100*i}else if(a==="vh"||a==="vw"){var u=void 0;return a==="vh"?u=Math.max(document.documentElement.clientHeight,window.innerHeight||0):u=Math.max(document.documentElement.clientWidth,window.innerWidth||0),u/100*i}else return i}function lI(e,t,n,r){var o=[0,0],i=["right","left"].indexOf(r)!==-1,a=e.split(/(\+|\-)/).map(function(c){return c.trim()}),s=a.indexOf(os(a,function(c){return c.search(/,|\s/)!==-1}));a[s]&&a[s].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var l=/\s*,\s*|\s+/,u=s!==-1?[a.slice(0,s).concat([a[s].split(l)[0]]),[a[s].split(l)[1]].concat(a.slice(s+1))]:[a];return u=u.map(function(c,f){var d=(f===1?!i:i)?"height":"width",p=!1;return c.reduce(function(m,y){return m[m.length-1]===""&&["+","-"].indexOf(y)!==-1?(m[m.length-1]=y,p=!0,m):p?(m[m.length-1]+=y,p=!1,m):m.concat(y)},[]).map(function(m){return sI(m,d,t,n)})}),u.forEach(function(c,f){c.forEach(function(d,p){lh(d)&&(o[f]+=d*(c[p-1]==="-"?-1:1))})}),o}function uI(e,t){var n=t.offset,r=e.placement,o=e.offsets,i=o.popper,a=o.reference,s=r.split("-")[0],l=void 0;return lh(+n)?l=[+n,0]:l=lI(n,i,a,s),s==="left"?(i.top+=l[0],i.left-=l[1]):s==="right"?(i.top+=l[0],i.left+=l[1]):s==="top"?(i.left+=l[0],i.top-=l[1]):s==="bottom"&&(i.left+=l[0],i.top+=l[1]),e.popper=i,e}function cI(e,t){var n=t.boundariesElement||Wo(e.instance.popper);e.instance.reference===n&&(n=Wo(n));var r=sh("transform"),o=e.instance.popper.style,i=o.top,a=o.left,s=o[r];o.top="",o.left="",o[r]="";var l=ah(e.instance.popper,e.instance.reference,t.padding,n,e.positionFixed);o.top=i,o.left=a,o[r]=s,t.boundaries=l;var u=t.priority,c=e.offsets.popper,f={primary:function(p){var m=c[p];return c[p]l[p]&&!t.escapeWithReference&&(y=Math.min(c[m],l[p]-(p==="right"?c.width:c.height))),zo({},m,y)}};return u.forEach(function(d){var p=["left","top"].indexOf(d)!==-1?"primary":"secondary";c=Mt({},c,f[p](d))}),e.offsets.popper=c,e}function fI(e){var t=e.placement,n=t.split("-")[0],r=t.split("-")[1];if(r){var o=e.offsets,i=o.reference,a=o.popper,s=["bottom","top"].indexOf(n)!==-1,l=s?"left":"top",u=s?"width":"height",c={start:zo({},l,i[l]),end:zo({},l,i[l]+i[u]-a[u])};e.offsets.popper=Mt({},a,c[r])}return e}function dI(e){if(!qw(e.instance.modifiers,"hide","preventOverflow"))return e;var t=e.offsets.reference,n=os(e.instance.modifiers,function(r){return r.name==="preventOverflow"}).boundaries;if(t.bottomn.right||t.top>n.bottom||t.right2&&arguments[2]!==void 0?arguments[2]:{};j6(this,e),this.scheduleUpdate=function(){return requestAnimationFrame(r.update)},this.update=F6(this.update.bind(this)),this.options=Mt({},e.Defaults,o),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=t&&t.jquery?t[0]:t,this.popper=n&&n.jquery?n[0]:n,this.options.modifiers={},Object.keys(Mt({},e.Defaults.modifiers,o.modifiers)).forEach(function(a){r.options.modifiers[a]=Mt({},e.Defaults.modifiers[a]||{},o.modifiers?o.modifiers[a]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(a){return Mt({name:a},r.options.modifiers[a])}).sort(function(a,s){return a.order-s.order}),this.modifiers.forEach(function(a){a.enabled&&Bw(a.onLoad)&&a.onLoad(r.reference,r.popper,r.options,a,r.state)}),this.update();var i=this.options.eventsEnabled;i&&this.enableEventListeners(),this.state.eventsEnabled=i}return W6(e,[{key:"update",value:function(){return $6.call(this)}},{key:"destroy",value:function(){return H6.call(this)}},{key:"enableEventListeners",value:function(){return J6.call(this)}},{key:"disableEventListeners",value:function(){return X6.call(this)}}]),e}();ju.Utils=(typeof window!="undefined"?window:global).PopperUtils;ju.placements=Zw;ju.Defaults=mI;const bg=ju;var eS={},tS={exports:{}};(function(e,t){(function(n,r){var o=r(n);e.exports=o})(Fg,function(n){var r=["N","E","A","D"];function o(b,E){b.super_=E,b.prototype=Object.create(E.prototype,{constructor:{value:b,enumerable:!1,writable:!0,configurable:!0}})}function i(b,E){Object.defineProperty(this,"kind",{value:b,enumerable:!0}),E&&E.length&&Object.defineProperty(this,"path",{value:E,enumerable:!0})}function a(b,E,x){a.super_.call(this,"E",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0}),Object.defineProperty(this,"rhs",{value:x,enumerable:!0})}o(a,i);function s(b,E){s.super_.call(this,"N",b),Object.defineProperty(this,"rhs",{value:E,enumerable:!0})}o(s,i);function l(b,E){l.super_.call(this,"D",b),Object.defineProperty(this,"lhs",{value:E,enumerable:!0})}o(l,i);function u(b,E,x){u.super_.call(this,"A",b),Object.defineProperty(this,"index",{value:E,enumerable:!0}),Object.defineProperty(this,"item",{value:x,enumerable:!0})}o(u,i);function c(b,E,x){var _=b.slice((x||E)+1||b.length);return b.length=E<0?b.length+E:E,b.push.apply(b,_),b}function f(b){var E=typeof b;return E!=="object"?E:b===Math?"math":b===null?"null":Array.isArray(b)?"array":Object.prototype.toString.call(b)==="[object Date]"?"date":typeof b.toString=="function"&&/^\/.*\//.test(b.toString())?"regexp":"object"}function d(b){var E=0;if(b.length===0)return E;for(var x=0;x0&&B[B.length-1].lhs&&Object.getOwnPropertyDescriptor(B[B.length-1].lhs,D),ue=ye!=="undefined"||B&&B.length>0&&B[B.length-1].rhs&&Object.getOwnPropertyDescriptor(B[B.length-1].rhs,D);if(!le&&ue)x.push(new s(H,E));else if(!ue&&le)x.push(new l(H,b));else if(f(b)!==f(E))x.push(new a(H,b,E));else if(f(b)==="date"&&b-E!==0)x.push(new a(H,b,E));else if(he==="object"&&b!==null&&E!==null){for(ne=B.length-1;ne>-1;--ne)if(B[ne].lhs===b){V=!0;break}if(V)b!==E&&x.push(new a(H,b,E));else{if(B.push({lhs:b,rhs:E}),Array.isArray(b)){for(q&&(b.sort(function(Ue,rt){return p(Ue)-p(rt)}),E.sort(function(Ue,rt){return p(Ue)-p(rt)})),ne=E.length-1,R=b.length-1;ne>R;)x.push(new u(H,ne,new s(void 0,E[ne--])));for(;R>ne;)x.push(new u(H,R,new l(void 0,b[R--])));for(;ne>=0;--ne)m(b[ne],E[ne],x,_,H,ne,B,q)}else{var ze=Object.keys(b),Fe=Object.keys(E);for(ne=0;ne=0?(m(b[Y],E[Y],x,_,H,Y,B,q),Fe[V]=null):m(b[Y],void 0,x,_,H,Y,B,q);for(ne=0;ne -*/var vI={set:wI,get:gI,has:yI,hasOwn:function(e,t,n){return this.has(e,t,n||{own:!0})},isIn:SI};function gI(e,t){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var n=t.split(".");return n.reduce(function(r,o){return r&&r[o]},e)}else return typeof t=="number"?e[t]:e;else return e}function yI(e,t,n){if(n=n||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a,s){return a==s.length-1?n.own?!!(o&&o.hasOwnProperty(i)):o!==null&&typeof o=="object"&&i in o:o&&o[i]},e)}else return typeof t=="number"?t in e:!1;else return!1}function wI(e,t,n){if(e&&typeof e=="object")if(typeof t=="string"&&t!==""){var r=t.split(".");return r.reduce(function(o,i,a){const s=Number.isInteger(Number(r[a+1]));return o[i]=o[i]||(s?[]:{}),r.length==a+1&&(o[i]=n),o[i]},e)}else return typeof t=="number"?(e[t]=n,e[t]):e;else return e}function SI(e,t,n,r){if(r=r||{},e&&typeof e=="object")if(typeof t=="string"&&t!==""){var o=t.split("."),i=!1,a;return a=!!o.reduce(function(s,l){return i=i||s===n||!!s&&s[l]===n,s&&s[l]},e),r.validPath?i&&a:i}else return!1;else return!1}Object.defineProperty(eS,"__esModule",{value:!0});var bI=tS.exports,dt=vI;function EI(){for(var e=[],t=0;t=0:a===r,u=Array.isArray(o)?o.indexOf(s)>=0:s===o;return l&&(i?u:!i)},changedTo:function(n,r){if(typeof n=="undefined")throw new Error("Key parameter is required");var o=dt.get(e,n),i=dt.get(t,n),a=Array.isArray(r)?r.indexOf(o)<0:o!==r,s=Array.isArray(r)?r.indexOf(i)>=0:i===r;return a&&s},increased:function(n){if(typeof n=="undefined")throw new Error("Key parameter is required");return Eg(dt.get(e,n),dt.get(t,n))&&dt.get(e,n)dt.get(t,n)}}}var xI=eS.default=AI;function Cg(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function Ee(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function nS(e,t){if(e==null)return{};var n=_I(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function bn(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function rS(e,t){return t&&(typeof t=="object"||typeof t=="function")?t:bn(e)}function ls(e){var t=OI();return function(){var r=Vl(e),o;if(t){var i=Vl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return rS(this,o)}}var PI={flip:{padding:20},preventOverflow:{padding:10}},ae={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},an=Dw.canUseDOM,Ai=nr.createPortal!==void 0;function jc(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ns(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&t&&n&&(console.groupCollapsed("%creact-floater: ".concat(t),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd())}function kI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.addEventListener(t,n,r)}function TI(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;e.removeEventListener(t,n,r)}function II(e,t,n){var r=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,o;o=function(a){n(a),TI(e,t,o)},kI(e,t,o,r)}function xg(){}var oS=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),an?(o.node=document.createElement("div"),r.id&&(o.node.id=r.id),r.zIndex&&(o.node.style.zIndex=r.zIndex),document.body.appendChild(o.node),o):rS(o)}return as(n,[{key:"componentDidMount",value:function(){!an||Ai||this.renderPortal()}},{key:"componentDidUpdate",value:function(){!an||Ai||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!an||!this.node||(Ai||nr.unmountComponentAtNode(this.node),document.body.removeChild(this.node))}},{key:"renderPortal",value:function(){if(!an)return null;var o=this.props,i=o.children,a=o.setRef;if(Ai)return nr.createPortal(i,this.node);var s=nr.unstable_renderSubtreeIntoContainer(this,i.length>1?g("div",{children:i}):i[0],this.node);return a(s),null}},{key:"renderReact16",value:function(){var o=this.props,i=o.hasChildren,a=o.placement,s=o.target;return i?this.renderPortal():s||a==="center"?this.renderPortal():null}},{key:"render",value:function(){return Ai?this.renderReact16():null}}]),n}(I.Component);qe(oS,"propTypes",{children:M.exports.oneOfType([M.exports.element,M.exports.array]),hasChildren:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),placement:M.exports.string,setRef:M.exports.func.isRequired,target:M.exports.oneOfType([M.exports.object,M.exports.string]),zIndex:M.exports.number});var iS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"parentStyle",get:function(){var o=this.props,i=o.placement,a=o.styles,s=a.arrow.length,l={pointerEvents:"none",position:"absolute",width:"100%"};return i.startsWith("top")?(l.bottom=0,l.left=0,l.right=0,l.height=s):i.startsWith("bottom")?(l.left=0,l.right=0,l.top=0,l.height=s):i.startsWith("left")?(l.right=0,l.top=0,l.bottom=0):i.startsWith("right")&&(l.left=0,l.top=0),l}},{key:"render",value:function(){var o=this.props,i=o.placement,a=o.setArrowRef,s=o.styles,l=s.arrow,u=l.color,c=l.display,f=l.length,d=l.margin,p=l.position,m=l.spread,y={display:c,position:p},h,v=m,w=f;return i.startsWith("top")?(h="0,0 ".concat(v/2,",").concat(w," ").concat(v,",0"),y.bottom=0,y.marginLeft=d,y.marginRight=d):i.startsWith("bottom")?(h="".concat(v,",").concat(w," ").concat(v/2,",0 0,").concat(w),y.top=0,y.marginLeft=d,y.marginRight=d):i.startsWith("left")?(w=m,v=f,h="0,0 ".concat(v,",").concat(w/2," 0,").concat(w),y.right=0,y.marginTop=d,y.marginBottom=d):i.startsWith("right")&&(w=m,v=f,h="".concat(v,",").concat(w," ").concat(v,",0 0,").concat(w/2),y.left=0,y.marginTop=d,y.marginBottom=d),g("div",{className:"__floater__arrow",style:this.parentStyle,children:g("span",{ref:a,style:y,children:g("svg",{width:v,height:w,version:"1.1",xmlns:"http://www.w3.org/2000/svg",children:g("polygon",{points:h,fill:u})})})})}}]),n}(I.Component);qe(iS,"propTypes",{placement:M.exports.string.isRequired,setArrowRef:M.exports.func.isRequired,styles:M.exports.object.isRequired});var NI=["color","height","width"],aS=function(t){var n=t.handleClick,r=t.styles,o=r.color,i=r.height,a=r.width,s=nS(r,NI);return g("button",{"aria-label":"close",onClick:n,style:s,type:"button",children:g("svg",{width:"".concat(a,"px"),height:"".concat(i,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})})};aS.propTypes={handleClick:M.exports.func.isRequired,styles:M.exports.object.isRequired};var sS=function(t){var n=t.content,r=t.footer,o=t.handleClick,i=t.open,a=t.positionWrapper,s=t.showCloseButton,l=t.title,u=t.styles,c={content:I.isValidElement(n)?n:g("div",{className:"__floater__content",style:u.content,children:n})};return l&&(c.title=I.isValidElement(l)?l:g("div",{className:"__floater__title",style:u.title,children:l})),r&&(c.footer=I.isValidElement(r)?r:g("div",{className:"__floater__footer",style:u.footer,children:r})),(s||a)&&!P.boolean(i)&&(c.close=g(aS,{styles:u.close,handleClick:o})),N("div",{className:"__floater__container",style:u.container,children:[c.close,c.title,c.content,c.footer]})};sS.propTypes={content:M.exports.node.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,open:M.exports.bool,positionWrapper:M.exports.bool.isRequired,showCloseButton:M.exports.bool.isRequired,styles:M.exports.object.isRequired,title:M.exports.node};var lS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"style",get:function(){var o=this.props,i=o.disableAnimation,a=o.component,s=o.placement,l=o.hideArrow,u=o.status,c=o.styles,f=c.arrow.length,d=c.floater,p=c.floaterCentered,m=c.floaterClosing,y=c.floaterOpening,h=c.floaterWithAnimation,v=c.floaterWithComponent,w={};return l||(s.startsWith("top")?w.padding="0 0 ".concat(f,"px"):s.startsWith("bottom")?w.padding="".concat(f,"px 0 0"):s.startsWith("left")?w.padding="0 ".concat(f,"px 0 0"):s.startsWith("right")&&(w.padding="0 0 0 ".concat(f,"px"))),[ae.OPENING,ae.OPEN].indexOf(u)!==-1&&(w=Ee(Ee({},w),y)),u===ae.CLOSING&&(w=Ee(Ee({},w),m)),u===ae.OPEN&&!i&&(w=Ee(Ee({},w),h)),s==="center"&&(w=Ee(Ee({},w),p)),a&&(w=Ee(Ee({},w),v)),Ee(Ee({},d),w)}},{key:"render",value:function(){var o=this.props,i=o.component,a=o.handleClick,s=o.hideArrow,l=o.setFloaterRef,u=o.status,c={},f=["__floater"];return i?I.isValidElement(i)?c.content=I.cloneElement(i,{closeFn:a}):c.content=i({closeFn:a}):c.content=g(sS,F({},this.props)),u===ae.OPEN&&f.push("__floater__open"),s||(c.arrow=g(iS,F({},this.props))),g("div",{ref:l,className:f.join(" "),style:this.style,children:N("div",{className:"__floater__body",children:[c.content,c.arrow]})})}}]),n}(I.Component);qe(lS,"propTypes",{component:M.exports.oneOfType([M.exports.func,M.exports.element]),content:M.exports.node,disableAnimation:M.exports.bool.isRequired,footer:M.exports.node,handleClick:M.exports.func.isRequired,hideArrow:M.exports.bool.isRequired,open:M.exports.bool,placement:M.exports.string.isRequired,positionWrapper:M.exports.bool.isRequired,setArrowRef:M.exports.func.isRequired,setFloaterRef:M.exports.func.isRequired,showCloseButton:M.exports.bool,status:M.exports.string.isRequired,styles:M.exports.object.isRequired,title:M.exports.node});var uS=function(e){ss(n,e);var t=ls(n);function n(){return is(this,n),t.apply(this,arguments)}return as(n,[{key:"render",value:function(){var o=this.props,i=o.children,a=o.handleClick,s=o.handleMouseEnter,l=o.handleMouseLeave,u=o.setChildRef,c=o.setWrapperRef,f=o.style,d=o.styles,p;if(i)if(I.Children.count(i)===1)if(!I.isValidElement(i))p=g("span",{children:i});else{var m=P.function(i.type)?"innerRef":"ref";p=I.cloneElement(I.Children.only(i),qe({},m,u))}else p=i;return p?g("span",{ref:c,style:Ee(Ee({},d),f),onClick:a,onMouseEnter:s,onMouseLeave:l,children:p}):null}}]),n}(I.Component);qe(uS,"propTypes",{children:M.exports.node,handleClick:M.exports.func.isRequired,handleMouseEnter:M.exports.func.isRequired,handleMouseLeave:M.exports.func.isRequired,setChildRef:M.exports.func.isRequired,setWrapperRef:M.exports.func.isRequired,style:M.exports.object,styles:M.exports.object.isRequired});var DI={zIndex:100};function RI(e){var t=on(DI,e.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:t.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:t.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:t}}var LI=["arrow","flip","offset"],MI=["position","top","right","bottom","left"],uh=function(e){ss(n,e);var t=ls(n);function n(r){var o;return is(this,n),o=t.call(this,r),qe(bn(o),"setArrowRef",function(i){o.arrowRef=i}),qe(bn(o),"setChildRef",function(i){o.childRef=i}),qe(bn(o),"setFloaterRef",function(i){o.floaterRef||(o.floaterRef=i)}),qe(bn(o),"setWrapperRef",function(i){o.wrapperRef=i}),qe(bn(o),"handleTransitionEnd",function(){var i=o.state.status,a=o.props.callback;o.wrapperPopper&&o.wrapperPopper.instance.update(),o.setState({status:i===ae.OPENING?ae.OPEN:ae.IDLE},function(){var s=o.state.status;a(s===ae.OPEN?"open":"close",o.props)})}),qe(bn(o),"handleClick",function(){var i=o.props,a=i.event,s=i.open;if(!P.boolean(s)){var l=o.state,u=l.positionWrapper,c=l.status;(o.event==="click"||o.event==="hover"&&u)&&(Ns({title:"click",data:[{event:a,status:c===ae.OPEN?"closing":"opening"}],debug:o.debug}),o.toggle())}}),qe(bn(o),"handleMouseEnter",function(){var i=o.props,a=i.event,s=i.open;if(!(P.boolean(s)||jc())){var l=o.state.status;o.event==="hover"&&l===ae.IDLE&&(Ns({title:"mouseEnter",data:[{key:"originalEvent",value:a}],debug:o.debug}),clearTimeout(o.eventDelayTimeout),o.toggle())}}),qe(bn(o),"handleMouseLeave",function(){var i=o.props,a=i.event,s=i.eventDelay,l=i.open;if(!(P.boolean(l)||jc())){var u=o.state,c=u.status,f=u.positionWrapper;o.event==="hover"&&(Ns({title:"mouseLeave",data:[{key:"originalEvent",value:a}],debug:o.debug}),s?[ae.OPENING,ae.OPEN].indexOf(c)!==-1&&!f&&!o.eventDelayTimeout&&(o.eventDelayTimeout=setTimeout(function(){delete o.eventDelayTimeout,o.toggle()},s*1e3)):o.toggle(ae.IDLE))}}),o.state={currentPlacement:r.placement,positionWrapper:r.wrapperOptions.position&&!!r.target,status:ae.INIT,statusWrapper:ae.INIT},o._isMounted=!1,an&&window.addEventListener("load",function(){o.popper&&o.popper.instance.update(),o.wrapperPopper&&o.wrapperPopper.instance.update()}),o}return as(n,[{key:"componentDidMount",value:function(){if(!!an){var o=this.state.positionWrapper,i=this.props,a=i.children,s=i.open,l=i.target;this._isMounted=!0,Ns({title:"init",data:{hasChildren:!!a,hasTarget:!!l,isControlled:P.boolean(s),positionWrapper:o,target:this.target,floater:this.floaterRef},debug:this.debug}),this.initPopper(),!a&&l&&P.boolean(s)}}},{key:"componentDidUpdate",value:function(o,i){if(!!an){var a=this.props,s=a.autoOpen,l=a.open,u=a.target,c=a.wrapperOptions,f=xI(i,this.state),d=f.changedFrom,p=f.changedTo;if(o.open!==l){var m;P.boolean(l)&&(m=l?ae.OPENING:ae.CLOSING),this.toggle(m)}(o.wrapperOptions.position!==c.position||o.target!==u)&&this.changeWrapperPosition(this.props),p("status",ae.IDLE)&&l?this.toggle(ae.OPEN):d("status",ae.INIT,ae.IDLE)&&s&&this.toggle(ae.OPEN),this.popper&&p("status",ae.OPENING)&&this.popper.instance.update(),this.floaterRef&&(p("status",ae.OPENING)||p("status",ae.CLOSING))&&II(this.floaterRef,"transitionend",this.handleTransitionEnd)}}},{key:"componentWillUnmount",value:function(){!an||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var o=this,i=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,a=this.state.positionWrapper,s=this.props,l=s.disableFlip,u=s.getPopper,c=s.hideArrow,f=s.offset,d=s.placement,p=s.wrapperOptions,m=d==="top"||d==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(d==="center")this.setState({status:ae.IDLE});else if(i&&this.floaterRef){var y=this.options,h=y.arrow,v=y.flip,w=y.offset,S=nS(y,LI);new bg(i,this.floaterRef,{placement:d,modifiers:Ee({arrow:Ee({enabled:!c,element:this.arrowRef},h),flip:Ee({enabled:!l,behavior:m},v),offset:Ee({offset:"0, ".concat(f,"px")},w)},S),onCreate:function(C){o.popper=C,u(C,"floater"),o._isMounted&&o.setState({currentPlacement:C.placement,status:ae.IDLE}),d!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){o.popper=C;var O=o.state.currentPlacement;o._isMounted&&C.placement!==O&&o.setState({currentPlacement:C.placement})}})}if(a){var A=P.undefined(p.offset)?0:p.offset;new bg(this.target,this.wrapperRef,{placement:p.placement||d,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(A,"px")},flip:{enabled:!1}},onCreate:function(C){o.wrapperPopper=C,o._isMounted&&o.setState({statusWrapper:ae.IDLE}),u(C,"wrapper"),d!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"changeWrapperPosition",value:function(o){var i=o.target,a=o.wrapperOptions;this.setState({positionWrapper:a.position&&!!i})}},{key:"toggle",value:function(o){var i=this.state.status,a=i===ae.OPEN?ae.CLOSING:ae.OPENING;P.undefined(o)||(a=o),this.setState({status:a})}},{key:"debug",get:function(){var o=this.props.debug;return o||!!global.ReactFloaterDebug}},{key:"event",get:function(){var o=this.props,i=o.disableHoverToClick,a=o.event;return a==="hover"&&jc()&&!i?"click":a}},{key:"options",get:function(){var o=this.props.options;return on(PI,o||{})}},{key:"styles",get:function(){var o=this,i=this.state,a=i.status,s=i.positionWrapper,l=i.statusWrapper,u=this.props.styles,c=on(RI(u),u);if(s){var f;[ae.IDLE].indexOf(a)===-1||[ae.IDLE].indexOf(l)===-1?f=c.wrapperPosition:f=this.wrapperPopper.styles,c.wrapper=Ee(Ee({},c.wrapper),f)}if(this.target){var d=window.getComputedStyle(this.target);this.wrapperStyles?c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles):["relative","static"].indexOf(d.position)===-1&&(this.wrapperStyles={},s||(MI.forEach(function(p){o.wrapperStyles[p]=d[p]}),c.wrapper=Ee(Ee({},c.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return c}},{key:"target",get:function(){if(!an)return null;var o=this.props.target;return o?P.domElement(o)?o:document.querySelector(o):this.childRef||this.wrapperRef}},{key:"render",value:function(){var o=this.state,i=o.currentPlacement,a=o.positionWrapper,s=o.status,l=this.props,u=l.children,c=l.component,f=l.content,d=l.disableAnimation,p=l.footer,m=l.hideArrow,y=l.id,h=l.open,v=l.showCloseButton,w=l.style,S=l.target,A=l.title,T=g(uS,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:w,styles:this.styles.wrapper,children:u}),C={};return a?C.wrapperInPortal=T:C.wrapperAsChildren=T,N("span",{children:[N(oS,{hasChildren:!!u,id:y,placement:i,setRef:this.setFloaterRef,target:S,zIndex:this.styles.options.zIndex,children:[g(lS,{component:c,content:f,disableAnimation:d,footer:p,handleClick:this.handleClick,hideArrow:m||i==="center",open:h,placement:i,positionWrapper:a,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:v,status:s,styles:this.styles,title:A}),C.wrapperInPortal]}),C.wrapperAsChildren]})}}]),n}(I.Component);qe(uh,"propTypes",{autoOpen:M.exports.bool,callback:M.exports.func,children:M.exports.node,component:mg(M.exports.oneOfType([M.exports.func,M.exports.element]),function(e){return!e.content}),content:mg(M.exports.node,function(e){return!e.component}),debug:M.exports.bool,disableAnimation:M.exports.bool,disableFlip:M.exports.bool,disableHoverToClick:M.exports.bool,event:M.exports.oneOf(["hover","click"]),eventDelay:M.exports.number,footer:M.exports.node,getPopper:M.exports.func,hideArrow:M.exports.bool,id:M.exports.oneOfType([M.exports.string,M.exports.number]),offset:M.exports.number,open:M.exports.bool,options:M.exports.object,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:M.exports.bool,style:M.exports.object,styles:M.exports.object,target:M.exports.oneOfType([M.exports.object,M.exports.string]),title:M.exports.node,wrapperOptions:M.exports.shape({offset:M.exports.number,placement:M.exports.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:M.exports.bool})});qe(uh,"defaultProps",{autoOpen:!1,callback:xg,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:xg,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function Og(e,t){var n=Object.keys(e);if(Object.getOwnPropertySymbols){var r=Object.getOwnPropertySymbols(e);t&&(r=r.filter(function(o){return Object.getOwnPropertyDescriptor(e,o).enumerable})),n.push.apply(n,r)}return n}function W(e){for(var t=1;t=0)&&(n[o]=e[o]);return n}function Ql(e,t){if(e==null)return{};var n=UI(e,t),r,o;if(Object.getOwnPropertySymbols){var i=Object.getOwnPropertySymbols(e);for(o=0;o=0)&&(!Object.prototype.propertyIsEnumerable.call(e,r)||(n[r]=e[r]))}return n}function Pe(e){if(e===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return e}function cS(e,t){if(t&&(typeof t=="object"||typeof t=="function"))return t;if(t!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return Pe(e)}function Jr(e){var t=FI();return function(){var r=Jl(e),o;if(t){var i=Jl(this).constructor;o=Reflect.construct(r,arguments,i)}else o=r.apply(this,arguments);return cS(this,o)}}var oe={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},it={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},ee={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},re={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},Cn=Dw.canUseDOM,xi=Na.exports.createPortal!==void 0;function fS(){var e=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,t=e;return typeof window=="undefined"?t="node":document.documentMode?t="ie":/Edge/.test(e)?t="edge":Boolean(window.opera)||e.indexOf(" OPR/")>=0?t="opera":typeof window.InstallTrigger!="undefined"?t="firefox":window.chrome?t="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(e)&&(t="safari"),t}function Wc(e){return Object.prototype.toString.call(e).slice(8,-1).toLowerCase()}function Oi(e){var t=[],n=function r(o){if(typeof o=="string"||typeof o=="number")t.push(o);else if(Array.isArray(o))o.forEach(function(a){return r(a)});else if(o&&o.props){var i=o.props.children;Array.isArray(i)?i.forEach(function(a){return r(a)}):r(i)}};return n(e),t.join(" ").trim()}function Pg(e,t){return Object.prototype.hasOwnProperty.call(e,t)}function BI(e,t){return!P.plainObject(e)||!P.array(t)?!1:Object.keys(e).every(function(n){return t.indexOf(n)!==-1})}function jI(e){var t=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,n=e.replace(t,function(o,i,a,s){return i+i+a+a+s+s}),r=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(n);return r?[parseInt(r[1],16),parseInt(r[2],16),parseInt(r[3],16)]:[]}function kg(e){return e.disableBeacon||e.placement==="center"}function ld(e,t){var n,r=j.exports.isValidElement(e)||j.exports.isValidElement(t),o=P.undefined(e)||P.undefined(t);if(Wc(e)!==Wc(t)||r||o)return!1;if(P.domElement(e))return e.isSameNode(t);if(P.number(e))return e===t;if(P.function(e))return e.toString()===t.toString();for(var i in e)if(Pg(e,i)){if(typeof e[i]=="undefined"||typeof t[i]=="undefined")return!1;if(n=Wc(e[i]),["object","array"].indexOf(n)!==-1&&ld(e[i],t[i])||n==="function"&&ld(e[i],t[i]))continue;if(e[i]!==t[i])return!1}for(var a in t)if(Pg(t,a)&&typeof e[a]=="undefined")return!1;return!0}function Tg(){return["chrome","safari","firefox","opera"].indexOf(fS())===-1}function jr(e){var t=e.title,n=e.data,r=e.warn,o=r===void 0?!1:r,i=e.debug,a=i===void 0?!1:i,s=o?console.warn||console.error:console.log;a&&(t&&n?(console.groupCollapsed("%creact-joyride: ".concat(t),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(n)?n.forEach(function(l){P.plainObject(l)&&l.key?s.apply(console,[l.key,l.value]):s.apply(console,[l])}):s.apply(console,[n]),console.groupEnd()):console.error("Missing title or data props"))}var WI={action:"",controlled:!1,index:0,lifecycle:ee.INIT,size:0,status:re.IDLE},Ig=["action","index","lifecycle","status"];function YI(e){var t=new Map,n=new Map,r=function(){function o(){var i=this,a=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},s=a.continuous,l=s===void 0?!1:s,u=a.stepIndex,c=a.steps,f=c===void 0?[]:c;Ln(this,o),J(this,"listener",void 0),J(this,"setSteps",function(d){var p=i.getState(),m=p.size,y=p.status,h={size:d.length,status:y};n.set("steps",d),y===re.WAITING&&!m&&d.length&&(h.status=re.RUNNING),i.setState(h)}),J(this,"addListener",function(d){i.listener=d}),J(this,"update",function(d){if(!BI(d,Ig))throw new Error("State is not valid. Valid keys: ".concat(Ig.join(", ")));i.setState(W({},i.getNextState(W(W(W({},i.getState()),d),{},{action:d.action||oe.UPDATE}),!0)))}),J(this,"start",function(d){var p=i.getState(),m=p.index,y=p.size;i.setState(W(W({},i.getNextState({action:oe.START,index:P.number(d)?d:m},!0)),{},{status:y?re.RUNNING:re.WAITING}))}),J(this,"stop",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.index,y=p.status;[re.FINISHED,re.SKIPPED].indexOf(y)===-1&&i.setState(W(W({},i.getNextState({action:oe.STOP,index:m+(d?1:0)})),{},{status:re.PAUSED}))}),J(this,"close",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.CLOSE,index:p+1})))}),J(this,"go",function(d){var p=i.getState(),m=p.controlled,y=p.status;if(!(m||y!==re.RUNNING)){var h=i.getSteps()[d];i.setState(W(W({},i.getNextState({action:oe.GO,index:d})),{},{status:h?y:re.FINISHED}))}}),J(this,"info",function(){return i.getState()}),J(this,"next",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(i.getNextState({action:oe.NEXT,index:p+1}))}),J(this,"open",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.UPDATE,lifecycle:ee.TOOLTIP})))}),J(this,"prev",function(){var d=i.getState(),p=d.index,m=d.status;m===re.RUNNING&&i.setState(W({},i.getNextState({action:oe.PREV,index:p-1})))}),J(this,"reset",function(){var d=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,p=i.getState(),m=p.controlled;m||i.setState(W(W({},i.getNextState({action:oe.RESET,index:0})),{},{status:d?re.RUNNING:re.READY}))}),J(this,"skip",function(){var d=i.getState(),p=d.status;p===re.RUNNING&&i.setState({action:oe.SKIP,lifecycle:ee.INIT,status:re.SKIPPED})}),this.setState({action:oe.INIT,controlled:P.number(u),continuous:l,index:P.number(u)?u:0,lifecycle:ee.INIT,status:f.length?re.READY:re.IDLE},!0),this.setSteps(f)}return Mn(o,[{key:"setState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=W(W({},l),a),c=u.action,f=u.index,d=u.lifecycle,p=u.size,m=u.status;t.set("action",c),t.set("index",f),t.set("lifecycle",d),t.set("size",p),t.set("status",m),s&&(t.set("controlled",a.controlled),t.set("continuous",a.continuous)),this.listener&&this.hasUpdatedState(l)&&this.listener(this.getState())}},{key:"getState",value:function(){return t.size?{action:t.get("action")||"",controlled:t.get("controlled")||!1,index:parseInt(t.get("index"),10),lifecycle:t.get("lifecycle")||"",size:t.get("size")||0,status:t.get("status")||""}:W({},WI)}},{key:"getNextState",value:function(a){var s=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,l=this.getState(),u=l.action,c=l.controlled,f=l.index,d=l.size,p=l.status,m=P.number(a.index)?a.index:f,y=c&&!s?f:Math.min(Math.max(m,0),d);return{action:a.action||u,controlled:c,index:y,lifecycle:a.lifecycle||ee.INIT,size:a.size||d,status:y===d?re.FINISHED:a.status||p}}},{key:"hasUpdatedState",value:function(a){var s=JSON.stringify(a),l=JSON.stringify(this.getState());return s!==l}},{key:"getSteps",value:function(){var a=n.get("steps");return Array.isArray(a)?a:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),o}();return new r(e)}function aa(){return document.scrollingElement||document.createElement("body")}function dS(e){return e?e.getBoundingClientRect():{}}function zI(){var e=document,t=e.body,n=e.documentElement;return!t||!n?0:Math.max(t.scrollHeight,t.offsetHeight,n.clientHeight,n.scrollHeight,n.offsetHeight)}function or(e){return typeof e=="string"?document.querySelector(e):e}function GI(e){return!e||e.nodeType!==1?{}:getComputedStyle(e)}function Wu(e,t,n){var r=Lw(e);if(r.isSameNode(aa()))return n?document:aa();var o=r.scrollHeight>r.offsetHeight;return!o&&!t?(r.style.overflow="initial",aa()):r}function Yu(e,t){if(!e)return!1;var n=Wu(e,t);return!n.isSameNode(aa())}function $I(e){return e.offsetParent!==document.body}function Go(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!e||!(e instanceof HTMLElement))return!1;var n=e.nodeName;return n==="BODY"||n==="HTML"?!1:GI(e).position===t?!0:Go(e.parentNode,t)}function HI(e){if(!e)return!1;for(var t=e;t&&t!==document.body;){if(t instanceof HTMLElement){var n=getComputedStyle(t),r=n.display,o=n.visibility;if(r==="none"||o==="hidden")return!1}t=t.parentNode}return!0}function VI(e,t,n){var r=dS(e),o=Wu(e,n),i=Yu(e,n),a=0;o instanceof HTMLElement&&(a=o.scrollTop);var s=r.top+(!i&&!Go(e)?a:0);return Math.floor(s-t)}function ud(e){return e instanceof HTMLElement?e.offsetParent instanceof HTMLElement?ud(e.offsetParent)+e.offsetTop:e.offsetTop:0}function JI(e,t,n){if(!e)return 0;var r=Lw(e),o=ud(e);return Yu(e,n)&&!$I(e)&&(o-=ud(r)),Math.floor(o-t)}function QI(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:aa(),n=arguments.length>2?arguments[2]:void 0;return new Promise(function(r,o){var i=t.scrollTop,a=e>i?e-i:i-e;i6.top(t,e,{duration:a<100?50:n},function(s){return s&&s.message!=="Element already at target scroll position"?o(s):r()})})}function XI(e){function t(r,o,i,a,s,l){var u=a||"<>",c=l||i;if(o[i]==null)return r?new Error("Required ".concat(s," `").concat(c,"` was not specified in `").concat(u,"`.")):null;for(var f=arguments.length,d=new Array(f>6?f-6:0),p=6;p0&&arguments[0]!==void 0?arguments[0]:{},t=on(KI,e.options||{}),n=290;window.innerWidth>480&&(n=380),t.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return P.plainObject(e)?e.target?!0:(jr({title:"validateStep",data:"target is missing from the step",warn:!0,debug:t}),!1):(jr({title:"validateStep",data:"step must be an object",warn:!0,debug:t}),!1)}function Dg(e){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return P.array(e)?e.every(function(n){return pS(n,t)}):(jr({title:"validateSteps",data:"steps must be an array",warn:!0,debug:t}),!1)}var eN=Mn(function e(t){var n=this,r=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(Ln(this,e),J(this,"element",void 0),J(this,"options",void 0),J(this,"canBeTabbed",function(o){var i=o.tabIndex;(i===null||i<0)&&(i=void 0);var a=isNaN(i);return!a&&n.canHaveFocus(o)}),J(this,"canHaveFocus",function(o){var i=/input|select|textarea|button|object/,a=o.nodeName.toLowerCase(),s=i.test(a)&&!o.getAttribute("disabled")||a==="a"&&!!o.getAttribute("href");return s&&n.isVisible(o)}),J(this,"findValidTabElements",function(){return[].slice.call(n.element.querySelectorAll("*"),0).filter(n.canBeTabbed)}),J(this,"handleKeyDown",function(o){var i=n.options.keyCode,a=i===void 0?9:i;o.keyCode===a&&n.interceptTab(o)}),J(this,"interceptTab",function(o){var i=n.findValidTabElements();if(!!i.length){o.preventDefault();var a=o.shiftKey,s=i.indexOf(document.activeElement);s===-1||!a&&s+1===i.length?s=0:a&&s===0?s=i.length-1:s+=a?-1:1,i[s].focus()}}),J(this,"isHidden",function(o){var i=o.offsetWidth<=0&&o.offsetHeight<=0,a=window.getComputedStyle(o);return i&&!o.innerHTML?!0:i&&a.getPropertyValue("overflow")!=="visible"||a.getPropertyValue("display")==="none"}),J(this,"isVisible",function(o){for(var i=o;i;)if(i instanceof HTMLElement){if(i===document.body)break;if(n.isHidden(i))return!1;i=i.parentNode}return!0}),J(this,"removeScope",function(){window.removeEventListener("keydown",n.handleKeyDown)}),J(this,"checkFocus",function(o){document.activeElement!==o&&(o.focus(),window.requestAnimationFrame(function(){return n.checkFocus(o)}))}),J(this,"setFocus",function(){var o=n.options.selector;if(!!o){var i=n.element.querySelector(o);i&&window.requestAnimationFrame(function(){return n.checkFocus(i)})}}),!(t instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=t,this.options=r,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),tN=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;if(Ln(this,n),o=t.call(this,r),J(Pe(o),"setBeaconRef",function(l){o.beacon=l}),!r.beaconComponent){var i=document.head||document.getElementsByTagName("head")[0],a=document.createElement("style"),s=` - @keyframes joyride-beacon-inner { - 20% { - opacity: 0.9; - } - - 90% { - opacity: 0.7; - } - } - - @keyframes joyride-beacon-outer { - 0% { - transform: scale(1); - } - - 45% { - opacity: 0.7; - transform: scale(0.75); - } - - 100% { - opacity: 0.9; - transform: scale(1); - } - } - `;a.type="text/css",a.id="joyride-beacon-animation",r.nonce!==void 0&&a.setAttribute("nonce",r.nonce),a.appendChild(document.createTextNode(s)),i.appendChild(a)}return o}return Mn(n,[{key:"componentDidMount",value:function(){var o=this,i=this.props.shouldFocus;setTimeout(function(){P.domElement(o.beacon)&&i&&o.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var o=document.getElementById("joyride-beacon-animation");o&&o.parentNode.removeChild(o)}},{key:"render",value:function(){var o=this.props,i=o.beaconComponent,a=o.locale,s=o.onClickOrHover,l=o.styles,u={"aria-label":a.open,onClick:s,onMouseEnter:s,ref:this.setBeaconRef,title:a.open},c;if(i){var f=i;c=g(f,F({},u))}else c=N("button",$(F({className:"react-joyride__beacon",style:l.beacon,type:"button"},u),{children:[g("span",{style:l.beaconInner}),g("span",{style:l.beaconOuter})]}),"JoyrideBeacon");return c}}]),n}(I.Component),nN=function(t){var n=t.styles;return g("div",{className:"react-joyride__spotlight",style:n},"JoyrideSpotlight")},rN=["mixBlendMode","zIndex"],oN=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a=p&&y<=p+c,w=h>=f&&h<=f+m,S=w&&v;S!==l&&r.updateState({mouseOverSpotlight:S})}),J(Pe(r),"handleScroll",function(){var s=r.props.target,l=or(s);if(r.scrollParent!==document){var u=r.state.isScrolling;u||r.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(r.scrollTimeout),r.scrollTimeout=setTimeout(function(){r.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Go(l,"sticky")&&r.updateState({})}),J(Pe(r),"handleResize",function(){clearTimeout(r.resizeTimeout),r.resizeTimeout=setTimeout(function(){!r._isMounted||r.forceUpdate()},100)}),r}return Mn(n,[{key:"componentDidMount",value:function(){var o=this.props;o.debug,o.disableScrolling;var i=o.disableScrollParentFix,a=o.target,s=or(a);this.scrollParent=Wu(s,i,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(o){var i=this,a=this.props,s=a.lifecycle,l=a.spotlightClicks,u=Gl(o,this.props),c=u.changed;c("lifecycle",ee.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var f=i.state.isScrolling;f||i.updateState({showSpotlight:!0})},100)),(c("spotlightClicks")||c("disableOverlay")||c("lifecycle"))&&(l&&s===ee.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):s!==ee.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var o=this.state.showSpotlight,i=this.props,a=i.disableScrollParentFix,s=i.spotlightClicks,l=i.spotlightPadding,u=i.styles,c=i.target,f=or(c),d=dS(f),p=Go(f),m=VI(f,l,a);return W(W({},Tg()?u.spotlightLegacy:u.spotlight),{},{height:Math.round(d.height+l*2),left:Math.round(d.left-l),opacity:o?1:0,pointerEvents:s?"none":"auto",position:p?"fixed":"absolute",top:m,transition:"opacity 0.2s",width:Math.round(d.width+l*2)})}},{key:"updateState",value:function(o){!this._isMounted||this.setState(o)}},{key:"render",value:function(){var o=this.state,i=o.mouseOverSpotlight,a=o.showSpotlight,s=this.props,l=s.disableOverlay,u=s.disableOverlayClose,c=s.lifecycle,f=s.onClickOverlay,d=s.placement,p=s.styles;if(l||c!==ee.TOOLTIP)return null;var m=p.overlay;Tg()&&(m=d==="center"?p.overlayLegacyCenter:p.overlayLegacy);var y=W({cursor:u?"default":"pointer",height:zI(),pointerEvents:i?"none":"auto"},m),h=d!=="center"&&a&&g(nN,{styles:this.spotlightStyles});if(fS()==="safari"){y.mixBlendMode,y.zIndex;var v=Ql(y,rN);h=g("div",{style:W({},v),children:h}),delete y.backgroundColor}return g("div",{className:"react-joyride__overlay",style:y,onClick:f,children:h})}}]),n}(I.Component),iN=["styles"],aN=["color","height","width"],sN=function(t){var n=t.styles,r=Ql(t,iN),o=n.color,i=n.height,a=n.width,s=Ql(n,aN);return g("button",$(F({style:s,type:"button"},r),{children:g("svg",{width:typeof a=="number"?"".concat(a,"px"):a,height:typeof i=="number"?"".concat(i,"px"):i,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid",children:g("g",{children:g("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:o})})})}))},lN=function(e){Vr(n,e);var t=Jr(n);function n(){return Ln(this,n),t.apply(this,arguments)}return Mn(n,[{key:"render",value:function(){var o=this.props,i=o.backProps,a=o.closeProps,s=o.continuous,l=o.index,u=o.isLastStep,c=o.primaryProps,f=o.size,d=o.skipProps,p=o.step,m=o.tooltipProps,y=p.content,h=p.hideBackButton,v=p.hideCloseButton,w=p.hideFooter,S=p.showProgress,A=p.showSkipButton,T=p.title,C=p.styles,O=p.locale,b=O.back,E=O.close,x=O.last,_=O.next,k=O.skip,D={primary:E};return s&&(D.primary=u?x:_,S&&(D.primary=N("span",{children:[D.primary," (",l+1,"/",f,")"]}))),A&&!u&&(D.skip=g("button",$(F({style:C.buttonSkip,type:"button","aria-live":"off"},d),{children:k}))),!h&&l>0&&(D.back=g("button",$(F({style:C.buttonBack,type:"button"},i),{children:b}))),D.close=!v&&g(sN,F({styles:C.buttonClose},a)),N("div",$(F({className:"react-joyride__tooltip",style:C.tooltip},m),{children:[N("div",{style:C.tooltipContainer,children:[T&&g("h4",{style:C.tooltipTitle,"aria-label":T,children:T}),g("div",{style:C.tooltipContent,children:y})]}),!w&&N("div",{style:C.tooltipFooter,children:[g("div",{style:C.tooltipFooterSpacer,children:D.skip}),D.back,g("button",$(F({style:C.buttonNext,type:"button"},c),{children:D.primary}))]}),D.close]}),"JoyrideTooltip")}}]),n}(I.Component),uN=["beaconComponent","tooltipComponent"],cN=function(e){Vr(n,e);var t=Jr(n);function n(){var r;Ln(this,n);for(var o=arguments.length,i=new Array(o),a=0;a0||a===oe.PREV),C=w("action")||w("index")||w("lifecycle")||w("status"),O=S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT),b=w("action",[oe.NEXT,oe.PREV,oe.SKIP,oe.CLOSE]);if(b&&(O||u)&&s(W(W({},A),{},{index:o.index,lifecycle:ee.COMPLETE,step:o.step,type:it.STEP_AFTER})),w("index")&&f>0&&d===ee.INIT&&m===re.RUNNING&&y.placement==="center"&&h({lifecycle:ee.READY}),C&&y){var E=or(y.target),x=!!E,_=x&&HI(E);_?(S("status",re.READY,re.RUNNING)||S("lifecycle",ee.INIT,ee.READY))&&s(W(W({},A),{},{step:y,type:it.STEP_BEFORE})):(console.warn(x?"Target not visible":"Target not mounted",y),s(W(W({},A),{},{type:it.TARGET_NOT_FOUND,step:y})),u||h({index:f+([oe.PREV].indexOf(a)!==-1?-1:1)}))}S("lifecycle",ee.INIT,ee.READY)&&h({lifecycle:kg(y)||T?ee.TOOLTIP:ee.BEACON}),w("index")&&jr({title:"step:".concat(d),data:[{key:"props",value:this.props}],debug:c}),w("lifecycle",ee.BEACON)&&s(W(W({},A),{},{step:y,type:it.BEACON})),w("lifecycle",ee.TOOLTIP)&&(s(W(W({},A),{},{step:y,type:it.TOOLTIP})),this.scope=new eN(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),S("lifecycle",[ee.TOOLTIP,ee.INIT],ee.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var o=this.props,i=o.step,a=o.lifecycle;return!!(kg(i)||a===ee.TOOLTIP)}},{key:"render",value:function(){var o=this.props,i=o.continuous,a=o.debug,s=o.helpers,l=o.index,u=o.lifecycle,c=o.nonce,f=o.shouldScroll,d=o.size,p=o.step,m=or(p.target);return!pS(p)||!P.domElement(m)?null:N("div",{className:"react-joyride__step",children:[g(fN,{id:"react-joyride-portal",children:g(oN,$(F({},p),{debug:a,lifecycle:u,onClickOverlay:this.handleClickOverlay}))}),g(uh,$(F({component:g(cN,{continuous:i,helpers:s,index:l,isLastStep:l+1===d,setTooltipRef:this.setTooltipRef,size:d,step:p}),debug:a,getPopper:this.setPopper,id:"react-joyride-step-".concat(l),isPositioned:p.isFixed||Go(m),open:this.open,placement:p.placement,target:p.target},p.floaterProps),{children:g(tN,{beaconComponent:p.beaconComponent,locale:p.locale,nonce:c,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:f,styles:p.styles})}))]},"JoyrideStep-".concat(l))}}]),n}(I.Component),hS=function(e){Vr(n,e);var t=Jr(n);function n(r){var o;return Ln(this,n),o=t.call(this,r),J(Pe(o),"initStore",function(){var i=o.props,a=i.debug,s=i.getHelpers,l=i.run,u=i.stepIndex;o.store=new YI(W(W({},o.props),{},{controlled:l&&P.number(u)})),o.helpers=o.store.getHelpers();var c=o.store.addListener;return jr({title:"init",data:[{key:"props",value:o.props},{key:"state",value:o.state}],debug:a}),c(o.syncState),s(o.helpers),o.store.getState()}),J(Pe(o),"callback",function(i){var a=o.props.callback;P.function(a)&&a(i)}),J(Pe(o),"handleKeyboard",function(i){var a=o.state,s=a.index,l=a.lifecycle,u=o.props.steps,c=u[s],f=window.Event?i.which:i.keyCode;l===ee.TOOLTIP&&f===27&&c&&!c.disableCloseOnEsc&&o.store.close()}),J(Pe(o),"syncState",function(i){o.setState(i)}),J(Pe(o),"setPopper",function(i,a){a==="wrapper"?o.beaconPopper=i:o.tooltipPopper=i}),J(Pe(o),"shouldScroll",function(i,a,s,l,u,c,f){return!i&&(a!==0||s||l===ee.TOOLTIP)&&u.placement!=="center"&&(!u.isFixed||!Go(c))&&f.lifecycle!==l&&[ee.BEACON,ee.TOOLTIP].indexOf(l)!==-1}),o.state=o.initStore(),o}return Mn(n,[{key:"componentDidMount",value:function(){if(!!Cn){var o=this.props,i=o.disableCloseOnEsc,a=o.debug,s=o.run,l=o.steps,u=this.store.start;Dg(l,a)&&s&&u(),i||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(o,i){if(!!Cn){var a=this.state,s=a.action,l=a.controlled,u=a.index,c=a.lifecycle,f=a.status,d=this.props,p=d.debug,m=d.run,y=d.stepIndex,h=d.steps,v=o.steps,w=o.stepIndex,S=this.store,A=S.reset,T=S.setSteps,C=S.start,O=S.stop,b=S.update,E=Gl(o,this.props),x=E.changed,_=Gl(i,this.state),k=_.changed,D=_.changedFrom,B=Pi(h[u],this.props),q=!ld(v,h),H=P.number(y)&&x("stepIndex"),ce=or(B==null?void 0:B.target);if(q&&(Dg(h,p)?T(h):console.warn("Steps are not valid",h)),x("run")&&(m?C(y):O()),H){var he=w=0?C:0,l===re.RUNNING&&QI(C,T,y)}}}},{key:"render",value:function(){if(!Cn)return null;var o=this.state,i=o.index,a=o.status,s=this.props,l=s.continuous,u=s.debug,c=s.nonce,f=s.scrollToFirstStep,d=s.steps,p=Pi(d[i],this.props),m;return a===re.RUNNING&&p&&(m=g(dN,$(F({},this.state),{callback:this.callback,continuous:l,debug:u,setPopper:this.setPopper,helpers:this.helpers,nonce:c,shouldScroll:!p.disableScrolling&&(i!==0||f),step:p,update:this.store.update}))),g("div",{className:"react-joyride",children:m})}}]),n}(I.Component);J(hS,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});const pN=N("div",{children:[g("p",{children:"You can see how the changes impact your app with the app preview."}),g("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),g("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]}),hN=N("div",{children:[g("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),g("p",{children:"You can click on elements to select them or drag them around to move them."}),g("p",{children:"Cards can be resized by dragging resize handles on the sides."}),g("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),g("p",{children:g("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]}),mN=N("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",g("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",g("span",{className:zf.canAcceptDrop,style:{padding:"2px"},children:"orange outline."})]}),vN=N("div",{children:[g("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),g("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]}),gN=[{target:".app-view",content:hN,disableBeacon:!0},{target:".elements-panel",content:mN,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:vN,placement:"left-start"},{target:".app-preview",content:pN,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function yN(){const[e,t]=j.exports.useState(0),[n,r]=j.exports.useState(!1),o=j.exports.useCallback(a=>{const{action:s,index:l,status:u,type:c}=a;console.log({action:s,index:l,status:u,type:c}),(c===it.STEP_AFTER||c===it.TARGET_NOT_FOUND)&&(s===oe.NEXT?t(l+1):s===oe.PREV?t(l-1):s===oe.CLOSE&&r(!1)),c===it.TOUR_END&&(s===oe.NEXT&&(r(!1),t(0)),s===oe.SKIP&&r(!1))},[]),i=j.exports.useCallback(()=>{r(!0)},[]);return N(Me,{children:[N(wt,{onClick:i,title:"Take a guided tour of app",variant:"transparent",children:[g(CA,{id:"tour",size:"24px"}),"Tour App"]}),g(hS,{callback:o,steps:gN,stepIndex:e,run:n,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:SN})]})}const Rg="#e07189",wN="#f6d5dc",SN={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:Rg},beaconOuter:{backgroundColor:wN,border:`2px solid ${Rg}`}},bN="_container_1ehu8_1",EN="_elementsPanel_1ehu8_28",CN="_propertiesPanel_1ehu8_33",AN="_editorHolder_1ehu8_47",xN="_titledPanel_1ehu8_59",ON="_panelTitleHeader_1ehu8_71",_N="_header_1ehu8_80",PN="_rightSide_1ehu8_88",kN="_divider_1ehu8_109",TN="_title_1ehu8_59",IN="_shinyLogo_1ehu8_120",pt={container:bN,elementsPanel:EN,propertiesPanel:CN,editorHolder:AN,titledPanel:xN,panelTitleHeader:ON,header:_N,rightSide:PN,divider:kN,title:TN,shinyLogo:IN},NN="_container_1fh41_1",DN="_node_1fh41_12",Lg={container:NN,node:DN};function RN({tree:e,path:t,onSelect:n}){const r=t.length;let o=[];for(let i=0;i<=r;i++){const a=rr(e,t.slice(0,i));if(a===void 0)return null;o.push(en[a.uiName].title)}return g("div",{className:Lg.container,children:o.map((i,a)=>g("div",{className:Lg.node,onClick:a===r?void 0:()=>n(t.slice(0,a)),children:LN(i)},i+a))})}function LN(e){return e.replace(/[a-z]+::/,"")}const MN="_settingsPanel_zsgzt_1",FN="_currentElementAbout_zsgzt_10",UN="_settingsForm_zsgzt_17",BN="_settingsInputs_zsgzt_24",jN="_buttonsHolder_zsgzt_28",WN="_validationErrorMsg_zsgzt_45",ki={settingsPanel:MN,currentElementAbout:FN,settingsForm:UN,settingsInputs:BN,buttonsHolder:jN,validationErrorMsg:WN};function YN(e){const t=vr(),[n,r]=v1(),[o,i]=j.exports.useState(n!==null?rr(e,n):null),a=j.exports.useRef(!1),s=j.exports.useMemo(()=>Fp(u=>{!n||!a.current||t(Sw({path:n,node:u}))},250),[t,n]);return j.exports.useEffect(()=>{if(a.current=!1,n===null){i(null);return}rr(e,n)!==void 0&&i(rr(e,n))},[e,n]),j.exports.useEffect(()=>{!o||s(o)},[o,s]),{currentNode:o,updateArgumentsByName:({name:u,value:c})=>{i(f=>$(F({},f),{uiArguments:$(F({},f==null?void 0:f.uiArguments),{[u]:c})})),a.current=!0},selectedPath:n,setNodeSelection:r}}function zN({tree:e}){const{currentNode:t,updateArgumentsByName:n,selectedPath:r,setNodeSelection:o}=YN(e);if(r===null)return g("div",{children:"Select an element to edit properties"});if(t===null)return N("div",{children:["Error finding requested node at path ",r.join(".")]});const i=r.length===0,{uiName:a,uiArguments:s}=t,l=en[a].SettingsComponent;return N("div",{className:ki.settingsPanel+" properties-panel",children:[g("div",{className:ki.currentElementAbout,children:g(RN,{tree:e,path:r,onSelect:o})}),g("form",{className:ki.settingsForm,onSubmit:GN,children:g("div",{className:ki.settingsInputs,children:g(r2,{onChange:n,children:g(l,{settings:s})})})}),g("div",{className:ki.buttonsHolder,children:i?null:g(m1,{path:r})})]})}function GN(e){e.preventDefault()}function $N(e){return["INITIAL-DATA"].includes(e.path)}function HN(){const e=vr(),t=Ja(r=>r.uiTree),n=j.exports.useCallback(r=>{e(Ok({initialState:r}))},[e]);return{tree:t,setTree:n}}function VN(){const{tree:e,setTree:t}=HN(),{status:n,ws:r}=Ow(),[o,i]=j.exports.useState("loading"),a=j.exports.useRef(null),s=Ja(l=>l.uiTree);return j.exports.useEffect(()=>{n==="connected"&&(_w(r,l=>{!$N(l)||(a.current=l.payload,t(l.payload),i("connected"))}),ia(r,{path:"READY-FOR-STATE"})),n==="failed-to-open"&&(i("no-backend"),t(JN),console.log("Running in static mode"))},[t,n,r]),j.exports.useEffect(()=>{s===Zp||s===a.current||n==="connected"&&ia(r,{path:"STATE-UPDATE",payload:s})},[s,n,r]),{status:o,tree:e}}const JN={uiName:"gridlayout::grid_page",uiArguments:{areas:[["header","header"],["sidebar","plot"],["sidebar","plot"]],row_sizes:["100px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"My App",alignment:"start",is_title:!0}},{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"mySlider",label:"Slider",min:2,max:11,value:7}},{uiName:"shiny::numericInput",uiArguments:{inputId:"myNumericInput",label:"Numeric Input",min:2,max:11,value:7,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"plot"}}]},mS=236,QN={"--properties-panel-width":`${mS}px`};function XN(){const{status:e,tree:t}=VN();return e==="loading"?g(KN,{}):N(LA,{children:[N("div",{className:pt.container,style:QN,children:[N("div",{className:pt.header,children:[g(_T,{className:pt.shinyLogo,style:{backgroundColor:"var(--rstudio-blue, pink)"}}),g("h1",{className:pt.title,children:"Shiny UI Editor"}),N("div",{className:pt.rightSide,children:[g(yN,{}),g("div",{className:pt.divider}),g(DT,{})]})]}),N("div",{className:`${pt.elementsPanel} ${pt.titledPanel} elements-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Elements"}),g(BT,{})]}),g("div",{className:pt.editorHolder+" app-view",children:g(Ep,F({},t))}),N("div",{className:`${pt.propertiesPanel}`,children:[N("div",{className:`${pt.titledPanel} properties-panel`,children:[g("h3",{className:pt.panelTitleHeader,children:"Properties"}),g(zN,{tree:t})]}),g("div",{className:`${pt.titledPanel} app-preview`,children:g(ET,{})})]})]}),g(qN,{})]})}function KN(){return g("h3",{children:"Loading initial state from server"})}function qN(){return Ja(t=>t.connectedToServer)?null:g(X1,{onConfirm:()=>console.log("User confirmed"),onCancel:()=>console.log("user canceled"),children:g("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}const ZN=()=>g(Ik,{children:g(Mk,{children:g(XN,{})})}),e5="modulepreload",t5=function(e,t){return new URL(e,t).href},Mg={},n5=function(t,n,r){return!n||n.length===0?t():Promise.all(n.map(o=>{if(o=t5(o,r),o in Mg)return;Mg[o]=!0;const i=o.endsWith(".css"),a=i?'[rel="stylesheet"]':"";if(document.querySelector(`link[href="${o}"]${a}`))return;const s=document.createElement("link");if(s.rel=i?"stylesheet":e5,i||(s.as="script",s.crossOrigin=""),s.href=o,document.head.appendChild(s),i)return new Promise((l,u)=>{s.addEventListener("load",l),s.addEventListener("error",()=>u(new Error(`Unable to preload CSS for ${o}`)))})})).then(()=>t())},r5=e=>{e&&e instanceof Function&&n5(()=>import("./web-vitals.es5.min.acaaa503.js"),[],import.meta.url).then(({getCLS:t,getFID:n,getFCP:r,getLCP:o,getTTFB:i})=>{t(e),n(e),r(e),o(e),i(e)})};Boolean(window.location.hostname==="localhost"||window.location.hostname==="[::1]"||window.location.hostname.match(/^127(?:\.(?:25[0-5]|2[0-4][0-9]|[01]?[0-9][0-9]?)){3}$/));function o5(){"serviceWorker"in navigator&&navigator.serviceWorker.ready.then(e=>{e.unregister()}).catch(e=>{console.error(e.message)})}nr.render(g(j.exports.StrictMode,{children:g(ZN,{})}),document.getElementById("root"));o5();r5(); diff --git a/docs/articles/demo-app/assets/web-vitals.es5.min.acaaa503.js b/docs/articles/demo-app/assets/web-vitals.es5.min.acaaa503.js deleted file mode 100644 index 3ae99760c..000000000 --- a/docs/articles/demo-app/assets/web-vitals.es5.min.acaaa503.js +++ /dev/null @@ -1 +0,0 @@ -var c,p,y=function(){return"".concat(Date.now(),"-").concat(Math.floor(8999999999999*Math.random())+1e12)},u=function(i){var t=arguments.length>1&&arguments[1]!==void 0?arguments[1]:-1;return{name:i,value:t,delta:0,entries:[],id:y(),isFinal:!1}},m=function(i,t){try{if(PerformanceObserver.supportedEntryTypes.includes(i)){var n=new PerformanceObserver(function(e){return e.getEntries().map(t)});return n.observe({type:i,buffered:!0}),n}}catch(e){}},S=!1,h=!1,F=function(i){S=!i.persisted},T=function(){addEventListener("pagehide",F),addEventListener("beforeunload",function(){})},l=function(i){var t=arguments.length>1&&arguments[1]!==void 0&&arguments[1];h||(T(),h=!0),addEventListener("visibilitychange",function(n){var e=n.timeStamp;document.visibilityState==="hidden"&&i({timeStamp:e,isUnloading:S})},{capture:!0,once:t})},d=function(i,t,n,e){var r;return function(){n&&t.isFinal&&n.disconnect(),t.value>=0&&(e||t.isFinal||document.visibilityState==="hidden")&&(t.delta=t.value-(r||0),(t.delta||t.isFinal||r===void 0)&&(i(t),r=t.value))}},b=function(i){var t,n=arguments.length>1&&arguments[1]!==void 0&&arguments[1],e=u("CLS",0),r=function(a){a.hadRecentInput||(e.value+=a.value,e.entries.push(a),t())},s=m("layout-shift",r);s&&(t=d(i,e,s,n),l(function(a){var o=a.isUnloading;s.takeRecords().map(r),o&&(e.isFinal=!0),t()}))},v=function(){return c===void 0&&(c=document.visibilityState==="hidden"?0:1/0,l(function(i){var t=i.timeStamp;return c=t},!0)),{get timeStamp(){return c}}},L=function(i){var t,n=u("FCP"),e=v(),r=m("paint",function(s){s.name==="first-contentful-paint"&&s.startTime1&&arguments[1]!==void 0&&arguments[1],e=u("LCP"),r=v(),s=function(f){var g=f.startTime;g - - - - - - - - - - - Shiny UI Editor - - - - - - -
- - - diff --git a/docs/articles/demo-app/logo192.png b/docs/articles/demo-app/logo192.png deleted file mode 100644 index fc44b0a37..000000000 Binary files a/docs/articles/demo-app/logo192.png and /dev/null differ diff --git a/docs/articles/demo-app/logo512.png b/docs/articles/demo-app/logo512.png deleted file mode 100644 index a4e47a654..000000000 Binary files a/docs/articles/demo-app/logo512.png and /dev/null differ diff --git a/docs/articles/demo-app/manifest.json b/docs/articles/demo-app/manifest.json deleted file mode 100644 index 080d6c77a..000000000 --- a/docs/articles/demo-app/manifest.json +++ /dev/null @@ -1,25 +0,0 @@ -{ - "short_name": "React App", - "name": "Create React App Sample", - "icons": [ - { - "src": "favicon.ico", - "sizes": "64x64 32x32 24x24 16x16", - "type": "image/x-icon" - }, - { - "src": "logo192.png", - "type": "image/png", - "sizes": "192x192" - }, - { - "src": "logo512.png", - "type": "image/png", - "sizes": "512x512" - } - ], - "start_url": ".", - "display": "standalone", - "theme_color": "#000000", - "background_color": "#ffffff" -} diff --git a/docs/articles/demo-app/robots.txt b/docs/articles/demo-app/robots.txt deleted file mode 100644 index e9e57dc4d..000000000 --- a/docs/articles/demo-app/robots.txt +++ /dev/null @@ -1,3 +0,0 @@ -# https://www.robotstxt.org/robotstxt.html -User-agent: * -Disallow: diff --git a/docs/articles/faqs.html b/docs/articles/faqs.html deleted file mode 100644 index 4314dffd4..000000000 --- a/docs/articles/faqs.html +++ /dev/null @@ -1,289 +0,0 @@ - - - - - - - -Frequently Asked Questions • shinyuieditor - - - - - - - - - - - - - - - -
-
- - - - -
-
- - - - -

The following are a list of common questions one may have about the -shinyuieditor.

-
-

Can I use a different page type other than -gridlayout? -

-

Currently only gridlayout::grid_page is supported as the -root of your app. More options for app layout are planned.

-
-
-

I have an existing app, can I use the shinyuieditor on -it? -

-

Yes! If you point launch_editor() at your existing app, -then it will be read into the ui editor. If the ui can’t be parsed then -the editor will ask you if you want to replace it with a -shinyuieditor-friendly starter template which you will then -need to update to match the inputs/outputs of your app’s server code. -(Note that this template replacement works only for two-file apps -currently.)

-
-
-

I don’t have an app, can I start one with the -shinyuieditor? -

-

Yes! If you run launch_editor() with -app_loc set to an non-existing or non-app-containing -location it will ask you a few questions to setup a starter template -app. This will then be written to the app_loc and you can -continue editing it as you please. This can be used as an alternative to -the typical “new shiny app” geyser template. More templates will -continually be added as the shinyuieditor matures.

-
-
-

Is there a way to edit the server code for my app? -

-

There is no way to directly edit the server code for your app from -within the editor window. However, if you edit the server code within -your editor window and save, the app preview will automatically refresh -the app with the new server code for you. This allows you to build your -app by writing more traditional R code for your server and editing the -ui with shinyuieditor’s visual interface.

-
-
-

I use a lot of in my apps and it’s not available in -the elements palette, can I still use the editor? -

-

Currently there is a limited number of ui elements that can be -directly edited with the editor. These were chosen to fit the broadest -range of needed ui elements but you will likely run into a case where -you need a non-supported ui element. In this case you can add the ui -element in the ui code directly. Unknown ui elements will show up as -grey boxes in the editor but can be moved around within the editor just -as any other element - just without the ability to change settings.

-
-
-

The ui editor can’t find “a valid ui definition” but I have one, -what’s going on? -

-

The editor assumes that your app’s ui code is assigned to the -variable ui.

-

Good

-
-...
-ui <- grid_page(...)
-...
-shinyApp(ui, server)
-

Bad

-
-...
-# App ui variable is not named ui
-my_app_ui <- grid_page(...)
-...
-shinyApp(ui = my_app_ui, server)
-

Also Bad

-
-...
-# UI is directly passed to shinyApp function
-shinyApp(
-  ui = grid_page(...), 
-  server = ...
-)
-
-
-

The editor keeps changing the formatting and erasing comments in my -code, can I stop that? -

-

Unfortunately not. When the UI editor updates your code it rewrites -the entire ui definition. Any code sitting outside of the ui definition -in your app will be preserved exactly as it was, however.

-
-
-

My app takes a long time to start up, can I turnoff the live app -preview? -

-

In the launch_editor() function, the argument -app_preview can be set to false to not run the app preview -in the background. You won’t however, be able to see the updates you -make to your app reflected in real time.

-
-
-

I don’t see an argument I want to set for a ui element in its -settings panel? How do I set it? -

-

Not every argument is exposed via the settings panel for the provided -ui elements. If you need another argument you can write it into the ui -code directly. Any argument not present in the settings panel for a -given element will be passed through unchanged.

-
-
- -

There is no official workflow for this yet as each ui element needs -to be added to the shinyuieditor manually. Placing an issue -on the github issues page will help show the desire and potentially -motivate your widgets addition. For the more brave, a PR could be -submitted to add (although that will require a decent knowledge of the -javascript framework the editor is written in, React, to -accomplish).

-

In the future a plugin system may be available that will allow a -package to register their ui elements with the ui editor automatically -but currently no such system exists.

-
-
-

How does the shinyuieditor compare to - -

-

shinyuieditor is focused on the editing of the ui of -shiny apps while producing clean and easy to read code output. Other -excellent visual editors for Shiny exist and are being developed such as -Dashboard-Builder -designer which may -be more appropriate for your use-case. As with any tooling decision, -take a look at the pros and cons of the various options before making -your final decision!

-
-
- - - -
- - - -
-

shinyuieditor is an R package developed by RStudio

-
- -
-

-

Site built with pkgdown 2.0.5.

-
- -
-
- - - - - - - - diff --git a/docs/articles/how-to-videos/add-element.webm b/docs/articles/how-to-videos/add-element.webm deleted file mode 100644 index 830751e96..000000000 Binary files a/docs/articles/how-to-videos/add-element.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/add-tract.webm b/docs/articles/how-to-videos/add-tract.webm deleted file mode 100644 index afcddd2a7..000000000 Binary files a/docs/articles/how-to-videos/add-tract.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/delete-an-element.webm b/docs/articles/how-to-videos/delete-an-element.webm deleted file mode 100644 index 788925c09..000000000 Binary files a/docs/articles/how-to-videos/delete-an-element.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/delete-tract.webm b/docs/articles/how-to-videos/delete-tract.webm deleted file mode 100644 index b3a7fbaad..000000000 Binary files a/docs/articles/how-to-videos/delete-tract.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/move-an-element.webm b/docs/articles/how-to-videos/move-an-element.webm deleted file mode 100644 index 753945183..000000000 Binary files a/docs/articles/how-to-videos/move-an-element.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/resize-with-drag.webm b/docs/articles/how-to-videos/resize-with-drag.webm deleted file mode 100644 index f56d0748d..000000000 Binary files a/docs/articles/how-to-videos/resize-with-drag.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/resize-with-widget.webm b/docs/articles/how-to-videos/resize-with-widget.webm deleted file mode 100644 index 2ea808812..000000000 Binary files a/docs/articles/how-to-videos/resize-with-widget.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/select-an-element.webm b/docs/articles/how-to-videos/select-an-element.webm deleted file mode 100644 index 0e23b5593..000000000 Binary files a/docs/articles/how-to-videos/select-an-element.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/show-size-widget.webm b/docs/articles/how-to-videos/show-size-widget.webm deleted file mode 100644 index fecfd5363..000000000 Binary files a/docs/articles/how-to-videos/show-size-widget.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/undo-redo.webm b/docs/articles/how-to-videos/undo-redo.webm deleted file mode 100644 index f10b88c1a..000000000 Binary files a/docs/articles/how-to-videos/undo-redo.webm and /dev/null differ diff --git a/docs/articles/how-to-videos/update-an-element.webm b/docs/articles/how-to-videos/update-an-element.webm deleted file mode 100644 index 61d5927ee..000000000 Binary files a/docs/articles/how-to-videos/update-an-element.webm and /dev/null differ diff --git a/docs/articles/how-to.html b/docs/articles/how-to.html deleted file mode 100644 index ea3391405..000000000 --- a/docs/articles/how-to.html +++ /dev/null @@ -1,280 +0,0 @@ - - - - - - - -How to • shinyuieditor - - - - - - - - - - - - - - - -
-
- - - - -
-
- - - - - -

This article lays out how to do some of the more common tasks you -will do with the shinyuieditor.

-

For the same info in a long-form video, see the shinyuieditor feature -tour video.

-
-

Add a new ui element to your app -

-

To add a new ui element to your app you drag the desired element in -from the “Elements” panel. Places where the element can be placed will -be highlighted (if no places are available, try adding a new row or -column to the app to create space.) Once you have dragged your element -over an available area, release it to add it to your app.

- -
-
-

Move a ui element within your app -

-

Click and drag the ui element you wish to move. Just like adding an -element, the available positions to move the element will be -highlighted. Drag the element to the desired new position and drop to -move it.

- -
-
-

Select a ui element -

-

Select the element by clicking inside it. Once the element is -selected it will be given a blue outline and the “Properties” panel will -update with details for the element. Alternatively, you can select the -parent of the currently selected element by clicking the parent’s name -in the element-path visualization at the top of the “Properties” -panel.

- -
-
-

Delete a ui element -

-

Select the element. Once the element is -selected, click the “Delete Element” button at the bottom of the -“Properties” panel. Some elements such as a grid_card() -will also show delete buttons right on the element itself when no -children are contained.

- -
-
-

Update the settings for a ui element -

-

Select the element. After element is selected, -update the settings using the “Properties” panel. As inputs are updated -the changes will automatically be saved and reflected in the app outline -and live-preview window.

- -
-
-

Show row/column size widget -

-

Mouse-over the left end of a row or top of a column to reveal the -sizing widget.

- -
-
-

Add a row or column to the layout grid -

-

Open the sizing widget of row or -column adjacent to where you wish to add a new row or column. On -either end of the widget will be plus (+) buttons that when -clicked will add a row or column on their respective sides of the -existing row or column.

- -
-
-

Delete a row or column in the layout grid -

-

Open the sizing widget of the row or -column you wish to delete. Then click the red trash icon to delete -that row from layout. If the trash icon is greyed-out the row or column -can’t be deleted due named areas on the grid residing entirely within -it. Mousing over the greyed-out button will tell you which grid-areas -these are so you can either delete them or move them to a new -location.

- -
-
-

Resize the rows and columns of the layout grid -

-
-

By dragging -

-

Click on the delineating lines between rows or columns and start -dragging. Once resizing is occurring size indicators will popup on the -resize-effected rows or columns. Once desired size is reached, stop -dragging to finalize the resize.

- -
-
-

With row/column size widgets -

-

Open the row/column to be resized’s -sizing widget Use the css unit input controls in this widget to -update the size of the row or column.

- -
-
-
-

Undo/redo a change made to the app -

-

Use the undo button available in the upper-right corner of the app to -restore your app’s ui to the way it was before the last change made. If -you wish to restore the change just undone, click the redo button to the -right.

- -
-
-

Stop the editor -

-

As long as the argument stop_on_browser_close is set at -the default value of TRUE, then all you need to do to stop -the editor is close the browser tab/window the editor is currently open -in. Another way of ending is to interupt the editor server by pressing -Control/Command + c in the R console used to -launch the editor. If in RStudio the red stop icon will also accomplish -this.

-
-
- - - -
- - - -
-

shinyuieditor is an R package developed by RStudio

-
- -
-

-

Site built with pkgdown 2.0.5.

-
- -
-
- - - - - - - - diff --git a/docs/articles/quick-start.html b/docs/articles/quick-start.html deleted file mode 100644 index de7f71b36..000000000 --- a/docs/articles/quick-start.html +++ /dev/null @@ -1,229 +0,0 @@ - - - - - - - -Quick start • shinyuieditor - - - - - - - - - - - - - - - -
-
- - - - -
-
- - - - - -

The following will show you how to get up and running with the ui -editor from scratch.

-

If you prefer video format, here’s an in-depth walkthrough -of using the ui editor to create and edit a new app.

-
-

Pre-reqs -

-
    -
  • -shinyuieditor package installed. See the installing section -
  • -
  • Shiny app with ui built using gridlayout::gridpage() -(more layout functions coming soon.) See the gridlayout -package for more info.
  • -
-
-
-

Running -

-
-

New app -

-

If you set the argument app_loc to a location that does -not yet exist, the launcher will ask a few and setup a simple template -app for you to use with building.

-
-shinyuieditor::launch_editor(app_loc = "new-app/")
-
-#> No app was found at location /Users/me/new_app.
-#> Would you like to start a new app from a template?
-#> 1: yes
-#> 2: no
-#>
-#> Selection: 1
-#> Which starter template would you like to use? (Sorry, it's an easy choice currently.)
-#> 1: geyser
-#>
-#> Selection: 1
-#> => Starting Shiny preview app...
-#> ...
-

In the future more starting templates will be offered, however, -currently only a simple grid-layout recreation of the classic “Geyser” -app is available.

-
-
-

Existing app -

-

Assuming there’s an existing app (either app.R or -ui.R and server.R) in the folder -existing-app/ relative to your current working directly -(getwd()), then you start the ui-editor on that app by -running the following code and pasting the returned link into your -web-browser.

-
-shinyuieditor::launch_editor(app_loc = "existing-app/")
-#> Live editor running at http://localhost:44509/app
-
-
-
-
-

Editing your app -

-

Once you’re in the editor, any changes you make will automatically be -written to your app’s UI and the changes can be seen in real-time with -the “App Preview” window.

-

For more info on how to perform various tasks with the editor, see -vignette("how-to").

-
-
-

Saving/Closing editor -

-

When you’re done, simply close the browser window (or press -{control/command}-c in the console) to stop the editor preview process -in R. Since all changes are eagerly applied there’s no need to save.

-
-
- - - -
- - - -
-

shinyuieditor is an R package developed by RStudio

-
- -
-

-

Site built with pkgdown 2.0.5.

-
- -
-
- - - - - - - - diff --git a/docs/articles/ui-editor-live-demo.html b/docs/articles/ui-editor-live-demo.html deleted file mode 100644 index 3702de8e9..000000000 --- a/docs/articles/ui-editor-live-demo.html +++ /dev/null @@ -1,174 +0,0 @@ - - - - - - - -Live Demo • shinyuieditor - - - - - - - - - - - - - - - -
-
- - - - -
-
- - - - - -

The following is the shinyuieditor interface running in -its entirety.
-There is no R backend hooked up so the app preview is non-functional but -you can use this to play around and see what’s possible to build with -the editor.

- -
- - - -
- - - -
-

shinyuieditor is an R package developed by RStudio

-
- -
-

-

Site built with pkgdown 2.0.5.

-
- -
-
- - - - - - - - diff --git a/docs/authors.html b/docs/authors.html deleted file mode 100644 index 6838f7329..000000000 --- a/docs/authors.html +++ /dev/null @@ -1,138 +0,0 @@ - -Authors and Citation • shinyuieditor - - -
-
- - - -
-
-
- - - -
  • -

    Nick Strayer. Author, maintainer. -

    -
  • -
-
-
-

Citation

- -
-
- - -

Strayer N (2022). -shinyuieditor: Build and Modify your Shiny UI, visually. -R package version 0.1.0, https://rstudio.github.io/shinyuieditor/. -

-
@Manual{,
-  title = {shinyuieditor: Build and Modify your Shiny UI, visually},
-  author = {Nick Strayer},
-  year = {2022},
-  note = {R package version 0.1.0},
-  url = {https://rstudio.github.io/shinyuieditor/},
-}
- -
- -
- - - -
-

shinyuieditor is an R package developed by RStudio

-
- -
-

Site built with pkgdown 2.0.5.

-
- -
- - - - - - - - diff --git a/docs/bootstrap-toc.css b/docs/bootstrap-toc.css deleted file mode 100644 index 5a859415c..000000000 --- a/docs/bootstrap-toc.css +++ /dev/null @@ -1,60 +0,0 @@ -/*! - * Bootstrap Table of Contents v0.4.1 (http://afeld.github.io/bootstrap-toc/) - * Copyright 2015 Aidan Feldman - * Licensed under MIT (https://github.com/afeld/bootstrap-toc/blob/gh-pages/LICENSE.md) */ - -/* modified from https://github.com/twbs/bootstrap/blob/94b4076dd2efba9af71f0b18d4ee4b163aa9e0dd/docs/assets/css/src/docs.css#L548-L601 */ - -/* All levels of nav */ -nav[data-toggle='toc'] .nav > li > a { - display: block; - padding: 4px 20px; - font-size: 13px; - font-weight: 500; - color: #767676; -} -nav[data-toggle='toc'] .nav > li > a:hover, -nav[data-toggle='toc'] .nav > li > a:focus { - padding-left: 19px; - color: #563d7c; - text-decoration: none; - background-color: transparent; - border-left: 1px solid #563d7c; -} -nav[data-toggle='toc'] .nav > .active > a, -nav[data-toggle='toc'] .nav > .active:hover > a, -nav[data-toggle='toc'] .nav > .active:focus > a { - padding-left: 18px; - font-weight: bold; - color: #563d7c; - background-color: transparent; - border-left: 2px solid #563d7c; -} - -/* Nav: second level (shown on .active) */ -nav[data-toggle='toc'] .nav .nav { - display: none; /* Hide by default, but at >768px, show it */ - padding-bottom: 10px; -} -nav[data-toggle='toc'] .nav .nav > li > a { - padding-top: 1px; - padding-bottom: 1px; - padding-left: 30px; - font-size: 12px; - font-weight: normal; -} -nav[data-toggle='toc'] .nav .nav > li > a:hover, -nav[data-toggle='toc'] .nav .nav > li > a:focus { - padding-left: 29px; -} -nav[data-toggle='toc'] .nav .nav > .active > a, -nav[data-toggle='toc'] .nav .nav > .active:hover > a, -nav[data-toggle='toc'] .nav .nav > .active:focus > a { - padding-left: 28px; - font-weight: 500; -} - -/* from https://github.com/twbs/bootstrap/blob/e38f066d8c203c3e032da0ff23cd2d6098ee2dd6/docs/assets/css/src/docs.css#L631-L634 */ -nav[data-toggle='toc'] .nav > .active > ul { - display: block; -} diff --git a/docs/bootstrap-toc.js b/docs/bootstrap-toc.js deleted file mode 100644 index 1cdd573b2..000000000 --- a/docs/bootstrap-toc.js +++ /dev/null @@ -1,159 +0,0 @@ -/*! - * Bootstrap Table of Contents v0.4.1 (http://afeld.github.io/bootstrap-toc/) - * Copyright 2015 Aidan Feldman - * Licensed under MIT (https://github.com/afeld/bootstrap-toc/blob/gh-pages/LICENSE.md) */ -(function() { - 'use strict'; - - window.Toc = { - helpers: { - // return all matching elements in the set, or their descendants - findOrFilter: function($el, selector) { - // http://danielnouri.org/notes/2011/03/14/a-jquery-find-that-also-finds-the-root-element/ - // http://stackoverflow.com/a/12731439/358804 - var $descendants = $el.find(selector); - return $el.filter(selector).add($descendants).filter(':not([data-toc-skip])'); - }, - - generateUniqueIdBase: function(el) { - var text = $(el).text(); - var anchor = text.trim().toLowerCase().replace(/[^A-Za-z0-9]+/g, '-'); - return anchor || el.tagName.toLowerCase(); - }, - - generateUniqueId: function(el) { - var anchorBase = this.generateUniqueIdBase(el); - for (var i = 0; ; i++) { - var anchor = anchorBase; - if (i > 0) { - // add suffix - anchor += '-' + i; - } - // check if ID already exists - if (!document.getElementById(anchor)) { - return anchor; - } - } - }, - - generateAnchor: function(el) { - if (el.id) { - return el.id; - } else { - var anchor = this.generateUniqueId(el); - el.id = anchor; - return anchor; - } - }, - - createNavList: function() { - return $(''); - }, - - createChildNavList: function($parent) { - var $childList = this.createNavList(); - $parent.append($childList); - return $childList; - }, - - generateNavEl: function(anchor, text) { - var $a = $(''); - $a.attr('href', '#' + anchor); - $a.text(text); - var $li = $('
  • '); - $li.append($a); - return $li; - }, - - generateNavItem: function(headingEl) { - var anchor = this.generateAnchor(headingEl); - var $heading = $(headingEl); - var text = $heading.data('toc-text') || $heading.text(); - return this.generateNavEl(anchor, text); - }, - - // Find the first heading level (`

    `, then `

    `, etc.) that has more than one element. Defaults to 1 (for `

    `). - getTopLevel: function($scope) { - for (var i = 1; i <= 6; i++) { - var $headings = this.findOrFilter($scope, 'h' + i); - if ($headings.length > 1) { - return i; - } - } - - return 1; - }, - - // returns the elements for the top level, and the next below it - getHeadings: function($scope, topLevel) { - var topSelector = 'h' + topLevel; - - var secondaryLevel = topLevel + 1; - var secondarySelector = 'h' + secondaryLevel; - - return this.findOrFilter($scope, topSelector + ',' + secondarySelector); - }, - - getNavLevel: function(el) { - return parseInt(el.tagName.charAt(1), 10); - }, - - populateNav: function($topContext, topLevel, $headings) { - var $context = $topContext; - var $prevNav; - - var helpers = this; - $headings.each(function(i, el) { - var $newNav = helpers.generateNavItem(el); - var navLevel = helpers.getNavLevel(el); - - // determine the proper $context - if (navLevel === topLevel) { - // use top level - $context = $topContext; - } else if ($prevNav && $context === $topContext) { - // create a new level of the tree and switch to it - $context = helpers.createChildNavList($prevNav); - } // else use the current $context - - $context.append($newNav); - - $prevNav = $newNav; - }); - }, - - parseOps: function(arg) { - var opts; - if (arg.jquery) { - opts = { - $nav: arg - }; - } else { - opts = arg; - } - opts.$scope = opts.$scope || $(document.body); - return opts; - } - }, - - // accepts a jQuery object, or an options object - init: function(opts) { - opts = this.helpers.parseOps(opts); - - // ensure that the data attribute is in place for styling - opts.$nav.attr('data-toggle', 'toc'); - - var $topContext = this.helpers.createChildNavList(opts.$nav); - var topLevel = this.helpers.getTopLevel(opts.$scope); - var $headings = this.helpers.getHeadings(opts.$scope, topLevel); - this.helpers.populateNav($topContext, topLevel, $headings); - } - }; - - $(function() { - $('nav[data-toggle="toc"]').each(function(i, el) { - var $nav = $(el); - Toc.init($nav); - }); - }); -})(); diff --git a/docs/docsearch.css b/docs/docsearch.css deleted file mode 100644 index e5f1fe1df..000000000 --- a/docs/docsearch.css +++ /dev/null @@ -1,148 +0,0 @@ -/* Docsearch -------------------------------------------------------------- */ -/* - Source: https://github.com/algolia/docsearch/ - License: MIT -*/ - -.algolia-autocomplete { - display: block; - -webkit-box-flex: 1; - -ms-flex: 1; - flex: 1 -} - -.algolia-autocomplete .ds-dropdown-menu { - width: 100%; - min-width: none; - max-width: none; - padding: .75rem 0; - background-color: #fff; - background-clip: padding-box; - border: 1px solid rgba(0, 0, 0, .1); - box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .175); -} - -@media (min-width:768px) { - .algolia-autocomplete .ds-dropdown-menu { - width: 175% - } -} - -.algolia-autocomplete .ds-dropdown-menu::before { - display: none -} - -.algolia-autocomplete .ds-dropdown-menu [class^=ds-dataset-] { - padding: 0; - background-color: rgb(255,255,255); - border: 0; - max-height: 80vh; -} - -.algolia-autocomplete .ds-dropdown-menu .ds-suggestions { - margin-top: 0 -} - -.algolia-autocomplete .algolia-docsearch-suggestion { - padding: 0; - overflow: visible -} - -.algolia-autocomplete .algolia-docsearch-suggestion--category-header { - padding: .125rem 1rem; - margin-top: 0; - font-size: 1.3em; - font-weight: 500; - color: #00008B; - border-bottom: 0 -} - -.algolia-autocomplete .algolia-docsearch-suggestion--wrapper { - float: none; - padding-top: 0 -} - -.algolia-autocomplete .algolia-docsearch-suggestion--subcategory-column { - float: none; - width: auto; - padding: 0; - text-align: left -} - -.algolia-autocomplete .algolia-docsearch-suggestion--content { - float: none; - width: auto; - padding: 0 -} - -.algolia-autocomplete .algolia-docsearch-suggestion--content::before { - display: none -} - -.algolia-autocomplete .ds-suggestion:not(:first-child) .algolia-docsearch-suggestion--category-header { - padding-top: .75rem; - margin-top: .75rem; - border-top: 1px solid rgba(0, 0, 0, .1) -} - -.algolia-autocomplete .ds-suggestion .algolia-docsearch-suggestion--subcategory-column { - display: block; - padding: .1rem 1rem; - margin-bottom: 0.1; - font-size: 1.0em; - font-weight: 400 - /* display: none */ -} - -.algolia-autocomplete .algolia-docsearch-suggestion--title { - display: block; - padding: .25rem 1rem; - margin-bottom: 0; - font-size: 0.9em; - font-weight: 400 -} - -.algolia-autocomplete .algolia-docsearch-suggestion--text { - padding: 0 1rem .5rem; - margin-top: -.25rem; - font-size: 0.8em; - font-weight: 400; - line-height: 1.25 -} - -.algolia-autocomplete .algolia-docsearch-footer { - width: 110px; - height: 20px; - z-index: 3; - margin-top: 10.66667px; - float: right; - font-size: 0; - line-height: 0; -} - -.algolia-autocomplete .algolia-docsearch-footer--logo { - background-image: url("data:image/svg+xml;utf8,"); - background-repeat: no-repeat; - background-position: 50%; - background-size: 100%; - overflow: hidden; - text-indent: -9000px; - width: 100%; - height: 100%; - display: block; - transform: translate(-8px); -} - -.algolia-autocomplete .algolia-docsearch-suggestion--highlight { - color: #FF8C00; - background: rgba(232, 189, 54, 0.1) -} - - -.algolia-autocomplete .algolia-docsearch-suggestion--text .algolia-docsearch-suggestion--highlight { - box-shadow: inset 0 -2px 0 0 rgba(105, 105, 105, .5) -} - -.algolia-autocomplete .ds-suggestion.ds-cursor .algolia-docsearch-suggestion--content { - background-color: rgba(192, 192, 192, .15) -} diff --git a/docs/docsearch.js b/docs/docsearch.js deleted file mode 100644 index b35504cd3..000000000 --- a/docs/docsearch.js +++ /dev/null @@ -1,85 +0,0 @@ -$(function() { - - // register a handler to move the focus to the search bar - // upon pressing shift + "/" (i.e. "?") - $(document).on('keydown', function(e) { - if (e.shiftKey && e.keyCode == 191) { - e.preventDefault(); - $("#search-input").focus(); - } - }); - - $(document).ready(function() { - // do keyword highlighting - /* modified from https://jsfiddle.net/julmot/bL6bb5oo/ */ - var mark = function() { - - var referrer = document.URL ; - var paramKey = "q" ; - - if (referrer.indexOf("?") !== -1) { - var qs = referrer.substr(referrer.indexOf('?') + 1); - var qs_noanchor = qs.split('#')[0]; - var qsa = qs_noanchor.split('&'); - var keyword = ""; - - for (var i = 0; i < qsa.length; i++) { - var currentParam = qsa[i].split('='); - - if (currentParam.length !== 2) { - continue; - } - - if (currentParam[0] == paramKey) { - keyword = decodeURIComponent(currentParam[1].replace(/\+/g, "%20")); - } - } - - if (keyword !== "") { - $(".contents").unmark({ - done: function() { - $(".contents").mark(keyword); - } - }); - } - } - }; - - mark(); - }); -}); - -/* Search term highlighting ------------------------------*/ - -function matchedWords(hit) { - var words = []; - - var hierarchy = hit._highlightResult.hierarchy; - // loop to fetch from lvl0, lvl1, etc. - for (var idx in hierarchy) { - words = words.concat(hierarchy[idx].matchedWords); - } - - var content = hit._highlightResult.content; - if (content) { - words = words.concat(content.matchedWords); - } - - // return unique words - var words_uniq = [...new Set(words)]; - return words_uniq; -} - -function updateHitURL(hit) { - - var words = matchedWords(hit); - var url = ""; - - if (hit.anchor) { - url = hit.url_without_anchor + '?q=' + escape(words.join(" ")) + '#' + hit.anchor; - } else { - url = hit.url + '?q=' + escape(words.join(" ")); - } - - return url; -} diff --git a/docs/holder-2.9.0/holder.min.js b/docs/holder-2.9.0/holder.min.js deleted file mode 100755 index 127534f8a..000000000 --- a/docs/holder-2.9.0/holder.min.js +++ /dev/null @@ -1,12 +0,0 @@ -/*! - -Holder - client side image placeholders -Version 2.9.0+f2dkw -© 2015 Ivan Malopinsky - http://imsky.co - -Site: http://holderjs.com -Issues: https://github.com/imsky/holder/issues -License: MIT - -*/ -!function(e){if(e.document){var t=e.document;t.querySelectorAll||(t.querySelectorAll=function(n){var r,i=t.createElement("style"),o=[];for(t.documentElement.firstChild.appendChild(i),t._qsa=[],i.styleSheet.cssText=n+"{x-qsa:expression(document._qsa && document._qsa.push(this))}",e.scrollBy(0,0),i.parentNode.removeChild(i);t._qsa.length;)r=t._qsa.shift(),r.style.removeAttribute("x-qsa"),o.push(r);return t._qsa=null,o}),t.querySelector||(t.querySelector=function(e){var n=t.querySelectorAll(e);return n.length?n[0]:null}),t.getElementsByClassName||(t.getElementsByClassName=function(e){return e=String(e).replace(/^|\s+/g,"."),t.querySelectorAll(e)}),Object.keys||(Object.keys=function(e){if(e!==Object(e))throw TypeError("Object.keys called on non-object");var t,n=[];for(t in e)Object.prototype.hasOwnProperty.call(e,t)&&n.push(t);return n}),Array.prototype.forEach||(Array.prototype.forEach=function(e){if(void 0===this||null===this)throw TypeError();var t=Object(this),n=t.length>>>0;if("function"!=typeof e)throw TypeError();var r,i=arguments[1];for(r=0;n>r;r++)r in t&&e.call(i,t[r],r,t)}),function(e){var t="ABCDEFGHIJKLMNOPQRSTUVWXYZabcdefghijklmnopqrstuvwxyz0123456789+/=";e.atob=e.atob||function(e){e=String(e);var n,r=0,i=[],o=0,a=0;if(e=e.replace(/\s/g,""),e.length%4===0&&(e=e.replace(/=+$/,"")),e.length%4===1)throw Error("InvalidCharacterError");if(/[^+/0-9A-Za-z]/.test(e))throw Error("InvalidCharacterError");for(;r>16&255)),i.push(String.fromCharCode(o>>8&255)),i.push(String.fromCharCode(255&o)),a=0,o=0),r+=1;return 12===a?(o>>=4,i.push(String.fromCharCode(255&o))):18===a&&(o>>=2,i.push(String.fromCharCode(o>>8&255)),i.push(String.fromCharCode(255&o))),i.join("")},e.btoa=e.btoa||function(e){e=String(e);var n,r,i,o,a,s,l,h=0,u=[];if(/[^\x00-\xFF]/.test(e))throw Error("InvalidCharacterError");for(;h>2,a=(3&n)<<4|r>>4,s=(15&r)<<2|i>>6,l=63&i,h===e.length+2?(s=64,l=64):h===e.length+1&&(l=64),u.push(t.charAt(o),t.charAt(a),t.charAt(s),t.charAt(l));return u.join("")}}(e),Object.prototype.hasOwnProperty||(Object.prototype.hasOwnProperty=function(e){var t=this.__proto__||this.constructor.prototype;return e in this&&(!(e in t)||t[e]!==this[e])}),function(){if("performance"in e==!1&&(e.performance={}),Date.now=Date.now||function(){return(new Date).getTime()},"now"in e.performance==!1){var t=Date.now();performance.timing&&performance.timing.navigationStart&&(t=performance.timing.navigationStart),e.performance.now=function(){return Date.now()-t}}}(),e.requestAnimationFrame||(e.webkitRequestAnimationFrame?!function(e){e.requestAnimationFrame=function(t){return webkitRequestAnimationFrame(function(){t(e.performance.now())})},e.cancelAnimationFrame=webkitCancelAnimationFrame}(e):e.mozRequestAnimationFrame?!function(e){e.requestAnimationFrame=function(t){return mozRequestAnimationFrame(function(){t(e.performance.now())})},e.cancelAnimationFrame=mozCancelAnimationFrame}(e):!function(e){e.requestAnimationFrame=function(t){return e.setTimeout(t,1e3/60)},e.cancelAnimationFrame=e.clearTimeout}(e))}}(this),function(e,t){"object"==typeof exports&&"object"==typeof module?module.exports=t():"function"==typeof define&&define.amd?define([],t):"object"==typeof exports?exports.Holder=t():e.Holder=t()}(this,function(){return function(e){function t(r){if(n[r])return n[r].exports;var i=n[r]={exports:{},id:r,loaded:!1};return e[r].call(i.exports,i,i.exports,t),i.loaded=!0,i.exports}var n={};return t.m=e,t.c=n,t.p="",t(0)}([function(e,t,n){e.exports=n(1)},function(e,t,n){(function(t){function r(e,t,n,r){var a=i(n.substr(n.lastIndexOf(e.domain)),e);a&&o({mode:null,el:r,flags:a,engineSettings:t})}function i(e,t){var n={theme:T(F.settings.themes.gray,null),stylesheets:t.stylesheets,instanceOptions:t},r=e.split("?"),i=r[0].split("/");n.holderURL=e;var o=i[1],a=o.match(/([\d]+p?)x([\d]+p?)/);if(!a)return!1;if(n.fluid=-1!==o.indexOf("p"),n.dimensions={width:a[1].replace("p","%"),height:a[2].replace("p","%")},2===r.length){var s=v.parse(r[1]);if(s.bg&&(n.theme.bg=w.parseColor(s.bg)),s.fg&&(n.theme.fg=w.parseColor(s.fg)),s.bg&&!s.fg&&(n.autoFg=!0),s.theme&&n.instanceOptions.themes.hasOwnProperty(s.theme)&&(n.theme=T(n.instanceOptions.themes[s.theme],null)),s.text&&(n.text=s.text),s.textmode&&(n.textmode=s.textmode),s.size&&(n.size=s.size),s.font&&(n.font=s.font),s.align&&(n.align=s.align),s.lineWrap&&(n.lineWrap=s.lineWrap),n.nowrap=w.truthy(s.nowrap),n.auto=w.truthy(s.auto),n.outline=w.truthy(s.outline),w.truthy(s.random)){F.vars.cache.themeKeys=F.vars.cache.themeKeys||Object.keys(n.instanceOptions.themes);var l=F.vars.cache.themeKeys[0|Math.random()*F.vars.cache.themeKeys.length];n.theme=T(n.instanceOptions.themes[l],null)}}return n}function o(e){var t=e.mode,n=e.el,r=e.flags,i=e.engineSettings,o=r.dimensions,s=r.theme,l=o.width+"x"+o.height;t=null==t?r.fluid?"fluid":"image":t;var d=/holder_([a-z]+)/g,c=!1;if(null!=r.text&&(s.text=r.text,"object"===n.nodeName.toLowerCase())){for(var f=s.text.split("\\n"),p=0;p1){var b,x=0,A=0,C=0;w=new s.Group("line"+C),("left"===e.align||"right"===e.align)&&(o=e.width*(1-2*(1-r)));for(var E=0;E=o||k===!0)&&(t(g,w,x,g.properties.leading),g.add(w),x=0,A+=g.properties.leading,C+=1,w=new s.Group("line"+C),w.y=A),k!==!0&&(v.moveTo(x,0),x+=m.spaceWidth+T.width,w.add(v))}if(t(g,w,x,g.properties.leading),g.add(w),"left"===e.align)g.moveTo(e.width-i,null,null);else if("right"===e.align){for(b in g.children)w=g.children[b],w.moveTo(e.width-w.width,null,null);g.moveTo(0-(e.width-i),null,null)}else{for(b in g.children)w=g.children[b],w.moveTo((g.width-w.width)/2,null,null);g.moveTo((e.width-g.width)/2,null,null)}g.moveTo(null,(e.height-g.height)/2,null),(e.height-g.height)/2<0&&g.moveTo(null,0,null)}else v=new s.Text(e.text),w=new s.Group("line0"),w.add(v),g.add(w),"left"===e.align?g.moveTo(e.width-i,null,null):"right"===e.align?g.moveTo(0-(e.width-i),null,null):g.moveTo((e.width-m.boundingBox.width)/2,null,null),g.moveTo(null,(e.height-m.boundingBox.height)/2,null);return a}function l(e,t,n,r){var i=parseInt(e,10),o=parseInt(t,10),a=Math.max(i,o),s=Math.min(i,o),l=.8*Math.min(s,a*r);return Math.round(Math.max(n,l))}function h(e){var t;t=null==e||null==e.nodeType?F.vars.resizableImages:[e];for(var n=0,r=t.length;r>n;n++){var i=t[n];if(i.holderData){var o=i.holderData.flags,s=k(i);if(s){if(!i.holderData.resizeUpdate)continue;if(o.fluid&&o.auto){var l=i.holderData.fluidConfig;switch(l.mode){case"width":s.height=s.width/l.ratio;break;case"height":s.width=s.height*l.ratio}}var h={mode:"image",holderSettings:{dimensions:s,theme:o.theme,flags:o},el:i,engineSettings:i.holderData.engineSettings};"exact"==o.textmode&&(o.exactDimensions=s,h.holderSettings.dimensions=o.dimensions),a(h)}else f(i)}}}function u(e){if(e.holderData){var t=k(e);if(t){var n=e.holderData.flags,r={fluidHeight:"%"==n.dimensions.height.slice(-1),fluidWidth:"%"==n.dimensions.width.slice(-1),mode:null,initialDimensions:t};r.fluidWidth&&!r.fluidHeight?(r.mode="width",r.ratio=r.initialDimensions.width/parseFloat(n.dimensions.height)):!r.fluidWidth&&r.fluidHeight&&(r.mode="height",r.ratio=parseFloat(n.dimensions.width)/r.initialDimensions.height),e.holderData.fluidConfig=r}else f(e)}}function d(){var e,n=[],r=Object.keys(F.vars.invisibleImages);r.forEach(function(t){e=F.vars.invisibleImages[t],k(e)&&"img"==e.nodeName.toLowerCase()&&(n.push(e),delete F.vars.invisibleImages[t])}),n.length&&O.run({images:n}),setTimeout(function(){t.requestAnimationFrame(d)},10)}function c(){F.vars.visibilityCheckStarted||(t.requestAnimationFrame(d),F.vars.visibilityCheckStarted=!0)}function f(e){e.holderData.invisibleId||(F.vars.invisibleId+=1,F.vars.invisibleImages["i"+F.vars.invisibleId]=e,e.holderData.invisibleId=F.vars.invisibleId)}function p(e){F.vars.debounceTimer||e.call(this),F.vars.debounceTimer&&t.clearTimeout(F.vars.debounceTimer),F.vars.debounceTimer=t.setTimeout(function(){F.vars.debounceTimer=null,e.call(this)},F.setup.debounce)}function g(){p(function(){h(null)})}var m=n(2),v=n(3),y=n(6),w=n(7),b=n(8),x=n(9),S=n(10),A=n(11),C=n(12),E=n(15),T=w.extend,k=w.dimensionCheck,j=A.svg_ns,O={version:A.version,addTheme:function(e,t){return null!=e&&null!=t&&(F.settings.themes[e]=t),delete F.vars.cache.themeKeys,this},addImage:function(e,t){var n=x.getNodeArray(t);return n.forEach(function(t){var n=x.newEl("img"),r={};r[F.setup.dataAttr]=e,x.setAttr(n,r),t.appendChild(n)}),this},setResizeUpdate:function(e,t){e.holderData&&(e.holderData.resizeUpdate=!!t,e.holderData.resizeUpdate&&h(e))},run:function(e){e=e||{};var n={},a=T(F.settings,e);F.vars.preempted=!0,F.vars.dataAttr=a.dataAttr||F.setup.dataAttr,n.renderer=a.renderer?a.renderer:F.setup.renderer,-1===F.setup.renderers.join(",").indexOf(n.renderer)&&(n.renderer=F.setup.supportsSVG?"svg":F.setup.supportsCanvas?"canvas":"html");var s=x.getNodeArray(a.images),l=x.getNodeArray(a.bgnodes),h=x.getNodeArray(a.stylenodes),u=x.getNodeArray(a.objects);return n.stylesheets=[],n.svgXMLStylesheet=!0,n.noFontFallback=a.noFontFallback?a.noFontFallback:!1,h.forEach(function(e){if(e.attributes.rel&&e.attributes.href&&"stylesheet"==e.attributes.rel.value){var t=e.attributes.href.value,r=x.newEl("a");r.href=t;var i=r.protocol+"//"+r.host+r.pathname+r.search;n.stylesheets.push(i)}}),l.forEach(function(e){if(t.getComputedStyle){var r=t.getComputedStyle(e,null).getPropertyValue("background-image"),s=e.getAttribute("data-background-src"),l=s||r,h=null,u=a.domain+"/",d=l.indexOf(u);if(0===d)h=l;else if(1===d&&"?"===l[0])h=l.slice(1);else{var c=l.substr(d).match(/([^\"]*)"?\)/);if(null!==c)h=c[1];else if(0===l.indexOf("url("))throw"Holder: unable to parse background URL: "+l}if(null!=h){var f=i(h,a);f&&o({mode:"background",el:e,flags:f,engineSettings:n})}}}),u.forEach(function(e){var t={};try{t.data=e.getAttribute("data"),t.dataSrc=e.getAttribute(F.vars.dataAttr)}catch(i){}var o=null!=t.data&&0===t.data.indexOf(a.domain),s=null!=t.dataSrc&&0===t.dataSrc.indexOf(a.domain);o?r(a,n,t.data,e):s&&r(a,n,t.dataSrc,e)}),s.forEach(function(e){var t={};try{t.src=e.getAttribute("src"),t.dataSrc=e.getAttribute(F.vars.dataAttr),t.rendered=e.getAttribute("data-holder-rendered")}catch(i){}var o=null!=t.src,s=null!=t.dataSrc&&0===t.dataSrc.indexOf(a.domain),l=null!=t.rendered&&"true"==t.rendered;o?0===t.src.indexOf(a.domain)?r(a,n,t.src,e):s&&(l?r(a,n,t.dataSrc,e):!function(e,t,n,i,o){w.imageExists(e,function(e){e||r(t,n,i,o)})}(t.src,a,n,t.dataSrc,e)):s&&r(a,n,t.dataSrc,e)}),this}},F={settings:{domain:"holder.js",images:"img",objects:"object",bgnodes:"body .holderjs",stylenodes:"head link.holderjs",themes:{gray:{bg:"#EEEEEE",fg:"#AAAAAA"},social:{bg:"#3a5a97",fg:"#FFFFFF"},industrial:{bg:"#434A52",fg:"#C2F200"},sky:{bg:"#0D8FDB",fg:"#FFFFFF"},vine:{bg:"#39DBAC",fg:"#1E292C"},lava:{bg:"#F8591A",fg:"#1C2846"}}},defaults:{size:10,units:"pt",scale:1/16}},z=function(){var e=null,t=null,n=null;return function(r){var i=r.root;if(F.setup.supportsSVG){var o=!1,a=function(e){return document.createTextNode(e)};(null==e||e.parentNode!==document.body)&&(o=!0),e=b.initSVG(e,i.properties.width,i.properties.height),e.style.display="block",o&&(t=x.newEl("text",j),n=a(null),x.setAttr(t,{x:0}),t.appendChild(n),e.appendChild(t),document.body.appendChild(e),e.style.visibility="hidden",e.style.position="absolute",e.style.top="-100%",e.style.left="-100%");var s=i.children.holderTextGroup,l=s.properties;x.setAttr(t,{y:l.font.size,style:w.cssProps({"font-weight":l.font.weight,"font-size":l.font.size+l.font.units,"font-family":l.font.family})}),n.nodeValue=l.text;var h=t.getBBox(),u=Math.ceil(h.width/i.properties.width),d=l.text.split(" "),c=l.text.match(/\\n/g);u+=null==c?0:c.length,n.nodeValue=l.text.replace(/[ ]+/g,"");var f=t.getComputedTextLength(),p=h.width-f,g=Math.round(p/Math.max(1,d.length-1)),m=[];if(u>1){n.nodeValue="";for(var v=0;v=0?t:1)}function o(e){x?i(e):S.push(e)}null==document.readyState&&document.addEventListener&&(document.addEventListener("DOMContentLoaded",function C(){document.removeEventListener("DOMContentLoaded",C,!1),document.readyState="complete"},!1),document.readyState="loading");var a=e.document,s=a.documentElement,l="load",h=!1,u="on"+l,d="complete",c="readyState",f="attachEvent",p="detachEvent",g="addEventListener",m="DOMContentLoaded",v="onreadystatechange",y="removeEventListener",w=g in a,b=h,x=h,S=[];if(a[c]===d)i(t);else if(w)a[g](m,n,h),e[g](l,n,h);else{a[f](v,n),e[f](u,n);try{b=null==e.frameElement&&s}catch(A){}b&&b.doScroll&&!function E(){if(!x){try{b.doScroll("left")}catch(e){return i(E,50)}r(),t()}}()}return o.version="1.4.0",o.isReady=function(){return x},o}e.exports="undefined"!=typeof window&&n(window)},function(e,t,n){var r=encodeURIComponent,i=decodeURIComponent,o=n(4),a=n(5),s=/(\w+)\[(\d+)\]/,l=/\w+\.\w+/;t.parse=function(e){if("string"!=typeof e)return{};if(e=o(e),""===e)return{};"?"===e.charAt(0)&&(e=e.slice(1));for(var t={},n=e.split("&"),r=0;r=0;r--)n=e.charCodeAt(r),n>128?t.unshift(["&#",n,";"].join("")):t.unshift(e[r]);return t.join("")},t.imageExists=function(e,t){var n=new Image;n.onerror=function(){t.call(this,!1)},n.onload=function(){t.call(this,!0)},n.src=e},t.decodeHtmlEntity=function(e){return e.replace(/&#(\d+);/g,function(e,t){return String.fromCharCode(t)})},t.dimensionCheck=function(e){var t={height:e.clientHeight,width:e.clientWidth};return t.height&&t.width?t:!1},t.truthy=function(e){return"string"==typeof e?"true"===e||"yes"===e||"1"===e||"on"===e||"✓"===e:!!e},t.parseColor=function(e){var t,n=/(^(?:#?)[0-9a-f]{6}$)|(^(?:#?)[0-9a-f]{3}$)/i,r=/^rgb\((\d{1,3})\s*,\s*(\d{1,3})\s*,\s*(\d{1,3})\s*\)$/,i=/^rgba\((\d{1,3})\s*,\s*(\d{1,3})\s*,\s*(\d{1,3})\s*,\s*(0\.\d{1,}|1)\)$/,o=e.match(n);return null!==o?(t=o[1]||o[2],"#"!==t[0]?"#"+t:t):(o=e.match(r),null!==o?t="rgb("+o.slice(1).join(",")+")":(o=e.match(i),null!==o?t="rgba("+o.slice(1).join(",")+")":null))},t.canvasRatio=function(){var t=1,n=1;if(e.document){var r=e.document.createElement("canvas");if(r.getContext){var i=r.getContext("2d");t=e.devicePixelRatio||1,n=i.webkitBackingStorePixelRatio||i.mozBackingStorePixelRatio||i.msBackingStorePixelRatio||i.oBackingStorePixelRatio||i.backingStorePixelRatio||1}}return t/n}}).call(t,function(){return this}())},function(e,t,n){(function(e){var r=n(9),i="http://www.w3.org/2000/svg",o=8;t.initSVG=function(e,t,n){var a,s,l=!1;e&&e.querySelector?(s=e.querySelector("style"),null===s&&(l=!0)):(e=r.newEl("svg",i),l=!0),l&&(a=r.newEl("defs",i),s=r.newEl("style",i),r.setAttr(s,{type:"text/css"}),a.appendChild(s),e.appendChild(a)),e.webkitMatchesSelector&&e.setAttribute("xmlns",i);for(var h=0;h=0;l--){var h=s.createProcessingInstruction("xml-stylesheet",'href="'+a[l]+'" rel="stylesheet"');s.insertBefore(h,s.firstChild)}s.removeChild(s.documentElement),o=i.serializeToString(s)}var u=i.serializeToString(t);return u=u.replace(/\&(\#[0-9]{2,}\;)/g,"&$1"),o+u}}}).call(t,function(){return this}())},function(e,t){(function(e){t.newEl=function(t,n){return e.document?null==n?e.document.createElement(t):e.document.createElementNS(n,t):void 0},t.setAttr=function(e,t){for(var n in t)e.setAttribute(n,t[n])},t.createXML=function(){return e.DOMParser?(new DOMParser).parseFromString("","application/xml"):void 0},t.getNodeArray=function(t){var n=null;return"string"==typeof t?n=document.querySelectorAll(t):e.NodeList&&t instanceof e.NodeList?n=t:e.Node&&t instanceof e.Node?n=[t]:e.HTMLCollection&&t instanceof e.HTMLCollection?n=t:t instanceof Array?n=t:null===t&&(n=[]),n=Array.prototype.slice.call(n)}}).call(t,function(){return this}())},function(e,t){var n=function(e,t){"string"==typeof e&&(this.original=e,"#"===e.charAt(0)&&(e=e.slice(1)),/[^a-f0-9]+/i.test(e)||(3===e.length&&(e=e.replace(/./g,"$&$&")),6===e.length&&(this.alpha=1,t&&t.alpha&&(this.alpha=t.alpha),this.set(parseInt(e,16)))))};n.rgb2hex=function(e,t,n){function r(e){var t=(0|e).toString(16);return 16>e&&(t="0"+t),t}return[e,t,n].map(r).join("")},n.hsl2rgb=function(e,t,n){var r=e/60,i=(1-Math.abs(2*n-1))*t,o=i*(1-Math.abs(parseInt(r)%2-1)),a=n-i/2,s=0,l=0,h=0;return r>=0&&1>r?(s=i,l=o):r>=1&&2>r?(s=o,l=i):r>=2&&3>r?(l=i,h=o):r>=3&&4>r?(l=o,h=i):r>=4&&5>r?(s=o,h=i):r>=5&&6>r&&(s=i,h=o),s+=a,l+=a,h+=a,s=parseInt(255*s),l=parseInt(255*l),h=parseInt(255*h),[s,l,h]},n.prototype.set=function(e){this.raw=e;var t=(16711680&this.raw)>>16,n=(65280&this.raw)>>8,r=255&this.raw,i=.2126*t+.7152*n+.0722*r,o=-.09991*t-.33609*n+.436*r,a=.615*t-.55861*n-.05639*r;return this.rgb={r:t,g:n,b:r},this.yuv={y:i,u:o,v:a},this},n.prototype.lighten=function(e){var t=Math.min(1,Math.max(0,Math.abs(e)))*(0>e?-1:1),r=255*t|0,i=Math.min(255,Math.max(0,this.rgb.r+r)),o=Math.min(255,Math.max(0,this.rgb.g+r)),a=Math.min(255,Math.max(0,this.rgb.b+r)),s=n.rgb2hex(i,o,a);return new n(s)},n.prototype.toHex=function(e){return(e?"#":"")+this.raw.toString(16)},n.prototype.lighterThan=function(e){return e instanceof n||(e=new n(e)),this.yuv.y>e.yuv.y},n.prototype.blendAlpha=function(e){e instanceof n||(e=new n(e));var t=e,r=this,i=t.alpha*t.rgb.r+(1-t.alpha)*r.rgb.r,o=t.alpha*t.rgb.g+(1-t.alpha)*r.rgb.g,a=t.alpha*t.rgb.b+(1-t.alpha)*r.rgb.b;return new n(n.rgb2hex(i,o,a))},e.exports=n},function(e,t){e.exports={version:"2.9.0",svg_ns:"http://www.w3.org/2000/svg"}},function(e,t,n){function r(e,t){return d.element({tag:t,width:e.width,height:e.height,fill:e.properties.fill})}function i(e){return h.cssProps({fill:e.fill,"font-weight":e.font.weight,"font-family":e.font.family+", monospace","font-size":e.font.size+e.font.units})}function o(e,t,n){var r=n/2;return["M",r,r,"H",e-r,"V",t-r,"H",r,"V",0,"M",0,r,"L",e,t-r,"M",0,t-r,"L",e,r].join(" ")}var a=n(13),s=n(8),l=n(11),h=n(7),u=l.svg_ns,d={element:function(e){var t=e.tag,n=e.content||"";return delete e.tag,delete e.content,[t,n,e]}};e.exports=function(e,t){var n=t.engineSettings,l=n.stylesheets,h=l.map(function(e){return''}).join("\n"),c="holder_"+Number(new Date).toString(16),f=e.root,p=f.children.holderTextGroup,g="#"+c+" text { "+i(p.properties)+" } ";p.y+=.8*p.textPositionData.boundingBox.height;var m=[];Object.keys(p.children).forEach(function(e){var t=p.children[e];Object.keys(t.children).forEach(function(e){var n=t.children[e],r=p.x+t.x+n.x,i=p.y+t.y+n.y,o=d.element({tag:"text",content:n.properties.text,x:r,y:i});m.push(o)})});var v=d.element({tag:"g",content:m}),y=null;if(f.children.holderBg.properties.outline){var w=f.children.holderBg.properties.outline;y=d.element({tag:"path",d:o(f.children.holderBg.width,f.children.holderBg.height,w.width),"stroke-width":w.width,stroke:w.fill,fill:"none"})}var b=r(f.children.holderBg,"rect"),x=[];x.push(b),w&&x.push(y),x.push(v);var S=d.element({tag:"g",id:c,content:x}),A=d.element({tag:"style",content:g,type:"text/css"}),C=d.element({tag:"defs",content:A}),E=d.element({tag:"svg",content:[C,S],width:f.properties.width,height:f.properties.height,xmlns:u,viewBox:[0,0,f.properties.width,f.properties.height].join(" "),preserveAspectRatio:"none"}),T=a(E);T=h+T[0];var k=s.svgStringToDataURI(T,"background"===t.mode);return k}},function(e,t,n){n(14);e.exports=function r(e,t,n){"use strict";function i(e){var t=e.match(/^\w+/),r={tag:t?t[0]:"div",attr:{},children:[]},i=e.match(/#([\w-]+)/),o=e.match(/\$([\w-]+)/),a=e.match(/\.[\w-]+/g);return i&&(r.attr.id=i[1],n[i[1]]=r),o&&(n[o[1]]=r),a&&(r.attr["class"]=a.join(" ").replace(/\./g,"")),e.match(/&$/g)&&(f=!1),r}function o(e,t){return null!==t&&t!==!1&&void 0!==t?"string"!=typeof t&&"object"!=typeof t?String(t):t:void 0}function a(e){return String(e).replace(/&/g,"&").replace(/"/g,""")}function s(e){return String(e).replace(/&/g,"&").replace(/"/g,""").replace(/'/g,"'").replace(//g,">")}var l,h,u,d,c=1,f=!0;if(n=n||{},"string"==typeof e[0])e[0]=i(e[0]);else{if(!Array.isArray(e[0]))throw new Error("First element of array must be a string, or an array and not "+JSON.stringify(e[0]));c=0}for(;c",e[0]=l}return n[0]=e[0],u&&u(e[0]),n}},function(e,t){function n(e){return String(e).replace(/&/g,"&").replace(/"/g,""").replace(/'/g,"'").replace(//g,">")}e.exports=n},function(e,t,n){var r=n(9),i=n(7);e.exports=function(){var e=r.newEl("canvas"),t=null;return function(n){null==t&&(t=e.getContext("2d"));var r=i.canvasRatio(),o=n.root;e.width=r*o.properties.width,e.height=r*o.properties.height,t.textBaseline="middle";var a=o.children.holderBg,s=r*a.width,l=r*a.height,h=2,u=h/2;t.fillStyle=a.properties.fill,t.fillRect(0,0,s,l),a.properties.outline&&(t.strokeStyle=a.properties.outline.fill,t.lineWidth=a.properties.outline.width,t.moveTo(u,u),t.lineTo(s-u,u),t.lineTo(s-u,l-u),t.lineTo(u,l-u),t.lineTo(u,u),t.moveTo(0,u),t.lineTo(s,l-u),t.moveTo(0,l-u),t.lineTo(s,u),t.stroke());var d=o.children.holderTextGroup;t.font=d.properties.font.weight+" "+r*d.properties.font.size+d.properties.font.units+" "+d.properties.font.family+", monospace",t.fillStyle=d.properties.fill;for(var c in d.children){var f=d.children[c];for(var p in f.children){var g=f.children[p],m=r*(d.x+f.x+g.x),v=r*(d.y+f.y+g.y+d.properties.leading/2);t.fillText(g.properties.text,m,v)}}return e.toDataURL("image/png")}}()}])}),function(e,t){t&&(Holder=e.Holder)}(this,"undefined"!=typeof Meteor&&"undefined"!=typeof Package); \ No newline at end of file diff --git a/docs/index.html b/docs/index.html deleted file mode 100644 index b5684e8c3..000000000 --- a/docs/index.html +++ /dev/null @@ -1,261 +0,0 @@ - - - - - - - -Build and Modify your Shiny UI, visually • shinyuieditor - - - - - - - - - - - - - - - -
    -
    - - - - -
    -
    -
    - - -

    A visual tool for building the UI portion of a Shiny application that generates clean and human-readable code.

    -

    The goal of the Shiny Ui Editor is to allow people to build the broad-level UI for their Shiny app without writing code. The editor is intended for those who may not be comfortable with the HTML-style code of Shiny’s UI functions or who simply don’t want to fiddle with sizes to get things laid out correctly.

    -
    -

    ⚠️ shinyuieditor is currently in Alpha. -

    -

    It may be unstable, and the API may change. We’re excited to hear your feedback, but please don’t use it for production applications just yet!

    -
    -
    -

    Installing -

    -

    While in development the package is only available on github:

    -
    -install.packages("remotes")
    -
    -# Install using the remotes package
    -remotes::install_github("rstudio/shinyuieditor")
    -

    🚨 Installation fail? See the Trouble installing section.

    -
    -
    -

    Feedback -

    -

    Found a bug or want to suggest a feature? Use the github issues page: github repo’s issues..

    -

    More general comments can be sent via email () or for more public discourse, twitter.

    -

    The things most useful for feedback at this stage are:

    -
      -
    • Are there interaction patterns you kept wanting to do that were either unavailable or not intuitive? E.g., Wanting to delete an element with the delete key or by throwing the element off the screen.
    • -
    • Did the app crash? If so -
        -
      • Was the crash reflected in errors in the R console?
      • -
      • if not, were there errors in the browser’s javascript console? (Keyboard shortcut Ctrl-Shift-J on Windows, or Cmd-Option-J on Mac.)
      • -
      -
    • -
    • Do you have any ideas about how you could see yourself or others using the editor that are not currently supported?
    • -
    -
    -
    -

    Getting help -

    -

    If the UI is confusing, there’s a tour mode that walks you through the various components of the Ui Editor. Simple click the button titled “Tour App” to enter the tour mode. Also check out the FAQs section (vignette('faqs')) and the “How To” article (vignette('how-to')).

    -
    -
    -

    Trouble installing -

    -

    Because the package uses a remote dependency (gridlayout) installation can sometimes fail in confusing ways.

    -
    -

    HTTP error 404, Not Found -

    -
    > remotes::install_github('rstudio/shinyuieditor')
    -Error: Failed to install 'shinyuieditor' from GitHub:
    -  HTTP error 404.
    -  Not Found
    -
    -  Did you spell the repo owner (`rstudio`) and repo name (`shinyuieditor`) correctly?
    -  - If spelling is correct, check that you have the required permissions to access the repo.
    -

    You may need to setup your github PAT to access. To set this up run usethis::create_github_token() in the terminal and follow the prompts.

    -

    Using remotes?

    -

    usethis::create_github_token() no longer puts your PAT in an environment variable, however that’s the method remotes uses for authentication. You can get around this by using the withr package to temporarily set the environment variable.

    -
    -withr::with_envvar(
    -  list( GITHUB_PAT = gitcreds::gitcreds_get()$password ),
    -  remotes::install_github('rstudio/shinyuieditor')
    -)
    -
    -
    -

    Subscript out of bounds -

    -
    > pak::pkg_install('rstudio/shinyuieditor')
    -Error: subscript out of bounds
    -Type .Last.error.trace to see where the error occurred
    -

    This occurs for some reason when trying to reinstall or update the package using pak. The easiest solution is to either use remotes (see above), or to uninstall both shinyuieditor and gridlayout and then reinstall.

    -
    -remove.packages(c('shinyuieditor', 'gridlayout'))
    -# now works
    -pak::pkg_install("rstudio/shinyuieditor")
    -
    -
    -
    -

    Overarching principle -

    -

    We’re trying hard to constrain the feature set so we have fewer but higher-quality features. Lots of the no-code UI builders expose so many options that, ultimately, they’re more complex to use than just writing the code by hand. By generating code for the user, we’re letting them flesh out those details by hand on top of a solid foundation instead of forcing them to do it in a (probably sub-optimal) visual paradigm.

    -
    -

    Complexity is anything related to the structure of a system that makes it hard to understand and modify that system

    -
    -

    - A Philosophy of Software Design, John Ousterhout

    -
    -
    -
    - - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    -

    Site built with pkgdown 2.0.5.

    -
    - -
    -
    - - - - - - - - diff --git a/docs/link.svg b/docs/link.svg deleted file mode 100644 index c948c0170..000000000 --- a/docs/link.svg +++ /dev/null @@ -1 +0,0 @@ - diff --git a/docs/news/index.html b/docs/news/index.html deleted file mode 100644 index 88b91715e..000000000 --- a/docs/news/index.html +++ /dev/null @@ -1,169 +0,0 @@ - -Changelog • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    - -
    -

    Major new features and improvements

    -
    • Edits can now be made in either ui editor or the in the code and the updates are now automatically synced (fca63396948905055d6f42d05f87993bc3620c65)
    • -
    • New single-file starter templates (geyser and chick weights)
    • -
    • The main container for placing items on grid is now gridlayout::grid_card() -
    • -
    -
    -

    Minor new features and improvements

    -
    • Tract resizing is now much quicker and has less visual noise due to only showing small size-popups (5e767eef9e62170f758d1aab87ba22464008cd7b)
    • -
    • Website updated with a bunch of new articles
    • -
    • Added some explanatory text about the format of grid-names to the popup for naming newly added grid items (ca625edb3c65c5a0da4ebebb5b9d04013c4e84e5)
    • -
    • The app preview window now no-longer shoes up at all if there’s no preview connection. (ae5d8113bd687bd7f7c2d540347bf3289bb57f49)
    • -
    -
    -

    Bug fixes

    -
    • Theme argument is now supported in gridlayout::grid_page() (#51)
    • -
    • Numeric inputs are now usable in firefox (See “Known bugs” for more detail.)
    • -
    -
    -

    Known bugs

    -
    • Firefox inputs don’t have increment buttons (#60)
    • -
    • Arguments that a component knows about but are supplied a non-known argument type will simply get wiped away (#58)
    • -
    • Can fail installing on windows using pak (#53)
    • -
    -
    -
    - -
    -

    Major new features and improvements

    -
    • Single-file apps are now supported (#41, #42)
    • -
    • Rehauled the interface for updating the layout for gridlayout::grid_page(). Tracts can now be resized by dragging the divisions and the resizing controls hide when not in use to allow for more efficient use of space.
    • -
    • Any code outside of the ui declaration is now preserved, along with library() calls (#38, #42)
    • -
    • By default, namespaces are omitted from generated code in favor of placing library() calls at the top of the file (#42)
    • -
    -
    -

    Minor new features and improvements

    -
    • Refreshing the app preview now has animation to let the user know something actually happened (#34, #44)
    • -
    • Arguments to functions that are not simple primative types are now preserved (#29, #37)
    • -
    • If the browser window containing the editor is closed, the ui server now terminates, freeing the terminal (#27, #43)
    • -
    -
    -

    Bug fixes

    -
    • Leaving early from the editor no longer returns NULL to the console (#36, #45)
    • -
    • Resizing grid panels to a smaller size now respects the grid tracts (#25, #46)
    • -
    • Fixed accidental allowance of gridlayout::grid_panel_plot() being dropped into a gridlayout::grid_panel_stack() which could cause an invalid ui function state (#35, #49).
    • -
    -
    -
    - -
    • Editor now works with Safari (#33)
    • -
    -
    - - - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/pkgdown.css b/docs/pkgdown.css deleted file mode 100644 index 80ea5b838..000000000 --- a/docs/pkgdown.css +++ /dev/null @@ -1,384 +0,0 @@ -/* Sticky footer */ - -/** - * Basic idea: https://philipwalton.github.io/solved-by-flexbox/demos/sticky-footer/ - * Details: https://github.com/philipwalton/solved-by-flexbox/blob/master/assets/css/components/site.css - * - * .Site -> body > .container - * .Site-content -> body > .container .row - * .footer -> footer - * - * Key idea seems to be to ensure that .container and __all its parents__ - * have height set to 100% - * - */ - -html, body { - height: 100%; -} - -body { - position: relative; -} - -body > .container { - display: flex; - height: 100%; - flex-direction: column; -} - -body > .container .row { - flex: 1 0 auto; -} - -footer { - margin-top: 45px; - padding: 35px 0 36px; - border-top: 1px solid #e5e5e5; - color: #666; - display: flex; - flex-shrink: 0; -} -footer p { - margin-bottom: 0; -} -footer div { - flex: 1; -} -footer .pkgdown { - text-align: right; -} -footer p { - margin-bottom: 0; -} - -img.icon { - float: right; -} - -/* Ensure in-page images don't run outside their container */ -.contents img { - max-width: 100%; - height: auto; -} - -/* Fix bug in bootstrap (only seen in firefox) */ -summary { - display: list-item; -} - -/* Typographic tweaking ---------------------------------*/ - -.contents .page-header { - margin-top: calc(-60px + 1em); -} - -dd { - margin-left: 3em; -} - -/* Section anchors ---------------------------------*/ - -a.anchor { - display: none; - margin-left: 5px; - width: 20px; - height: 20px; - - background-image: url(./link.svg); - background-repeat: no-repeat; - background-size: 20px 20px; - background-position: center center; -} - -h1:hover .anchor, -h2:hover .anchor, -h3:hover .anchor, -h4:hover .anchor, -h5:hover .anchor, -h6:hover .anchor { - display: inline-block; -} - -/* Fixes for fixed navbar --------------------------*/ - -.contents h1, .contents h2, .contents h3, .contents h4 { - padding-top: 60px; - margin-top: -40px; -} - -/* Navbar submenu --------------------------*/ - -.dropdown-submenu { - position: relative; -} - -.dropdown-submenu>.dropdown-menu { - top: 0; - left: 100%; - margin-top: -6px; - margin-left: -1px; - border-radius: 0 6px 6px 6px; -} - -.dropdown-submenu:hover>.dropdown-menu { - display: block; -} - -.dropdown-submenu>a:after { - display: block; - content: " "; - float: right; - width: 0; - height: 0; - border-color: transparent; - border-style: solid; - border-width: 5px 0 5px 5px; - border-left-color: #cccccc; - margin-top: 5px; - margin-right: -10px; -} - -.dropdown-submenu:hover>a:after { - border-left-color: #ffffff; -} - -.dropdown-submenu.pull-left { - float: none; -} - -.dropdown-submenu.pull-left>.dropdown-menu { - left: -100%; - margin-left: 10px; - border-radius: 6px 0 6px 6px; -} - -/* Sidebar --------------------------*/ - -#pkgdown-sidebar { - margin-top: 30px; - position: -webkit-sticky; - position: sticky; - top: 70px; -} - -#pkgdown-sidebar h2 { - font-size: 1.5em; - margin-top: 1em; -} - -#pkgdown-sidebar h2:first-child { - margin-top: 0; -} - -#pkgdown-sidebar .list-unstyled li { - margin-bottom: 0.5em; -} - -/* bootstrap-toc tweaks ------------------------------------------------------*/ - -/* All levels of nav */ - -nav[data-toggle='toc'] .nav > li > a { - padding: 4px 20px 4px 6px; - font-size: 1.5rem; - font-weight: 400; - color: inherit; -} - -nav[data-toggle='toc'] .nav > li > a:hover, -nav[data-toggle='toc'] .nav > li > a:focus { - padding-left: 5px; - color: inherit; - border-left: 1px solid #878787; -} - -nav[data-toggle='toc'] .nav > .active > a, -nav[data-toggle='toc'] .nav > .active:hover > a, -nav[data-toggle='toc'] .nav > .active:focus > a { - padding-left: 5px; - font-size: 1.5rem; - font-weight: 400; - color: inherit; - border-left: 2px solid #878787; -} - -/* Nav: second level (shown on .active) */ - -nav[data-toggle='toc'] .nav .nav { - display: none; /* Hide by default, but at >768px, show it */ - padding-bottom: 10px; -} - -nav[data-toggle='toc'] .nav .nav > li > a { - padding-left: 16px; - font-size: 1.35rem; -} - -nav[data-toggle='toc'] .nav .nav > li > a:hover, -nav[data-toggle='toc'] .nav .nav > li > a:focus { - padding-left: 15px; -} - -nav[data-toggle='toc'] .nav .nav > .active > a, -nav[data-toggle='toc'] .nav .nav > .active:hover > a, -nav[data-toggle='toc'] .nav .nav > .active:focus > a { - padding-left: 15px; - font-weight: 500; - font-size: 1.35rem; -} - -/* orcid ------------------------------------------------------------------- */ - -.orcid { - font-size: 16px; - color: #A6CE39; - /* margins are required by official ORCID trademark and display guidelines */ - margin-left:4px; - margin-right:4px; - vertical-align: middle; -} - -/* Reference index & topics ----------------------------------------------- */ - -.ref-index th {font-weight: normal;} - -.ref-index td {vertical-align: top; min-width: 100px} -.ref-index .icon {width: 40px;} -.ref-index .alias {width: 40%;} -.ref-index-icons .alias {width: calc(40% - 40px);} -.ref-index .title {width: 60%;} - -.ref-arguments th {text-align: right; padding-right: 10px;} -.ref-arguments th, .ref-arguments td {vertical-align: top; min-width: 100px} -.ref-arguments .name {width: 20%;} -.ref-arguments .desc {width: 80%;} - -/* Nice scrolling for wide elements --------------------------------------- */ - -table { - display: block; - overflow: auto; -} - -/* Syntax highlighting ---------------------------------------------------- */ - -pre, code, pre code { - background-color: #f8f8f8; - color: #333; -} -pre, pre code { - white-space: pre-wrap; - word-break: break-all; - overflow-wrap: break-word; -} - -pre { - border: 1px solid #eee; -} - -pre .img, pre .r-plt { - margin: 5px 0; -} - -pre .img img, pre .r-plt img { - background-color: #fff; -} - -code a, pre a { - color: #375f84; -} - -a.sourceLine:hover { - text-decoration: none; -} - -.fl {color: #1514b5;} -.fu {color: #000000;} /* function */ -.ch,.st {color: #036a07;} /* string */ -.kw {color: #264D66;} /* keyword */ -.co {color: #888888;} /* comment */ - -.error {font-weight: bolder;} -.warning {font-weight: bolder;} - -/* Clipboard --------------------------*/ - -.hasCopyButton { - position: relative; -} - -.btn-copy-ex { - position: absolute; - right: 0; - top: 0; - visibility: hidden; -} - -.hasCopyButton:hover button.btn-copy-ex { - visibility: visible; -} - -/* headroom.js ------------------------ */ - -.headroom { - will-change: transform; - transition: transform 200ms linear; -} -.headroom--pinned { - transform: translateY(0%); -} -.headroom--unpinned { - transform: translateY(-100%); -} - -/* mark.js ----------------------------*/ - -mark { - background-color: rgba(255, 255, 51, 0.5); - border-bottom: 2px solid rgba(255, 153, 51, 0.3); - padding: 1px; -} - -/* vertical spacing after htmlwidgets */ -.html-widget { - margin-bottom: 10px; -} - -/* fontawesome ------------------------ */ - -.fab { - font-family: "Font Awesome 5 Brands" !important; -} - -/* don't display links in code chunks when printing */ -/* source: https://stackoverflow.com/a/10781533 */ -@media print { - code a:link:after, code a:visited:after { - content: ""; - } -} - -/* Section anchors --------------------------------- - Added in pandoc 2.11: https://github.com/jgm/pandoc-templates/commit/9904bf71 -*/ - -div.csl-bib-body { } -div.csl-entry { - clear: both; -} -.hanging-indent div.csl-entry { - margin-left:2em; - text-indent:-2em; -} -div.csl-left-margin { - min-width:2em; - float:left; -} -div.csl-right-inline { - margin-left:2em; - padding-left:1em; -} -div.csl-indent { - margin-left: 2em; -} diff --git a/docs/pkgdown.js b/docs/pkgdown.js deleted file mode 100644 index 6f0eee40b..000000000 --- a/docs/pkgdown.js +++ /dev/null @@ -1,108 +0,0 @@ -/* http://gregfranko.com/blog/jquery-best-practices/ */ -(function($) { - $(function() { - - $('.navbar-fixed-top').headroom(); - - $('body').css('padding-top', $('.navbar').height() + 10); - $(window).resize(function(){ - $('body').css('padding-top', $('.navbar').height() + 10); - }); - - $('[data-toggle="tooltip"]').tooltip(); - - var cur_path = paths(location.pathname); - var links = $("#navbar ul li a"); - var max_length = -1; - var pos = -1; - for (var i = 0; i < links.length; i++) { - if (links[i].getAttribute("href") === "#") - continue; - // Ignore external links - if (links[i].host !== location.host) - continue; - - var nav_path = paths(links[i].pathname); - - var length = prefix_length(nav_path, cur_path); - if (length > max_length) { - max_length = length; - pos = i; - } - } - - // Add class to parent
  • , and enclosing
  • if in dropdown - if (pos >= 0) { - var menu_anchor = $(links[pos]); - menu_anchor.parent().addClass("active"); - menu_anchor.closest("li.dropdown").addClass("active"); - } - }); - - function paths(pathname) { - var pieces = pathname.split("/"); - pieces.shift(); // always starts with / - - var end = pieces[pieces.length - 1]; - if (end === "index.html" || end === "") - pieces.pop(); - return(pieces); - } - - // Returns -1 if not found - function prefix_length(needle, haystack) { - if (needle.length > haystack.length) - return(-1); - - // Special case for length-0 haystack, since for loop won't run - if (haystack.length === 0) { - return(needle.length === 0 ? 0 : -1); - } - - for (var i = 0; i < haystack.length; i++) { - if (needle[i] != haystack[i]) - return(i); - } - - return(haystack.length); - } - - /* Clipboard --------------------------*/ - - function changeTooltipMessage(element, msg) { - var tooltipOriginalTitle=element.getAttribute('data-original-title'); - element.setAttribute('data-original-title', msg); - $(element).tooltip('show'); - element.setAttribute('data-original-title', tooltipOriginalTitle); - } - - if(ClipboardJS.isSupported()) { - $(document).ready(function() { - var copyButton = ""; - - $("div.sourceCode").addClass("hasCopyButton"); - - // Insert copy buttons: - $(copyButton).prependTo(".hasCopyButton"); - - // Initialize tooltips: - $('.btn-copy-ex').tooltip({container: 'body'}); - - // Initialize clipboard: - var clipboardBtnCopies = new ClipboardJS('[data-clipboard-copy]', { - text: function(trigger) { - return trigger.parentNode.textContent.replace(/\n#>[^\n]*/g, ""); - } - }); - - clipboardBtnCopies.on('success', function(e) { - changeTooltipMessage(e.trigger, 'Copied!'); - e.clearSelection(); - }); - - clipboardBtnCopies.on('error', function() { - changeTooltipMessage(e.trigger,'Press Ctrl+C or Command+C to copy'); - }); - }); - } -})(window.jQuery || window.$) diff --git a/docs/pkgdown.yml b/docs/pkgdown.yml deleted file mode 100644 index 7d0980d2c..000000000 --- a/docs/pkgdown.yml +++ /dev/null @@ -1,13 +0,0 @@ -pandoc: '2.18' -pkgdown: 2.0.5 -pkgdown_sha: ~ -articles: - faqs: faqs.html - how-to: how-to.html - quick-start: quick-start.html - ui-editor-live-demo: ui-editor-live-demo.html -last_built: 2022-08-19T19:18Z -urls: - reference: https://rstudio.github.io/shinyuieditor/reference - article: https://rstudio.github.io/shinyuieditor/articles - diff --git a/docs/reference/Rplot001.png b/docs/reference/Rplot001.png deleted file mode 100644 index 17a358060..000000000 Binary files a/docs/reference/Rplot001.png and /dev/null differ diff --git a/docs/reference/create_output_subscribers.html b/docs/reference/create_output_subscribers.html deleted file mode 100644 index f284bfdcd..000000000 --- a/docs/reference/create_output_subscribers.html +++ /dev/null @@ -1,189 +0,0 @@ - -Create a subscribable stream to a function output — create_output_subscribers • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Create a subscribable stream to a function output

    -
    - -
    -
    create_output_subscribers(
    -  source_fn,
    -  filter_fn = function(...) TRUE,
    -  delay = 0.1,
    -  callback = NULL
    -)
    -
    - -
    -

    Arguments

    -
    source_fn
    -

    A zero-argument function who's return value is to be -subscribed to.

    - - -
    filter_fn
    -

    Optional function returning boolean that can be used to skip -invoking all the subscribed functions on a given loop.

    - - -
    delay
    -

    How frequently to poll source_fn.

    - - -
    callback
    -

    A callback to be run on each poll round with output of -source_fn. Same as using $subscribe() method without ability to cancel -subscription for just this callback.

    - -
    -
    -

    Value

    - - -

    A list with two callbacks attached: $subscribe() which will add a -new callback to the subscription queue that takes as its input the output -of source_fn(); and $cleanup which is used to stop listening to the -output of source_fn().

    -
    - -
    -

    Examples

    -
    
    -clock <- shinyuieditor:::create_output_subscribers(
    -  source_fn = Sys.time,
    -  delay = 1
    -)
    -
    -tic_tok <- clock$subscribe(
    -  function(t) {
    -    cat(
    -      if (as.integer(t) %% 2 == 0) "Tic" else "Tok",
    -      "\n"
    -    )
    -  }
    -)
    -popcorn <- clock$subscribe(
    -  function(t) {
    -    cat(paste("At the tone the time is", t, "\n"))
    -  }
    -)
    -
    -# unsubscribe to just popcorn
    -popcorn()
    -
    -# stop listening entirely
    -clock$cancel_all()
    -
    -
    -
    -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/deparse_ui_fn.html b/docs/reference/deparse_ui_fn.html deleted file mode 100644 index 531323167..000000000 --- a/docs/reference/deparse_ui_fn.html +++ /dev/null @@ -1,142 +0,0 @@ - -Deparse ui function tree to expression — deparse_ui_fn • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Deparse ui function tree to expression

    -
    - -
    -
    deparse_ui_fn(ui_tree, remove_namespace = FALSE)
    -
    - -
    -

    Arguments

    -
    ui_tree
    -

    Valid ui tree intermediate representation of an apps ui

    - - -
    remove_namespace
    -

    Should the generated code have the namespaces removed -or should generated function calls take the form of pkg::fn()

    - -
    -
    -

    Value

    - - -

    A list with call: language expression of the generated code, and -namespaces_removed: a character vector of all the namespaces that were -stripped from the ui functions (only has elements if remove_namespaces = TRUE)

    -
    - -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/get_app_ui_file.html b/docs/reference/get_app_ui_file.html deleted file mode 100644 index baf6d21aa..000000000 --- a/docs/reference/get_app_ui_file.html +++ /dev/null @@ -1,137 +0,0 @@ - -Get the file defining the ui for a shiny app directory — get_app_ui_file • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Get the file defining the ui for a shiny app directory

    -
    - -
    -
    get_app_ui_file(app_loc)
    -
    - -
    -

    Arguments

    -
    app_loc
    -

    Path to a shiny app

    - -
    -
    -

    Value

    - - -

    Path to either the app.R file in directory in the case of -single-file apps, or ui.R in the case of multi-file apps. If both exist -then app.R will take precedence

    -
    - -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/get_file_ui_definition_info.html b/docs/reference/get_file_ui_definition_info.html deleted file mode 100644 index 1fc355188..000000000 --- a/docs/reference/get_file_ui_definition_info.html +++ /dev/null @@ -1,518 +0,0 @@ - -Get app ui information from script — get_file_ui_definition_info • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Get app ui information from script

    -
    - -
    -
    get_file_ui_definition_info(file_lines, type = "single-file")
    -
    - -
    -

    Arguments

    -
    file_lines
    -

    Character vector of the lines of the file that defines a -shiny app's ui (as from readLines()).

    - - -
    type
    -

    Is the app a single-file app? E.g. app is container entirely in -app.R? Or is it multi-file?

    - -
    -
    -

    Value

    - - -

    List with both the type and file_lines mirrored from the -arguments of the same name. Along with this the ui_bounds containing the -start and end lines of the file section that defines the app's ui, the -ui_tree IR that defines that ui, and loaded_libraries: libraries loaded -via library() calls in the script.

    -
    - -
    -

    Examples

    -
    
    -# Note the use of the triple colon, this function is not exported
    -# shinyuieditor:::get_file_ui_definition_info(...)
    -
    -# Can handle single-file app.R
    -app_loc <- system.file(
    -  "app-templates/geyser/app.R",
    -  package = "shinyuieditor"
    - )
    -shinyuieditor:::get_file_ui_definition_info(readLines(app_loc), type = "single-file")
    -#> $type
    -#> [1] "single-file"
    -#> 
    -#> $file_lines
    -#>  [1] "library(shiny)"                                                 
    -#>  [2] "library(gridlayout)"                                            
    -#>  [3] ""                                                               
    -#>  [4] "# App template from the shinyuieditor"                          
    -#>  [5] "ui <- grid_page("                                               
    -#>  [6] "  layout = c("                                                  
    -#>  [7] "    \"header header\","                                         
    -#>  [8] "    \"sidebar distPlot\","                                      
    -#>  [9] "    \"sidebar bluePlot\""                                       
    -#> [10] "  ),"                                                           
    -#> [11] "  row_sizes = c("                                               
    -#> [12] "    \"100px\","                                                 
    -#> [13] "    \"1fr\","                                                   
    -#> [14] "    \"1fr\""                                                    
    -#> [15] "  ),"                                                           
    -#> [16] "  col_sizes = c("                                               
    -#> [17] "    \"250px\","                                                 
    -#> [18] "    \"1fr\""                                                    
    -#> [19] "  ),"                                                           
    -#> [20] "  gap_size = \"1rem\","                                         
    -#> [21] "  grid_card("                                                   
    -#> [22] "    area = \"sidebar\","                                        
    -#> [23] "    item_gap = \"12px\","                                       
    -#> [24] "    item_alignment = \"top\","                                  
    -#> [25] "    title = \"Settings\","                                      
    -#> [26] "    sliderInput("                                               
    -#> [27] "      inputId = \"bins\","                                      
    -#> [28] "      label = \"Number of Bins\","                              
    -#> [29] "      min = 12L,"                                               
    -#> [30] "      max = 100L,"                                              
    -#> [31] "      value = 30L,"                                             
    -#> [32] "      width = \"100%\""                                         
    -#> [33] "    )"                                                          
    -#> [34] "  ),"                                                           
    -#> [35] "  grid_card_text("                                              
    -#> [36] "    area = \"header\","                                         
    -#> [37] "    content = \"Geysers!\","                                    
    -#> [38] "    alignment = \"start\","                                     
    -#> [39] "    is_title = FALSE"                                           
    -#> [40] "  ),"                                                           
    -#> [41] "  grid_card_plot(area = \"bluePlot\"),"                         
    -#> [42] "  grid_card_plot(area = \"distPlot\")"                          
    -#> [43] ")"                                                              
    -#> [44] ""                                                               
    -#> [45] "# Define server logic required to draw a histogram"             
    -#> [46] "server <- function(input, output) {"                            
    -#> [47] ""                                                               
    -#> [48] "  output$distPlot <- renderPlot({"                              
    -#> [49] "    # generate bins based on input$bins from ui.R"              
    -#> [50] "    x    <- faithful[, 2]"                                      
    -#> [51] "    bins <- seq(min(x), max(x), length.out = input$bins + 1)"   
    -#> [52] ""                                                               
    -#> [53] "    # draw the histogram with the specified number of bins"     
    -#> [54] "    hist(x, breaks = bins, col = 'darkgray', border = 'white')" 
    -#> [55] "  })"                                                           
    -#> [56] ""                                                               
    -#> [57] "  output$bluePlot <- renderPlot({"                              
    -#> [58] "    # generate bins based on input$bins from ui.R"              
    -#> [59] "    x    <- faithful[, 2]"                                      
    -#> [60] "    bins <- seq(min(x), max(x), length.out = input$bins + 1)"   
    -#> [61] ""                                                               
    -#> [62] "    # draw the histogram with the specified number of bins"     
    -#> [63] "    hist(x, breaks = bins, col = 'steelblue', border = 'white')"
    -#> [64] "  })"                                                           
    -#> [65] ""                                                               
    -#> [66] "}"                                                              
    -#> [67] ""                                                               
    -#> [68] "shinyApp(ui, server)"                                           
    -#> [69] ""                                                               
    -#> 
    -#> $ui_bounds
    -#> $ui_bounds$start
    -#> [1] 5
    -#> 
    -#> $ui_bounds$end
    -#> [1] 43
    -#> 
    -#> 
    -#> $ui_tree
    -#> $ui_tree$uiName
    -#> [1] "gridlayout::grid_page"
    -#> 
    -#> $ui_tree$uiArguments
    -#> $ui_tree$uiArguments$row_sizes
    -#> [1] "100px" "1fr"   "1fr"  
    -#> 
    -#> $ui_tree$uiArguments$col_sizes
    -#> [1] "250px" "1fr"  
    -#> 
    -#> $ui_tree$uiArguments$gap_size
    -#> [1] "1rem"
    -#> 
    -#> $ui_tree$uiArguments$areas
    -#>      [,1]      [,2]      
    -#> [1,] "header"  "header"  
    -#> [2,] "sidebar" "distPlot"
    -#> [3,] "sidebar" "bluePlot"
    -#> 
    -#> 
    -#> $ui_tree$uiChildren
    -#> $ui_tree$uiChildren[[1]]
    -#> $ui_tree$uiChildren[[1]]$uiName
    -#> [1] "gridlayout::grid_card"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments
    -#> $ui_tree$uiChildren[[1]]$uiArguments$area
    -#> [1] "sidebar"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments$item_alignment
    -#> [1] "top"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments$title
    -#> [1] "Settings"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments$item_gap
    -#> [1] "12px"
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiChildren
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiName
    -#> [1] "shiny::sliderInput"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiArguments
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiArguments$inputId
    -#> [1] "bins"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiArguments$label
    -#> [1] "Number of Bins"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiArguments$min
    -#> [1] 12
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiArguments$max
    -#> [1] 100
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiArguments$value
    -#> [1] 30
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiChildren[[1]]$uiArguments$width
    -#> [1] "100%"
    -#> 
    -#> 
    -#> 
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[2]]
    -#> $ui_tree$uiChildren[[2]]$uiName
    -#> [1] "gridlayout::grid_card_text"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiArguments
    -#> $ui_tree$uiChildren[[2]]$uiArguments$area
    -#> [1] "header"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiArguments$content
    -#> [1] "Geysers!"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiArguments$alignment
    -#> [1] "start"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiArguments$is_title
    -#> [1] FALSE
    -#> 
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[3]]
    -#> $ui_tree$uiChildren[[3]]$uiName
    -#> [1] "gridlayout::grid_card_plot"
    -#> 
    -#> $ui_tree$uiChildren[[3]]$uiArguments
    -#> $ui_tree$uiChildren[[3]]$uiArguments$area
    -#> [1] "bluePlot"
    -#> 
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[4]]
    -#> $ui_tree$uiChildren[[4]]$uiName
    -#> [1] "gridlayout::grid_card_plot"
    -#> 
    -#> $ui_tree$uiChildren[[4]]$uiArguments
    -#> $ui_tree$uiChildren[[4]]$uiArguments$area
    -#> [1] "distPlot"
    -#> 
    -#> 
    -#> 
    -#> 
    -#> 
    -#> $loaded_libraries
    -#> [1] "shiny"      "gridlayout"
    -#> 
    -
    -# Also handles multi-file apps
    -app_loc <- system.file("app-templates/geyser_multi-file/ui.R", package = "shinyuieditor")
    -shinyuieditor:::get_file_ui_definition_info(readLines(app_loc), type = "multi-file")
    -#> $type
    -#> [1] "multi-file"
    -#> 
    -#> $file_lines
    -#>  [1] "gridlayout::grid_page("                            
    -#>  [2] "  layout = c("                                     
    -#>  [3] "    \"header header\","                            
    -#>  [4] "    \"sidebar bluePlot\","                         
    -#>  [5] "    \"sidebar distPlot\""                          
    -#>  [6] "  ),"                                              
    -#>  [7] "  row_sizes = c("                                  
    -#>  [8] "    \"100px\","                                    
    -#>  [9] "    \"1fr\","                                      
    -#> [10] "    \"1fr\""                                       
    -#> [11] "  ),"                                              
    -#> [12] "  col_sizes = c("                                  
    -#> [13] "    \"250px\","                                    
    -#> [14] "    \"1fr\""                                       
    -#> [15] "  ),"                                              
    -#> [16] "  gap_size = \"15px\","                            
    -#> [17] "  gridlayout::grid_card_text("                     
    -#> [18] "    area = \"header\","                            
    -#> [19] "    content = \"Geysers!\","                       
    -#> [20] "    h_align = \"start\","                          
    -#> [21] "    is_title = TRUE"                               
    -#> [22] "  ),"                                              
    -#> [23] "  gridlayout::grid_card("                          
    -#> [24] "    area = \"sidebar\","                           
    -#> [25] "    item_alignment = \"top\","                     
    -#> [26] "    item_gap = \"12px\","                          
    -#> [27] "    shiny::sliderInput("                           
    -#> [28] "      inputId = \"bins\","                         
    -#> [29] "      label = \"Number of Bins\","                 
    -#> [30] "      min = 5L,"                                   
    -#> [31] "      max = 50L,"                                  
    -#> [32] "      value = 20L,"                                
    -#> [33] "      width = \"100%\""                            
    -#> [34] "    )"                                             
    -#> [35] "  ),"                                              
    -#> [36] "  gridlayout::grid_card_plot(area = \"distPlot\"),"
    -#> [37] "  gridlayout::grid_card_plot(area = \"bluePlot\")" 
    -#> [38] ")"                                                 
    -#> 
    -#> $ui_bounds
    -#> $ui_bounds$start
    -#> [1] 1
    -#> 
    -#> $ui_bounds$end
    -#> [1] 38
    -#> 
    -#> 
    -#> $ui_tree
    -#> $ui_tree$uiName
    -#> [1] "gridlayout::grid_page"
    -#> 
    -#> $ui_tree$uiArguments
    -#> $ui_tree$uiArguments$row_sizes
    -#> [1] "100px" "1fr"   "1fr"  
    -#> 
    -#> $ui_tree$uiArguments$col_sizes
    -#> [1] "250px" "1fr"  
    -#> 
    -#> $ui_tree$uiArguments$gap_size
    -#> [1] "15px"
    -#> 
    -#> $ui_tree$uiArguments$areas
    -#>      [,1]      [,2]      
    -#> [1,] "header"  "header"  
    -#> [2,] "sidebar" "bluePlot"
    -#> [3,] "sidebar" "distPlot"
    -#> 
    -#> 
    -#> $ui_tree$uiChildren
    -#> $ui_tree$uiChildren[[1]]
    -#> $ui_tree$uiChildren[[1]]$uiName
    -#> [1] "gridlayout::grid_card_text"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments
    -#> $ui_tree$uiChildren[[1]]$uiArguments$area
    -#> [1] "header"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments$content
    -#> [1] "Geysers!"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments$h_align
    -#> [1] "start"
    -#> 
    -#> $ui_tree$uiChildren[[1]]$uiArguments$is_title
    -#> [1] TRUE
    -#> 
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[2]]
    -#> $ui_tree$uiChildren[[2]]$uiName
    -#> [1] "gridlayout::grid_card"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiArguments
    -#> $ui_tree$uiChildren[[2]]$uiArguments$area
    -#> [1] "sidebar"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiArguments$item_alignment
    -#> [1] "top"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiArguments$item_gap
    -#> [1] "12px"
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiChildren
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiName
    -#> [1] "shiny::sliderInput"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiArguments
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiArguments$inputId
    -#> [1] "bins"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiArguments$label
    -#> [1] "Number of Bins"
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiArguments$min
    -#> [1] 5
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiArguments$max
    -#> [1] 50
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiArguments$value
    -#> [1] 20
    -#> 
    -#> $ui_tree$uiChildren[[2]]$uiChildren[[1]]$uiArguments$width
    -#> [1] "100%"
    -#> 
    -#> 
    -#> 
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[3]]
    -#> $ui_tree$uiChildren[[3]]$uiName
    -#> [1] "gridlayout::grid_card_plot"
    -#> 
    -#> $ui_tree$uiChildren[[3]]$uiArguments
    -#> $ui_tree$uiChildren[[3]]$uiArguments$area
    -#> [1] "distPlot"
    -#> 
    -#> 
    -#> 
    -#> $ui_tree$uiChildren[[4]]
    -#> $ui_tree$uiChildren[[4]]$uiName
    -#> [1] "gridlayout::grid_card_plot"
    -#> 
    -#> $ui_tree$uiChildren[[4]]$uiArguments
    -#> $ui_tree$uiChildren[[4]]$uiArguments$area
    -#> [1] "bluePlot"
    -#> 
    -#> 
    -#> 
    -#> 
    -#> 
    -#> $loaded_libraries
    -#> character(0)
    -#> 
    -
    -
    -
    -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/index.html b/docs/reference/index.html deleted file mode 100644 index c0c5acd74..000000000 --- a/docs/reference/index.html +++ /dev/null @@ -1,137 +0,0 @@ - -Function reference • shinyuieditor - - -
    -
    - - - -
    -
    - - - - - - - - - - - - -
    -

    Main launcher function

    -

    Run the shinyuieditor. The only function you’ll probably use.

    -
    -

    launch_editor()

    -

    Launch shinyuieditor server

    -

    Advanced

    -

    Functions used behind the scenes to parse app ui into a tree structure. These are provided for context if one chooses to extend the editor, but will almost never be used directly.

    -
    -

    get_file_ui_definition_info()

    -

    Get app ui information from script

    -

    update_ui_definition()

    -

    Update the ui definition for a given ui-defining file

    -

    ui_code_to_tree()

    -

    Convert ui code expression to ui tree IR

    - - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/launch_editor.html b/docs/reference/launch_editor.html deleted file mode 100644 index 4f0e6f789..000000000 --- a/docs/reference/launch_editor.html +++ /dev/null @@ -1,219 +0,0 @@ - -Launch shinyuieditor server — launch_editor • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Spins up an instance of the shinyuieditor server for building new and -editing existing Shiny UIs. The console will be blocked while running the -editor.

    -
    - -
    -
    launch_editor(
    -  app_loc,
    -  host = "127.0.0.1",
    -  port = httpuv::randomPort(),
    -  shiny_background_port = httpuv::randomPort(),
    -  remove_namespace = TRUE,
    -  app_preview = TRUE,
    -  show_logs = TRUE,
    -  show_preview_app_logs = TRUE,
    -  launch_browser = interactive(),
    -  stop_on_browser_close = TRUE
    -)
    -
    - -
    -

    Arguments

    -
    app_loc
    -

    Path to directory containing Shiny app to be visually edited -(either containing an app.R or both a ui.R and server.R). If the -provided location doesn't exist, or doesn't contain an app, the user will -be prompted to choose a starter template which will then be written to the -location specified.

    - - -
    host
    -

    A string that is a valid IPv4 address that is owned by this -server, or "0.0.0.0" to listen on all IP addresses.

    - - -
    port
    -

    A number or integer that indicates the server port that should be -listened on. Note that on most Unix-like systems including Linux and Mac OS -X, port numbers smaller than 1025 require root privileges.

    - - -
    shiny_background_port
    -

    Port to launch the shiny app preview on. -Typically not necessary to set manually.

    - - -
    remove_namespace
    -

    Should namespaces (library:: prefixes) be stripped -from the generated UI code? Set to FALSE if you prefer the style of -shiny::sliderInput() to sliderInput(). If set to TRUE, then any -libraries needed for the nodes will be loaded at the top of your app.R or -ui.R.

    - - -
    app_preview
    -

    Should a live version of the Shiny app being edited run -and auto-show updates made? You may want to disable this if the app has -long-running or processor intensive initialization steps.

    - - -
    show_logs
    -

    Print status messages to the console?

    - - -
    show_preview_app_logs
    -

    Should the logged output of the app preview be -printed? Useful for debugging an app that's not working properly. These -logs are already shown in the app-preview pane of the editor.

    - - -
    launch_browser
    -

    Should the browser be automatically opened to the -editor?

    - - -
    stop_on_browser_close
    -

    Should the editor server end when the browser -window is closed or is dormant for too long. Set this to false if you want -to try running the app in a different browser or refreshing the browser -etc..

    - -
    - -
    -

    Examples

    -
    if (FALSE) {
    -  # Start editor on a non-existing app directory to choose a starter template
    -  launch_editor(app_loc = "empty_directory/")
    -
    -
    -  # You can control where the app runs just like a normal Shiny app.
    -  # This can be useful if you want to access it from a headless server
    -  launch_editor(
    -    app_loc = "my-app/",
    -    host = "0.0.0.0",
    -    port = 8888,
    -    launch_browser = FALSE,
    -    stop_on_browser_close = FALSE
    -  )
    -}
    -
    -
    -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/namespace_ui_fn.html b/docs/reference/namespace_ui_fn.html deleted file mode 100644 index d77122663..000000000 --- a/docs/reference/namespace_ui_fn.html +++ /dev/null @@ -1,145 +0,0 @@ - -Namespace a ui function — namespace_ui_fn • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Throws an error if the function is not in the list of known ui functions

    -
    - -
    -
    namespace_ui_fn(ui_name)
    -
    - -
    -

    Arguments

    -
    ui_name
    -

    Namespaced (pkg::fn) or un-namespaced (fn) function name -of known ui functions

    - -
    -
    -

    Value

    - - -

    Function name in namespaced format

    -
    - -
    -

    Examples

    -
    shinyuieditor:::namespace_ui_fn("gridlayout::grid_page")
    -#> [1] "gridlayout::grid_page"
    -shinyuieditor:::namespace_ui_fn("grid_page")
    -#> [1] "gridlayout::grid_page"
    -
    -
    -
    -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/parse_ui_fn.html b/docs/reference/parse_ui_fn.html deleted file mode 100644 index 64cd7b2af..000000000 --- a/docs/reference/parse_ui_fn.html +++ /dev/null @@ -1,247 +0,0 @@ - -Parse UI function node — parse_ui_fn • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Function to recursively parse a Shiny UI definition. Will build a nested list -of known UI functions and their arguments.

    -
    - -
    -
    parse_ui_fn(ui_node_expr)
    -
    - -
    -

    Arguments

    -
    ui_node_expr
    -

    A language object representing the call of a known Shiny -UI function.

    - -
    -
    -

    Value

    - - -

    A nested list describing the UI of the app for use in the ui editor

    -
    - -
    -

    Examples

    -
    
    -app_expr <- rlang::expr(
    -  gridlayout::grid_page(
    -    layout = "
    -            | 1rem | 250px   | 1fr  |
    -            |------|---------|------|
    -            | 1fr  | sidebar | plot |",
    -    gridlayout::grid_card(
    -      area = "sidebar",
    -      item_alignment = "center",
    -      shiny::sliderInput(
    -        inputId = "bins",
    -        label = "Num Bins",
    -        min = 10L,
    -        max = 100L,
    -        value = 40L
    -      )
    -    ),
    -    gridlayout::grid_card(
    -      area = "plot",
    -      item_alignment = "center",
    -      shiny::plotOutput(
    -        outputId = "distPlot",
    -        height = "100%"
    -      )
    -    )
    -  )
    -)
    -parse_ui_fn(app_expr)
    -#> $uiName
    -#> [1] "gridlayout::grid_page"
    -#> 
    -#> $uiArguments
    -#> $uiArguments$layout
    -#> [1] "\n            | 1rem | 250px   | 1fr  |\n            |------|---------|------|\n            | 1fr  | sidebar | plot |"
    -#> 
    -#> 
    -#> $uiChildren
    -#> $uiChildren[[1]]
    -#> $uiChildren[[1]]$uiName
    -#> [1] "gridlayout::grid_card"
    -#> 
    -#> $uiChildren[[1]]$uiArguments
    -#> $uiChildren[[1]]$uiArguments$area
    -#> [1] "sidebar"
    -#> 
    -#> $uiChildren[[1]]$uiArguments$item_alignment
    -#> [1] "center"
    -#> 
    -#> 
    -#> $uiChildren[[1]]$uiChildren
    -#> $uiChildren[[1]]$uiChildren[[1]]
    -#> $uiChildren[[1]]$uiChildren[[1]]$uiName
    -#> [1] "shiny::sliderInput"
    -#> 
    -#> $uiChildren[[1]]$uiChildren[[1]]$uiArguments
    -#> $uiChildren[[1]]$uiChildren[[1]]$uiArguments$inputId
    -#> [1] "bins"
    -#> 
    -#> $uiChildren[[1]]$uiChildren[[1]]$uiArguments$label
    -#> [1] "Num Bins"
    -#> 
    -#> $uiChildren[[1]]$uiChildren[[1]]$uiArguments$min
    -#> [1] 10
    -#> 
    -#> $uiChildren[[1]]$uiChildren[[1]]$uiArguments$max
    -#> [1] 100
    -#> 
    -#> $uiChildren[[1]]$uiChildren[[1]]$uiArguments$value
    -#> [1] 40
    -#> 
    -#> 
    -#> 
    -#> 
    -#> 
    -#> $uiChildren[[2]]
    -#> $uiChildren[[2]]$uiName
    -#> [1] "gridlayout::grid_card"
    -#> 
    -#> $uiChildren[[2]]$uiArguments
    -#> $uiChildren[[2]]$uiArguments$area
    -#> [1] "plot"
    -#> 
    -#> $uiChildren[[2]]$uiArguments$item_alignment
    -#> [1] "center"
    -#> 
    -#> 
    -#> $uiChildren[[2]]$uiChildren
    -#> $uiChildren[[2]]$uiChildren[[1]]
    -#> $uiChildren[[2]]$uiChildren[[1]]$uiName
    -#> [1] "shiny::plotOutput"
    -#> 
    -#> $uiChildren[[2]]$uiChildren[[1]]$uiArguments
    -#> $uiChildren[[2]]$uiChildren[[1]]$uiArguments$outputId
    -#> [1] "distPlot"
    -#> 
    -#> $uiChildren[[2]]$uiChildren[[1]]$uiArguments$height
    -#> [1] "100%"
    -#> 
    -#> 
    -#> 
    -#> 
    -#> 
    -#> 
    -
    -
    -
    -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/ui_code_to_tree.html b/docs/reference/ui_code_to_tree.html deleted file mode 100644 index 9ba15e3b8..000000000 --- a/docs/reference/ui_code_to_tree.html +++ /dev/null @@ -1,212 +0,0 @@ - -Convert ui code expression to ui tree IR — ui_code_to_tree • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Convert ui code expression to ui tree IR

    -
    - -
    -
    ui_code_to_tree(ui_expr, packages = c())
    -
    - -
    -

    Arguments

    -
    ui_expr
    -

    Language object containing code generate an app ui

    - - -
    packages
    -

    List of any packages that need to be loaded into the -namespace when evaluating the ui_expr

    - -
    -
    -

    Value

    - - -

    A UI tree intermediate representation that can be sent to ui editor -front-end

    -
    - -
    -

    Examples

    -
    # Takes optional list of libraries needed to accurately parse file
    -ui_expr <- rlang::expr(
    -  grid_card(
    -    area = "plot",
    -    plotOutput("distPlot",height = "100%")
    -  )
    -)
    -
    -shinyuieditor:::ui_code_to_tree(ui_expr, packages = c("shiny", "gridlayout"))
    -#> $uiName
    -#> [1] "gridlayout::grid_card"
    -#> 
    -#> $uiArguments
    -#> $uiArguments$area
    -#> [1] "plot"
    -#> 
    -#> 
    -#> $uiChildren
    -#> $uiChildren[[1]]
    -#> $uiChildren[[1]]$uiName
    -#> [1] "shiny::plotOutput"
    -#> 
    -#> $uiChildren[[1]]$uiArguments
    -#> $uiChildren[[1]]$uiArguments$outputId
    -#> [1] "distPlot"
    -#> 
    -#> $uiChildren[[1]]$uiArguments$height
    -#> [1] "100%"
    -#> 
    -#> 
    -#> 
    -#> 
    -
    -
    -# If all functions are namespaced then the packages can be omited
    -ui_expr <- rlang::expr(
    -  gridlayout::grid_card(
    -    area = "plot",
    -    shiny::plotOutput("distPlot", height = "100%")
    -  )
    -)
    -
    -shinyuieditor:::ui_code_to_tree(ui_expr)
    -#> $uiName
    -#> [1] "gridlayout::grid_card"
    -#> 
    -#> $uiArguments
    -#> $uiArguments$area
    -#> [1] "plot"
    -#> 
    -#> 
    -#> $uiChildren
    -#> $uiChildren[[1]]
    -#> $uiChildren[[1]]$uiName
    -#> [1] "shiny::plotOutput"
    -#> 
    -#> $uiChildren[[1]]$uiArguments
    -#> $uiChildren[[1]]$uiArguments$outputId
    -#> [1] "distPlot"
    -#> 
    -#> $uiChildren[[1]]$uiArguments$height
    -#> [1] "100%"
    -#> 
    -#> 
    -#> 
    -#> 
    -
    -
    -
    -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/ui_tree_to_code.html b/docs/reference/ui_tree_to_code.html deleted file mode 100644 index ad90c289b..000000000 --- a/docs/reference/ui_tree_to_code.html +++ /dev/null @@ -1,142 +0,0 @@ - -Convert ui tree IR to code text — ui_tree_to_code • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Convert ui tree IR to code text

    -
    - -
    -
    ui_tree_to_code(ui_tree, remove_namespace = TRUE)
    -
    - -
    -

    Arguments

    -
    ui_tree
    -

    Valid ui tree intermediate representation of an apps ui

    - - -
    remove_namespace
    -

    Should the generated code have the namespaces removed -or should generated function calls take the form of pkg::fn()

    - -
    -
    -

    Value

    - - -

    A list with text: lines of the generated code, and -namespaces_removed: a character vector of all the namespaces that were -stripped from the ui functions (only has elements if remove_namespaces = TRUE)

    -
    - -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/reference/update_ui_definition.html b/docs/reference/update_ui_definition.html deleted file mode 100644 index e24b0ee7e..000000000 --- a/docs/reference/update_ui_definition.html +++ /dev/null @@ -1,146 +0,0 @@ - -Update the ui definition for a given ui-defining file — update_ui_definition • shinyuieditor - - -
    -
    - - - -
    -
    - - -
    -

    Update the ui definition for a given ui-defining file

    -
    - -
    -
    update_ui_definition(file_info, new_ui_tree, remove_namespace = TRUE)
    -
    - -
    -

    Arguments

    -
    file_info
    -

    Info on the ui-defining file as obtained by -shinyuieditor:::get_file_ui_definition_info

    - - -
    new_ui_tree
    -

    The new UI IR tree defining the new ui for the file

    - - -
    remove_namespace
    -

    Should the new ui be generated with namespaces -stripped and library() calls added for any non-defined namespaces?

    - -
    -
    -

    Value

    - - -

    A new character vector containing the lines of the ui-defining file -with the layout updated to match the new_ui_tree.

    -
    - -
    - -
    - - -
    -

    shinyuieditor is an R package developed by RStudio

    -
    - -
    -

    Site built with pkgdown 2.0.5.

    -
    - -
    - - - - - - - - diff --git a/docs/rmarkdown.png b/docs/rmarkdown.png deleted file mode 100644 index 283fe18b5..000000000 Binary files a/docs/rmarkdown.png and /dev/null differ diff --git a/docs/rmd.css b/docs/rmd.css deleted file mode 100644 index ff1d03b7c..000000000 --- a/docs/rmd.css +++ /dev/null @@ -1,467 +0,0 @@ -/* heavily adapted from Desirée De Leon's tidymodels pkgdown CSS */ -/* https://github.com/tidyverse/tidytemplate/blob/master/inst/pkgdown/assets/tidymodels.css */ - -@import url('https://fonts.googleapis.com/css2?family=Work+Sans&display=swap'); -@import url('https://fonts.googleapis.com/css2?family=Source+Code+Pro&display=swap'); - -:root { - --pg-header: #096B72; /*green*/ - --dk-header: #013631; /*darker green*/ - --bw-header: #07555a; /*between medium green*/ - --a-hover: #405359; /*dark grey*/ - --a-alpha: #6C797C; /*dark grey white added*/ - --nav-bkg: #e6f3fc; /*pale blue*/ - --accent: #79beee; /*sky blue*/ -} - -pre, code { - font-family: "Source Code Pro", Consolas, Inconsolata, monospace; - font-size: 16px; -} - -code { - text-transform: none -} - -h1 > code, h2 > code, h3 > code, h4 > code, h5 > code, h6 > code { - font-size: inherit; - background-color: inherit; - color: inherit; -} - -body { - font-size: 18px; - font-family: Work Sans; - line-height: 1.6em; -} - -/* -h1 {font-size: 40px;} -h2 {font-size: 33px;} -h3 {font-size: 23px;} -h4 {font-size: 20px;} -*/ - -h1 { - font-size: 2.0em; - font-weight: 400; - letter-spacing: .08em; -} -h2 { - font-size: 1.7em; - font-weight: 300; - color: var(--pg-header); - letter-spacing: .08em; -} -h3 { - font-size: 1.2em; - text-transform: uppercase; - font-weight: 200; - color: var(--bw-header); - letter-spacing: .1em; -} -h4 { - font-size: 1.2em; - text-transform: none; - font-weight: 600; - color: var(--dk-header); - letter-spacing: .05em; -} - -h1, h2, h3, h4 { - font-family: 'Work Sans', sans-serif; -/*font-weight: normal;*/ -/* font-size: 1.3em; */ -/* letter-spacing: 1.2pt; */ - /*text-transform: uppercase;*/ -} - -.page-header h1 { - color: var(--pg-header); - font-weight: normal; - text-transform: none; - letter-spacing: normal; - font-size: 2.4em; -} - - - - -.contents .page-header { - margin-top: 10px; -} - -a:hover { - color: var(--a-hover); -} - -a { - color: var(--pg-header); -} - -p a { - text-decoration: underline var(--pg-header) dotted; - text-decoration-skip-ink: none; - text-decoration-thickness: from-font; -} - - -/* navbar ----------------------------------------------- */ - -.navbar { - background-color: var(--nav-bkg); - box-shadow: none !important; - border-bottom: 0pt !important; - padding-bottom: 1em; - padding-top: 1em; -} - - -.navbar-brand { - /*background-image: url(reference/figures/rmarkdown.png); - background-size: 32px auto; - background-repeat: no-repeat; - background-position: 15px center;*/ - padding: 0 0 0 10px; - height: 50px; - line-height: 50px; - font-size: 20px; -} - -/* only when using navbar custom template */ -.navbar .info .version-danger { - font-weight: bold; - color: #fff; /* #126180 */ -} - -.navbar-brand .version { - font-family: "Work Sans", sans-serif; -} - -.label-default, -.label-danger { - background-color: var(--a-alpha); -} - -/* make room in navbar for longer text */ -.navbar .info { - /* background-image: url(rmarkdown.png); - background-size: 40px auto; - background-repeat: no-repeat; - background-position: 10px center; */ - float: right; - height: 50px; - width: 250px; - font-size: 80%; - position: relative; - margin-left: 10px; - margin-top: 10px; - padding-left: 0px; /* 60px; */ - /* border-left: 1px solid #C8CED0; */ -} - -.navbar > .container .navbar-brand, -.navbar > .container-fluid .navbar-brand { - padding-right: 10px; -} - -.navbar-nav li a { - /*text-transform: uppercase;*/ - letter-spacing: 0.1rem; - font-size: 1em; -} - -/* -.navbar-nav li a:hover { - color: #187BA2 !important; -} -*/ - -.navbar-default .navbar-nav > .active > a, -.navbar-default .navbar-nav > .active > a:hover, -.navbar-default .navbar-nav > .active > a:focus { - color: #013631; - background-color: inherit; - text-decoration: none; -} - -.navbar-default .navbar-brand, -.navbar-default .navbar-nav > li > a { - color: #555555; -} - -.navbar-default .navbar-link:hover { - color: #013631; - text-decoration: none !important; -} - -.navbar-default .navbar-nav > li > a:focus, -.navbar-default .navbar-nav > li > a:hover { - color: #013631; - background-color: transparent; -} - -.navbar-default .navbar-brand:hover, -.navbar-default .navbar-brand:focus { - color: #013631; - background-color: transparent; -} - -/* dropdowns in navbar */ -.navbar-default .navbar-nav > .open > a, -.navbar-default .navbar-nav > .open > a:focus, -.navbar-default .navbar-nav > .open > a:hover { - color: #555; - background-color: var(--nav-bkg); -} - -.dropdown-menu > .active > a, -.dropdown-menu > .active > a:hover, -.dropdown-menu > .active > a:focus { - color: var(--pg-header); - text-decoration: none; - outline: 0; - background-color: var(--nav-bkg); -} - -/* White Space */ - -.row { - margin-top: 1.5em; -} - -@media (min-width: 768px) { - .contents { - padding-right: 4em; - } -} - -.contents h1, .contents h2, .contents h3, .contents h4{ - margin-bottom: 1.3em; - margin-top: -30px; /* originally -40px */ -} - - -/* sidebar ------------------------------------------------ */ - -#pkgdown-sidebar { - /* border-left: 1px solid #7e7e7e; */ - padding-left: 25px; - top: 7em; /* so that navbar doesn't cover it for sticky pos */ -} - -#pkgdown-sidebar h2 { - font-size: 1em; - margin-bottom: 0.85em; - text-transform: uppercase; - /* font-weight: 700; */ - color: var(--pg-header); - letter-spacing: 1.5pt; - padding-left: 10px; -} - -#pkgdown-sidebar ul.list-unstyled { - padding-left: 0; - list-style: none; - margin-bottom: 1.2em; - font-size: 1.5rem; -} - - -#pkgdown-sidebar .list-unstyled li { - padding-bottom: 1em; - padding-left: 10px; - margin-bottom: 0; - line-height: 1.4em; - letter-spacing: 0.4pt; - font-size: 1.5rem; -} - -#pkgdown-sidebar small.roles { - font-size: 0.8em; - text-transform: uppercase; - color: #00000094; -} - -#pkgdown-sidebar a { - color: var(--a-hover); - text-decoration: none; -} - -#pkgdown-sidebar a:hover { - text-decoration: underline; - color: #013631; -} - - -/*----TOC sidebar on non-homepages----*/ - -nav[data-toggle='toc'] .nav > li > a { - padding: 4px 20px 4px 10px; /* Left-padding changed from 6px to 5px, so shift left does not happen on hover */ -} - -/* Active, hover, and focus links */ - -nav[data-toggle='toc'] .nav > .active > a, -nav[data-toggle='toc'] .nav > .active:hover > a, -nav[data-toggle='toc'] .nav > .active:focus > a, -nav[data-toggle='toc'] ul > li > a:hover { - border-left: 3px solid var(--accent); - padding-left: 10px; - letter-spacing: 1pt; - font-size: 15px; - text-decoration: none !important; -} - -/* Increase space between list items, descrease within-item spacing */ -nav[data-toggle='toc'] .nav li { - margin-top: 0.5em; - line-height: 1.5; -} - -nav[data-toggle='toc'] > ul > li:first-child { - margin-top: 0; -} - -nav[data-toggle='toc'] .nav > li > a:hover, -nav[data-toggle='toc'] .nav > li > a:focus { - padding-left: 10px; - border-left: 3px solid var(--accent); -} - - -/* Links NOT hovered or active */ - -nav[data-toggle='toc'] ul > li > a { - border-left: 3px solid #FFFFFF; - padding-left: 10px; - letter-spacing: 1pt; - font-size: 15px; - text-decoration: none !important; -} - -/* Nested List items: never get border*/ - -nav[data-toggle='toc'] .nav .nav > li > a:hover, -nav[data-toggle='toc'] .nav .nav > li > a:active, -nav[data-toggle='toc'] .nav .nav > li > a:focus, -nav[data-toggle='toc'] .nav .nav > li > a, - -nav[data-toggle='toc'] .nav .nav > .active > a, -nav[data-toggle='toc'] .nav .nav > .active:hover > a, -nav[data-toggle='toc'] .nav .nav > .active:focus > a { - padding-left: calc(10px + 15px); - font-size: 1.35rem; - border-left: none !important; -} - - - -/*----Copy Buttons ----*/ - -.btn-primary { - background-color: var(--pg-header); - border-color: var(--pg-header); -} - -.btn-primary:hover, -.btn-primary:focus, -.btn-primary:active:hover { - background-color: var(--accent); - border-color: var(--accent); -} - -/*----- COLORED LIST BULLET----*/ - -ul > li::marker { - color: var(--accent); -} - -/* from original source docs */ - -.snippet { - border: solid 1px #cccccc; - margin-bottom: 12px; - width: 100%; -} - -.screenshot { - border: solid 1px #cccccc; - margin-bottom: 15px; -} - -.screenshot-right { - float: right; - margin-left: 15px; -} - -.holder { - padding-right: 5px; - padding-bottom: 5px; -} - -.nopadding { - padding: 0 !important; - margin: 0 !important; -} - -.thumbnail { - border: 1px solid white; -} - -.thumbnail .caption { - padding: 0; - padding-top: 4px; - padding-left: 3px; - font-size: 0.9em; - color: var(--dk-header); -} - -a.thumbnail:hover { - text-decoration: none; -} - -table a:not(.btn), .table a:not(.btn) { - text-decoration: none; -} - -table a:not(.btn):hover, .table a:not(.btn):hover { - text-decoration: underline; -} - -a.anchor { - margin-left: -22px; - display: inline-block; - width: 22px; - height: 22px; - visibility: hidden; - background-image: url(./link.svg); - background-repeat: no-repeat; - background-size: 20px 20px; - background-position: center bottom; -} - - -a.thumbnail.active, -a.thumbnail:focus, -a.thumbnail:hover { - border-color: #FEDB00; -} - - - -/* tweak headroom.js to not disappear as aggressively at the top of the page */ -.headroom { - will-change: transform; - transition: transform 400ms ease; -} - -.page-header { - padding-bottom: 0px; -} - -/* Size of book cover in README */ -img.book { - height: 400px; - width: auto; -} diff --git a/docs/sitemap.xml b/docs/sitemap.xml deleted file mode 100644 index 9019963e2..000000000 --- a/docs/sitemap.xml +++ /dev/null @@ -1,72 +0,0 @@ - - - - https://rstudio.github.io/shinyuieditor/404.html - - - https://rstudio.github.io/shinyuieditor/LICENSE-text.html - - - https://rstudio.github.io/shinyuieditor/LICENSE.html - - - https://rstudio.github.io/shinyuieditor/articles/demo-app/index.html - - - https://rstudio.github.io/shinyuieditor/articles/faqs.html - - - https://rstudio.github.io/shinyuieditor/articles/how-to.html - - - https://rstudio.github.io/shinyuieditor/articles/index.html - - - https://rstudio.github.io/shinyuieditor/articles/quick-start.html - - - https://rstudio.github.io/shinyuieditor/articles/ui-editor-live-demo.html - - - https://rstudio.github.io/shinyuieditor/authors.html - - - https://rstudio.github.io/shinyuieditor/index.html - - - https://rstudio.github.io/shinyuieditor/news/index.html - - - https://rstudio.github.io/shinyuieditor/reference/create_output_subscribers.html - - - https://rstudio.github.io/shinyuieditor/reference/deparse_ui_fn.html - - - https://rstudio.github.io/shinyuieditor/reference/get_app_ui_file.html - - - https://rstudio.github.io/shinyuieditor/reference/get_file_ui_definition_info.html - - - https://rstudio.github.io/shinyuieditor/reference/index.html - - - https://rstudio.github.io/shinyuieditor/reference/launch_editor.html - - - https://rstudio.github.io/shinyuieditor/reference/namespace_ui_fn.html - - - https://rstudio.github.io/shinyuieditor/reference/parse_ui_fn.html - - - https://rstudio.github.io/shinyuieditor/reference/ui_code_to_tree.html - - - https://rstudio.github.io/shinyuieditor/reference/ui_tree_to_code.html - - - https://rstudio.github.io/shinyuieditor/reference/update_ui_definition.html - - diff --git a/docs/snippets/snippets.js b/docs/snippets/snippets.js deleted file mode 100755 index 795f4cc56..000000000 --- a/docs/snippets/snippets.js +++ /dev/null @@ -1,23 +0,0 @@ - - -function loadSnippet(snippet, mode) { - mode = mode || "markdown"; - $("#" + snippet).addClass("snippet"); - var editor = ace.edit(snippet); - editor.setHighlightActiveLine(false); - editor.setShowPrintMargin(false); - editor.setReadOnly(true); - editor.setShowFoldWidgets(false); - editor.renderer.setDisplayIndentGuides(false); - editor.setTheme("ace/theme/textmate"); - editor.$blockScrolling = Infinity; - editor.session.setMode("ace/mode/" + mode); - editor.session.getSelection().clearSelection(); - - $.get("snippets/" + snippet + ".md", function(data) { - editor.setValue(data, -1); - editor.setOptions({ - maxLines: editor.session.getLength() - }); - }); -} diff --git a/docs/tidyverse-2.css b/docs/tidyverse-2.css deleted file mode 100755 index 99deb7ef3..000000000 --- a/docs/tidyverse-2.css +++ /dev/null @@ -1,133 +0,0 @@ -body {font-size: 16px;} -h1 {font-size: 40px;} -h2 {font-size: 30px;} -h3 {font-size: 23px;} - -.contents .page-header { - margin-top: 10px; -} - -/* reduce h3 margin for proper nesting under h2 */ -.contents h3 {margin-top: -60px} - -.ref-arguments th {vertical-align: top;} - -/* navbar ----------------------------------------------- */ - -.navbar .info { - float: left; - height: 50px; - width: 140px; - font-size: 80%; - position: relative; - margin-left: 5px; -} -.navbar .info .partof { - position: absolute; - top: 0; -} -.navbar .info .version { - position: absolute; - bottom: 0; -} -.navbar .info .version-danger { - font-weight: bold; - color: orange; -} - -.navbar-form { - margin-top: 3px; - margin-bottom: 0; -} - -.navbar-toggle { - margin-top: 8px; - margin-bottom: 5px; -} - -.navbar-nav li a { - padding-bottom: 10px; -} -.navbar-default .navbar-nav > .active > a, -.navbar-default .navbar-nav > .active > a:hover, -.navbar-default .navbar-nav > .active > a:focus { - background-color: #eee; - border-radius: 3px; -} - -/* syntax highlighting ----------------------------------- */ - -.co { - color: #333; -} - -/* footer ------------------------------------------------ */ - -footer { - margin-top: 45px; - padding: 35px 0 36px; - border-top: 1px solid #e5e5e5; - - display: flex; - color: #666; -} -footer p { - margin-bottom: 0; -} -footer .tidyverse { - flex: 1; - margin-right: 1em; -} -footer .author { - flex: 1; - text-align: right; - margin-left: 1em; -} - -/* sidebar ------------------------------------------------ */ - -#sidebar h2 { - font-size: 1.6em; - margin-top: 1em; - margin-bottom: 0.25em; -} - -#sidebar .list-unstyled li { - margin-bottom: 0.5em; - line-height: 1.4; -} - -#sidebar small { - color: #777; -} - -#sidebar .nav { - padding-left: 0px; - list-style-type: none; - color: #5a9ddb; -} - -#sidebar .nav > li { - padding: 10px 0 0px 20px; - display: list-item; - line-height: 20px; - background-image: url(./tocBullet.svg); - background-repeat: no-repeat; - background-size: 16px 280px; - background-position: left 0px; -} - -#sidebar .nav > li.active { - background-position: left -240px; -} - -#sidebar a { - padding: 0px; - color: #5a9ddb; - background-color: transparent; -} - -#sidebar a:hover { - background-color: transparent; - text-decoration: underline; -} diff --git a/docs/tidyverse.css b/docs/tidyverse.css deleted file mode 100755 index 0a8de94a4..000000000 --- a/docs/tidyverse.css +++ /dev/null @@ -1,6531 +0,0 @@ -@charset "UTF-8"; -/*! - * Bootstrap v3.3.7 (http://getbootstrap.com) - * Copyright 2011-2016 Twitter, Inc. - * Licensed under MIT (https://github.com/twbs/bootstrap/blob/master/LICENSE) - */ -/*! normalize.css v3.0.3 | MIT License | github.com/necolas/normalize.css */ -@import url("https://fonts.googleapis.com/css?family=Source+Code+Pro:300,400,700|Source+Sans+Pro:300,400,700"); -html { - font-family: sans-serif; - -ms-text-size-adjust: 100%; - -webkit-text-size-adjust: 100%; } - -body { - margin: 0; } - -article, -aside, -details, -figcaption, -figure, -footer, -header, -hgroup, -main, -menu, -nav, -section, -summary { - display: block; } - -audio, -canvas, -progress, -video { - display: inline-block; - vertical-align: baseline; } - -audio:not([controls]) { - display: none; - height: 0; } - -[hidden], -template { - display: none; } - -a { - background-color: transparent; } - -a:active, -a:hover { - outline: 0; } - -abbr[title] { - border-bottom: 1px dotted; } - -b, -strong { - font-weight: bold; } - -dfn { - font-style: italic; } - -h1 { - font-size: 2em; - margin: 0.67em 0; } - -mark { - background: #ff0; - color: #000; } - -small { - font-size: 80%; } - -sub, -sup { - font-size: 75%; - line-height: 0; - position: relative; - vertical-align: baseline; } - -sup { - top: -0.5em; } - -sub { - bottom: -0.25em; } - -img { - border: 0; } - -svg:not(:root) { - overflow: hidden; } - -figure { - margin: 1em 40px; } - -hr { - box-sizing: content-box; - height: 0; } - -pre { - overflow: auto; } - -code, -kbd, -pre, -samp { - font-family: monospace, monospace; - font-size: 1em; } - -button, -input, -optgroup, -select, -textarea { - color: inherit; - font: inherit; - margin: 0; } - -button { - overflow: visible; } - -button, -select { - text-transform: none; } - -button, -html input[type="button"], -input[type="reset"], -input[type="submit"] { - -webkit-appearance: button; - cursor: pointer; } - -button[disabled], -html input[disabled] { - cursor: default; } - -button::-moz-focus-inner, -input::-moz-focus-inner { - border: 0; - padding: 0; } - -input { - line-height: normal; } - -input[type="checkbox"], -input[type="radio"] { - box-sizing: border-box; - padding: 0; } - -input[type="number"]::-webkit-inner-spin-button, -input[type="number"]::-webkit-outer-spin-button { - height: auto; } - -input[type="search"] { - -webkit-appearance: textfield; - box-sizing: content-box; } - -input[type="search"]::-webkit-search-cancel-button, -input[type="search"]::-webkit-search-decoration { - -webkit-appearance: none; } - -fieldset { - border: 1px solid #c0c0c0; - margin: 0 2px; - padding: 0.35em 0.625em 0.75em; } - -legend { - border: 0; - padding: 0; } - -textarea { - overflow: auto; } - -optgroup { - font-weight: bold; } - -table { - border-collapse: collapse; - border-spacing: 0; } - -td, -th { - padding: 0; } - -/*! Source: https://github.com/h5bp/html5-boilerplate/blob/master/src/css/main.css */ -@media print { - *, - *:before, - *:after { - background: transparent !important; - color: #000 !important; - box-shadow: none !important; - text-shadow: none !important; } - a, - a:visited { - text-decoration: underline; } - a[href]:after { - content: " (" attr(href) ")"; } - abbr[title]:after { - content: " (" attr(title) ")"; } - a[href^="#"]:after, - a[href^="javascript:"]:after { - content: ""; } - pre, - blockquote { - border: 1px solid #999; - page-break-inside: avoid; } - thead { - display: table-header-group; } - tr, - img { - page-break-inside: avoid; } - img { - max-width: 100% !important; } - p, - h2, - h3 { - orphans: 3; - widows: 3; } - h2, - h3 { - page-break-after: avoid; } - .navbar { - display: none; } - .btn > .caret, - .dropup > .btn > .caret { - border-top-color: #000 !important; } - .label { - border: 1px solid #000; } - .table { - border-collapse: collapse !important; } - .table td, - .table th { - background-color: #fff !important; } - .table-bordered th, - .table-bordered td { - border: 1px solid #ddd !important; } } - -@font-face { - font-family: 'Glyphicons Halflings'; - src: url("../fonts/bootstrap/glyphicons-halflings-regular.eot"); - src: url("../fonts/bootstrap/glyphicons-halflings-regular.eot?#iefix") format("embedded-opentype"), url("../fonts/bootstrap/glyphicons-halflings-regular.woff2") format("woff2"), url("../fonts/bootstrap/glyphicons-halflings-regular.woff") format("woff"), url("../fonts/bootstrap/glyphicons-halflings-regular.ttf") format("truetype"), url("../fonts/bootstrap/glyphicons-halflings-regular.svg#glyphicons_halflingsregular") format("svg"); } - -.glyphicon { - position: relative; - top: 1px; - display: inline-block; - font-family: 'Glyphicons Halflings'; - font-style: normal; - font-weight: normal; - line-height: 1; - -webkit-font-smoothing: antialiased; - -moz-osx-font-smoothing: grayscale; } - -.glyphicon-asterisk:before { - content: "\002a"; } - -.glyphicon-plus:before { - content: "\002b"; } - -.glyphicon-euro:before, -.glyphicon-eur:before { - content: "\20ac"; } - -.glyphicon-minus:before { - content: "\2212"; } - -.glyphicon-cloud:before { - content: "\2601"; } - -.glyphicon-envelope:before { - content: "\2709"; } - -.glyphicon-pencil:before { - content: "\270f"; } - -.glyphicon-glass:before { - content: "\e001"; } - -.glyphicon-music:before { - content: "\e002"; } - -.glyphicon-search:before { - content: "\e003"; } - -.glyphicon-heart:before { - content: "\e005"; } - -.glyphicon-star:before { - content: "\e006"; } - -.glyphicon-star-empty:before { - content: "\e007"; } - -.glyphicon-user:before { - content: "\e008"; } - -.glyphicon-film:before { - content: "\e009"; } - -.glyphicon-th-large:before { - content: "\e010"; } - -.glyphicon-th:before { - content: "\e011"; } - -.glyphicon-th-list:before { - content: "\e012"; } - -.glyphicon-ok:before { - content: "\e013"; } - -.glyphicon-remove:before { - content: "\e014"; } - -.glyphicon-zoom-in:before { - content: "\e015"; } - -.glyphicon-zoom-out:before { - content: "\e016"; } - -.glyphicon-off:before { - content: "\e017"; } - -.glyphicon-signal:before { - content: "\e018"; } - -.glyphicon-cog:before { - content: "\e019"; } - -.glyphicon-trash:before { - content: "\e020"; } - -.glyphicon-home:before { - content: "\e021"; } - -.glyphicon-file:before { - content: "\e022"; } - -.glyphicon-time:before { - content: "\e023"; } - -.glyphicon-road:before { - content: "\e024"; } - -.glyphicon-download-alt:before { - content: "\e025"; } - -.glyphicon-download:before { - content: "\e026"; } - -.glyphicon-upload:before { - content: "\e027"; } - -.glyphicon-inbox:before { - content: "\e028"; } - -.glyphicon-play-circle:before { - content: "\e029"; } - -.glyphicon-repeat:before { - content: "\e030"; } - -.glyphicon-refresh:before { - content: "\e031"; } - -.glyphicon-list-alt:before { - content: "\e032"; } - -.glyphicon-lock:before { - content: "\e033"; } - -.glyphicon-flag:before { - content: "\e034"; } - -.glyphicon-headphones:before { - content: "\e035"; } - -.glyphicon-volume-off:before { - content: "\e036"; } - -.glyphicon-volume-down:before { - content: "\e037"; } - -.glyphicon-volume-up:before { - content: "\e038"; } - -.glyphicon-qrcode:before { - content: "\e039"; } - -.glyphicon-barcode:before { - content: "\e040"; } - -.glyphicon-tag:before { - content: "\e041"; } - -.glyphicon-tags:before { - content: "\e042"; } - -.glyphicon-book:before { - content: "\e043"; } - -.glyphicon-bookmark:before { - content: "\e044"; } - -.glyphicon-print:before { - content: "\e045"; } - -.glyphicon-camera:before { - content: "\e046"; } - -.glyphicon-font:before { - content: "\e047"; } - -.glyphicon-bold:before { - content: "\e048"; } - -.glyphicon-italic:before { - content: "\e049"; } - -.glyphicon-text-height:before { - content: "\e050"; } - -.glyphicon-text-width:before { - content: "\e051"; } - -.glyphicon-align-left:before { - content: "\e052"; } - -.glyphicon-align-center:before { - content: "\e053"; } - -.glyphicon-align-right:before { - content: "\e054"; } - -.glyphicon-align-justify:before { - content: "\e055"; } - -.glyphicon-list:before { - content: "\e056"; } - -.glyphicon-indent-left:before { - content: "\e057"; } - -.glyphicon-indent-right:before { - content: "\e058"; } - -.glyphicon-facetime-video:before { - content: "\e059"; } - -.glyphicon-picture:before { - content: "\e060"; } - -.glyphicon-map-marker:before { - content: "\e062"; } - -.glyphicon-adjust:before { - content: "\e063"; } - -.glyphicon-tint:before { - content: "\e064"; } - -.glyphicon-edit:before { - content: "\e065"; } - -.glyphicon-share:before { - content: "\e066"; } - -.glyphicon-check:before { - content: "\e067"; } - -.glyphicon-move:before { - content: "\e068"; } - -.glyphicon-step-backward:before { - content: "\e069"; } - -.glyphicon-fast-backward:before { - content: "\e070"; } - -.glyphicon-backward:before { - content: "\e071"; } - -.glyphicon-play:before { - content: "\e072"; } - -.glyphicon-pause:before { - content: "\e073"; } - -.glyphicon-stop:before { - content: "\e074"; } - -.glyphicon-forward:before { - content: "\e075"; } - -.glyphicon-fast-forward:before { - content: "\e076"; } - -.glyphicon-step-forward:before { - content: "\e077"; } - -.glyphicon-eject:before { - content: "\e078"; } - -.glyphicon-chevron-left:before { - content: "\e079"; } - -.glyphicon-chevron-right:before { - content: "\e080"; } - -.glyphicon-plus-sign:before { - content: "\e081"; } - -.glyphicon-minus-sign:before { - content: "\e082"; } - -.glyphicon-remove-sign:before { - content: "\e083"; } - -.glyphicon-ok-sign:before { - content: "\e084"; } - -.glyphicon-question-sign:before { - content: "\e085"; } - -.glyphicon-info-sign:before { - content: "\e086"; } - -.glyphicon-screenshot:before { - content: "\e087"; } - -.glyphicon-remove-circle:before { - content: "\e088"; } - -.glyphicon-ok-circle:before { - content: "\e089"; } - -.glyphicon-ban-circle:before { - content: "\e090"; } - -.glyphicon-arrow-left:before { - content: "\e091"; } - -.glyphicon-arrow-right:before { - content: "\e092"; } - -.glyphicon-arrow-up:before { - content: "\e093"; } - -.glyphicon-arrow-down:before { - content: "\e094"; } - -.glyphicon-share-alt:before { - content: "\e095"; } - -.glyphicon-resize-full:before { - content: "\e096"; } - -.glyphicon-resize-small:before { - content: "\e097"; } - -.glyphicon-exclamation-sign:before { - content: "\e101"; } - -.glyphicon-gift:before { - content: "\e102"; } - -.glyphicon-leaf:before { - content: "\e103"; } - -.glyphicon-fire:before { - content: "\e104"; } - -.glyphicon-eye-open:before { - content: "\e105"; } - -.glyphicon-eye-close:before { - content: "\e106"; } - -.glyphicon-warning-sign:before { - content: "\e107"; } - -.glyphicon-plane:before { - content: "\e108"; } - -.glyphicon-calendar:before { - content: "\e109"; } - -.glyphicon-random:before { - content: "\e110"; } - -.glyphicon-comment:before { - content: "\e111"; } - -.glyphicon-magnet:before { - content: "\e112"; } - -.glyphicon-chevron-up:before { - content: "\e113"; } - -.glyphicon-chevron-down:before { - content: "\e114"; } - -.glyphicon-retweet:before { - content: "\e115"; } - -.glyphicon-shopping-cart:before { - content: "\e116"; } - -.glyphicon-folder-close:before { - content: "\e117"; } - -.glyphicon-folder-open:before { - content: "\e118"; } - -.glyphicon-resize-vertical:before { - content: "\e119"; } - -.glyphicon-resize-horizontal:before { - content: "\e120"; } - -.glyphicon-hdd:before { - content: "\e121"; } - -.glyphicon-bullhorn:before { - content: "\e122"; } - -.glyphicon-bell:before { - content: "\e123"; } - -.glyphicon-certificate:before { - content: "\e124"; } - -.glyphicon-thumbs-up:before { - content: "\e125"; } - -.glyphicon-thumbs-down:before { - content: "\e126"; } - -.glyphicon-hand-right:before { - content: "\e127"; } - -.glyphicon-hand-left:before { - content: "\e128"; } - -.glyphicon-hand-up:before { - content: "\e129"; } - -.glyphicon-hand-down:before { - content: "\e130"; } - -.glyphicon-circle-arrow-right:before { - content: "\e131"; } - -.glyphicon-circle-arrow-left:before { - content: "\e132"; } - -.glyphicon-circle-arrow-up:before { - content: "\e133"; } - -.glyphicon-circle-arrow-down:before { - content: "\e134"; } - -.glyphicon-globe:before { - content: "\e135"; } - -.glyphicon-wrench:before { - content: "\e136"; } - -.glyphicon-tasks:before { - content: "\e137"; } - -.glyphicon-filter:before { - content: "\e138"; } - -.glyphicon-briefcase:before { - content: "\e139"; } - -.glyphicon-fullscreen:before { - content: "\e140"; } - -.glyphicon-dashboard:before { - content: "\e141"; } - -.glyphicon-paperclip:before { - content: "\e142"; } - -.glyphicon-heart-empty:before { - content: "\e143"; } - -.glyphicon-link:before { - content: "\e144"; } - -.glyphicon-phone:before { - content: "\e145"; } - -.glyphicon-pushpin:before { - content: "\e146"; } - -.glyphicon-usd:before { - content: "\e148"; } - -.glyphicon-gbp:before { - content: "\e149"; } - -.glyphicon-sort:before { - content: "\e150"; } - -.glyphicon-sort-by-alphabet:before { - content: "\e151"; } - -.glyphicon-sort-by-alphabet-alt:before { - content: "\e152"; } - -.glyphicon-sort-by-order:before { - content: "\e153"; } - -.glyphicon-sort-by-order-alt:before { - content: "\e154"; } - -.glyphicon-sort-by-attributes:before { - content: "\e155"; } - -.glyphicon-sort-by-attributes-alt:before { - content: "\e156"; } - -.glyphicon-unchecked:before { - content: "\e157"; } - -.glyphicon-expand:before { - content: "\e158"; } - -.glyphicon-collapse-down:before { - content: "\e159"; } - -.glyphicon-collapse-up:before { - content: "\e160"; } - -.glyphicon-log-in:before { - content: "\e161"; } - -.glyphicon-flash:before { - content: "\e162"; } - -.glyphicon-log-out:before { - content: "\e163"; } - -.glyphicon-new-window:before { - content: "\e164"; } - -.glyphicon-record:before { - content: "\e165"; } - -.glyphicon-save:before { - content: "\e166"; } - -.glyphicon-open:before { - content: "\e167"; } - -.glyphicon-saved:before { - content: "\e168"; } - -.glyphicon-import:before { - content: "\e169"; } - -.glyphicon-export:before { - content: "\e170"; } - -.glyphicon-send:before { - content: "\e171"; } - -.glyphicon-floppy-disk:before { - content: "\e172"; } - -.glyphicon-floppy-saved:before { - content: "\e173"; } - -.glyphicon-floppy-remove:before { - content: "\e174"; } - -.glyphicon-floppy-save:before { - content: "\e175"; } - -.glyphicon-floppy-open:before { - content: "\e176"; } - -.glyphicon-credit-card:before { - content: "\e177"; } - -.glyphicon-transfer:before { - content: "\e178"; } - -.glyphicon-cutlery:before { - content: "\e179"; } - -.glyphicon-header:before { - content: "\e180"; } - -.glyphicon-compressed:before { - content: "\e181"; } - -.glyphicon-earphone:before { - content: "\e182"; } - -.glyphicon-phone-alt:before { - content: "\e183"; } - -.glyphicon-tower:before { - content: "\e184"; } - -.glyphicon-stats:before { - content: "\e185"; } - -.glyphicon-sd-video:before { - content: "\e186"; } - -.glyphicon-hd-video:before { - content: "\e187"; } - -.glyphicon-subtitles:before { - content: "\e188"; } - -.glyphicon-sound-stereo:before { - content: "\e189"; } - -.glyphicon-sound-dolby:before { - content: "\e190"; } - -.glyphicon-sound-5-1:before { - content: "\e191"; } - -.glyphicon-sound-6-1:before { - content: "\e192"; } - -.glyphicon-sound-7-1:before { - content: "\e193"; } - -.glyphicon-copyright-mark:before { - content: "\e194"; } - -.glyphicon-registration-mark:before { - content: "\e195"; } - -.glyphicon-cloud-download:before { - content: "\e197"; } - -.glyphicon-cloud-upload:before { - content: "\e198"; } - -.glyphicon-tree-conifer:before { - content: "\e199"; } - -.glyphicon-tree-deciduous:before { - content: "\e200"; } - -.glyphicon-cd:before { - content: "\e201"; } - -.glyphicon-save-file:before { - content: "\e202"; } - -.glyphicon-open-file:before { - content: "\e203"; } - -.glyphicon-level-up:before { - content: "\e204"; } - -.glyphicon-copy:before { - content: "\e205"; } - -.glyphicon-paste:before { - content: "\e206"; } - -.glyphicon-alert:before { - content: "\e209"; } - -.glyphicon-equalizer:before { - content: "\e210"; } - -.glyphicon-king:before { - content: "\e211"; } - -.glyphicon-queen:before { - content: "\e212"; } - -.glyphicon-pawn:before { - content: "\e213"; } - -.glyphicon-bishop:before { - content: "\e214"; } - -.glyphicon-knight:before { - content: "\e215"; } - -.glyphicon-baby-formula:before { - content: "\e216"; } - -.glyphicon-tent:before { - content: "\26fa"; } - -.glyphicon-blackboard:before { - content: "\e218"; } - -.glyphicon-bed:before { - content: "\e219"; } - -.glyphicon-apple:before { - content: "\f8ff"; } - -.glyphicon-erase:before { - content: "\e221"; } - -.glyphicon-hourglass:before { - content: "\231b"; } - -.glyphicon-lamp:before { - content: "\e223"; } - -.glyphicon-duplicate:before { - content: "\e224"; } - -.glyphicon-piggy-bank:before { - content: "\e225"; } - -.glyphicon-scissors:before { - content: "\e226"; } - -.glyphicon-bitcoin:before { - content: "\e227"; } - -.glyphicon-btc:before { - content: "\e227"; } - -.glyphicon-xbt:before { - content: "\e227"; } - -.glyphicon-yen:before { - content: "\00a5"; } - -.glyphicon-jpy:before { - content: "\00a5"; } - -.glyphicon-ruble:before { - content: "\20bd"; } - -.glyphicon-rub:before { - content: "\20bd"; } - -.glyphicon-scale:before { - content: "\e230"; } - -.glyphicon-ice-lolly:before { - content: "\e231"; } - -.glyphicon-ice-lolly-tasted:before { - content: "\e232"; } - -.glyphicon-education:before { - content: "\e233"; } - -.glyphicon-option-horizontal:before { - content: "\e234"; } - -.glyphicon-option-vertical:before { - content: "\e235"; } - -.glyphicon-menu-hamburger:before { - content: "\e236"; } - -.glyphicon-modal-window:before { - content: "\e237"; } - -.glyphicon-oil:before { - content: "\e238"; } - -.glyphicon-grain:before { - content: "\e239"; } - -.glyphicon-sunglasses:before { - content: "\e240"; } - -.glyphicon-text-size:before { - content: "\e241"; } - -.glyphicon-text-color:before { - content: "\e242"; } - -.glyphicon-text-background:before { - content: "\e243"; } - -.glyphicon-object-align-top:before { - content: "\e244"; } - -.glyphicon-object-align-bottom:before { - content: "\e245"; } - -.glyphicon-object-align-horizontal:before { - content: "\e246"; } - -.glyphicon-object-align-left:before { - content: "\e247"; } - -.glyphicon-object-align-vertical:before { - content: "\e248"; } - -.glyphicon-object-align-right:before { - content: "\e249"; } - -.glyphicon-triangle-right:before { - content: "\e250"; } - -.glyphicon-triangle-left:before { - content: "\e251"; } - -.glyphicon-triangle-bottom:before { - content: "\e252"; } - -.glyphicon-triangle-top:before { - content: "\e253"; } - -.glyphicon-console:before { - content: "\e254"; } - -.glyphicon-superscript:before { - content: "\e255"; } - -.glyphicon-subscript:before { - content: "\e256"; } - -.glyphicon-menu-left:before { - content: "\e257"; } - -.glyphicon-menu-right:before { - content: "\e258"; } - -.glyphicon-menu-down:before { - content: "\e259"; } - -.glyphicon-menu-up:before { - content: "\e260"; } - -* { - -webkit-box-sizing: border-box; - -moz-box-sizing: border-box; - box-sizing: border-box; } - -*:before, -*:after { - -webkit-box-sizing: border-box; - -moz-box-sizing: border-box; - box-sizing: border-box; } - -html { - font-size: 10px; - -webkit-tap-highlight-color: rgba(0, 0, 0, 0); } - -body { - font-family: "Source Sans Pro", "Helvetica Neue", Helvetica, Arial, sans-serif; - font-size: 15px; - line-height: 1.846; - color: #444; - background-color: #fff; } - -input, -button, -select, -textarea { - font-family: inherit; - font-size: inherit; - line-height: inherit; } - -a { - color: #5a9ddb; - text-decoration: none; } - a:hover, a:focus { - color: #2a77bf; - text-decoration: underline; } - a:focus { - outline: 5px auto -webkit-focus-ring-color; - outline-offset: -2px; } - -figure { - margin: 0; } - -img { - vertical-align: middle; } - -.img-responsive { - display: block; - max-width: 100%; - height: auto; } - -.img-rounded { - border-radius: 3px; } - -.img-thumbnail { - padding: 4px; - line-height: 1.846; - background-color: #fff; - border: 1px solid #ddd; - border-radius: 3px; - -webkit-transition: all 0.2s ease-in-out; - -o-transition: all 0.2s ease-in-out; - transition: all 0.2s ease-in-out; - display: inline-block; - max-width: 100%; - height: auto; } - -.img-circle { - border-radius: 50%; } - -hr { - margin-top: 27px; - margin-bottom: 27px; - border: 0; - border-top: 1px solid #eeeeee; } - -.sr-only { - position: absolute; - width: 1px; - height: 1px; - margin: -1px; - padding: 0; - overflow: hidden; - clip: rect(0, 0, 0, 0); - border: 0; } - -.sr-only-focusable:active, .sr-only-focusable:focus { - position: static; - width: auto; - height: auto; - margin: 0; - overflow: visible; - clip: auto; } - -[role="button"] { - cursor: pointer; } - -h1, h2, h3, h4, h5, h6, -.h1, .h2, .h3, .h4, .h5, .h6 { - font-family: inherit; - font-weight: 300; - line-height: 1.1; - color: #444; } - h1 small, - h1 .small, h2 small, - h2 .small, h3 small, - h3 .small, h4 small, - h4 .small, h5 small, - h5 .small, h6 small, - h6 .small, - .h1 small, - .h1 .small, .h2 small, - .h2 .small, .h3 small, - .h3 .small, .h4 small, - .h4 .small, .h5 small, - .h5 .small, .h6 small, - .h6 .small { - font-weight: normal; - line-height: 1; - color: #bbb; } - -h1, .h1, -h2, .h2, -h3, .h3 { - margin-top: 27px; - margin-bottom: 13.5px; } - h1 small, - h1 .small, .h1 small, - .h1 .small, - h2 small, - h2 .small, .h2 small, - .h2 .small, - h3 small, - h3 .small, .h3 small, - .h3 .small { - font-size: 65%; } - -h4, .h4, -h5, .h5, -h6, .h6 { - margin-top: 13.5px; - margin-bottom: 13.5px; } - h4 small, - h4 .small, .h4 small, - .h4 .small, - h5 small, - h5 .small, .h5 small, - .h5 .small, - h6 small, - h6 .small, .h6 small, - .h6 .small { - font-size: 75%; } - -h1, .h1 { - font-size: 48px; } - -h2, .h2 { - font-size: 40px; } - -h3, .h3 { - font-size: 32px; } - -h4, .h4 { - font-size: 24px; } - -h5, .h5 { - font-size: 20px; } - -h6, .h6 { - font-size: 14px; } - -p { - margin: 0 0 13.5px; } - -.lead { - margin-bottom: 27px; - font-size: 17px; - font-weight: 300; - line-height: 1.4; } - @media (min-width: 768px) { - .lead { - font-size: 22.5px; } } - -small, -.small { - font-size: 86%; } - -mark, -.mark { - background-color: #ffe0b2; - padding: .2em; } - -.text-left { - text-align: left; } - -.text-right { - text-align: right; } - -.text-center { - text-align: center; } - -.text-justify { - text-align: justify; } - -.text-nowrap { - white-space: nowrap; } - -.text-lowercase { - text-transform: lowercase; } - -.text-uppercase, .initialism { - text-transform: uppercase; } - -.text-capitalize { - text-transform: capitalize; } - -.text-muted { - color: #bbb; } - -.text-primary { - color: #5a9ddb; } - -a.text-primary:hover, -a.text-primary:focus { - color: #3084d2; } - -.text-success { - color: #4CAF50; } - -a.text-success:hover, -a.text-success:focus { - color: #3d8b40; } - -.text-info { - color: #9C27B0; } - -a.text-info:hover, -a.text-info:focus { - color: #771e86; } - -.text-warning { - color: #ff9800; } - -a.text-warning:hover, -a.text-warning:focus { - color: #cc7a00; } - -.text-danger { - color: #e51c23; } - -a.text-danger:hover, -a.text-danger:focus { - color: #b9151b; } - -.bg-primary { - color: #fff; } - -.bg-primary { - background-color: #5a9ddb; } - -a.bg-primary:hover, -a.bg-primary:focus { - background-color: #3084d2; } - -.bg-success { - background-color: #dff0d8; } - -a.bg-success:hover, -a.bg-success:focus { - background-color: #c1e2b3; } - -.bg-info { - background-color: #e1bee7; } - -a.bg-info:hover, -a.bg-info:focus { - background-color: #d099d9; } - -.bg-warning { - background-color: #ffe0b2; } - -a.bg-warning:hover, -a.bg-warning:focus { - background-color: #ffcb7f; } - -.bg-danger { - background-color: #f9bdbb; } - -a.bg-danger:hover, -a.bg-danger:focus { - background-color: #f5908c; } - -.page-header { - padding-bottom: 12.5px; - margin: 54px 0 27px; - border-bottom: 1px solid #eeeeee; } - -ul, -ol { - margin-top: 0; - margin-bottom: 13.5px; } - ul ul, - ul ol, - ol ul, - ol ol { - margin-bottom: 0; } - -.list-unstyled { - padding-left: 0; - list-style: none; } - -.list-inline { - padding-left: 0; - list-style: none; - margin-left: -5px; } - .list-inline > li { - display: inline-block; - padding-left: 5px; - padding-right: 5px; } - -dl { - margin-top: 0; - margin-bottom: 27px; } - -dt, -dd { - line-height: 1.846; } - -dt { - font-weight: bold; } - -dd { - margin-left: 0; } - -.dl-horizontal dd:before, .dl-horizontal dd:after { - content: " "; - display: table; } - -.dl-horizontal dd:after { - clear: both; } - -@media (min-width: 768px) { - .dl-horizontal dt { - float: left; - width: 160px; - clear: left; - text-align: right; - overflow: hidden; - text-overflow: ellipsis; - white-space: nowrap; } - .dl-horizontal dd { - margin-left: 180px; } } - -abbr[title], -abbr[data-original-title] { - cursor: help; - border-bottom: 1px dotted #bbb; } - -.initialism { - font-size: 90%; } - -blockquote { - padding: 13.5px 27px; - margin: 0 0 27px; - font-size: 18.75px; - border-left: 5px solid #eeeeee; } - blockquote p:last-child, - blockquote ul:last-child, - blockquote ol:last-child { - margin-bottom: 0; } - blockquote footer, - blockquote small, - blockquote .small { - display: block; - font-size: 80%; - line-height: 1.846; - color: #bbb; } - blockquote footer:before, - blockquote small:before, - blockquote .small:before { - content: '\2014 \00A0'; } - -.blockquote-reverse, -blockquote.pull-right { - padding-right: 15px; - padding-left: 0; - border-right: 5px solid #eeeeee; - border-left: 0; - text-align: right; } - .blockquote-reverse footer:before, - .blockquote-reverse small:before, - .blockquote-reverse .small:before, - blockquote.pull-right footer:before, - blockquote.pull-right small:before, - blockquote.pull-right .small:before { - content: ''; } - .blockquote-reverse footer:after, - .blockquote-reverse small:after, - .blockquote-reverse .small:after, - blockquote.pull-right footer:after, - blockquote.pull-right small:after, - blockquote.pull-right .small:after { - content: '\00A0 \2014'; } - -address { - margin-bottom: 27px; - font-style: normal; - line-height: 1.846; } - -code, -kbd, -pre, -samp { - font-family: "Source Code Pro", Menlo, Monaco, Consolas, "Courier New", monospace; } - -code { - padding: 2px 4px; - font-size: 90%; - color: #444; - background-color: #f2f2f2; - border-radius: 3px; } - -kbd { - padding: 2px 4px; - font-size: 90%; - color: #fff; - background-color: #333; - border-radius: 3px; - box-shadow: inset 0 -1px 0 rgba(0, 0, 0, 0.25); } - kbd kbd { - padding: 0; - font-size: 100%; - font-weight: bold; - box-shadow: none; } - -pre { - display: block; - padding: 13px; - margin: 0 0 13.5px; - font-size: 14px; - line-height: 1.846; - word-break: break-all; - word-wrap: break-word; - color: #212121; - background-color: #f5f5f5; - border: 1px solid #ccc; - border-radius: 3px; } - pre code { - padding: 0; - font-size: inherit; - color: inherit; - white-space: pre-wrap; - background-color: transparent; - border-radius: 0; } - -.pre-scrollable { - max-height: 340px; - overflow-y: scroll; } - -.container { - margin-right: auto; - margin-left: auto; - padding-left: 15px; - padding-right: 15px; } - .container:before, .container:after { - content: " "; - display: table; } - .container:after { - clear: both; } - @media (min-width: 768px) { - .container { - width: 750px; } } - @media (min-width: 992px) { - .container { - width: 970px; } } - @media (min-width: 1200px) { - .container { - width: 1170px; } } - -.container-fluid { - margin-right: auto; - margin-left: auto; - padding-left: 15px; - padding-right: 15px; } - .container-fluid:before, .container-fluid:after { - content: " "; - display: table; } - .container-fluid:after { - clear: both; } - -.row { - margin-left: -15px; - margin-right: -15px; } - .row:before, .row:after { - content: " "; - display: table; } - .row:after { - clear: both; } - -.col-xs-1, .col-sm-1, .col-md-1, .col-lg-1, .col-xs-2, .col-sm-2, .col-md-2, .col-lg-2, .col-xs-3, .col-sm-3, .col-md-3, .col-lg-3, .col-xs-4, .col-sm-4, .col-md-4, .col-lg-4, .col-xs-5, .col-sm-5, .col-md-5, .col-lg-5, .col-xs-6, .col-sm-6, .col-md-6, .col-lg-6, .col-xs-7, .col-sm-7, .col-md-7, .col-lg-7, .col-xs-8, .col-sm-8, .col-md-8, .col-lg-8, .col-xs-9, .col-sm-9, .col-md-9, .col-lg-9, .col-xs-10, .col-sm-10, .col-md-10, .col-lg-10, .col-xs-11, .col-sm-11, .col-md-11, .col-lg-11, .col-xs-12, .col-sm-12, .col-md-12, .col-lg-12 { - position: relative; - min-height: 1px; - padding-left: 15px; - padding-right: 15px; } - -.col-xs-1, .col-xs-2, .col-xs-3, .col-xs-4, .col-xs-5, .col-xs-6, .col-xs-7, .col-xs-8, .col-xs-9, .col-xs-10, .col-xs-11, .col-xs-12 { - float: left; } - -.col-xs-1 { - width: 8.33333%; } - -.col-xs-2 { - width: 16.66667%; } - -.col-xs-3 { - width: 25%; } - -.col-xs-4 { - width: 33.33333%; } - -.col-xs-5 { - width: 41.66667%; } - -.col-xs-6 { - width: 50%; } - -.col-xs-7 { - width: 58.33333%; } - -.col-xs-8 { - width: 66.66667%; } - -.col-xs-9 { - width: 75%; } - -.col-xs-10 { - width: 83.33333%; } - -.col-xs-11 { - width: 91.66667%; } - -.col-xs-12 { - width: 100%; } - -.col-xs-pull-0 { - right: auto; } - -.col-xs-pull-1 { - right: 8.33333%; } - -.col-xs-pull-2 { - right: 16.66667%; } - -.col-xs-pull-3 { - right: 25%; } - -.col-xs-pull-4 { - right: 33.33333%; } - -.col-xs-pull-5 { - right: 41.66667%; } - -.col-xs-pull-6 { - right: 50%; } - -.col-xs-pull-7 { - right: 58.33333%; } - -.col-xs-pull-8 { - right: 66.66667%; } - -.col-xs-pull-9 { - right: 75%; } - -.col-xs-pull-10 { - right: 83.33333%; } - -.col-xs-pull-11 { - right: 91.66667%; } - -.col-xs-pull-12 { - right: 100%; } - -.col-xs-push-0 { - left: auto; } - -.col-xs-push-1 { - left: 8.33333%; } - -.col-xs-push-2 { - left: 16.66667%; } - -.col-xs-push-3 { - left: 25%; } - -.col-xs-push-4 { - left: 33.33333%; } - -.col-xs-push-5 { - left: 41.66667%; } - -.col-xs-push-6 { - left: 50%; } - -.col-xs-push-7 { - left: 58.33333%; } - -.col-xs-push-8 { - left: 66.66667%; } - -.col-xs-push-9 { - left: 75%; } - -.col-xs-push-10 { - left: 83.33333%; } - -.col-xs-push-11 { - left: 91.66667%; } - -.col-xs-push-12 { - left: 100%; } - -.col-xs-offset-0 { - margin-left: 0%; } - -.col-xs-offset-1 { - margin-left: 8.33333%; } - -.col-xs-offset-2 { - margin-left: 16.66667%; } - -.col-xs-offset-3 { - margin-left: 25%; } - -.col-xs-offset-4 { - margin-left: 33.33333%; } - -.col-xs-offset-5 { - margin-left: 41.66667%; } - -.col-xs-offset-6 { - margin-left: 50%; } - -.col-xs-offset-7 { - margin-left: 58.33333%; } - -.col-xs-offset-8 { - margin-left: 66.66667%; } - -.col-xs-offset-9 { - margin-left: 75%; } - -.col-xs-offset-10 { - margin-left: 83.33333%; } - -.col-xs-offset-11 { - margin-left: 91.66667%; } - -.col-xs-offset-12 { - margin-left: 100%; } - -@media (min-width: 768px) { - .col-sm-1, .col-sm-2, .col-sm-3, .col-sm-4, .col-sm-5, .col-sm-6, .col-sm-7, .col-sm-8, .col-sm-9, .col-sm-10, .col-sm-11, .col-sm-12 { - float: left; } - .col-sm-1 { - width: 8.33333%; } - .col-sm-2 { - width: 16.66667%; } - .col-sm-3 { - width: 25%; } - .col-sm-4 { - width: 33.33333%; } - .col-sm-5 { - width: 41.66667%; } - .col-sm-6 { - width: 50%; } - .col-sm-7 { - width: 58.33333%; } - .col-sm-8 { - width: 66.66667%; } - .col-sm-9 { - width: 75%; } - .col-sm-10 { - width: 83.33333%; } - .col-sm-11 { - width: 91.66667%; } - .col-sm-12 { - width: 100%; } - .col-sm-pull-0 { - right: auto; } - .col-sm-pull-1 { - right: 8.33333%; } - .col-sm-pull-2 { - right: 16.66667%; } - .col-sm-pull-3 { - right: 25%; } - .col-sm-pull-4 { - right: 33.33333%; } - .col-sm-pull-5 { - right: 41.66667%; } - .col-sm-pull-6 { - right: 50%; } - .col-sm-pull-7 { - right: 58.33333%; } - .col-sm-pull-8 { - right: 66.66667%; } - .col-sm-pull-9 { - right: 75%; } - .col-sm-pull-10 { - right: 83.33333%; } - .col-sm-pull-11 { - right: 91.66667%; } - .col-sm-pull-12 { - right: 100%; } - .col-sm-push-0 { - left: auto; } - .col-sm-push-1 { - left: 8.33333%; } - .col-sm-push-2 { - left: 16.66667%; } - .col-sm-push-3 { - left: 25%; } - .col-sm-push-4 { - left: 33.33333%; } - .col-sm-push-5 { - left: 41.66667%; } - .col-sm-push-6 { - left: 50%; } - .col-sm-push-7 { - left: 58.33333%; } - .col-sm-push-8 { - left: 66.66667%; } - .col-sm-push-9 { - left: 75%; } - .col-sm-push-10 { - left: 83.33333%; } - .col-sm-push-11 { - left: 91.66667%; } - .col-sm-push-12 { - left: 100%; } - .col-sm-offset-0 { - margin-left: 0%; } - .col-sm-offset-1 { - margin-left: 8.33333%; } - .col-sm-offset-2 { - margin-left: 16.66667%; } - .col-sm-offset-3 { - margin-left: 25%; } - .col-sm-offset-4 { - margin-left: 33.33333%; } - .col-sm-offset-5 { - margin-left: 41.66667%; } - .col-sm-offset-6 { - margin-left: 50%; } - .col-sm-offset-7 { - margin-left: 58.33333%; } - .col-sm-offset-8 { - margin-left: 66.66667%; } - .col-sm-offset-9 { - margin-left: 75%; } - .col-sm-offset-10 { - margin-left: 83.33333%; } - .col-sm-offset-11 { - margin-left: 91.66667%; } - .col-sm-offset-12 { - margin-left: 100%; } } - -@media (min-width: 992px) { - .col-md-1, .col-md-2, .col-md-3, .col-md-4, .col-md-5, .col-md-6, .col-md-7, .col-md-8, .col-md-9, .col-md-10, .col-md-11, .col-md-12 { - float: left; } - .col-md-1 { - width: 8.33333%; } - .col-md-2 { - width: 16.66667%; } - .col-md-3 { - width: 25%; } - .col-md-4 { - width: 33.33333%; } - .col-md-5 { - width: 41.66667%; } - .col-md-6 { - width: 50%; } - .col-md-7 { - width: 58.33333%; } - .col-md-8 { - width: 66.66667%; } - .col-md-9 { - width: 75%; } - .col-md-10 { - width: 83.33333%; } - .col-md-11 { - width: 91.66667%; } - .col-md-12 { - width: 100%; } - .col-md-pull-0 { - right: auto; } - .col-md-pull-1 { - right: 8.33333%; } - .col-md-pull-2 { - right: 16.66667%; } - .col-md-pull-3 { - right: 25%; } - .col-md-pull-4 { - right: 33.33333%; } - .col-md-pull-5 { - right: 41.66667%; } - .col-md-pull-6 { - right: 50%; } - .col-md-pull-7 { - right: 58.33333%; } - .col-md-pull-8 { - right: 66.66667%; } - .col-md-pull-9 { - right: 75%; } - .col-md-pull-10 { - right: 83.33333%; } - .col-md-pull-11 { - right: 91.66667%; } - .col-md-pull-12 { - right: 100%; } - .col-md-push-0 { - left: auto; } - .col-md-push-1 { - left: 8.33333%; } - .col-md-push-2 { - left: 16.66667%; } - .col-md-push-3 { - left: 25%; } - .col-md-push-4 { - left: 33.33333%; } - .col-md-push-5 { - left: 41.66667%; } - .col-md-push-6 { - left: 50%; } - .col-md-push-7 { - left: 58.33333%; } - .col-md-push-8 { - left: 66.66667%; } - .col-md-push-9 { - left: 75%; } - .col-md-push-10 { - left: 83.33333%; } - .col-md-push-11 { - left: 91.66667%; } - .col-md-push-12 { - left: 100%; } - .col-md-offset-0 { - margin-left: 0%; } - .col-md-offset-1 { - margin-left: 8.33333%; } - .col-md-offset-2 { - margin-left: 16.66667%; } - .col-md-offset-3 { - margin-left: 25%; } - .col-md-offset-4 { - margin-left: 33.33333%; } - .col-md-offset-5 { - margin-left: 41.66667%; } - .col-md-offset-6 { - margin-left: 50%; } - .col-md-offset-7 { - margin-left: 58.33333%; } - .col-md-offset-8 { - margin-left: 66.66667%; } - .col-md-offset-9 { - margin-left: 75%; } - .col-md-offset-10 { - margin-left: 83.33333%; } - .col-md-offset-11 { - margin-left: 91.66667%; } - .col-md-offset-12 { - margin-left: 100%; } } - -@media (min-width: 1200px) { - .col-lg-1, .col-lg-2, .col-lg-3, .col-lg-4, .col-lg-5, .col-lg-6, .col-lg-7, .col-lg-8, .col-lg-9, .col-lg-10, .col-lg-11, .col-lg-12 { - float: left; } - .col-lg-1 { - width: 8.33333%; } - .col-lg-2 { - width: 16.66667%; } - .col-lg-3 { - width: 25%; } - .col-lg-4 { - width: 33.33333%; } - .col-lg-5 { - width: 41.66667%; } - .col-lg-6 { - width: 50%; } - .col-lg-7 { - width: 58.33333%; } - .col-lg-8 { - width: 66.66667%; } - .col-lg-9 { - width: 75%; } - .col-lg-10 { - width: 83.33333%; } - .col-lg-11 { - width: 91.66667%; } - .col-lg-12 { - width: 100%; } - .col-lg-pull-0 { - right: auto; } - .col-lg-pull-1 { - right: 8.33333%; } - .col-lg-pull-2 { - right: 16.66667%; } - .col-lg-pull-3 { - right: 25%; } - .col-lg-pull-4 { - right: 33.33333%; } - .col-lg-pull-5 { - right: 41.66667%; } - .col-lg-pull-6 { - right: 50%; } - .col-lg-pull-7 { - right: 58.33333%; } - .col-lg-pull-8 { - right: 66.66667%; } - .col-lg-pull-9 { - right: 75%; } - .col-lg-pull-10 { - right: 83.33333%; } - .col-lg-pull-11 { - right: 91.66667%; } - .col-lg-pull-12 { - right: 100%; } - .col-lg-push-0 { - left: auto; } - .col-lg-push-1 { - left: 8.33333%; } - .col-lg-push-2 { - left: 16.66667%; } - .col-lg-push-3 { - left: 25%; } - .col-lg-push-4 { - left: 33.33333%; } - .col-lg-push-5 { - left: 41.66667%; } - .col-lg-push-6 { - left: 50%; } - .col-lg-push-7 { - left: 58.33333%; } - .col-lg-push-8 { - left: 66.66667%; } - .col-lg-push-9 { - left: 75%; } - .col-lg-push-10 { - left: 83.33333%; } - .col-lg-push-11 { - left: 91.66667%; } - .col-lg-push-12 { - left: 100%; } - .col-lg-offset-0 { - margin-left: 0%; } - .col-lg-offset-1 { - margin-left: 8.33333%; } - .col-lg-offset-2 { - margin-left: 16.66667%; } - .col-lg-offset-3 { - margin-left: 25%; } - .col-lg-offset-4 { - margin-left: 33.33333%; } - .col-lg-offset-5 { - margin-left: 41.66667%; } - .col-lg-offset-6 { - margin-left: 50%; } - .col-lg-offset-7 { - margin-left: 58.33333%; } - .col-lg-offset-8 { - margin-left: 66.66667%; } - .col-lg-offset-9 { - margin-left: 75%; } - .col-lg-offset-10 { - margin-left: 83.33333%; } - .col-lg-offset-11 { - margin-left: 91.66667%; } - .col-lg-offset-12 { - margin-left: 100%; } } - -table { - background-color: transparent; } - -caption { - padding-top: 8px; - padding-bottom: 8px; - color: #bbb; - text-align: left; } - -th { - text-align: left; } - -.table { - width: 100%; - max-width: 100%; - margin-bottom: 27px; } - .table > thead > tr > th, - .table > thead > tr > td, - .table > tbody > tr > th, - .table > tbody > tr > td, - .table > tfoot > tr > th, - .table > tfoot > tr > td { - padding: 8px; - line-height: 1.846; - vertical-align: top; - border-top: 1px solid #ddd; } - .table > thead > tr > th { - vertical-align: bottom; - border-bottom: 2px solid #ddd; } - .table > caption + thead > tr:first-child > th, - .table > caption + thead > tr:first-child > td, - .table > colgroup + thead > tr:first-child > th, - .table > colgroup + thead > tr:first-child > td, - .table > thead:first-child > tr:first-child > th, - .table > thead:first-child > tr:first-child > td { - border-top: 0; } - .table > tbody + tbody { - border-top: 2px solid #ddd; } - .table .table { - background-color: #fff; } - -.table-condensed > thead > tr > th, -.table-condensed > thead > tr > td, -.table-condensed > tbody > tr > th, -.table-condensed > tbody > tr > td, -.table-condensed > tfoot > tr > th, -.table-condensed > tfoot > tr > td { - padding: 5px; } - -.table-bordered { - border: 1px solid #ddd; } - .table-bordered > thead > tr > th, - .table-bordered > thead > tr > td, - .table-bordered > tbody > tr > th, - .table-bordered > tbody > tr > td, - .table-bordered > tfoot > tr > th, - .table-bordered > tfoot > tr > td { - border: 1px solid #ddd; } - .table-bordered > thead > tr > th, - .table-bordered > thead > tr > td { - border-bottom-width: 2px; } - -.table-striped > tbody > tr:nth-of-type(odd) { - background-color: #f9f9f9; } - -.table-hover > tbody > tr:hover { - background-color: #f5f5f5; } - -table col[class*="col-"] { - position: static; - float: none; - display: table-column; } - -table td[class*="col-"], -table th[class*="col-"] { - position: static; - float: none; - display: table-cell; } - -.table > thead > tr > td.active, -.table > thead > tr > th.active, -.table > thead > tr.active > td, -.table > thead > tr.active > th, -.table > tbody > tr > td.active, -.table > tbody > tr > th.active, -.table > tbody > tr.active > td, -.table > tbody > tr.active > th, -.table > tfoot > tr > td.active, -.table > tfoot > tr > th.active, -.table > tfoot > tr.active > td, -.table > tfoot > tr.active > th { - background-color: #f5f5f5; } - -.table-hover > tbody > tr > td.active:hover, -.table-hover > tbody > tr > th.active:hover, -.table-hover > tbody > tr.active:hover > td, -.table-hover > tbody > tr:hover > .active, -.table-hover > tbody > tr.active:hover > th { - background-color: #e8e8e8; } - -.table > thead > tr > td.success, -.table > thead > tr > th.success, -.table > thead > tr.success > td, -.table > thead > tr.success > th, -.table > tbody > tr > td.success, -.table > tbody > tr > th.success, -.table > tbody > tr.success > td, -.table > tbody > tr.success > th, -.table > tfoot > tr > td.success, -.table > tfoot > tr > th.success, -.table > tfoot > tr.success > td, -.table > tfoot > tr.success > th { - background-color: #dff0d8; } - -.table-hover > tbody > tr > td.success:hover, -.table-hover > tbody > tr > th.success:hover, -.table-hover > tbody > tr.success:hover > td, -.table-hover > tbody > tr:hover > .success, -.table-hover > tbody > tr.success:hover > th { - background-color: #d0e9c6; } - -.table > thead > tr > td.info, -.table > thead > tr > th.info, -.table > thead > tr.info > td, -.table > thead > tr.info > th, -.table > tbody > tr > td.info, -.table > tbody > tr > th.info, -.table > tbody > tr.info > td, -.table > tbody > tr.info > th, -.table > tfoot > tr > td.info, -.table > tfoot > tr > th.info, -.table > tfoot > tr.info > td, -.table > tfoot > tr.info > th { - background-color: #e1bee7; } - -.table-hover > tbody > tr > td.info:hover, -.table-hover > tbody > tr > th.info:hover, -.table-hover > tbody > tr.info:hover > td, -.table-hover > tbody > tr:hover > .info, -.table-hover > tbody > tr.info:hover > th { - background-color: #d8abe0; } - -.table > thead > tr > td.warning, -.table > thead > tr > th.warning, -.table > thead > tr.warning > td, -.table > thead > tr.warning > th, -.table > tbody > tr > td.warning, -.table > tbody > tr > th.warning, -.table > tbody > tr.warning > td, -.table > tbody > tr.warning > th, -.table > tfoot > tr > td.warning, -.table > tfoot > tr > th.warning, -.table > tfoot > tr.warning > td, -.table > tfoot > tr.warning > th { - background-color: #ffe0b2; } - -.table-hover > tbody > tr > td.warning:hover, -.table-hover > tbody > tr > th.warning:hover, -.table-hover > tbody > tr.warning:hover > td, -.table-hover > tbody > tr:hover > .warning, -.table-hover > tbody > tr.warning:hover > th { - background-color: #ffd699; } - -.table > thead > tr > td.danger, -.table > thead > tr > th.danger, -.table > thead > tr.danger > td, -.table > thead > tr.danger > th, -.table > tbody > tr > td.danger, -.table > tbody > tr > th.danger, -.table > tbody > tr.danger > td, -.table > tbody > tr.danger > th, -.table > tfoot > tr > td.danger, -.table > tfoot > tr > th.danger, -.table > tfoot > tr.danger > td, -.table > tfoot > tr.danger > th { - background-color: #f9bdbb; } - -.table-hover > tbody > tr > td.danger:hover, -.table-hover > tbody > tr > th.danger:hover, -.table-hover > tbody > tr.danger:hover > td, -.table-hover > tbody > tr:hover > .danger, -.table-hover > tbody > tr.danger:hover > th { - background-color: #f7a6a4; } - -.table-responsive { - overflow-x: auto; - min-height: 0.01%; } - @media screen and (max-width: 767px) { - .table-responsive { - width: 100%; - margin-bottom: 20.25px; - overflow-y: hidden; - -ms-overflow-style: -ms-autohiding-scrollbar; - border: 1px solid #ddd; } - .table-responsive > .table { - margin-bottom: 0; } - .table-responsive > .table > thead > tr > th, - .table-responsive > .table > thead > tr > td, - .table-responsive > .table > tbody > tr > th, - .table-responsive > .table > tbody > tr > td, - .table-responsive > .table > tfoot > tr > th, - .table-responsive > .table > tfoot > tr > td { - white-space: nowrap; } - .table-responsive > .table-bordered { - border: 0; } - .table-responsive > .table-bordered > thead > tr > th:first-child, - .table-responsive > .table-bordered > thead > tr > td:first-child, - .table-responsive > .table-bordered > tbody > tr > th:first-child, - .table-responsive > .table-bordered > tbody > tr > td:first-child, - .table-responsive > .table-bordered > tfoot > tr > th:first-child, - .table-responsive > .table-bordered > tfoot > tr > td:first-child { - border-left: 0; } - .table-responsive > .table-bordered > thead > tr > th:last-child, - .table-responsive > .table-bordered > thead > tr > td:last-child, - .table-responsive > .table-bordered > tbody > tr > th:last-child, - .table-responsive > .table-bordered > tbody > tr > td:last-child, - .table-responsive > .table-bordered > tfoot > tr > th:last-child, - .table-responsive > .table-bordered > tfoot > tr > td:last-child { - border-right: 0; } - .table-responsive > .table-bordered > tbody > tr:last-child > th, - .table-responsive > .table-bordered > tbody > tr:last-child > td, - .table-responsive > .table-bordered > tfoot > tr:last-child > th, - .table-responsive > .table-bordered > tfoot > tr:last-child > td { - border-bottom: 0; } } - -fieldset { - padding: 0; - margin: 0; - border: 0; - min-width: 0; } - -legend { - display: block; - width: 100%; - padding: 0; - margin-bottom: 27px; - font-size: 22.5px; - line-height: inherit; - color: #212121; - border: 0; - border-bottom: 1px solid #e5e5e5; } - -label { - display: inline-block; - max-width: 100%; - margin-bottom: 5px; - font-weight: bold; } - -input[type="search"] { - -webkit-box-sizing: border-box; - -moz-box-sizing: border-box; - box-sizing: border-box; } - -input[type="radio"], -input[type="checkbox"] { - margin: 4px 0 0; - margin-top: 1px \9; - line-height: normal; } - -input[type="file"] { - display: block; } - -input[type="range"] { - display: block; - width: 100%; } - -select[multiple], -select[size] { - height: auto; } - -input[type="file"]:focus, -input[type="radio"]:focus, -input[type="checkbox"]:focus { - outline: 5px auto -webkit-focus-ring-color; - outline-offset: -2px; } - -output { - display: block; - padding-top: 7px; - font-size: 15px; - line-height: 1.846; - color: #666; } - -.form-control { - display: block; - width: 100%; - height: 41px; - padding: 6px 16px; - font-size: 15px; - line-height: 1.846; - color: #666; - background-color: transparent; - background-image: none; - border: 1px solid transparent; - border-radius: 3px; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); - -webkit-transition: border-color ease-in-out 0.15s, box-shadow ease-in-out 0.15s; - -o-transition: border-color ease-in-out 0.15s, box-shadow ease-in-out 0.15s; - transition: border-color ease-in-out 0.15s, box-shadow ease-in-out 0.15s; } - .form-control:focus { - border-color: #66afe9; - outline: 0; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 8px rgba(102, 175, 233, 0.6); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 8px rgba(102, 175, 233, 0.6); } - .form-control::-moz-placeholder { - color: #bbb; - opacity: 1; } - .form-control:-ms-input-placeholder { - color: #bbb; } - .form-control::-webkit-input-placeholder { - color: #bbb; } - .form-control::-ms-expand { - border: 0; - background-color: transparent; } - .form-control[disabled], .form-control[readonly], - fieldset[disabled] .form-control { - background-color: transparent; - opacity: 1; } - .form-control[disabled], - fieldset[disabled] .form-control { - cursor: not-allowed; } - -textarea.form-control { - height: auto; } - -input[type="search"] { - -webkit-appearance: none; } - -@media screen and (-webkit-min-device-pixel-ratio: 0) { - input[type="date"].form-control, - input[type="time"].form-control, - input[type="datetime-local"].form-control, - input[type="month"].form-control { - line-height: 41px; } - input[type="date"].input-sm, .input-group-sm > input.form-control[type="date"], - .input-group-sm > input.input-group-addon[type="date"], - .input-group-sm > .input-group-btn > input.btn[type="date"], - .input-group-sm input[type="date"], - input[type="time"].input-sm, - .input-group-sm > input.form-control[type="time"], - .input-group-sm > input.input-group-addon[type="time"], - .input-group-sm > .input-group-btn > input.btn[type="time"], - .input-group-sm - input[type="time"], - input[type="datetime-local"].input-sm, - .input-group-sm > input.form-control[type="datetime-local"], - .input-group-sm > input.input-group-addon[type="datetime-local"], - .input-group-sm > .input-group-btn > input.btn[type="datetime-local"], - .input-group-sm - input[type="datetime-local"], - input[type="month"].input-sm, - .input-group-sm > input.form-control[type="month"], - .input-group-sm > input.input-group-addon[type="month"], - .input-group-sm > .input-group-btn > input.btn[type="month"], - .input-group-sm - input[type="month"] { - line-height: 31px; } - input[type="date"].input-lg, .input-group-lg > input.form-control[type="date"], - .input-group-lg > input.input-group-addon[type="date"], - .input-group-lg > .input-group-btn > input.btn[type="date"], - .input-group-lg input[type="date"], - input[type="time"].input-lg, - .input-group-lg > input.form-control[type="time"], - .input-group-lg > input.input-group-addon[type="time"], - .input-group-lg > .input-group-btn > input.btn[type="time"], - .input-group-lg - input[type="time"], - input[type="datetime-local"].input-lg, - .input-group-lg > input.form-control[type="datetime-local"], - .input-group-lg > input.input-group-addon[type="datetime-local"], - .input-group-lg > .input-group-btn > input.btn[type="datetime-local"], - .input-group-lg - input[type="datetime-local"], - input[type="month"].input-lg, - .input-group-lg > input.form-control[type="month"], - .input-group-lg > input.input-group-addon[type="month"], - .input-group-lg > .input-group-btn > input.btn[type="month"], - .input-group-lg - input[type="month"] { - line-height: 48px; } } - -.form-group { - margin-bottom: 15px; } - -.radio, -.checkbox { - position: relative; - display: block; - margin-top: 10px; - margin-bottom: 10px; } - .radio label, - .checkbox label { - min-height: 27px; - padding-left: 20px; - margin-bottom: 0; - font-weight: normal; - cursor: pointer; } - -.radio input[type="radio"], -.radio-inline input[type="radio"], -.checkbox input[type="checkbox"], -.checkbox-inline input[type="checkbox"] { - position: absolute; - margin-left: -20px; - margin-top: 4px \9; } - -.radio + .radio, -.checkbox + .checkbox { - margin-top: -5px; } - -.radio-inline, -.checkbox-inline { - position: relative; - display: inline-block; - padding-left: 20px; - margin-bottom: 0; - vertical-align: middle; - font-weight: normal; - cursor: pointer; } - -.radio-inline + .radio-inline, -.checkbox-inline + .checkbox-inline { - margin-top: 0; - margin-left: 10px; } - -input[type="radio"][disabled], input[type="radio"].disabled, -fieldset[disabled] input[type="radio"], -input[type="checkbox"][disabled], -input[type="checkbox"].disabled, -fieldset[disabled] -input[type="checkbox"] { - cursor: not-allowed; } - -.radio-inline.disabled, -fieldset[disabled] .radio-inline, -.checkbox-inline.disabled, -fieldset[disabled] -.checkbox-inline { - cursor: not-allowed; } - -.radio.disabled label, -fieldset[disabled] .radio label, -.checkbox.disabled label, -fieldset[disabled] -.checkbox label { - cursor: not-allowed; } - -.form-control-static { - padding-top: 7px; - padding-bottom: 7px; - margin-bottom: 0; - min-height: 42px; } - .form-control-static.input-lg, .input-group-lg > .form-control-static.form-control, - .input-group-lg > .form-control-static.input-group-addon, - .input-group-lg > .input-group-btn > .form-control-static.btn, .form-control-static.input-sm, .input-group-sm > .form-control-static.form-control, - .input-group-sm > .form-control-static.input-group-addon, - .input-group-sm > .input-group-btn > .form-control-static.btn { - padding-left: 0; - padding-right: 0; } - -.input-sm, .input-group-sm > .form-control, -.input-group-sm > .input-group-addon, -.input-group-sm > .input-group-btn > .btn { - height: 31px; - padding: 5px 10px; - font-size: 13px; - line-height: 1.5; - border-radius: 3px; } - -select.input-sm, .input-group-sm > select.form-control, -.input-group-sm > select.input-group-addon, -.input-group-sm > .input-group-btn > select.btn { - height: 31px; - line-height: 31px; } - -textarea.input-sm, .input-group-sm > textarea.form-control, -.input-group-sm > textarea.input-group-addon, -.input-group-sm > .input-group-btn > textarea.btn, -select[multiple].input-sm, -.input-group-sm > select.form-control[multiple], -.input-group-sm > select.input-group-addon[multiple], -.input-group-sm > .input-group-btn > select.btn[multiple] { - height: auto; } - -.form-group-sm .form-control { - height: 31px; - padding: 5px 10px; - font-size: 13px; - line-height: 1.5; - border-radius: 3px; } - -.form-group-sm select.form-control { - height: 31px; - line-height: 31px; } - -.form-group-sm textarea.form-control, -.form-group-sm select[multiple].form-control { - height: auto; } - -.form-group-sm .form-control-static { - height: 31px; - min-height: 40px; - padding: 6px 10px; - font-size: 13px; - line-height: 1.5; } - -.input-lg, .input-group-lg > .form-control, -.input-group-lg > .input-group-addon, -.input-group-lg > .input-group-btn > .btn { - height: 48px; - padding: 10px 16px; - font-size: 19px; - line-height: 1.33333; - border-radius: 3px; } - -select.input-lg, .input-group-lg > select.form-control, -.input-group-lg > select.input-group-addon, -.input-group-lg > .input-group-btn > select.btn { - height: 48px; - line-height: 48px; } - -textarea.input-lg, .input-group-lg > textarea.form-control, -.input-group-lg > textarea.input-group-addon, -.input-group-lg > .input-group-btn > textarea.btn, -select[multiple].input-lg, -.input-group-lg > select.form-control[multiple], -.input-group-lg > select.input-group-addon[multiple], -.input-group-lg > .input-group-btn > select.btn[multiple] { - height: auto; } - -.form-group-lg .form-control { - height: 48px; - padding: 10px 16px; - font-size: 19px; - line-height: 1.33333; - border-radius: 3px; } - -.form-group-lg select.form-control { - height: 48px; - line-height: 48px; } - -.form-group-lg textarea.form-control, -.form-group-lg select[multiple].form-control { - height: auto; } - -.form-group-lg .form-control-static { - height: 48px; - min-height: 46px; - padding: 11px 16px; - font-size: 19px; - line-height: 1.33333; } - -.has-feedback { - position: relative; } - .has-feedback .form-control { - padding-right: 51.25px; } - -.form-control-feedback { - position: absolute; - top: 0; - right: 0; - z-index: 2; - display: block; - width: 41px; - height: 41px; - line-height: 41px; - text-align: center; - pointer-events: none; } - -.input-lg + .form-control-feedback, .input-group-lg > .form-control + .form-control-feedback, .input-group-lg > .input-group-addon + .form-control-feedback, .input-group-lg > .input-group-btn > .btn + .form-control-feedback, -.input-group-lg + .form-control-feedback, -.form-group-lg .form-control + .form-control-feedback { - width: 48px; - height: 48px; - line-height: 48px; } - -.input-sm + .form-control-feedback, .input-group-sm > .form-control + .form-control-feedback, .input-group-sm > .input-group-addon + .form-control-feedback, .input-group-sm > .input-group-btn > .btn + .form-control-feedback, -.input-group-sm + .form-control-feedback, -.form-group-sm .form-control + .form-control-feedback { - width: 31px; - height: 31px; - line-height: 31px; } - -.has-success .help-block, -.has-success .control-label, -.has-success .radio, -.has-success .checkbox, -.has-success .radio-inline, -.has-success .checkbox-inline, -.has-success.radio label, -.has-success.checkbox label, -.has-success.radio-inline label, -.has-success.checkbox-inline label { - color: #4CAF50; } - -.has-success .form-control { - border-color: #4CAF50; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); } - .has-success .form-control:focus { - border-color: #3d8b40; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 6px #92cf94; - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 6px #92cf94; } - -.has-success .input-group-addon { - color: #4CAF50; - border-color: #4CAF50; - background-color: #dff0d8; } - -.has-success .form-control-feedback { - color: #4CAF50; } - -.has-warning .help-block, -.has-warning .control-label, -.has-warning .radio, -.has-warning .checkbox, -.has-warning .radio-inline, -.has-warning .checkbox-inline, -.has-warning.radio label, -.has-warning.checkbox label, -.has-warning.radio-inline label, -.has-warning.checkbox-inline label { - color: #ff9800; } - -.has-warning .form-control { - border-color: #ff9800; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); } - .has-warning .form-control:focus { - border-color: #cc7a00; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 6px #ffc166; - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 6px #ffc166; } - -.has-warning .input-group-addon { - color: #ff9800; - border-color: #ff9800; - background-color: #ffe0b2; } - -.has-warning .form-control-feedback { - color: #ff9800; } - -.has-error .help-block, -.has-error .control-label, -.has-error .radio, -.has-error .checkbox, -.has-error .radio-inline, -.has-error .checkbox-inline, -.has-error.radio label, -.has-error.checkbox label, -.has-error.radio-inline label, -.has-error.checkbox-inline label { - color: #e51c23; } - -.has-error .form-control { - border-color: #e51c23; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075); } - .has-error .form-control:focus { - border-color: #b9151b; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 6px #ef787c; - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.075), 0 0 6px #ef787c; } - -.has-error .input-group-addon { - color: #e51c23; - border-color: #e51c23; - background-color: #f9bdbb; } - -.has-error .form-control-feedback { - color: #e51c23; } - -.has-feedback label ~ .form-control-feedback { - top: 32px; } - -.has-feedback label.sr-only ~ .form-control-feedback { - top: 0; } - -.help-block { - display: block; - margin-top: 5px; - margin-bottom: 10px; - color: #848484; } - -@media (min-width: 768px) { - .form-inline .form-group { - display: inline-block; - margin-bottom: 0; - vertical-align: middle; } - .form-inline .form-control { - display: inline-block; - width: auto; - vertical-align: middle; } - .form-inline .form-control-static { - display: inline-block; } - .form-inline .input-group { - display: inline-table; - vertical-align: middle; } - .form-inline .input-group .input-group-addon, - .form-inline .input-group .input-group-btn, - .form-inline .input-group .form-control { - width: auto; } - .form-inline .input-group > .form-control { - width: 100%; } - .form-inline .control-label { - margin-bottom: 0; - vertical-align: middle; } - .form-inline .radio, - .form-inline .checkbox { - display: inline-block; - margin-top: 0; - margin-bottom: 0; - vertical-align: middle; } - .form-inline .radio label, - .form-inline .checkbox label { - padding-left: 0; } - .form-inline .radio input[type="radio"], - .form-inline .checkbox input[type="checkbox"] { - position: relative; - margin-left: 0; } - .form-inline .has-feedback .form-control-feedback { - top: 0; } } - -.form-horizontal .radio, -.form-horizontal .checkbox, -.form-horizontal .radio-inline, -.form-horizontal .checkbox-inline { - margin-top: 0; - margin-bottom: 0; - padding-top: 7px; } - -.form-horizontal .radio, -.form-horizontal .checkbox { - min-height: 34px; } - -.form-horizontal .form-group { - margin-left: -15px; - margin-right: -15px; } - .form-horizontal .form-group:before, .form-horizontal .form-group:after { - content: " "; - display: table; } - .form-horizontal .form-group:after { - clear: both; } - -@media (min-width: 768px) { - .form-horizontal .control-label { - text-align: right; - margin-bottom: 0; - padding-top: 7px; } } - -.form-horizontal .has-feedback .form-control-feedback { - right: 15px; } - -@media (min-width: 768px) { - .form-horizontal .form-group-lg .control-label { - padding-top: 11px; - font-size: 19px; } } - -@media (min-width: 768px) { - .form-horizontal .form-group-sm .control-label { - padding-top: 6px; - font-size: 13px; } } - -.btn { - display: inline-block; - margin-bottom: 0; - font-weight: normal; - text-align: center; - vertical-align: middle; - touch-action: manipulation; - cursor: pointer; - background-image: none; - border: 1px solid transparent; - white-space: nowrap; - padding: 6px 16px; - font-size: 15px; - line-height: 1.846; - border-radius: 3px; - -webkit-user-select: none; - -moz-user-select: none; - -ms-user-select: none; - user-select: none; } - .btn:focus, .btn.focus, .btn:active:focus, .btn:active.focus, .btn.active:focus, .btn.active.focus { - outline: 5px auto -webkit-focus-ring-color; - outline-offset: -2px; } - .btn:hover, .btn:focus, .btn.focus { - color: #444; - text-decoration: none; } - .btn:active, .btn.active { - outline: 0; - background-image: none; - -webkit-box-shadow: inset 0 3px 5px rgba(0, 0, 0, 0.125); - box-shadow: inset 0 3px 5px rgba(0, 0, 0, 0.125); } - .btn.disabled, .btn[disabled], - fieldset[disabled] .btn { - cursor: not-allowed; - opacity: 0.65; - filter: alpha(opacity=65); - -webkit-box-shadow: none; - box-shadow: none; } - -a.btn.disabled, -fieldset[disabled] a.btn { - pointer-events: none; } - -.btn-default { - color: #444; - background-color: #fff; - border-color: transparent; } - .btn-default:focus, .btn-default.focus { - color: #444; - background-color: #e6e6e6; - border-color: rgba(0, 0, 0, 0); } - .btn-default:hover { - color: #444; - background-color: #e6e6e6; - border-color: rgba(0, 0, 0, 0); } - .btn-default:active, .btn-default.active, - .open > .btn-default.dropdown-toggle { - color: #444; - background-color: #e6e6e6; - border-color: rgba(0, 0, 0, 0); } - .btn-default:active:hover, .btn-default:active:focus, .btn-default:active.focus, .btn-default.active:hover, .btn-default.active:focus, .btn-default.active.focus, - .open > .btn-default.dropdown-toggle:hover, - .open > .btn-default.dropdown-toggle:focus, - .open > .btn-default.dropdown-toggle.focus { - color: #444; - background-color: #d4d4d4; - border-color: rgba(0, 0, 0, 0); } - .btn-default:active, .btn-default.active, - .open > .btn-default.dropdown-toggle { - background-image: none; } - .btn-default.disabled:hover, .btn-default.disabled:focus, .btn-default.disabled.focus, .btn-default[disabled]:hover, .btn-default[disabled]:focus, .btn-default[disabled].focus, - fieldset[disabled] .btn-default:hover, - fieldset[disabled] .btn-default:focus, - fieldset[disabled] .btn-default.focus { - background-color: #fff; - border-color: transparent; } - .btn-default .badge { - color: #fff; - background-color: #444; } - -.btn-primary { - color: #fff; - background-color: #5a9ddb; - border-color: transparent; } - .btn-primary:focus, .btn-primary.focus { - color: #fff; - background-color: #3084d2; - border-color: rgba(0, 0, 0, 0); } - .btn-primary:hover { - color: #fff; - background-color: #3084d2; - border-color: rgba(0, 0, 0, 0); } - .btn-primary:active, .btn-primary.active, - .open > .btn-primary.dropdown-toggle { - color: #fff; - background-color: #3084d2; - border-color: rgba(0, 0, 0, 0); } - .btn-primary:active:hover, .btn-primary:active:focus, .btn-primary:active.focus, .btn-primary.active:hover, .btn-primary.active:focus, .btn-primary.active.focus, - .open > .btn-primary.dropdown-toggle:hover, - .open > .btn-primary.dropdown-toggle:focus, - .open > .btn-primary.dropdown-toggle.focus { - color: #fff; - background-color: #2872b6; - border-color: rgba(0, 0, 0, 0); } - .btn-primary:active, .btn-primary.active, - .open > .btn-primary.dropdown-toggle { - background-image: none; } - .btn-primary.disabled:hover, .btn-primary.disabled:focus, .btn-primary.disabled.focus, .btn-primary[disabled]:hover, .btn-primary[disabled]:focus, .btn-primary[disabled].focus, - fieldset[disabled] .btn-primary:hover, - fieldset[disabled] .btn-primary:focus, - fieldset[disabled] .btn-primary.focus { - background-color: #5a9ddb; - border-color: transparent; } - .btn-primary .badge { - color: #5a9ddb; - background-color: #fff; } - -.btn-success { - color: #fff; - background-color: #4CAF50; - border-color: transparent; } - .btn-success:focus, .btn-success.focus { - color: #fff; - background-color: #3d8b40; - border-color: rgba(0, 0, 0, 0); } - .btn-success:hover { - color: #fff; - background-color: #3d8b40; - border-color: rgba(0, 0, 0, 0); } - .btn-success:active, .btn-success.active, - .open > .btn-success.dropdown-toggle { - color: #fff; - background-color: #3d8b40; - border-color: rgba(0, 0, 0, 0); } - .btn-success:active:hover, .btn-success:active:focus, .btn-success:active.focus, .btn-success.active:hover, .btn-success.active:focus, .btn-success.active.focus, - .open > .btn-success.dropdown-toggle:hover, - .open > .btn-success.dropdown-toggle:focus, - .open > .btn-success.dropdown-toggle.focus { - color: #fff; - background-color: #327334; - border-color: rgba(0, 0, 0, 0); } - .btn-success:active, .btn-success.active, - .open > .btn-success.dropdown-toggle { - background-image: none; } - .btn-success.disabled:hover, .btn-success.disabled:focus, .btn-success.disabled.focus, .btn-success[disabled]:hover, .btn-success[disabled]:focus, .btn-success[disabled].focus, - fieldset[disabled] .btn-success:hover, - fieldset[disabled] .btn-success:focus, - fieldset[disabled] .btn-success.focus { - background-color: #4CAF50; - border-color: transparent; } - .btn-success .badge { - color: #4CAF50; - background-color: #fff; } - -.btn-info { - color: #fff; - background-color: #9C27B0; - border-color: transparent; } - .btn-info:focus, .btn-info.focus { - color: #fff; - background-color: #771e86; - border-color: rgba(0, 0, 0, 0); } - .btn-info:hover { - color: #fff; - background-color: #771e86; - border-color: rgba(0, 0, 0, 0); } - .btn-info:active, .btn-info.active, - .open > .btn-info.dropdown-toggle { - color: #fff; - background-color: #771e86; - border-color: rgba(0, 0, 0, 0); } - .btn-info:active:hover, .btn-info:active:focus, .btn-info:active.focus, .btn-info.active:hover, .btn-info.active:focus, .btn-info.active.focus, - .open > .btn-info.dropdown-toggle:hover, - .open > .btn-info.dropdown-toggle:focus, - .open > .btn-info.dropdown-toggle.focus { - color: #fff; - background-color: #5d1769; - border-color: rgba(0, 0, 0, 0); } - .btn-info:active, .btn-info.active, - .open > .btn-info.dropdown-toggle { - background-image: none; } - .btn-info.disabled:hover, .btn-info.disabled:focus, .btn-info.disabled.focus, .btn-info[disabled]:hover, .btn-info[disabled]:focus, .btn-info[disabled].focus, - fieldset[disabled] .btn-info:hover, - fieldset[disabled] .btn-info:focus, - fieldset[disabled] .btn-info.focus { - background-color: #9C27B0; - border-color: transparent; } - .btn-info .badge { - color: #9C27B0; - background-color: #fff; } - -.btn-warning { - color: #fff; - background-color: #ff9800; - border-color: transparent; } - .btn-warning:focus, .btn-warning.focus { - color: #fff; - background-color: #cc7a00; - border-color: rgba(0, 0, 0, 0); } - .btn-warning:hover { - color: #fff; - background-color: #cc7a00; - border-color: rgba(0, 0, 0, 0); } - .btn-warning:active, .btn-warning.active, - .open > .btn-warning.dropdown-toggle { - color: #fff; - background-color: #cc7a00; - border-color: rgba(0, 0, 0, 0); } - .btn-warning:active:hover, .btn-warning:active:focus, .btn-warning:active.focus, .btn-warning.active:hover, .btn-warning.active:focus, .btn-warning.active.focus, - .open > .btn-warning.dropdown-toggle:hover, - .open > .btn-warning.dropdown-toggle:focus, - .open > .btn-warning.dropdown-toggle.focus { - color: #fff; - background-color: #a86400; - border-color: rgba(0, 0, 0, 0); } - .btn-warning:active, .btn-warning.active, - .open > .btn-warning.dropdown-toggle { - background-image: none; } - .btn-warning.disabled:hover, .btn-warning.disabled:focus, .btn-warning.disabled.focus, .btn-warning[disabled]:hover, .btn-warning[disabled]:focus, .btn-warning[disabled].focus, - fieldset[disabled] .btn-warning:hover, - fieldset[disabled] .btn-warning:focus, - fieldset[disabled] .btn-warning.focus { - background-color: #ff9800; - border-color: transparent; } - .btn-warning .badge { - color: #ff9800; - background-color: #fff; } - -.btn-danger { - color: #fff; - background-color: #e51c23; - border-color: transparent; } - .btn-danger:focus, .btn-danger.focus { - color: #fff; - background-color: #b9151b; - border-color: rgba(0, 0, 0, 0); } - .btn-danger:hover { - color: #fff; - background-color: #b9151b; - border-color: rgba(0, 0, 0, 0); } - .btn-danger:active, .btn-danger.active, - .open > .btn-danger.dropdown-toggle { - color: #fff; - background-color: #b9151b; - border-color: rgba(0, 0, 0, 0); } - .btn-danger:active:hover, .btn-danger:active:focus, .btn-danger:active.focus, .btn-danger.active:hover, .btn-danger.active:focus, .btn-danger.active.focus, - .open > .btn-danger.dropdown-toggle:hover, - .open > .btn-danger.dropdown-toggle:focus, - .open > .btn-danger.dropdown-toggle.focus { - color: #fff; - background-color: #991216; - border-color: rgba(0, 0, 0, 0); } - .btn-danger:active, .btn-danger.active, - .open > .btn-danger.dropdown-toggle { - background-image: none; } - .btn-danger.disabled:hover, .btn-danger.disabled:focus, .btn-danger.disabled.focus, .btn-danger[disabled]:hover, .btn-danger[disabled]:focus, .btn-danger[disabled].focus, - fieldset[disabled] .btn-danger:hover, - fieldset[disabled] .btn-danger:focus, - fieldset[disabled] .btn-danger.focus { - background-color: #e51c23; - border-color: transparent; } - .btn-danger .badge { - color: #e51c23; - background-color: #fff; } - -.btn-link { - color: #5a9ddb; - font-weight: normal; - border-radius: 0; } - .btn-link, .btn-link:active, .btn-link.active, .btn-link[disabled], - fieldset[disabled] .btn-link { - background-color: transparent; - -webkit-box-shadow: none; - box-shadow: none; } - .btn-link, .btn-link:hover, .btn-link:focus, .btn-link:active { - border-color: transparent; } - .btn-link:hover, .btn-link:focus { - color: #2a77bf; - text-decoration: underline; - background-color: transparent; } - .btn-link[disabled]:hover, .btn-link[disabled]:focus, - fieldset[disabled] .btn-link:hover, - fieldset[disabled] .btn-link:focus { - color: #bbb; - text-decoration: none; } - -.btn-lg, .btn-group-lg > .btn { - padding: 10px 16px; - font-size: 19px; - line-height: 1.33333; - border-radius: 3px; } - -.btn-sm, .btn-group-sm > .btn { - padding: 5px 10px; - font-size: 13px; - line-height: 1.5; - border-radius: 3px; } - -.btn-xs, .btn-group-xs > .btn { - padding: 1px 5px; - font-size: 13px; - line-height: 1.5; - border-radius: 3px; } - -.btn-block { - display: block; - width: 100%; } - -.btn-block + .btn-block { - margin-top: 5px; } - -input[type="submit"].btn-block, -input[type="reset"].btn-block, -input[type="button"].btn-block { - width: 100%; } - -.fade { - opacity: 0; - -webkit-transition: opacity 0.15s linear; - -o-transition: opacity 0.15s linear; - transition: opacity 0.15s linear; } - .fade.in { - opacity: 1; } - -.collapse { - display: none; } - .collapse.in { - display: block; } - -tr.collapse.in { - display: table-row; } - -tbody.collapse.in { - display: table-row-group; } - -.collapsing { - position: relative; - height: 0; - overflow: hidden; - -webkit-transition-property: height, visibility; - transition-property: height, visibility; - -webkit-transition-duration: 0.35s; - transition-duration: 0.35s; - -webkit-transition-timing-function: ease; - transition-timing-function: ease; } - -.caret { - display: inline-block; - width: 0; - height: 0; - margin-left: 2px; - vertical-align: middle; - border-top: 4px dashed; - border-top: 4px solid \9; - border-right: 4px solid transparent; - border-left: 4px solid transparent; } - -.dropup, -.dropdown { - position: relative; } - -.dropdown-toggle:focus { - outline: 0; } - -.dropdown-menu { - position: absolute; - top: 100%; - left: 0; - z-index: 1000; - display: none; - float: left; - min-width: 160px; - padding: 5px 0; - margin: 2px 0 0; - list-style: none; - font-size: 15px; - text-align: left; - background-color: #fff; - border: 1px solid #ccc; - border: 1px solid rgba(0, 0, 0, 0.15); - border-radius: 3px; - -webkit-box-shadow: 0 6px 12px rgba(0, 0, 0, 0.175); - box-shadow: 0 6px 12px rgba(0, 0, 0, 0.175); - background-clip: padding-box; } - .dropdown-menu.pull-right { - right: 0; - left: auto; } - .dropdown-menu .divider { - height: 1px; - margin: 12.5px 0; - overflow: hidden; - background-color: #e5e5e5; } - .dropdown-menu > li > a { - display: block; - padding: 3px 20px; - clear: both; - font-weight: normal; - line-height: 1.846; - color: #444; - white-space: nowrap; } - -.dropdown-menu > li > a:hover, .dropdown-menu > li > a:focus { - text-decoration: none; - color: #141414; - background-color: #eeeeee; } - -.dropdown-menu > .active > a, .dropdown-menu > .active > a:hover, .dropdown-menu > .active > a:focus { - color: #fff; - text-decoration: none; - outline: 0; - background-color: #5a9ddb; } - -.dropdown-menu > .disabled > a, .dropdown-menu > .disabled > a:hover, .dropdown-menu > .disabled > a:focus { - color: #bbb; } - -.dropdown-menu > .disabled > a:hover, .dropdown-menu > .disabled > a:focus { - text-decoration: none; - background-color: transparent; - background-image: none; - filter: progid:DXImageTransform.Microsoft.gradient(enabled = false); - cursor: not-allowed; } - -.open > .dropdown-menu { - display: block; } - -.open > a { - outline: 0; } - -.dropdown-menu-right { - left: auto; - right: 0; } - -.dropdown-menu-left { - left: 0; - right: auto; } - -.dropdown-header { - display: block; - padding: 3px 20px; - font-size: 13px; - line-height: 1.846; - color: #bbb; - white-space: nowrap; } - -.dropdown-backdrop { - position: fixed; - left: 0; - right: 0; - bottom: 0; - top: 0; - z-index: 990; } - -.pull-right > .dropdown-menu { - right: 0; - left: auto; } - -.dropup .caret, -.navbar-fixed-bottom .dropdown .caret { - border-top: 0; - border-bottom: 4px dashed; - border-bottom: 4px solid \9; - content: ""; } - -.dropup .dropdown-menu, -.navbar-fixed-bottom .dropdown .dropdown-menu { - top: auto; - bottom: 100%; - margin-bottom: 2px; } - -@media (min-width: 768px) { - .navbar-right .dropdown-menu { - right: 0; - left: auto; } - .navbar-right .dropdown-menu-left { - left: 0; - right: auto; } } - -.btn-group, -.btn-group-vertical { - position: relative; - display: inline-block; - vertical-align: middle; } - .btn-group > .btn, - .btn-group-vertical > .btn { - position: relative; - float: left; } - .btn-group > .btn:hover, .btn-group > .btn:focus, .btn-group > .btn:active, .btn-group > .btn.active, - .btn-group-vertical > .btn:hover, - .btn-group-vertical > .btn:focus, - .btn-group-vertical > .btn:active, - .btn-group-vertical > .btn.active { - z-index: 2; } - -.btn-group .btn + .btn, -.btn-group .btn + .btn-group, -.btn-group .btn-group + .btn, -.btn-group .btn-group + .btn-group { - margin-left: -1px; } - -.btn-toolbar { - margin-left: -5px; } - .btn-toolbar:before, .btn-toolbar:after { - content: " "; - display: table; } - .btn-toolbar:after { - clear: both; } - .btn-toolbar .btn, - .btn-toolbar .btn-group, - .btn-toolbar .input-group { - float: left; } - .btn-toolbar > .btn, - .btn-toolbar > .btn-group, - .btn-toolbar > .input-group { - margin-left: 5px; } - -.btn-group > .btn:not(:first-child):not(:last-child):not(.dropdown-toggle) { - border-radius: 0; } - -.btn-group > .btn:first-child { - margin-left: 0; } - .btn-group > .btn:first-child:not(:last-child):not(.dropdown-toggle) { - border-bottom-right-radius: 0; - border-top-right-radius: 0; } - -.btn-group > .btn:last-child:not(:first-child), -.btn-group > .dropdown-toggle:not(:first-child) { - border-bottom-left-radius: 0; - border-top-left-radius: 0; } - -.btn-group > .btn-group { - float: left; } - -.btn-group > .btn-group:not(:first-child):not(:last-child) > .btn { - border-radius: 0; } - -.btn-group > .btn-group:first-child:not(:last-child) > .btn:last-child, -.btn-group > .btn-group:first-child:not(:last-child) > .dropdown-toggle { - border-bottom-right-radius: 0; - border-top-right-radius: 0; } - -.btn-group > .btn-group:last-child:not(:first-child) > .btn:first-child { - border-bottom-left-radius: 0; - border-top-left-radius: 0; } - -.btn-group .dropdown-toggle:active, -.btn-group.open .dropdown-toggle { - outline: 0; } - -.btn-group > .btn + .dropdown-toggle { - padding-left: 8px; - padding-right: 8px; } - -.btn-group > .btn-lg + .dropdown-toggle, .btn-group-lg.btn-group > .btn + .dropdown-toggle { - padding-left: 12px; - padding-right: 12px; } - -.btn-group.open .dropdown-toggle { - -webkit-box-shadow: inset 0 3px 5px rgba(0, 0, 0, 0.125); - box-shadow: inset 0 3px 5px rgba(0, 0, 0, 0.125); } - .btn-group.open .dropdown-toggle.btn-link { - -webkit-box-shadow: none; - box-shadow: none; } - -.btn .caret { - margin-left: 0; } - -.btn-lg .caret, .btn-group-lg > .btn .caret { - border-width: 5px 5px 0; - border-bottom-width: 0; } - -.dropup .btn-lg .caret, .dropup .btn-group-lg > .btn .caret { - border-width: 0 5px 5px; } - -.btn-group-vertical > .btn, -.btn-group-vertical > .btn-group, -.btn-group-vertical > .btn-group > .btn { - display: block; - float: none; - width: 100%; - max-width: 100%; } - -.btn-group-vertical > .btn-group:before, .btn-group-vertical > .btn-group:after { - content: " "; - display: table; } - -.btn-group-vertical > .btn-group:after { - clear: both; } - -.btn-group-vertical > .btn-group > .btn { - float: none; } - -.btn-group-vertical > .btn + .btn, -.btn-group-vertical > .btn + .btn-group, -.btn-group-vertical > .btn-group + .btn, -.btn-group-vertical > .btn-group + .btn-group { - margin-top: -1px; - margin-left: 0; } - -.btn-group-vertical > .btn:not(:first-child):not(:last-child) { - border-radius: 0; } - -.btn-group-vertical > .btn:first-child:not(:last-child) { - border-top-right-radius: 3px; - border-top-left-radius: 3px; - border-bottom-right-radius: 0; - border-bottom-left-radius: 0; } - -.btn-group-vertical > .btn:last-child:not(:first-child) { - border-top-right-radius: 0; - border-top-left-radius: 0; - border-bottom-right-radius: 3px; - border-bottom-left-radius: 3px; } - -.btn-group-vertical > .btn-group:not(:first-child):not(:last-child) > .btn { - border-radius: 0; } - -.btn-group-vertical > .btn-group:first-child:not(:last-child) > .btn:last-child, -.btn-group-vertical > .btn-group:first-child:not(:last-child) > .dropdown-toggle { - border-bottom-right-radius: 0; - border-bottom-left-radius: 0; } - -.btn-group-vertical > .btn-group:last-child:not(:first-child) > .btn:first-child { - border-top-right-radius: 0; - border-top-left-radius: 0; } - -.btn-group-justified { - display: table; - width: 100%; - table-layout: fixed; - border-collapse: separate; } - .btn-group-justified > .btn, - .btn-group-justified > .btn-group { - float: none; - display: table-cell; - width: 1%; } - .btn-group-justified > .btn-group .btn { - width: 100%; } - .btn-group-justified > .btn-group .dropdown-menu { - left: auto; } - -[data-toggle="buttons"] > .btn input[type="radio"], -[data-toggle="buttons"] > .btn input[type="checkbox"], -[data-toggle="buttons"] > .btn-group > .btn input[type="radio"], -[data-toggle="buttons"] > .btn-group > .btn input[type="checkbox"] { - position: absolute; - clip: rect(0, 0, 0, 0); - pointer-events: none; } - -.input-group { - position: relative; - display: table; - border-collapse: separate; } - .input-group[class*="col-"] { - float: none; - padding-left: 0; - padding-right: 0; } - .input-group .form-control { - position: relative; - z-index: 2; - float: left; - width: 100%; - margin-bottom: 0; } - .input-group .form-control:focus { - z-index: 3; } - -.input-group-addon, -.input-group-btn, -.input-group .form-control { - display: table-cell; } - .input-group-addon:not(:first-child):not(:last-child), - .input-group-btn:not(:first-child):not(:last-child), - .input-group .form-control:not(:first-child):not(:last-child) { - border-radius: 0; } - -.input-group-addon, -.input-group-btn { - width: 1%; - white-space: nowrap; - vertical-align: middle; } - -.input-group-addon { - padding: 6px 16px; - font-size: 15px; - font-weight: normal; - line-height: 1; - color: #666; - text-align: center; - background-color: transparent; - border: 1px solid transparent; - border-radius: 3px; } - .input-group-addon.input-sm, - .input-group-sm > .input-group-addon, - .input-group-sm > .input-group-btn > .input-group-addon.btn { - padding: 5px 10px; - font-size: 13px; - border-radius: 3px; } - .input-group-addon.input-lg, - .input-group-lg > .input-group-addon, - .input-group-lg > .input-group-btn > .input-group-addon.btn { - padding: 10px 16px; - font-size: 19px; - border-radius: 3px; } - .input-group-addon input[type="radio"], - .input-group-addon input[type="checkbox"] { - margin-top: 0; } - -.input-group .form-control:first-child, -.input-group-addon:first-child, -.input-group-btn:first-child > .btn, -.input-group-btn:first-child > .btn-group > .btn, -.input-group-btn:first-child > .dropdown-toggle, -.input-group-btn:last-child > .btn:not(:last-child):not(.dropdown-toggle), -.input-group-btn:last-child > .btn-group:not(:last-child) > .btn { - border-bottom-right-radius: 0; - border-top-right-radius: 0; } - -.input-group-addon:first-child { - border-right: 0; } - -.input-group .form-control:last-child, -.input-group-addon:last-child, -.input-group-btn:last-child > .btn, -.input-group-btn:last-child > .btn-group > .btn, -.input-group-btn:last-child > .dropdown-toggle, -.input-group-btn:first-child > .btn:not(:first-child), -.input-group-btn:first-child > .btn-group:not(:first-child) > .btn { - border-bottom-left-radius: 0; - border-top-left-radius: 0; } - -.input-group-addon:last-child { - border-left: 0; } - -.input-group-btn { - position: relative; - font-size: 0; - white-space: nowrap; } - .input-group-btn > .btn { - position: relative; } - .input-group-btn > .btn + .btn { - margin-left: -1px; } - .input-group-btn > .btn:hover, .input-group-btn > .btn:focus, .input-group-btn > .btn:active { - z-index: 2; } - .input-group-btn:first-child > .btn, - .input-group-btn:first-child > .btn-group { - margin-right: -1px; } - .input-group-btn:last-child > .btn, - .input-group-btn:last-child > .btn-group { - z-index: 2; - margin-left: -1px; } - -.nav { - margin-bottom: 0; - padding-left: 0; - list-style: none; } - .nav:before, .nav:after { - content: " "; - display: table; } - .nav:after { - clear: both; } - .nav > li { - position: relative; - display: block; } - .nav > li > a { - position: relative; - display: block; - padding: 10px 15px; } - .nav > li > a:hover, .nav > li > a:focus { - text-decoration: none; - background-color: #eeeeee; } - .nav > li.disabled > a { - color: #bbb; } - .nav > li.disabled > a:hover, .nav > li.disabled > a:focus { - color: #bbb; - text-decoration: none; - background-color: transparent; - cursor: not-allowed; } - .nav .open > a, .nav .open > a:hover, .nav .open > a:focus { - background-color: #eeeeee; - border-color: #5a9ddb; } - .nav .nav-divider { - height: 1px; - margin: 12.5px 0; - overflow: hidden; - background-color: #e5e5e5; } - .nav > li > a > img { - max-width: none; } - -.nav-tabs { - border-bottom: 1px solid transparent; } - .nav-tabs > li { - float: left; - margin-bottom: -1px; } - .nav-tabs > li > a { - margin-right: 2px; - line-height: 1.846; - border: 1px solid transparent; - border-radius: 3px 3px 0 0; } - .nav-tabs > li > a:hover { - border-color: #eeeeee #eeeeee transparent; } - .nav-tabs > li.active > a, .nav-tabs > li.active > a:hover, .nav-tabs > li.active > a:focus { - color: #666; - background-color: transparent; - border: 1px solid transparent; - border-bottom-color: transparent; - cursor: default; } - -.nav-pills > li { - float: left; } - .nav-pills > li > a { - border-radius: 3px; } - .nav-pills > li + li { - margin-left: 2px; } - .nav-pills > li.active > a, .nav-pills > li.active > a:hover, .nav-pills > li.active > a:focus { - color: #fff; - background-color: #5a9ddb; } - -.nav-stacked > li { - float: none; } - .nav-stacked > li + li { - margin-top: 2px; - margin-left: 0; } - -.nav-justified, .nav-tabs.nav-justified { - width: 100%; } - .nav-justified > li, .nav-tabs.nav-justified > li { - float: none; } - .nav-justified > li > a, .nav-tabs.nav-justified > li > a { - text-align: center; - margin-bottom: 5px; } - .nav-justified > .dropdown .dropdown-menu { - top: auto; - left: auto; } - @media (min-width: 768px) { - .nav-justified > li, .nav-tabs.nav-justified > li { - display: table-cell; - width: 1%; } - .nav-justified > li > a, .nav-tabs.nav-justified > li > a { - margin-bottom: 0; } } - -.nav-tabs-justified, .nav-tabs.nav-justified { - border-bottom: 0; } - .nav-tabs-justified > li > a, .nav-tabs.nav-justified > li > a { - margin-right: 0; - border-radius: 3px; } - .nav-tabs-justified > .active > a, .nav-tabs.nav-justified > .active > a, - .nav-tabs-justified > .active > a:hover, - .nav-tabs.nav-justified > .active > a:hover, - .nav-tabs-justified > .active > a:focus, - .nav-tabs.nav-justified > .active > a:focus { - border: 1px solid transparent; } - @media (min-width: 768px) { - .nav-tabs-justified > li > a, .nav-tabs.nav-justified > li > a { - border-bottom: 1px solid transparent; - border-radius: 3px 3px 0 0; } - .nav-tabs-justified > .active > a, .nav-tabs.nav-justified > .active > a, - .nav-tabs-justified > .active > a:hover, - .nav-tabs.nav-justified > .active > a:hover, - .nav-tabs-justified > .active > a:focus, - .nav-tabs.nav-justified > .active > a:focus { - border-bottom-color: #fff; } } - -.tab-content > .tab-pane { - display: none; } - -.tab-content > .active { - display: block; } - -.nav-tabs .dropdown-menu { - margin-top: -1px; - border-top-right-radius: 0; - border-top-left-radius: 0; } - -.navbar { - position: relative; - min-height: 110px; - margin-bottom: 27px; - border: 1px solid transparent; } - .navbar:before, .navbar:after { - content: " "; - display: table; } - .navbar:after { - clear: both; } - @media (min-width: 768px) { - .navbar { - border-radius: 3px; } } - -.navbar-header:before, .navbar-header:after { - content: " "; - display: table; } - -.navbar-header:after { - clear: both; } - -@media (min-width: 768px) { - .navbar-header { - float: left; } } - -.navbar-collapse { - overflow-x: visible; - padding-right: 15px; - padding-left: 15px; - border-top: 1px solid transparent; - box-shadow: inset 0 1px 0 rgba(255, 255, 255, 0.1); - -webkit-overflow-scrolling: touch; } - .navbar-collapse:before, .navbar-collapse:after { - content: " "; - display: table; } - .navbar-collapse:after { - clear: both; } - .navbar-collapse.in { - overflow-y: auto; } - @media (min-width: 768px) { - .navbar-collapse { - width: auto; - border-top: 0; - box-shadow: none; } - .navbar-collapse.collapse { - display: block !important; - height: auto !important; - padding-bottom: 0; - overflow: visible !important; } - .navbar-collapse.in { - overflow-y: visible; } - .navbar-fixed-top .navbar-collapse, - .navbar-static-top .navbar-collapse, - .navbar-fixed-bottom .navbar-collapse { - padding-left: 0; - padding-right: 0; } } - -.navbar-fixed-top .navbar-collapse, -.navbar-fixed-bottom .navbar-collapse { - max-height: 340px; } - @media (max-device-width: 480px) and (orientation: landscape) { - .navbar-fixed-top .navbar-collapse, - .navbar-fixed-bottom .navbar-collapse { - max-height: 200px; } } - -.container > .navbar-header, -.container > .navbar-collapse, -.container-fluid > .navbar-header, -.container-fluid > .navbar-collapse { - margin-right: -15px; - margin-left: -15px; } - @media (min-width: 768px) { - .container > .navbar-header, - .container > .navbar-collapse, - .container-fluid > .navbar-header, - .container-fluid > .navbar-collapse { - margin-right: 0; - margin-left: 0; } } - -.navbar-static-top { - z-index: 1000; - border-width: 0 0 1px; } - @media (min-width: 768px) { - .navbar-static-top { - border-radius: 0; } } - -.navbar-fixed-top, -.navbar-fixed-bottom { - position: fixed; - right: 0; - left: 0; - z-index: 1030; } - @media (min-width: 768px) { - .navbar-fixed-top, - .navbar-fixed-bottom { - border-radius: 0; } } - -.navbar-fixed-top { - top: 0; - border-width: 0 0 1px; } - -.navbar-fixed-bottom { - bottom: 0; - margin-bottom: 0; - border-width: 1px 0 0; } - -.navbar-brand { - float: left; - padding: 41.5px 15px; - font-size: 19px; - line-height: 27px; - height: 110px; } - .navbar-brand:hover, .navbar-brand:focus { - text-decoration: none; } - .navbar-brand > img { - display: block; } - @media (min-width: 768px) { - .navbar > .container .navbar-brand, - .navbar > .container-fluid .navbar-brand { - margin-left: -15px; } } - -.navbar-toggle { - position: relative; - float: right; - margin-right: 15px; - padding: 9px 10px; - margin-top: 38px; - margin-bottom: 38px; - background-color: transparent; - background-image: none; - border: 1px solid transparent; - border-radius: 3px; } - .navbar-toggle:focus { - outline: 0; } - .navbar-toggle .icon-bar { - display: block; - width: 22px; - height: 2px; - border-radius: 1px; } - .navbar-toggle .icon-bar + .icon-bar { - margin-top: 4px; } - @media (min-width: 768px) { - .navbar-toggle { - display: none; } } - -.navbar-nav { - margin: 20.75px -15px; } - .navbar-nav > li > a { - padding-top: 10px; - padding-bottom: 10px; - line-height: 27px; } - @media (max-width: 767px) { - .navbar-nav .open .dropdown-menu { - position: static; - float: none; - width: auto; - margin-top: 0; - background-color: transparent; - border: 0; - box-shadow: none; } - .navbar-nav .open .dropdown-menu > li > a, - .navbar-nav .open .dropdown-menu .dropdown-header { - padding: 5px 15px 5px 25px; } - .navbar-nav .open .dropdown-menu > li > a { - line-height: 27px; } - .navbar-nav .open .dropdown-menu > li > a:hover, .navbar-nav .open .dropdown-menu > li > a:focus { - background-image: none; } } - @media (min-width: 768px) { - .navbar-nav { - float: left; - margin: 0; } - .navbar-nav > li { - float: left; } - .navbar-nav > li > a { - padding-top: 41.5px; - padding-bottom: 41.5px; } } - -.navbar-form { - margin-left: -15px; - margin-right: -15px; - padding: 10px 15px; - border-top: 1px solid transparent; - border-bottom: 1px solid transparent; - -webkit-box-shadow: inset 0 1px 0 rgba(255, 255, 255, 0.1), 0 1px 0 rgba(255, 255, 255, 0.1); - box-shadow: inset 0 1px 0 rgba(255, 255, 255, 0.1), 0 1px 0 rgba(255, 255, 255, 0.1); - margin-top: 34.5px; - margin-bottom: 34.5px; } - @media (min-width: 768px) { - .navbar-form .form-group { - display: inline-block; - margin-bottom: 0; - vertical-align: middle; } - .navbar-form .form-control { - display: inline-block; - width: auto; - vertical-align: middle; } - .navbar-form .form-control-static { - display: inline-block; } - .navbar-form .input-group { - display: inline-table; - vertical-align: middle; } - .navbar-form .input-group .input-group-addon, - .navbar-form .input-group .input-group-btn, - .navbar-form .input-group .form-control { - width: auto; } - .navbar-form .input-group > .form-control { - width: 100%; } - .navbar-form .control-label { - margin-bottom: 0; - vertical-align: middle; } - .navbar-form .radio, - .navbar-form .checkbox { - display: inline-block; - margin-top: 0; - margin-bottom: 0; - vertical-align: middle; } - .navbar-form .radio label, - .navbar-form .checkbox label { - padding-left: 0; } - .navbar-form .radio input[type="radio"], - .navbar-form .checkbox input[type="checkbox"] { - position: relative; - margin-left: 0; } - .navbar-form .has-feedback .form-control-feedback { - top: 0; } } - @media (max-width: 767px) { - .navbar-form .form-group { - margin-bottom: 5px; } - .navbar-form .form-group:last-child { - margin-bottom: 0; } } - @media (min-width: 768px) { - .navbar-form { - width: auto; - border: 0; - margin-left: 0; - margin-right: 0; - padding-top: 0; - padding-bottom: 0; - -webkit-box-shadow: none; - box-shadow: none; } } - -.navbar-nav > li > .dropdown-menu { - margin-top: 0; - border-top-right-radius: 0; - border-top-left-radius: 0; } - -.navbar-fixed-bottom .navbar-nav > li > .dropdown-menu { - margin-bottom: 0; - border-top-right-radius: 3px; - border-top-left-radius: 3px; - border-bottom-right-radius: 0; - border-bottom-left-radius: 0; } - -.navbar-btn { - margin-top: 34.5px; - margin-bottom: 34.5px; } - .navbar-btn.btn-sm, .btn-group-sm > .navbar-btn.btn { - margin-top: 39.5px; - margin-bottom: 39.5px; } - .navbar-btn.btn-xs, .btn-group-xs > .navbar-btn.btn { - margin-top: 44px; - margin-bottom: 44px; } - -.navbar-text { - margin-top: 41.5px; - margin-bottom: 41.5px; } - @media (min-width: 768px) { - .navbar-text { - float: left; - margin-left: 15px; - margin-right: 15px; } } - -@media (min-width: 768px) { - .navbar-left { - float: left !important; } - .navbar-right { - float: right !important; - margin-right: -15px; } - .navbar-right ~ .navbar-right { - margin-right: 0; } } - -.navbar-default { - background-color: #fff; - border-color: transparent; } - .navbar-default .navbar-brand { - color: #444; } - .navbar-default .navbar-brand:hover, .navbar-default .navbar-brand:focus { - color: #222; - background-color: transparent; } - .navbar-default .navbar-text { - color: #bbb; } - .navbar-default .navbar-nav > li > a { - color: #444; } - .navbar-default .navbar-nav > li > a:hover, .navbar-default .navbar-nav > li > a:focus { - color: #222; - background-color: transparent; } - .navbar-default .navbar-nav > .active > a, .navbar-default .navbar-nav > .active > a:hover, .navbar-default .navbar-nav > .active > a:focus { - color: #212121; - background-color: #fcfcfc; } - .navbar-default .navbar-nav > .disabled > a, .navbar-default .navbar-nav > .disabled > a:hover, .navbar-default .navbar-nav > .disabled > a:focus { - color: #ccc; - background-color: transparent; } - .navbar-default .navbar-toggle { - border-color: transparent; } - .navbar-default .navbar-toggle:hover, .navbar-default .navbar-toggle:focus { - background-color: transparent; } - .navbar-default .navbar-toggle .icon-bar { - background-color: rgba(0, 0, 0, 0.5); } - .navbar-default .navbar-collapse, - .navbar-default .navbar-form { - border-color: transparent; } - .navbar-default .navbar-nav > .open > a, .navbar-default .navbar-nav > .open > a:hover, .navbar-default .navbar-nav > .open > a:focus { - background-color: #fcfcfc; - color: #212121; } - @media (max-width: 767px) { - .navbar-default .navbar-nav .open .dropdown-menu > li > a { - color: #444; } - .navbar-default .navbar-nav .open .dropdown-menu > li > a:hover, .navbar-default .navbar-nav .open .dropdown-menu > li > a:focus { - color: #222; - background-color: transparent; } - .navbar-default .navbar-nav .open .dropdown-menu > .active > a, .navbar-default .navbar-nav .open .dropdown-menu > .active > a:hover, .navbar-default .navbar-nav .open .dropdown-menu > .active > a:focus { - color: #212121; - background-color: #fcfcfc; } - .navbar-default .navbar-nav .open .dropdown-menu > .disabled > a, .navbar-default .navbar-nav .open .dropdown-menu > .disabled > a:hover, .navbar-default .navbar-nav .open .dropdown-menu > .disabled > a:focus { - color: #ccc; - background-color: transparent; } } - .navbar-default .navbar-link { - color: #444; } - .navbar-default .navbar-link:hover { - color: #222; } - .navbar-default .btn-link { - color: #444; } - .navbar-default .btn-link:hover, .navbar-default .btn-link:focus { - color: #222; } - .navbar-default .btn-link[disabled]:hover, .navbar-default .btn-link[disabled]:focus, - fieldset[disabled] .navbar-default .btn-link:hover, - fieldset[disabled] .navbar-default .btn-link:focus { - color: #ccc; } - -.navbar-inverse { - background-color: #5a9ddb; - border-color: transparent; } - .navbar-inverse .navbar-brand { - color: #d8e8f6; } - .navbar-inverse .navbar-brand:hover, .navbar-inverse .navbar-brand:focus { - color: #fff; - background-color: transparent; } - .navbar-inverse .navbar-text { - color: #bbb; } - .navbar-inverse .navbar-nav > li > a { - color: #d8e8f6; } - .navbar-inverse .navbar-nav > li > a:hover, .navbar-inverse .navbar-nav > li > a:focus { - color: #fff; - background-color: transparent; } - .navbar-inverse .navbar-nav > .active > a, .navbar-inverse .navbar-nav > .active > a:hover, .navbar-inverse .navbar-nav > .active > a:focus { - color: #fff; - background-color: #3084d2; } - .navbar-inverse .navbar-nav > .disabled > a, .navbar-inverse .navbar-nav > .disabled > a:hover, .navbar-inverse .navbar-nav > .disabled > a:focus { - color: #444; - background-color: transparent; } - .navbar-inverse .navbar-toggle { - border-color: transparent; } - .navbar-inverse .navbar-toggle:hover, .navbar-inverse .navbar-toggle:focus { - background-color: transparent; } - .navbar-inverse .navbar-toggle .icon-bar { - background-color: rgba(0, 0, 0, 0.5); } - .navbar-inverse .navbar-collapse, - .navbar-inverse .navbar-form { - border-color: #3d8cd5; } - .navbar-inverse .navbar-nav > .open > a, .navbar-inverse .navbar-nav > .open > a:hover, .navbar-inverse .navbar-nav > .open > a:focus { - background-color: #3084d2; - color: #fff; } - @media (max-width: 767px) { - .navbar-inverse .navbar-nav .open .dropdown-menu > .dropdown-header { - border-color: transparent; } - .navbar-inverse .navbar-nav .open .dropdown-menu .divider { - background-color: transparent; } - .navbar-inverse .navbar-nav .open .dropdown-menu > li > a { - color: #d8e8f6; } - .navbar-inverse .navbar-nav .open .dropdown-menu > li > a:hover, .navbar-inverse .navbar-nav .open .dropdown-menu > li > a:focus { - color: #fff; - background-color: transparent; } - .navbar-inverse .navbar-nav .open .dropdown-menu > .active > a, .navbar-inverse .navbar-nav .open .dropdown-menu > .active > a:hover, .navbar-inverse .navbar-nav .open .dropdown-menu > .active > a:focus { - color: #fff; - background-color: #3084d2; } - .navbar-inverse .navbar-nav .open .dropdown-menu > .disabled > a, .navbar-inverse .navbar-nav .open .dropdown-menu > .disabled > a:hover, .navbar-inverse .navbar-nav .open .dropdown-menu > .disabled > a:focus { - color: #444; - background-color: transparent; } } - .navbar-inverse .navbar-link { - color: #d8e8f6; } - .navbar-inverse .navbar-link:hover { - color: #fff; } - .navbar-inverse .btn-link { - color: #d8e8f6; } - .navbar-inverse .btn-link:hover, .navbar-inverse .btn-link:focus { - color: #fff; } - .navbar-inverse .btn-link[disabled]:hover, .navbar-inverse .btn-link[disabled]:focus, - fieldset[disabled] .navbar-inverse .btn-link:hover, - fieldset[disabled] .navbar-inverse .btn-link:focus { - color: #444; } - -.breadcrumb { - padding: 8px 15px; - margin-bottom: 27px; - list-style: none; - background-color: #f5f5f5; - border-radius: 3px; } - .breadcrumb > li { - display: inline-block; } - .breadcrumb > li + li:before { - content: "/ "; - padding: 0 5px; - color: #ccc; } - .breadcrumb > .active { - color: #bbb; } - -.pagination { - display: inline-block; - padding-left: 0; - margin: 27px 0; - border-radius: 3px; } - .pagination > li { - display: inline; } - .pagination > li > a, - .pagination > li > span { - position: relative; - float: left; - padding: 6px 16px; - line-height: 1.846; - text-decoration: none; - color: #5a9ddb; - background-color: #fff; - border: 1px solid #ddd; - margin-left: -1px; } - .pagination > li:first-child > a, - .pagination > li:first-child > span { - margin-left: 0; - border-bottom-left-radius: 3px; - border-top-left-radius: 3px; } - .pagination > li:last-child > a, - .pagination > li:last-child > span { - border-bottom-right-radius: 3px; - border-top-right-radius: 3px; } - .pagination > li > a:hover, .pagination > li > a:focus, - .pagination > li > span:hover, - .pagination > li > span:focus { - z-index: 2; - color: #2a77bf; - background-color: #eeeeee; - border-color: #ddd; } - .pagination > .active > a, .pagination > .active > a:hover, .pagination > .active > a:focus, - .pagination > .active > span, - .pagination > .active > span:hover, - .pagination > .active > span:focus { - z-index: 3; - color: #fff; - background-color: #5a9ddb; - border-color: #5a9ddb; - cursor: default; } - .pagination > .disabled > span, - .pagination > .disabled > span:hover, - .pagination > .disabled > span:focus, - .pagination > .disabled > a, - .pagination > .disabled > a:hover, - .pagination > .disabled > a:focus { - color: #bbb; - background-color: #fff; - border-color: #ddd; - cursor: not-allowed; } - -.pagination-lg > li > a, -.pagination-lg > li > span { - padding: 10px 16px; - font-size: 19px; - line-height: 1.33333; } - -.pagination-lg > li:first-child > a, -.pagination-lg > li:first-child > span { - border-bottom-left-radius: 3px; - border-top-left-radius: 3px; } - -.pagination-lg > li:last-child > a, -.pagination-lg > li:last-child > span { - border-bottom-right-radius: 3px; - border-top-right-radius: 3px; } - -.pagination-sm > li > a, -.pagination-sm > li > span { - padding: 5px 10px; - font-size: 13px; - line-height: 1.5; } - -.pagination-sm > li:first-child > a, -.pagination-sm > li:first-child > span { - border-bottom-left-radius: 3px; - border-top-left-radius: 3px; } - -.pagination-sm > li:last-child > a, -.pagination-sm > li:last-child > span { - border-bottom-right-radius: 3px; - border-top-right-radius: 3px; } - -.pager { - padding-left: 0; - margin: 27px 0; - list-style: none; - text-align: center; } - .pager:before, .pager:after { - content: " "; - display: table; } - .pager:after { - clear: both; } - .pager li { - display: inline; } - .pager li > a, - .pager li > span { - display: inline-block; - padding: 5px 14px; - background-color: #fff; - border: 1px solid #ddd; - border-radius: 15px; } - .pager li > a:hover, - .pager li > a:focus { - text-decoration: none; - background-color: #eeeeee; } - .pager .next > a, - .pager .next > span { - float: right; } - .pager .previous > a, - .pager .previous > span { - float: left; } - .pager .disabled > a, - .pager .disabled > a:hover, - .pager .disabled > a:focus, - .pager .disabled > span { - color: #bbb; - background-color: #fff; - cursor: not-allowed; } - -.label { - display: inline; - padding: .2em .6em .3em; - font-size: 75%; - font-weight: bold; - line-height: 1; - color: #fff; - text-align: center; - white-space: nowrap; - vertical-align: baseline; - border-radius: .25em; } - .label:empty { - display: none; } - .btn .label { - position: relative; - top: -1px; } - -a.label:hover, a.label:focus { - color: #fff; - text-decoration: none; - cursor: pointer; } - -.label-default { - background-color: #bbb; } - .label-default[href]:hover, .label-default[href]:focus { - background-color: #a2a2a2; } - -.label-primary { - background-color: #5a9ddb; } - .label-primary[href]:hover, .label-primary[href]:focus { - background-color: #3084d2; } - -.label-success { - background-color: #4CAF50; } - .label-success[href]:hover, .label-success[href]:focus { - background-color: #3d8b40; } - -.label-info { - background-color: #9C27B0; } - .label-info[href]:hover, .label-info[href]:focus { - background-color: #771e86; } - -.label-warning { - background-color: #ff9800; } - .label-warning[href]:hover, .label-warning[href]:focus { - background-color: #cc7a00; } - -.label-danger { - background-color: #e51c23; } - .label-danger[href]:hover, .label-danger[href]:focus { - background-color: #b9151b; } - -.badge { - display: inline-block; - min-width: 10px; - padding: 3px 7px; - font-size: 13px; - font-weight: normal; - color: #fff; - line-height: 1; - vertical-align: middle; - white-space: nowrap; - text-align: center; - background-color: #bbb; - border-radius: 10px; } - .badge:empty { - display: none; } - .btn .badge { - position: relative; - top: -1px; } - .btn-xs .badge, .btn-group-xs > .btn .badge, - .btn-group-xs > .btn .badge { - top: 0; - padding: 1px 5px; } - .list-group-item.active > .badge, - .nav-pills > .active > a > .badge { - color: #5a9ddb; - background-color: #fff; } - .list-group-item > .badge { - float: right; } - .list-group-item > .badge + .badge { - margin-right: 5px; } - .nav-pills > li > a > .badge { - margin-left: 3px; } - -a.badge:hover, a.badge:focus { - color: #fff; - text-decoration: none; - cursor: pointer; } - -.jumbotron { - padding-top: 30px; - padding-bottom: 30px; - margin-bottom: 30px; - color: inherit; - background-color: #f5f5f5; } - .jumbotron h1, - .jumbotron .h1 { - color: #444; } - .jumbotron p { - margin-bottom: 15px; - font-size: 23px; - font-weight: 200; } - .jumbotron > hr { - border-top-color: gainsboro; } - .container .jumbotron, - .container-fluid .jumbotron { - border-radius: 3px; - padding-left: 15px; - padding-right: 15px; } - .jumbotron .container { - max-width: 100%; } - @media screen and (min-width: 768px) { - .jumbotron { - padding-top: 48px; - padding-bottom: 48px; } - .container .jumbotron, - .container-fluid .jumbotron { - padding-left: 60px; - padding-right: 60px; } - .jumbotron h1, - .jumbotron .h1 { - font-size: 68px; } } - -.thumbnail { - display: block; - padding: 4px; - margin-bottom: 27px; - line-height: 1.846; - background-color: #fff; - border: 1px solid #ddd; - border-radius: 3px; - -webkit-transition: border 0.2s ease-in-out; - -o-transition: border 0.2s ease-in-out; - transition: border 0.2s ease-in-out; } - .thumbnail > img, - .thumbnail a > img { - display: block; - max-width: 100%; - height: auto; - margin-left: auto; - margin-right: auto; } - .thumbnail .caption { - padding: 9px; - color: #444; } - -a.thumbnail:hover, -a.thumbnail:focus, -a.thumbnail.active { - border-color: #5a9ddb; } - -.alert { - padding: 15px; - margin-bottom: 27px; - border: 1px solid transparent; - border-radius: 3px; } - .alert h4 { - margin-top: 0; - color: inherit; } - .alert .alert-link { - font-weight: bold; } - .alert > p, - .alert > ul { - margin-bottom: 0; } - .alert > p + p { - margin-top: 5px; } - -.alert-dismissable, -.alert-dismissible { - padding-right: 35px; } - .alert-dismissable .close, - .alert-dismissible .close { - position: relative; - top: -2px; - right: -21px; - color: inherit; } - -.alert-success { - background-color: #dff0d8; - border-color: #d6e9c6; - color: #4CAF50; } - .alert-success hr { - border-top-color: #c9e2b3; } - .alert-success .alert-link { - color: #3d8b40; } - -.alert-info { - background-color: #e1bee7; - border-color: #cba4dd; - color: #9C27B0; } - .alert-info hr { - border-top-color: #c191d6; } - .alert-info .alert-link { - color: #771e86; } - -.alert-warning { - background-color: #ffe0b2; - border-color: #ffc599; - color: #ff9800; } - .alert-warning hr { - border-top-color: #ffb67f; } - .alert-warning .alert-link { - color: #cc7a00; } - -.alert-danger { - background-color: #f9bdbb; - border-color: #f7a4af; - color: #e51c23; } - .alert-danger hr { - border-top-color: #f58c9a; } - .alert-danger .alert-link { - color: #b9151b; } - -@-webkit-keyframes progress-bar-stripes { - from { - background-position: 40px 0; } - to { - background-position: 0 0; } } - -@keyframes progress-bar-stripes { - from { - background-position: 40px 0; } - to { - background-position: 0 0; } } - -.progress { - overflow: hidden; - height: 27px; - margin-bottom: 27px; - background-color: #f5f5f5; - border-radius: 3px; - -webkit-box-shadow: inset 0 1px 2px rgba(0, 0, 0, 0.1); - box-shadow: inset 0 1px 2px rgba(0, 0, 0, 0.1); } - -.progress-bar { - float: left; - width: 0%; - height: 100%; - font-size: 13px; - line-height: 27px; - color: #fff; - text-align: center; - background-color: #5a9ddb; - -webkit-box-shadow: inset 0 -1px 0 rgba(0, 0, 0, 0.15); - box-shadow: inset 0 -1px 0 rgba(0, 0, 0, 0.15); - -webkit-transition: width 0.6s ease; - -o-transition: width 0.6s ease; - transition: width 0.6s ease; } - -.progress-striped .progress-bar, -.progress-bar-striped { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-size: 40px 40px; } - -.progress.active .progress-bar, -.progress-bar.active { - -webkit-animation: progress-bar-stripes 2s linear infinite; - -o-animation: progress-bar-stripes 2s linear infinite; - animation: progress-bar-stripes 2s linear infinite; } - -.progress-bar-success { - background-color: #4CAF50; } - .progress-striped .progress-bar-success { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); } - -.progress-bar-info { - background-color: #9C27B0; } - .progress-striped .progress-bar-info { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); } - -.progress-bar-warning { - background-color: #ff9800; } - .progress-striped .progress-bar-warning { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); } - -.progress-bar-danger { - background-color: #e51c23; } - .progress-striped .progress-bar-danger { - background-image: -webkit-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: -o-linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); - background-image: linear-gradient(45deg, rgba(255, 255, 255, 0.15) 25%, transparent 25%, transparent 50%, rgba(255, 255, 255, 0.15) 50%, rgba(255, 255, 255, 0.15) 75%, transparent 75%, transparent); } - -.media { - margin-top: 15px; } - .media:first-child { - margin-top: 0; } - -.media, -.media-body { - zoom: 1; - overflow: hidden; } - -.media-body { - width: 10000px; } - -.media-object { - display: block; } - .media-object.img-thumbnail { - max-width: none; } - -.media-right, -.media > .pull-right { - padding-left: 10px; } - -.media-left, -.media > .pull-left { - padding-right: 10px; } - -.media-left, -.media-right, -.media-body { - display: table-cell; - vertical-align: top; } - -.media-middle { - vertical-align: middle; } - -.media-bottom { - vertical-align: bottom; } - -.media-heading { - margin-top: 0; - margin-bottom: 5px; } - -.media-list { - padding-left: 0; - list-style: none; } - -.list-group { - margin-bottom: 20px; - padding-left: 0; } - -.list-group-item { - position: relative; - display: block; - padding: 10px 15px; - margin-bottom: -1px; - background-color: #fff; - border: 1px solid #ddd; } - .list-group-item:first-child { - border-top-right-radius: 3px; - border-top-left-radius: 3px; } - .list-group-item:last-child { - margin-bottom: 0; - border-bottom-right-radius: 3px; - border-bottom-left-radius: 3px; } - -a.list-group-item, -button.list-group-item { - color: #555; } - a.list-group-item .list-group-item-heading, - button.list-group-item .list-group-item-heading { - color: #333; } - a.list-group-item:hover, a.list-group-item:focus, - button.list-group-item:hover, - button.list-group-item:focus { - text-decoration: none; - color: #555; - background-color: #f5f5f5; } - -button.list-group-item { - width: 100%; - text-align: left; } - -.list-group-item.disabled, .list-group-item.disabled:hover, .list-group-item.disabled:focus { - background-color: #eeeeee; - color: #bbb; - cursor: not-allowed; } - .list-group-item.disabled .list-group-item-heading, .list-group-item.disabled:hover .list-group-item-heading, .list-group-item.disabled:focus .list-group-item-heading { - color: inherit; } - .list-group-item.disabled .list-group-item-text, .list-group-item.disabled:hover .list-group-item-text, .list-group-item.disabled:focus .list-group-item-text { - color: #bbb; } - -.list-group-item.active, .list-group-item.active:hover, .list-group-item.active:focus { - z-index: 2; - color: #fff; - background-color: #5a9ddb; - border-color: #5a9ddb; } - .list-group-item.active .list-group-item-heading, - .list-group-item.active .list-group-item-heading > small, - .list-group-item.active .list-group-item-heading > .small, .list-group-item.active:hover .list-group-item-heading, - .list-group-item.active:hover .list-group-item-heading > small, - .list-group-item.active:hover .list-group-item-heading > .small, .list-group-item.active:focus .list-group-item-heading, - .list-group-item.active:focus .list-group-item-heading > small, - .list-group-item.active:focus .list-group-item-heading > .small { - color: inherit; } - .list-group-item.active .list-group-item-text, .list-group-item.active:hover .list-group-item-text, .list-group-item.active:focus .list-group-item-text { - color: white; } - -.list-group-item-success { - color: #4CAF50; - background-color: #dff0d8; } - -a.list-group-item-success, -button.list-group-item-success { - color: #4CAF50; } - a.list-group-item-success .list-group-item-heading, - button.list-group-item-success .list-group-item-heading { - color: inherit; } - a.list-group-item-success:hover, a.list-group-item-success:focus, - button.list-group-item-success:hover, - button.list-group-item-success:focus { - color: #4CAF50; - background-color: #d0e9c6; } - a.list-group-item-success.active, a.list-group-item-success.active:hover, a.list-group-item-success.active:focus, - button.list-group-item-success.active, - button.list-group-item-success.active:hover, - button.list-group-item-success.active:focus { - color: #fff; - background-color: #4CAF50; - border-color: #4CAF50; } - -.list-group-item-info { - color: #9C27B0; - background-color: #e1bee7; } - -a.list-group-item-info, -button.list-group-item-info { - color: #9C27B0; } - a.list-group-item-info .list-group-item-heading, - button.list-group-item-info .list-group-item-heading { - color: inherit; } - a.list-group-item-info:hover, a.list-group-item-info:focus, - button.list-group-item-info:hover, - button.list-group-item-info:focus { - color: #9C27B0; - background-color: #d8abe0; } - a.list-group-item-info.active, a.list-group-item-info.active:hover, a.list-group-item-info.active:focus, - button.list-group-item-info.active, - button.list-group-item-info.active:hover, - button.list-group-item-info.active:focus { - color: #fff; - background-color: #9C27B0; - border-color: #9C27B0; } - -.list-group-item-warning { - color: #ff9800; - background-color: #ffe0b2; } - -a.list-group-item-warning, -button.list-group-item-warning { - color: #ff9800; } - a.list-group-item-warning .list-group-item-heading, - button.list-group-item-warning .list-group-item-heading { - color: inherit; } - a.list-group-item-warning:hover, a.list-group-item-warning:focus, - button.list-group-item-warning:hover, - button.list-group-item-warning:focus { - color: #ff9800; - background-color: #ffd699; } - a.list-group-item-warning.active, a.list-group-item-warning.active:hover, a.list-group-item-warning.active:focus, - button.list-group-item-warning.active, - button.list-group-item-warning.active:hover, - button.list-group-item-warning.active:focus { - color: #fff; - background-color: #ff9800; - border-color: #ff9800; } - -.list-group-item-danger { - color: #e51c23; - background-color: #f9bdbb; } - -a.list-group-item-danger, -button.list-group-item-danger { - color: #e51c23; } - a.list-group-item-danger .list-group-item-heading, - button.list-group-item-danger .list-group-item-heading { - color: inherit; } - a.list-group-item-danger:hover, a.list-group-item-danger:focus, - button.list-group-item-danger:hover, - button.list-group-item-danger:focus { - color: #e51c23; - background-color: #f7a6a4; } - a.list-group-item-danger.active, a.list-group-item-danger.active:hover, a.list-group-item-danger.active:focus, - button.list-group-item-danger.active, - button.list-group-item-danger.active:hover, - button.list-group-item-danger.active:focus { - color: #fff; - background-color: #e51c23; - border-color: #e51c23; } - -.list-group-item-heading { - margin-top: 0; - margin-bottom: 5px; } - -.list-group-item-text { - margin-bottom: 0; - line-height: 1.3; } - -.panel { - margin-bottom: 27px; - background-color: #fff; - border: 1px solid transparent; - border-radius: 3px; - -webkit-box-shadow: 0 1px 1px rgba(0, 0, 0, 0.05); - box-shadow: 0 1px 1px rgba(0, 0, 0, 0.05); } - -.panel-body { - padding: 15px; } - .panel-body:before, .panel-body:after { - content: " "; - display: table; } - .panel-body:after { - clear: both; } - -.panel-heading { - padding: 10px 15px; - border-bottom: 1px solid transparent; - border-top-right-radius: 2px; - border-top-left-radius: 2px; } - .panel-heading > .dropdown .dropdown-toggle { - color: inherit; } - -.panel-title { - margin-top: 0; - margin-bottom: 0; - font-size: 17px; - color: inherit; } - .panel-title > a, - .panel-title > small, - .panel-title > .small, - .panel-title > small > a, - .panel-title > .small > a { - color: inherit; } - -.panel-footer { - padding: 10px 15px; - background-color: #f5f5f5; - border-top: 1px solid #ddd; - border-bottom-right-radius: 2px; - border-bottom-left-radius: 2px; } - -.panel > .list-group, -.panel > .panel-collapse > .list-group { - margin-bottom: 0; } - .panel > .list-group .list-group-item, - .panel > .panel-collapse > .list-group .list-group-item { - border-width: 1px 0; - border-radius: 0; } - .panel > .list-group:first-child .list-group-item:first-child, - .panel > .panel-collapse > .list-group:first-child .list-group-item:first-child { - border-top: 0; - border-top-right-radius: 2px; - border-top-left-radius: 2px; } - .panel > .list-group:last-child .list-group-item:last-child, - .panel > .panel-collapse > .list-group:last-child .list-group-item:last-child { - border-bottom: 0; - border-bottom-right-radius: 2px; - border-bottom-left-radius: 2px; } - -.panel > .panel-heading + .panel-collapse > .list-group .list-group-item:first-child { - border-top-right-radius: 0; - border-top-left-radius: 0; } - -.panel-heading + .list-group .list-group-item:first-child { - border-top-width: 0; } - -.list-group + .panel-footer { - border-top-width: 0; } - -.panel > .table, -.panel > .table-responsive > .table, -.panel > .panel-collapse > .table { - margin-bottom: 0; } - .panel > .table caption, - .panel > .table-responsive > .table caption, - .panel > .panel-collapse > .table caption { - padding-left: 15px; - padding-right: 15px; } - -.panel > .table:first-child, -.panel > .table-responsive:first-child > .table:first-child { - border-top-right-radius: 2px; - border-top-left-radius: 2px; } - .panel > .table:first-child > thead:first-child > tr:first-child, - .panel > .table:first-child > tbody:first-child > tr:first-child, - .panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child, - .panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child { - border-top-left-radius: 2px; - border-top-right-radius: 2px; } - .panel > .table:first-child > thead:first-child > tr:first-child td:first-child, - .panel > .table:first-child > thead:first-child > tr:first-child th:first-child, - .panel > .table:first-child > tbody:first-child > tr:first-child td:first-child, - .panel > .table:first-child > tbody:first-child > tr:first-child th:first-child, - .panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child td:first-child, - .panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child th:first-child, - .panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child td:first-child, - .panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child th:first-child { - border-top-left-radius: 2px; } - .panel > .table:first-child > thead:first-child > tr:first-child td:last-child, - .panel > .table:first-child > thead:first-child > tr:first-child th:last-child, - .panel > .table:first-child > tbody:first-child > tr:first-child td:last-child, - .panel > .table:first-child > tbody:first-child > tr:first-child th:last-child, - .panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child td:last-child, - .panel > .table-responsive:first-child > .table:first-child > thead:first-child > tr:first-child th:last-child, - .panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child td:last-child, - .panel > .table-responsive:first-child > .table:first-child > tbody:first-child > tr:first-child th:last-child { - border-top-right-radius: 2px; } - -.panel > .table:last-child, -.panel > .table-responsive:last-child > .table:last-child { - border-bottom-right-radius: 2px; - border-bottom-left-radius: 2px; } - .panel > .table:last-child > tbody:last-child > tr:last-child, - .panel > .table:last-child > tfoot:last-child > tr:last-child, - .panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child, - .panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child { - border-bottom-left-radius: 2px; - border-bottom-right-radius: 2px; } - .panel > .table:last-child > tbody:last-child > tr:last-child td:first-child, - .panel > .table:last-child > tbody:last-child > tr:last-child th:first-child, - .panel > .table:last-child > tfoot:last-child > tr:last-child td:first-child, - .panel > .table:last-child > tfoot:last-child > tr:last-child th:first-child, - .panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child td:first-child, - .panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child th:first-child, - .panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child td:first-child, - .panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child th:first-child { - border-bottom-left-radius: 2px; } - .panel > .table:last-child > tbody:last-child > tr:last-child td:last-child, - .panel > .table:last-child > tbody:last-child > tr:last-child th:last-child, - .panel > .table:last-child > tfoot:last-child > tr:last-child td:last-child, - .panel > .table:last-child > tfoot:last-child > tr:last-child th:last-child, - .panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child td:last-child, - .panel > .table-responsive:last-child > .table:last-child > tbody:last-child > tr:last-child th:last-child, - .panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child td:last-child, - .panel > .table-responsive:last-child > .table:last-child > tfoot:last-child > tr:last-child th:last-child { - border-bottom-right-radius: 2px; } - -.panel > .panel-body + .table, -.panel > .panel-body + .table-responsive, -.panel > .table + .panel-body, -.panel > .table-responsive + .panel-body { - border-top: 1px solid #ddd; } - -.panel > .table > tbody:first-child > tr:first-child th, -.panel > .table > tbody:first-child > tr:first-child td { - border-top: 0; } - -.panel > .table-bordered, -.panel > .table-responsive > .table-bordered { - border: 0; } - .panel > .table-bordered > thead > tr > th:first-child, - .panel > .table-bordered > thead > tr > td:first-child, - .panel > .table-bordered > tbody > tr > th:first-child, - .panel > .table-bordered > tbody > tr > td:first-child, - .panel > .table-bordered > tfoot > tr > th:first-child, - .panel > .table-bordered > tfoot > tr > td:first-child, - .panel > .table-responsive > .table-bordered > thead > tr > th:first-child, - .panel > .table-responsive > .table-bordered > thead > tr > td:first-child, - .panel > .table-responsive > .table-bordered > tbody > tr > th:first-child, - .panel > .table-responsive > .table-bordered > tbody > tr > td:first-child, - .panel > .table-responsive > .table-bordered > tfoot > tr > th:first-child, - .panel > .table-responsive > .table-bordered > tfoot > tr > td:first-child { - border-left: 0; } - .panel > .table-bordered > thead > tr > th:last-child, - .panel > .table-bordered > thead > tr > td:last-child, - .panel > .table-bordered > tbody > tr > th:last-child, - .panel > .table-bordered > tbody > tr > td:last-child, - .panel > .table-bordered > tfoot > tr > th:last-child, - .panel > .table-bordered > tfoot > tr > td:last-child, - .panel > .table-responsive > .table-bordered > thead > tr > th:last-child, - .panel > .table-responsive > .table-bordered > thead > tr > td:last-child, - .panel > .table-responsive > .table-bordered > tbody > tr > th:last-child, - .panel > .table-responsive > .table-bordered > tbody > tr > td:last-child, - .panel > .table-responsive > .table-bordered > tfoot > tr > th:last-child, - .panel > .table-responsive > .table-bordered > tfoot > tr > td:last-child { - border-right: 0; } - .panel > .table-bordered > thead > tr:first-child > td, - .panel > .table-bordered > thead > tr:first-child > th, - .panel > .table-bordered > tbody > tr:first-child > td, - .panel > .table-bordered > tbody > tr:first-child > th, - .panel > .table-responsive > .table-bordered > thead > tr:first-child > td, - .panel > .table-responsive > .table-bordered > thead > tr:first-child > th, - .panel > .table-responsive > .table-bordered > tbody > tr:first-child > td, - .panel > .table-responsive > .table-bordered > tbody > tr:first-child > th { - border-bottom: 0; } - .panel > .table-bordered > tbody > tr:last-child > td, - .panel > .table-bordered > tbody > tr:last-child > th, - .panel > .table-bordered > tfoot > tr:last-child > td, - .panel > .table-bordered > tfoot > tr:last-child > th, - .panel > .table-responsive > .table-bordered > tbody > tr:last-child > td, - .panel > .table-responsive > .table-bordered > tbody > tr:last-child > th, - .panel > .table-responsive > .table-bordered > tfoot > tr:last-child > td, - .panel > .table-responsive > .table-bordered > tfoot > tr:last-child > th { - border-bottom: 0; } - -.panel > .table-responsive { - border: 0; - margin-bottom: 0; } - -.panel-group { - margin-bottom: 27px; } - .panel-group .panel { - margin-bottom: 0; - border-radius: 3px; } - .panel-group .panel + .panel { - margin-top: 5px; } - .panel-group .panel-heading { - border-bottom: 0; } - .panel-group .panel-heading + .panel-collapse > .panel-body, - .panel-group .panel-heading + .panel-collapse > .list-group { - border-top: 1px solid #ddd; } - .panel-group .panel-footer { - border-top: 0; } - .panel-group .panel-footer + .panel-collapse .panel-body { - border-bottom: 1px solid #ddd; } - -.panel-default { - border-color: #ddd; } - .panel-default > .panel-heading { - color: #212121; - background-color: #f5f5f5; - border-color: #ddd; } - .panel-default > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #ddd; } - .panel-default > .panel-heading .badge { - color: #f5f5f5; - background-color: #212121; } - .panel-default > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #ddd; } - -.panel-primary { - border-color: #5a9ddb; } - .panel-primary > .panel-heading { - color: #fff; - background-color: #5a9ddb; - border-color: #5a9ddb; } - .panel-primary > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #5a9ddb; } - .panel-primary > .panel-heading .badge { - color: #5a9ddb; - background-color: #fff; } - .panel-primary > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #5a9ddb; } - -.panel-success { - border-color: #d6e9c6; } - .panel-success > .panel-heading { - color: #fff; - background-color: #4CAF50; - border-color: #d6e9c6; } - .panel-success > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #d6e9c6; } - .panel-success > .panel-heading .badge { - color: #4CAF50; - background-color: #fff; } - .panel-success > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #d6e9c6; } - -.panel-info { - border-color: #cba4dd; } - .panel-info > .panel-heading { - color: #fff; - background-color: #9C27B0; - border-color: #cba4dd; } - .panel-info > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #cba4dd; } - .panel-info > .panel-heading .badge { - color: #9C27B0; - background-color: #fff; } - .panel-info > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #cba4dd; } - -.panel-warning { - border-color: #ffc599; } - .panel-warning > .panel-heading { - color: #fff; - background-color: #ff9800; - border-color: #ffc599; } - .panel-warning > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #ffc599; } - .panel-warning > .panel-heading .badge { - color: #ff9800; - background-color: #fff; } - .panel-warning > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #ffc599; } - -.panel-danger { - border-color: #f7a4af; } - .panel-danger > .panel-heading { - color: #fff; - background-color: #e51c23; - border-color: #f7a4af; } - .panel-danger > .panel-heading + .panel-collapse > .panel-body { - border-top-color: #f7a4af; } - .panel-danger > .panel-heading .badge { - color: #e51c23; - background-color: #fff; } - .panel-danger > .panel-footer + .panel-collapse > .panel-body { - border-bottom-color: #f7a4af; } - -.embed-responsive { - position: relative; - display: block; - height: 0; - padding: 0; - overflow: hidden; } - .embed-responsive .embed-responsive-item, - .embed-responsive iframe, - .embed-responsive embed, - .embed-responsive object, - .embed-responsive video { - position: absolute; - top: 0; - left: 0; - bottom: 0; - height: 100%; - width: 100%; - border: 0; } - -.embed-responsive-16by9 { - padding-bottom: 56.25%; } - -.embed-responsive-4by3 { - padding-bottom: 75%; } - -.well { - min-height: 20px; - padding: 19px; - margin-bottom: 20px; - background-color: #f5f5f5; - border: 1px solid transparent; - border-radius: 3px; - -webkit-box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.05); - box-shadow: inset 0 1px 1px rgba(0, 0, 0, 0.05); } - .well blockquote { - border-color: #ddd; - border-color: rgba(0, 0, 0, 0.15); } - -.well-lg { - padding: 24px; - border-radius: 3px; } - -.well-sm { - padding: 9px; - border-radius: 3px; } - -.close { - float: right; - font-size: 22.5px; - font-weight: normal; - line-height: 1; - color: #000; - text-shadow: none; - opacity: 0.2; - filter: alpha(opacity=20); } - .close:hover, .close:focus { - color: #000; - text-decoration: none; - cursor: pointer; - opacity: 0.5; - filter: alpha(opacity=50); } - -button.close { - padding: 0; - cursor: pointer; - background: transparent; - border: 0; - -webkit-appearance: none; } - -.modal-open { - overflow: hidden; } - -.modal { - display: none; - overflow: hidden; - position: fixed; - top: 0; - right: 0; - bottom: 0; - left: 0; - z-index: 1050; - -webkit-overflow-scrolling: touch; - outline: 0; } - .modal.fade .modal-dialog { - -webkit-transform: translate(0, -25%); - -ms-transform: translate(0, -25%); - -o-transform: translate(0, -25%); - transform: translate(0, -25%); - -webkit-transition: -webkit-transform 0.3s ease-out; - -moz-transition: -moz-transform 0.3s ease-out; - -o-transition: -o-transform 0.3s ease-out; - transition: transform 0.3s ease-out; } - .modal.in .modal-dialog { - -webkit-transform: translate(0, 0); - -ms-transform: translate(0, 0); - -o-transform: translate(0, 0); - transform: translate(0, 0); } - -.modal-open .modal { - overflow-x: hidden; - overflow-y: auto; } - -.modal-dialog { - position: relative; - width: auto; - margin: 10px; } - -.modal-content { - position: relative; - background-color: #fff; - border: 1px solid #999; - border: 1px solid transparent; - border-radius: 3px; - -webkit-box-shadow: 0 3px 9px rgba(0, 0, 0, 0.5); - box-shadow: 0 3px 9px rgba(0, 0, 0, 0.5); - background-clip: padding-box; - outline: 0; } - -.modal-backdrop { - position: fixed; - top: 0; - right: 0; - bottom: 0; - left: 0; - z-index: 1040; - background-color: #000; } - .modal-backdrop.fade { - opacity: 0; - filter: alpha(opacity=0); } - .modal-backdrop.in { - opacity: 0.5; - filter: alpha(opacity=50); } - -.modal-header { - padding: 15px; - border-bottom: 1px solid transparent; } - .modal-header:before, .modal-header:after { - content: " "; - display: table; } - .modal-header:after { - clear: both; } - -.modal-header .close { - margin-top: -2px; } - -.modal-title { - margin: 0; - line-height: 1.846; } - -.modal-body { - position: relative; - padding: 15px; } - -.modal-footer { - padding: 15px; - text-align: right; - border-top: 1px solid transparent; } - .modal-footer:before, .modal-footer:after { - content: " "; - display: table; } - .modal-footer:after { - clear: both; } - .modal-footer .btn + .btn { - margin-left: 5px; - margin-bottom: 0; } - .modal-footer .btn-group .btn + .btn { - margin-left: -1px; } - .modal-footer .btn-block + .btn-block { - margin-left: 0; } - -.modal-scrollbar-measure { - position: absolute; - top: -9999px; - width: 50px; - height: 50px; - overflow: scroll; } - -@media (min-width: 768px) { - .modal-dialog { - width: 600px; - margin: 30px auto; } - .modal-content { - -webkit-box-shadow: 0 5px 15px rgba(0, 0, 0, 0.5); - box-shadow: 0 5px 15px rgba(0, 0, 0, 0.5); } - .modal-sm { - width: 300px; } } - -@media (min-width: 992px) { - .modal-lg { - width: 900px; } } - -.tooltip { - position: absolute; - z-index: 1070; - display: block; - font-family: "Source Sans Pro", "Helvetica Neue", Helvetica, Arial, sans-serif; - font-style: normal; - font-weight: normal; - letter-spacing: normal; - line-break: auto; - line-height: 1.846; - text-align: left; - text-align: start; - text-decoration: none; - text-shadow: none; - text-transform: none; - white-space: normal; - word-break: normal; - word-spacing: normal; - word-wrap: normal; - font-size: 13px; - opacity: 0; - filter: alpha(opacity=0); } - .tooltip.in { - opacity: 0.9; - filter: alpha(opacity=90); } - .tooltip.top { - margin-top: -3px; - padding: 5px 0; } - .tooltip.right { - margin-left: 3px; - padding: 0 5px; } - .tooltip.bottom { - margin-top: 3px; - padding: 5px 0; } - .tooltip.left { - margin-left: -3px; - padding: 0 5px; } - -.tooltip-inner { - max-width: 200px; - padding: 3px 8px; - color: #fff; - text-align: center; - background-color: #727272; - border-radius: 3px; } - -.tooltip-arrow { - position: absolute; - width: 0; - height: 0; - border-color: transparent; - border-style: solid; } - -.tooltip.top .tooltip-arrow { - bottom: 0; - left: 50%; - margin-left: -5px; - border-width: 5px 5px 0; - border-top-color: #727272; } - -.tooltip.top-left .tooltip-arrow { - bottom: 0; - right: 5px; - margin-bottom: -5px; - border-width: 5px 5px 0; - border-top-color: #727272; } - -.tooltip.top-right .tooltip-arrow { - bottom: 0; - left: 5px; - margin-bottom: -5px; - border-width: 5px 5px 0; - border-top-color: #727272; } - -.tooltip.right .tooltip-arrow { - top: 50%; - left: 0; - margin-top: -5px; - border-width: 5px 5px 5px 0; - border-right-color: #727272; } - -.tooltip.left .tooltip-arrow { - top: 50%; - right: 0; - margin-top: -5px; - border-width: 5px 0 5px 5px; - border-left-color: #727272; } - -.tooltip.bottom .tooltip-arrow { - top: 0; - left: 50%; - margin-left: -5px; - border-width: 0 5px 5px; - border-bottom-color: #727272; } - -.tooltip.bottom-left .tooltip-arrow { - top: 0; - right: 5px; - margin-top: -5px; - border-width: 0 5px 5px; - border-bottom-color: #727272; } - -.tooltip.bottom-right .tooltip-arrow { - top: 0; - left: 5px; - margin-top: -5px; - border-width: 0 5px 5px; - border-bottom-color: #727272; } - -.popover { - position: absolute; - top: 0; - left: 0; - z-index: 1060; - display: none; - max-width: 276px; - padding: 1px; - font-family: "Source Sans Pro", "Helvetica Neue", Helvetica, Arial, sans-serif; - font-style: normal; - font-weight: normal; - letter-spacing: normal; - line-break: auto; - line-height: 1.846; - text-align: left; - text-align: start; - text-decoration: none; - text-shadow: none; - text-transform: none; - white-space: normal; - word-break: normal; - word-spacing: normal; - word-wrap: normal; - font-size: 15px; - background-color: #fff; - background-clip: padding-box; - border: 1px solid transparent; - border: 1px solid transparent; - border-radius: 3px; - -webkit-box-shadow: 0 5px 10px rgba(0, 0, 0, 0.2); - box-shadow: 0 5px 10px rgba(0, 0, 0, 0.2); } - .popover.top { - margin-top: -10px; } - .popover.right { - margin-left: 10px; } - .popover.bottom { - margin-top: 10px; } - .popover.left { - margin-left: -10px; } - -.popover-title { - margin: 0; - padding: 8px 14px; - font-size: 15px; - background-color: #f7f7f7; - border-bottom: 1px solid #ebebeb; - border-radius: 2px 2px 0 0; } - -.popover-content { - padding: 9px 14px; } - -.popover > .arrow, .popover > .arrow:after { - position: absolute; - display: block; - width: 0; - height: 0; - border-color: transparent; - border-style: solid; } - -.popover > .arrow { - border-width: 11px; } - -.popover > .arrow:after { - border-width: 10px; - content: ""; } - -.popover.top > .arrow { - left: 50%; - margin-left: -11px; - border-bottom-width: 0; - border-top-color: rgba(0, 0, 0, 0); - border-top-color: fadein(transparent, 12%); - bottom: -11px; } - .popover.top > .arrow:after { - content: " "; - bottom: 1px; - margin-left: -10px; - border-bottom-width: 0; - border-top-color: #fff; } - -.popover.right > .arrow { - top: 50%; - left: -11px; - margin-top: -11px; - border-left-width: 0; - border-right-color: rgba(0, 0, 0, 0); - border-right-color: fadein(transparent, 12%); } - .popover.right > .arrow:after { - content: " "; - left: 1px; - bottom: -10px; - border-left-width: 0; - border-right-color: #fff; } - -.popover.bottom > .arrow { - left: 50%; - margin-left: -11px; - border-top-width: 0; - border-bottom-color: rgba(0, 0, 0, 0); - border-bottom-color: fadein(transparent, 12%); - top: -11px; } - .popover.bottom > .arrow:after { - content: " "; - top: 1px; - margin-left: -10px; - border-top-width: 0; - border-bottom-color: #fff; } - -.popover.left > .arrow { - top: 50%; - right: -11px; - margin-top: -11px; - border-right-width: 0; - border-left-color: rgba(0, 0, 0, 0); - border-left-color: fadein(transparent, 12%); } - .popover.left > .arrow:after { - content: " "; - right: 1px; - border-right-width: 0; - border-left-color: #fff; - bottom: -10px; } - -.carousel { - position: relative; } - -.carousel-inner { - position: relative; - overflow: hidden; - width: 100%; } - .carousel-inner > .item { - display: none; - position: relative; - -webkit-transition: 0.6s ease-in-out left; - -o-transition: 0.6s ease-in-out left; - transition: 0.6s ease-in-out left; } - .carousel-inner > .item > img, - .carousel-inner > .item > a > img { - display: block; - max-width: 100%; - height: auto; - line-height: 1; } - @media all and (transform-3d), (-webkit-transform-3d) { - .carousel-inner > .item { - -webkit-transition: -webkit-transform 0.6s ease-in-out; - -moz-transition: -moz-transform 0.6s ease-in-out; - -o-transition: -o-transform 0.6s ease-in-out; - transition: transform 0.6s ease-in-out; - -webkit-backface-visibility: hidden; - -moz-backface-visibility: hidden; - backface-visibility: hidden; - -webkit-perspective: 1000px; - -moz-perspective: 1000px; - perspective: 1000px; } - .carousel-inner > .item.next, .carousel-inner > .item.active.right { - -webkit-transform: translate3d(100%, 0, 0); - transform: translate3d(100%, 0, 0); - left: 0; } - .carousel-inner > .item.prev, .carousel-inner > .item.active.left { - -webkit-transform: translate3d(-100%, 0, 0); - transform: translate3d(-100%, 0, 0); - left: 0; } - .carousel-inner > .item.next.left, .carousel-inner > .item.prev.right, .carousel-inner > .item.active { - -webkit-transform: translate3d(0, 0, 0); - transform: translate3d(0, 0, 0); - left: 0; } } - .carousel-inner > .active, - .carousel-inner > .next, - .carousel-inner > .prev { - display: block; } - .carousel-inner > .active { - left: 0; } - .carousel-inner > .next, - .carousel-inner > .prev { - position: absolute; - top: 0; - width: 100%; } - .carousel-inner > .next { - left: 100%; } - .carousel-inner > .prev { - left: -100%; } - .carousel-inner > .next.left, - .carousel-inner > .prev.right { - left: 0; } - .carousel-inner > .active.left { - left: -100%; } - .carousel-inner > .active.right { - left: 100%; } - -.carousel-control { - position: absolute; - top: 0; - left: 0; - bottom: 0; - width: 15%; - opacity: 0.5; - filter: alpha(opacity=50); - font-size: 20px; - color: #fff; - text-align: center; - text-shadow: 0 1px 2px rgba(0, 0, 0, 0.6); - background-color: rgba(0, 0, 0, 0); } - .carousel-control.left { - background-image: -webkit-linear-gradient(left, rgba(0, 0, 0, 0.5) 0%, rgba(0, 0, 0, 0.0001) 100%); - background-image: -o-linear-gradient(left, rgba(0, 0, 0, 0.5) 0%, rgba(0, 0, 0, 0.0001) 100%); - background-image: linear-gradient(to right, rgba(0, 0, 0, 0.5) 0%, rgba(0, 0, 0, 0.0001) 100%); - background-repeat: repeat-x; - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#80000000', endColorstr='#00000000', GradientType=1); } - .carousel-control.right { - left: auto; - right: 0; - background-image: -webkit-linear-gradient(left, rgba(0, 0, 0, 0.0001) 0%, rgba(0, 0, 0, 0.5) 100%); - background-image: -o-linear-gradient(left, rgba(0, 0, 0, 0.0001) 0%, rgba(0, 0, 0, 0.5) 100%); - background-image: linear-gradient(to right, rgba(0, 0, 0, 0.0001) 0%, rgba(0, 0, 0, 0.5) 100%); - background-repeat: repeat-x; - filter: progid:DXImageTransform.Microsoft.gradient(startColorstr='#00000000', endColorstr='#80000000', GradientType=1); } - .carousel-control:hover, .carousel-control:focus { - outline: 0; - color: #fff; - text-decoration: none; - opacity: 0.9; - filter: alpha(opacity=90); } - .carousel-control .icon-prev, - .carousel-control .icon-next, - .carousel-control .glyphicon-chevron-left, - .carousel-control .glyphicon-chevron-right { - position: absolute; - top: 50%; - margin-top: -10px; - z-index: 5; - display: inline-block; } - .carousel-control .icon-prev, - .carousel-control .glyphicon-chevron-left { - left: 50%; - margin-left: -10px; } - .carousel-control .icon-next, - .carousel-control .glyphicon-chevron-right { - right: 50%; - margin-right: -10px; } - .carousel-control .icon-prev, - .carousel-control .icon-next { - width: 20px; - height: 20px; - line-height: 1; - font-family: serif; } - .carousel-control .icon-prev:before { - content: '\2039'; } - .carousel-control .icon-next:before { - content: '\203a'; } - -.carousel-indicators { - position: absolute; - bottom: 10px; - left: 50%; - z-index: 15; - width: 60%; - margin-left: -30%; - padding-left: 0; - list-style: none; - text-align: center; } - .carousel-indicators li { - display: inline-block; - width: 10px; - height: 10px; - margin: 1px; - text-indent: -999px; - border: 1px solid #fff; - border-radius: 10px; - cursor: pointer; - background-color: #000 \9; - background-color: rgba(0, 0, 0, 0); } - .carousel-indicators .active { - margin: 0; - width: 12px; - height: 12px; - background-color: #fff; } - -.carousel-caption { - position: absolute; - left: 15%; - right: 15%; - bottom: 20px; - z-index: 10; - padding-top: 20px; - padding-bottom: 20px; - color: #fff; - text-align: center; - text-shadow: 0 1px 2px rgba(0, 0, 0, 0.6); } - .carousel-caption .btn { - text-shadow: none; } - -@media screen and (min-width: 768px) { - .carousel-control .glyphicon-chevron-left, - .carousel-control .glyphicon-chevron-right, - .carousel-control .icon-prev, - .carousel-control .icon-next { - width: 30px; - height: 30px; - margin-top: -10px; - font-size: 30px; } - .carousel-control .glyphicon-chevron-left, - .carousel-control .icon-prev { - margin-left: -10px; } - .carousel-control .glyphicon-chevron-right, - .carousel-control .icon-next { - margin-right: -10px; } - .carousel-caption { - left: 20%; - right: 20%; - padding-bottom: 30px; } - .carousel-indicators { - bottom: 20px; } } - -.clearfix:before, .clearfix:after { - content: " "; - display: table; } - -.clearfix:after { - clear: both; } - -.center-block { - display: block; - margin-left: auto; - margin-right: auto; } - -.pull-right { - float: right !important; } - -.pull-left { - float: left !important; } - -.hide { - display: none !important; } - -.show { - display: block !important; } - -.invisible { - visibility: hidden; } - -.text-hide { - font: 0/0 a; - color: transparent; - text-shadow: none; - background-color: transparent; - border: 0; } - -.hidden { - display: none !important; } - -.affix { - position: fixed; } - -@-ms-viewport { - width: device-width; } - -.visible-xs { - display: none !important; } - -.visible-sm { - display: none !important; } - -.visible-md { - display: none !important; } - -.visible-lg { - display: none !important; } - -.visible-xs-block, -.visible-xs-inline, -.visible-xs-inline-block, -.visible-sm-block, -.visible-sm-inline, -.visible-sm-inline-block, -.visible-md-block, -.visible-md-inline, -.visible-md-inline-block, -.visible-lg-block, -.visible-lg-inline, -.visible-lg-inline-block { - display: none !important; } - -@media (max-width: 767px) { - .visible-xs { - display: block !important; } - table.visible-xs { - display: table !important; } - tr.visible-xs { - display: table-row !important; } - th.visible-xs, - td.visible-xs { - display: table-cell !important; } } - -@media (max-width: 767px) { - .visible-xs-block { - display: block !important; } } - -@media (max-width: 767px) { - .visible-xs-inline { - display: inline !important; } } - -@media (max-width: 767px) { - .visible-xs-inline-block { - display: inline-block !important; } } - -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm { - display: block !important; } - table.visible-sm { - display: table !important; } - tr.visible-sm { - display: table-row !important; } - th.visible-sm, - td.visible-sm { - display: table-cell !important; } } - -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm-block { - display: block !important; } } - -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm-inline { - display: inline !important; } } - -@media (min-width: 768px) and (max-width: 991px) { - .visible-sm-inline-block { - display: inline-block !important; } } - -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md { - display: block !important; } - table.visible-md { - display: table !important; } - tr.visible-md { - display: table-row !important; } - th.visible-md, - td.visible-md { - display: table-cell !important; } } - -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md-block { - display: block !important; } } - -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md-inline { - display: inline !important; } } - -@media (min-width: 992px) and (max-width: 1199px) { - .visible-md-inline-block { - display: inline-block !important; } } - -@media (min-width: 1200px) { - .visible-lg { - display: block !important; } - table.visible-lg { - display: table !important; } - tr.visible-lg { - display: table-row !important; } - th.visible-lg, - td.visible-lg { - display: table-cell !important; } } - -@media (min-width: 1200px) { - .visible-lg-block { - display: block !important; } } - -@media (min-width: 1200px) { - .visible-lg-inline { - display: inline !important; } } - -@media (min-width: 1200px) { - .visible-lg-inline-block { - display: inline-block !important; } } - -@media (max-width: 767px) { - .hidden-xs { - display: none !important; } } - -@media (min-width: 768px) and (max-width: 991px) { - .hidden-sm { - display: none !important; } } - -@media (min-width: 992px) and (max-width: 1199px) { - .hidden-md { - display: none !important; } } - -@media (min-width: 1200px) { - .hidden-lg { - display: none !important; } } - -.visible-print { - display: none !important; } - -@media print { - .visible-print { - display: block !important; } - table.visible-print { - display: table !important; } - tr.visible-print { - display: table-row !important; } - th.visible-print, - td.visible-print { - display: table-cell !important; } } - -.visible-print-block { - display: none !important; } - @media print { - .visible-print-block { - display: block !important; } } - -.visible-print-inline { - display: none !important; } - @media print { - .visible-print-inline { - display: inline !important; } } - -.visible-print-inline-block { - display: none !important; } - @media print { - .visible-print-inline-block { - display: inline-block !important; } } - -@media print { - .hidden-print { - display: none !important; } } - -/*! - * tidyverse theme - * Copyright 2016 RStudio, Inc. - */ -.navbar { - border: none; - -webkit-box-shadow: 0 3px 15px 0px rgba(0, 0, 0, 0.1); - box-shadow: 0 3px 15px 0px rgba(0, 0, 0, 0.1); - min-height: 50px; - padding: 5px 0; } - .navbar-brand { - font-family: "Source Code Pro", Menlo, Monaco, Consolas, "Courier New", monospace; - font-weight: normal; - font-size: 32px; - padding: 0 0 0 54px; - height: 50px; - line-height: 50px; - /*background-image: url(logo.png);*/ - background-size: 32px auto; - background-repeat: no-repeat; - background-position: 15px center; } - .navbar-nav li a { - padding-top: 10px; - padding-bottom: 0; - line-height: inherit; } - .navbar-inverse .navbar-form input[type=text], - .navbar-inverse .navbar-form input[type=password] { - color: #fff; - -webkit-box-shadow: inset 0 -1px 0 #d8e8f6; - box-shadow: inset 0 -1px 0 #d8e8f6; } - .navbar-inverse .navbar-form input[type=text]::-moz-placeholder, - .navbar-inverse .navbar-form input[type=password]::-moz-placeholder { - color: #d8e8f6; - opacity: 1; } - .navbar-inverse .navbar-form input[type=text]:-ms-input-placeholder, - .navbar-inverse .navbar-form input[type=password]:-ms-input-placeholder { - color: #d8e8f6; } - .navbar-inverse .navbar-form input[type=text]::-webkit-input-placeholder, - .navbar-inverse .navbar-form input[type=password]::-webkit-input-placeholder { - color: #d8e8f6; } - .navbar-inverse .navbar-form input[type=text]:focus, - .navbar-inverse .navbar-form input[type=password]:focus { - -webkit-box-shadow: inset 0 -2px 0 #fff; - box-shadow: inset 0 -2px 0 #fff; } - -.btn-default:focus { - background-color: #fff; } - -.btn-default:hover, .btn-default:active:hover { - background-color: #f0f0f0; } - -.btn-default:active { - -webkit-box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); - box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); } - -.btn-primary:focus { - background-color: #5a9ddb; } - -.btn-primary:hover, .btn-primary:active:hover { - background-color: #418ed6; } - -.btn-primary:active { - -webkit-box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); - box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); } - -.btn-success:focus { - background-color: #4CAF50; } - -.btn-success:hover, .btn-success:active:hover { - background-color: #439a46; } - -.btn-success:active { - -webkit-box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); - box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); } - -.btn-info:focus { - background-color: #9C27B0; } - -.btn-info:hover, .btn-info:active:hover { - background-color: #862197; } - -.btn-info:active { - -webkit-box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); - box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); } - -.btn-warning:focus { - background-color: #ff9800; } - -.btn-warning:hover, .btn-warning:active:hover { - background-color: #e08600; } - -.btn-warning:active { - -webkit-box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); - box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); } - -.btn-danger:focus { - background-color: #e51c23; } - -.btn-danger:hover, .btn-danger:active:hover { - background-color: #cb171e; } - -.btn-danger:active { - -webkit-box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); - box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); } - -.btn-link:focus { - background-color: #fff; } - -.btn-link:hover, .btn-link:active:hover { - background-color: #f0f0f0; } - -.btn-link:active { - -webkit-box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); - box-shadow: 2px 2px 4px rgba(0, 0, 0, 0.4); } - -.btn { - text-transform: uppercase; - border: none; - -webkit-box-shadow: 1px 1px 4px rgba(0, 0, 0, 0.4); - box-shadow: 1px 1px 4px rgba(0, 0, 0, 0.4); - -webkit-transition: all 0.4s; - -o-transition: all 0.4s; - transition: all 0.4s; - position: relative; } - .btn:after { - content: ""; - display: block; - position: absolute; - width: 100%; - height: 100%; - top: 0; - left: 0; - background-image: -webkit-radial-gradient(circle, #000 10%, transparent 10.01%); - background-image: radial-gradient(circle, #000 10%, transparent 10.01%); - background-repeat: no-repeat; - background-size: 1000% 1000%; - background-position: 50%; - opacity: 0; - pointer-events: none; - transition: background .5s, opacity 1s; } - .btn:active:after { - background-size: 0% 0%; - opacity: .2; - transition: 0s; } - .btn-link { - border-radius: 3px; - -webkit-box-shadow: none; - box-shadow: none; - color: #444; } - .btn-link:hover, .btn-link:focus { - -webkit-box-shadow: none; - box-shadow: none; - color: #444; - text-decoration: none; } - .btn-default.disabled { - background-color: rgba(0, 0, 0, 0.1); - color: rgba(0, 0, 0, 0.4); - opacity: 1; } - -.btn-group .btn + .btn, -.btn-group .btn + .btn-group, -.btn-group .btn-group + .btn, -.btn-group .btn-group + .btn-group { - margin-left: 0; } - -.btn-group-vertical > .btn + .btn, -.btn-group-vertical > .btn + .btn-group, -.btn-group-vertical > .btn-group + .btn, -.btn-group-vertical > .btn-group + .btn-group { - margin-top: 0; } - -body { - -webkit-font-smoothing: antialiased; - letter-spacing: .1px; } - -p { - margin: 0 0 1em; } - -input, -button { - -webkit-font-smoothing: antialiased; - letter-spacing: .1px; } - -a { - -webkit-transition: all 0.25s; - -o-transition: all 0.25s; - transition: all 0.25s; } - -.table-hover > tbody > tr, -.table-hover > tbody > tr > th, -.table-hover > tbody > tr > td { - -webkit-transition: all 0.2s; - -o-transition: all 0.2s; - transition: all 0.2s; } - -label { - font-weight: normal; } - -textarea, -textarea.form-control, -input.form-control, -input[type=text], -input[type=password], -input[type=email], -input[type=number], -[type=text].form-control, -[type=password].form-control, -[type=email].form-control, -[type=tel].form-control, -[contenteditable].form-control { - padding: 0; - border: none; - border-radius: 0; - -webkit-appearance: none; - -webkit-box-shadow: inset 0 -1px 0 #ddd; - box-shadow: inset 0 -1px 0 #ddd; - font-size: 16px; } - textarea:focus, - textarea.form-control:focus, - input.form-control:focus, - input[type=text]:focus, - input[type=password]:focus, - input[type=email]:focus, - input[type=number]:focus, - [type=text].form-control:focus, - [type=password].form-control:focus, - [type=email].form-control:focus, - [type=tel].form-control:focus, - [contenteditable].form-control:focus { - -webkit-box-shadow: inset 0 -2px 0 #5a9ddb; - box-shadow: inset 0 -2px 0 #5a9ddb; } - textarea[disabled], textarea[readonly], - textarea.form-control[disabled], - textarea.form-control[readonly], - input.form-control[disabled], - input.form-control[readonly], - input[type=text][disabled], - input[type=text][readonly], - input[type=password][disabled], - input[type=password][readonly], - input[type=email][disabled], - input[type=email][readonly], - input[type=number][disabled], - input[type=number][readonly], - [type=text].form-control[disabled], - [type=text].form-control[readonly], - [type=password].form-control[disabled], - [type=password].form-control[readonly], - [type=email].form-control[disabled], - [type=email].form-control[readonly], - [type=tel].form-control[disabled], - [type=tel].form-control[readonly], - [contenteditable].form-control[disabled], - [contenteditable].form-control[readonly] { - -webkit-box-shadow: none; - box-shadow: none; - border-bottom: 1px dotted #ddd; } - textarea.input-sm, .input-group-sm > textarea.form-control, - .input-group-sm > textarea.input-group-addon, - .input-group-sm > .input-group-btn > textarea.btn, - textarea.form-control.input-sm, - .input-group-sm > textarea.form-control, - .input-group-sm > .input-group-btn > textarea.form-control.btn, - input.form-control.input-sm, - .input-group-sm > input.form-control, - .input-group-sm > .input-group-btn > input.form-control.btn, - input[type=text].input-sm, - .input-group-sm > input.form-control[type=text], - .input-group-sm > input.input-group-addon[type=text], - .input-group-sm > .input-group-btn > input.btn[type=text], - input[type=password].input-sm, - .input-group-sm > input.form-control[type=password], - .input-group-sm > input.input-group-addon[type=password], - .input-group-sm > .input-group-btn > input.btn[type=password], - input[type=email].input-sm, - .input-group-sm > input.form-control[type=email], - .input-group-sm > input.input-group-addon[type=email], - .input-group-sm > .input-group-btn > input.btn[type=email], - input[type=number].input-sm, - .input-group-sm > input.form-control[type=number], - .input-group-sm > input.input-group-addon[type=number], - .input-group-sm > .input-group-btn > input.btn[type=number], - [type=text].form-control.input-sm, - .input-group-sm > [type=text].form-control, - .input-group-sm > .input-group-btn > .btn[type=text].form-control, - [type=password].form-control.input-sm, - .input-group-sm > [type=password].form-control, - .input-group-sm > .input-group-btn > .btn[type=password].form-control, - [type=email].form-control.input-sm, - .input-group-sm > [type=email].form-control, - .input-group-sm > .input-group-btn > .btn[type=email].form-control, - [type=tel].form-control.input-sm, - .input-group-sm > [type=tel].form-control, - .input-group-sm > .input-group-btn > .btn[type=tel].form-control, - [contenteditable].form-control.input-sm, - .input-group-sm > [contenteditable].form-control, - .input-group-sm > .input-group-btn > .btn[contenteditable].form-control { - font-size: 13px; } - textarea.input-lg, .input-group-lg > textarea.form-control, - .input-group-lg > textarea.input-group-addon, - .input-group-lg > .input-group-btn > textarea.btn, - textarea.form-control.input-lg, - .input-group-lg > textarea.form-control, - .input-group-lg > .input-group-btn > textarea.form-control.btn, - input.form-control.input-lg, - .input-group-lg > input.form-control, - .input-group-lg > .input-group-btn > input.form-control.btn, - input[type=text].input-lg, - .input-group-lg > input.form-control[type=text], - .input-group-lg > input.input-group-addon[type=text], - .input-group-lg > .input-group-btn > input.btn[type=text], - input[type=password].input-lg, - .input-group-lg > input.form-control[type=password], - .input-group-lg > input.input-group-addon[type=password], - .input-group-lg > .input-group-btn > input.btn[type=password], - input[type=email].input-lg, - .input-group-lg > input.form-control[type=email], - .input-group-lg > input.input-group-addon[type=email], - .input-group-lg > .input-group-btn > input.btn[type=email], - input[type=number].input-lg, - .input-group-lg > input.form-control[type=number], - .input-group-lg > input.input-group-addon[type=number], - .input-group-lg > .input-group-btn > input.btn[type=number], - [type=text].form-control.input-lg, - .input-group-lg > [type=text].form-control, - .input-group-lg > .input-group-btn > .btn[type=text].form-control, - [type=password].form-control.input-lg, - .input-group-lg > [type=password].form-control, - .input-group-lg > .input-group-btn > .btn[type=password].form-control, - [type=email].form-control.input-lg, - .input-group-lg > [type=email].form-control, - .input-group-lg > .input-group-btn > .btn[type=email].form-control, - [type=tel].form-control.input-lg, - .input-group-lg > [type=tel].form-control, - .input-group-lg > .input-group-btn > .btn[type=tel].form-control, - [contenteditable].form-control.input-lg, - .input-group-lg > [contenteditable].form-control, - .input-group-lg > .input-group-btn > .btn[contenteditable].form-control { - font-size: 19px; } - -select, -select.form-control { - border: 0; - border-radius: 0; - -webkit-appearance: none; - -moz-appearance: none; - appearance: none; - padding-left: 0; - padding-right: 0\9; - background-image: url(data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABoAAAAaCAMAAACelLz8AAAAJ1BMVEVmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmZmaP/QSjAAAADHRSTlMAAgMJC0uWpKa6wMxMdjkoAAAANUlEQVR4AeXJyQEAERAAsNl7Hf3X6xt0QL6JpZWq30pdvdadme+0PMdzvHm8YThHcT1H7K0BtOMDniZhWOgAAAAASUVORK5CYII=); - background-size: 13px; - background-repeat: no-repeat; - background-position: right center; - -webkit-box-shadow: inset 0 -1px 0 #ddd; - box-shadow: inset 0 -1px 0 #ddd; - font-size: 16px; - line-height: 1.5; } - select::-ms-expand, - select.form-control::-ms-expand { - display: none; } - select.input-sm, .input-group-sm > select.form-control, - .input-group-sm > select.input-group-addon, - .input-group-sm > .input-group-btn > select.btn, - select.form-control.input-sm, - .input-group-sm > select.form-control, - .input-group-sm > .input-group-btn > select.form-control.btn { - font-size: 13px; } - select.input-lg, .input-group-lg > select.form-control, - .input-group-lg > select.input-group-addon, - .input-group-lg > .input-group-btn > select.btn, - select.form-control.input-lg, - .input-group-lg > select.form-control, - .input-group-lg > .input-group-btn > select.form-control.btn { - font-size: 19px; } - select:focus, - select.form-control:focus { - -webkit-box-shadow: inset 0 -2px 0 #5a9ddb; - box-shadow: inset 0 -2px 0 #5a9ddb; - background-image: url(data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAABoAAAAaCAMAAACelLz8AAAAJ1BMVEUhISEhISEhISEhISEhISEhISEhISEhISEhISEhISEhISEhISEhISF8S9ewAAAADHRSTlMAAgMJC0uWpKa6wMxMdjkoAAAANUlEQVR4AeXJyQEAERAAsNl7Hf3X6xt0QL6JpZWq30pdvdadme+0PMdzvHm8YThHcT1H7K0BtOMDniZhWOgAAAAASUVORK5CYII=); } - select[multiple], - select.form-control[multiple] { - background: none; } - -.radio label, -.radio-inline label, -.checkbox label, -.checkbox-inline label { - padding-left: 25px; } - -.radio input[type="radio"], -.radio input[type="checkbox"], -.radio-inline input[type="radio"], -.radio-inline input[type="checkbox"], -.checkbox input[type="radio"], -.checkbox input[type="checkbox"], -.checkbox-inline input[type="radio"], -.checkbox-inline input[type="checkbox"] { - margin-left: -25px; } - -input[type="radio"], -.radio input[type="radio"], -.radio-inline input[type="radio"] { - position: relative; - margin-top: 6px; - margin-right: 4px; - vertical-align: top; - border: none; - background-color: transparent; - -webkit-appearance: none; - appearance: none; - cursor: pointer; } - input[type="radio"]:focus, - .radio input[type="radio"]:focus, - .radio-inline input[type="radio"]:focus { - outline: none; } - input[type="radio"]:before, input[type="radio"]:after, - .radio input[type="radio"]:before, - .radio input[type="radio"]:after, - .radio-inline input[type="radio"]:before, - .radio-inline input[type="radio"]:after { - content: ""; - display: block; - width: 18px; - height: 18px; - border-radius: 50%; - -webkit-transition: 240ms; - -o-transition: 240ms; - transition: 240ms; } - input[type="radio"]:before, - .radio input[type="radio"]:before, - .radio-inline input[type="radio"]:before { - position: absolute; - left: 0; - top: -3px; - background-color: #5a9ddb; - -webkit-transform: scale(0); - -ms-transform: scale(0); - -o-transform: scale(0); - transform: scale(0); } - input[type="radio"]:after, - .radio input[type="radio"]:after, - .radio-inline input[type="radio"]:after { - position: relative; - top: -3px; - border: 2px solid #666; } - input[type="radio"]:checked:before, - .radio input[type="radio"]:checked:before, - .radio-inline input[type="radio"]:checked:before { - -webkit-transform: scale(0.5); - -ms-transform: scale(0.5); - -o-transform: scale(0.5); - transform: scale(0.5); } - input[type="radio"]:disabled:checked:before, - .radio input[type="radio"]:disabled:checked:before, - .radio-inline input[type="radio"]:disabled:checked:before { - background-color: #bbb; } - input[type="radio"]:checked:after, - .radio input[type="radio"]:checked:after, - .radio-inline input[type="radio"]:checked:after { - border-color: #5a9ddb; } - input[type="radio"]:disabled:after, input[type="radio"]:disabled:checked:after, - .radio input[type="radio"]:disabled:after, - .radio input[type="radio"]:disabled:checked:after, - .radio-inline input[type="radio"]:disabled:after, - .radio-inline input[type="radio"]:disabled:checked:after { - border-color: #bbb; } - -input[type="checkbox"], -.checkbox input[type="checkbox"], -.checkbox-inline input[type="checkbox"] { - position: relative; - border: none; - margin-bottom: -4px; - -webkit-appearance: none; - appearance: none; - cursor: pointer; } - input[type="checkbox"]:focus, - .checkbox input[type="checkbox"]:focus, - .checkbox-inline input[type="checkbox"]:focus { - outline: none; } - input[type="checkbox"]:focus:after, - .checkbox input[type="checkbox"]:focus:after, - .checkbox-inline input[type="checkbox"]:focus:after { - border-color: #5a9ddb; } - input[type="checkbox"]:after, - .checkbox input[type="checkbox"]:after, - .checkbox-inline input[type="checkbox"]:after { - content: ""; - display: block; - width: 18px; - height: 18px; - margin-top: -2px; - margin-right: 5px; - border: 2px solid #666; - border-radius: 2px; - -webkit-transition: 240ms; - -o-transition: 240ms; - transition: 240ms; } - input[type="checkbox"]:checked:before, - .checkbox input[type="checkbox"]:checked:before, - .checkbox-inline input[type="checkbox"]:checked:before { - content: ""; - position: absolute; - top: 0; - left: 6px; - display: table; - width: 6px; - height: 12px; - border: 2px solid #fff; - border-top-width: 0; - border-left-width: 0; - -webkit-transform: rotate(45deg); - -ms-transform: rotate(45deg); - -o-transform: rotate(45deg); - transform: rotate(45deg); } - input[type="checkbox"]:checked:after, - .checkbox input[type="checkbox"]:checked:after, - .checkbox-inline input[type="checkbox"]:checked:after { - background-color: #5a9ddb; - border-color: #5a9ddb; } - input[type="checkbox"]:disabled:after, - .checkbox input[type="checkbox"]:disabled:after, - .checkbox-inline input[type="checkbox"]:disabled:after { - border-color: #bbb; } - input[type="checkbox"]:disabled:checked:after, - .checkbox input[type="checkbox"]:disabled:checked:after, - .checkbox-inline input[type="checkbox"]:disabled:checked:after { - background-color: #bbb; - border-color: transparent; } - -.has-warning input:not([type=checkbox]), -.has-warning .form-control, -.has-warning input.form-control[readonly], -.has-warning input[type=text][readonly], -.has-warning [type=text].form-control[readonly], -.has-warning input:not([type=checkbox]):focus, -.has-warning .form-control:focus { - border-bottom: none; - -webkit-box-shadow: inset 0 -2px 0 #ff9800; - box-shadow: inset 0 -2px 0 #ff9800; } - -.has-error input:not([type=checkbox]), -.has-error .form-control, -.has-error input.form-control[readonly], -.has-error input[type=text][readonly], -.has-error [type=text].form-control[readonly], -.has-error input:not([type=checkbox]):focus, -.has-error .form-control:focus { - border-bottom: none; - -webkit-box-shadow: inset 0 -2px 0 #e51c23; - box-shadow: inset 0 -2px 0 #e51c23; } - -.has-success input:not([type=checkbox]), -.has-success .form-control, -.has-success input.form-control[readonly], -.has-success input[type=text][readonly], -.has-success [type=text].form-control[readonly], -.has-success input:not([type=checkbox]):focus, -.has-success .form-control:focus { - border-bottom: none; - -webkit-box-shadow: inset 0 -2px 0 #4CAF50; - box-shadow: inset 0 -2px 0 #4CAF50; } - -.has-warning .input-group-addon, .has-error .input-group-addon, .has-success .input-group-addon { - color: #666; - border-color: transparent; - background-color: transparent; } - -.form-group-lg select, -.form-group-lg select.form-control { - line-height: 1.5; } - -.nav-tabs > li > a, -.nav-tabs > li > a:focus { - margin-right: 0; - background-color: transparent; - border: none; - color: #444; - -webkit-box-shadow: inset 0 -1px 0 #ddd; - box-shadow: inset 0 -1px 0 #ddd; - -webkit-transition: all 0.2s; - -o-transition: all 0.2s; - transition: all 0.2s; } - .nav-tabs > li > a:hover, - .nav-tabs > li > a:focus:hover { - background-color: transparent; - -webkit-box-shadow: inset 0 -2px 0 #5a9ddb; - box-shadow: inset 0 -2px 0 #5a9ddb; - color: #5a9ddb; } - -.nav-tabs > li.active > a, -.nav-tabs > li.active > a:focus { - border: none; - -webkit-box-shadow: inset 0 -2px 0 #5a9ddb; - box-shadow: inset 0 -2px 0 #5a9ddb; - color: #5a9ddb; } - .nav-tabs > li.active > a:hover, - .nav-tabs > li.active > a:focus:hover { - border: none; - color: #5a9ddb; } - -.nav-tabs > li.disabled > a { - -webkit-box-shadow: inset 0 -1px 0 #ddd; - box-shadow: inset 0 -1px 0 #ddd; } - -.nav-tabs.nav-justified > li > a, -.nav-tabs.nav-justified > li > a:hover, -.nav-tabs.nav-justified > li > a:focus, -.nav-tabs.nav-justified > .active > a, -.nav-tabs.nav-justified > .active > a:hover, -.nav-tabs.nav-justified > .active > a:focus { - border: none; } - -.nav-tabs .dropdown-menu { - margin-top: 0; } - -.dropdown-menu { - margin-top: 0; - border: none; - -webkit-box-shadow: 0 1px 4px rgba(0, 0, 0, 0.3); - box-shadow: 0 1px 4px rgba(0, 0, 0, 0.3); } - -.alert { - border: none; - color: #fff; } - .alert-success { - background-color: #4CAF50; } - .alert-info { - background-color: #9C27B0; } - .alert-warning { - background-color: #ff9800; } - .alert-danger { - background-color: #e51c23; } - .alert a:not(.close):not(.btn), - .alert .alert-link { - color: #fff; - font-weight: bold; } - .alert .close { - color: #fff; } - -.badge { - padding: 4px 6px 4px; } - -.progress { - position: relative; - z-index: 1; - height: 6px; - border-radius: 0; - -webkit-box-shadow: none; - box-shadow: none; } - .progress-bar { - -webkit-box-shadow: none; - box-shadow: none; } - .progress-bar:last-child { - border-radius: 0 3px 3px 0; } - .progress-bar:last-child:before { - display: block; - content: ""; - position: absolute; - width: 100%; - height: 100%; - left: 0; - right: 0; - z-index: -1; - background-color: #edf4fb; } - .progress-bar-success:last-child.progress-bar:before { - background-color: #c7e7c8; } - .progress-bar-info:last-child.progress-bar:before { - background-color: #edc9f3; } - .progress-bar-warning:last-child.progress-bar:before { - background-color: #ffe0b3; } - .progress-bar-danger:last-child.progress-bar:before { - background-color: #f28e92; } - -.close { - font-size: 34px; - font-weight: 300; - line-height: 24px; - opacity: 0.6; - -webkit-transition: all 0.2s; - -o-transition: all 0.2s; - transition: all 0.2s; } - .close:hover { - opacity: 1; } - -.list-group-item { - padding: 15px; } - -.list-group-item-text { - color: #bbb; } - -.well { - border-radius: 0; - -webkit-box-shadow: none; - box-shadow: none; } - -.panel { - border: none; - border-radius: 2px; - -webkit-box-shadow: 0 1px 4px rgba(0, 0, 0, 0.3); - box-shadow: 0 1px 4px rgba(0, 0, 0, 0.3); } - .panel-heading { - border-bottom: none; } - .panel-footer { - border-top: none; } - -.popover { - border: none; - -webkit-box-shadow: 0 1px 4px rgba(0, 0, 0, 0.3); - box-shadow: 0 1px 4px rgba(0, 0, 0, 0.3); } - -.carousel-caption h1, .carousel-caption h2, .carousel-caption h3, .carousel-caption h4, .carousel-caption h5, .carousel-caption h6 { - color: inherit; } - diff --git a/inst/ast-parsing/jest.config.js b/inst/ast-parsing/jest.config.js new file mode 100644 index 000000000..9edfb684c --- /dev/null +++ b/inst/ast-parsing/jest.config.js @@ -0,0 +1,6 @@ +/** @type {import('ts-jest').JestConfigWithTsJest} */ +module.exports = { + preset: "ts-jest", + testEnvironment: "node", + transformIgnorePatterns: ["!(/editor/)"], +}; diff --git a/inst/ast-parsing/package.json b/inst/ast-parsing/package.json new file mode 100644 index 000000000..e1e47fd5d --- /dev/null +++ b/inst/ast-parsing/package.json @@ -0,0 +1,19 @@ +{ + "name": "ast-parsing", + "main": "./src/index.ts", + "version": "0.1.0", + "private": true, + "dependencies": { + "editor": "*", + "tsconfig": "*", + "typescript": "^4.9.3", + "@types/jest": "^29.2.4", + "jest": "^29.3.1", + "ts-jest": "^29.0.3" + }, + "scripts": { + "type-check": "tsc -p ./ --noEmit", + "test": "jest", + "test-watch": "jest --watch" + } +} diff --git a/inst/ast-parsing/src/ast_to_shiny_ui_node.test.ts b/inst/ast-parsing/src/ast_to_shiny_ui_node.test.ts new file mode 100644 index 000000000..64bc85a84 --- /dev/null +++ b/inst/ast-parsing/src/ast_to_shiny_ui_node.test.ts @@ -0,0 +1,421 @@ +import type { R_AST } from "."; + +// import { parse_app_ast } from "./ast_to_shiny_ui_node"; + +const test_app_ast: R_AST = [ + { + val: [ + { val: "library", type: "s" }, + { val: "shiny", type: "s" }, + ], + type: "e", + pos: [1, 1, 1, 14], + }, + { + val: [ + { val: "library", type: "s" }, + { val: "gridlayout", type: "s" }, + ], + type: "e", + pos: [2, 1, 2, 19], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "ui", type: "s" }, + { + val: [ + { val: "grid_page", type: "s" }, + { + name: "layout", + val: [ + { val: "c", type: "s" }, + { val: "header header ", type: "c" }, + { val: "sidebar bluePlot", type: "c" }, + { val: "sidebar redPlot ", type: "c" }, + ], + type: "e", + }, + { + name: "row_sizes", + val: [ + { val: "c", type: "s" }, + { val: "80px", type: "c" }, + { val: "1fr", type: "c" }, + { val: "1fr", type: "c" }, + ], + type: "e", + }, + { + name: "col_sizes", + val: [ + { val: "c", type: "s" }, + { val: "330px", type: "c" }, + { val: "1fr", type: "c" }, + ], + type: "e", + }, + { name: "gap_size", val: "1rem", type: "c" }, + { + val: [ + { val: "grid_card", type: "s" }, + { name: "area", val: "sidebar", type: "c" }, + { name: "item_alignment", val: "top", type: "c" }, + { name: "title", val: "Settings", type: "c" }, + { name: "item_gap", val: "12px", type: "c" }, + { + val: [ + { val: "sliderInput", type: "s" }, + { name: "inputId", val: "bins", type: "c" }, + { name: "label", val: "Number of Bins", type: "c" }, + { name: "min", val: 12, type: "n" }, + { name: "max", val: 100, type: "n" }, + { name: "value", val: 30, type: "n" }, + { name: "width", val: "100%", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "actionButton", type: "s" }, + { name: "inputId", val: "redraw", type: "c" }, + { name: "label", val: "Redraw", type: "c" }, + ], + type: "e", + }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_text", type: "s" }, + { name: "area", val: "header", type: "c" }, + { name: "content", val: "Single File App", type: "c" }, + { name: "alignment", val: "start", type: "c" }, + { name: "is_title", val: false, type: "b" }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_plot", type: "s" }, + { name: "area", val: "bluePlot", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_plot", type: "s" }, + { name: "area", val: "redPlot", type: "c" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [5, 1, 47, 1], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "other_ui", type: "s" }, + { val: "hello there", type: "c" }, + ], + type: "e", + pos: [49, 1, 49, 25], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "server", type: "s" }, + { + val: [ + { val: "function", type: "s" }, + { + val: [ + { name: "input", val: "", type: "s" }, + { name: "output", val: "", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "{", type: "s", pos: [52, 35, 52, 35] }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "bluePlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [54, 33, 54, 33] }, + { + val: [ + { val: "<-", type: "s" }, + { val: "x", type: "s" }, + { + val: [ + { val: "[", type: "s" }, + { val: "faithful", type: "s" }, + { val: 2, type: "n" }, + ], + type: "e", + }, + ], + type: "e", + pos: [56, 5, 56, 25], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "bins", type: "s" }, + { + val: [ + { val: "seq", type: "s" }, + { + val: [ + { val: "min", type: "s" }, + { val: "x", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "max", type: "s" }, + { val: "x", type: "s" }, + ], + type: "e", + }, + { + name: "length.out", + val: [ + { val: "+", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "input", type: "s" }, + { val: "bins", type: "s" }, + ], + type: "e", + }, + { val: 1, type: "n" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [57, 5, 57, 60], + }, + { + val: [ + { val: "hist", type: "s" }, + { val: "x", type: "s" }, + { name: "breaks", val: "bins", type: "s" }, + { name: "col", val: "steelblue", type: "c" }, + { name: "border", val: "white", type: "c" }, + ], + type: "e", + pos: [60, 5, 60, 63], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [54, 3, 61, 4], + }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "redPlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [63, 32, 63, 32] }, + { + val: [ + { val: "hist", type: "s" }, + { + val: [ + { val: "rnorm", type: "s" }, + { val: 100, type: "n" }, + ], + type: "e", + }, + { name: "col", val: "orangered", type: "c" }, + ], + type: "e", + pos: [65, 5, 65, 39], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [63, 3, 66, 4], + }, + { + val: [ + { val: "%>%", type: "s" }, + { + val: [ + { val: "observe", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [68, 11, 68, 11] }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "redPlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { + val: "{", + type: "s", + pos: [69, 34, 69, 34], + }, + { + val: [ + { val: "hist", type: "s" }, + { + val: [ + { val: "rnorm", type: "s" }, + { val: 100, type: "n" }, + ], + type: "e", + }, + { + name: "col", + val: "orangered", + type: "c", + }, + ], + type: "e", + pos: [70, 7, 70, 41], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [69, 5, 71, 6], + }, + ], + type: "e", + }, + ], + type: "e", + }, + { + val: [ + { val: "bindEvent", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "input", type: "s" }, + { val: "redraw", type: "s" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [68, 3, 72, 32], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [52, 1, 74, 1], + }, + { + val: [ + { val: "shinyApp", type: "s" }, + { val: "ui", type: "s" }, + { val: "server", type: "s" }, + ], + type: "e", + pos: [76, 1, 76, 20], + }, +]; + +// const { ui_tree, ui_pos, ui_assignment_operator } = parse_app_ast(test_app_ast); + +describe("Can convert from ui definition node in ast to the the UI Specific ast", () => { + test("Basic test to avoid test errors", () => { + expect(true).toEqual(true); + }); + // test("Root node is right", () => { + // expect(ui_tree.uiName).toEqual("gridlayout::grid_page"); + // }); + + // test("Correct number of children nodes", () => { + // expect(ui_tree.uiChildren).toHaveLength(4); + // }); + + // test("UI Arguments for grid_page parse properly", () => { + // expect(ui_tree.uiArguments.layout).toHaveLength(3); + // expect(ui_tree.uiArguments.row_sizes).toHaveLength(3); + // expect(ui_tree.uiArguments.col_sizes).toHaveLength(2); + // }); + + // test("Children are correctly recursed into", () => { + // expect(ui_tree.uiChildren?.[0].uiName).toEqual("gridlayout::grid_card"); + // }); + + // test("Gives us the location of the ui nodes definition", () => { + // expect(ui_pos).toStrictEqual([5, 1, 47, 1]); + // }); + + // test("Preserves operator info so we can properly reconstruct the call", () => { + // expect(ui_assignment_operator).toEqual("<-"); + // }); +}); diff --git a/inst/ast-parsing/src/ast_to_shiny_ui_node.ts b/inst/ast-parsing/src/ast_to_shiny_ui_node.ts new file mode 100644 index 000000000..79ef5aed8 --- /dev/null +++ b/inst/ast-parsing/src/ast_to_shiny_ui_node.ts @@ -0,0 +1,97 @@ +import type { ShinyUiNode } from "editor"; +import { isShinyUiNode } from "editor/src/Shiny-Ui-Elements/isShinyUiNode"; +import { normalize_ui_name } from "editor/src/Shiny-Ui-Elements/normalize_ui_name"; +import type { ShinyUiNodeByName } from "editor/src/Shiny-Ui-Elements/uiNodeTypes"; + +import type { Branch_Node, Primatives, R_AST_Node } from "."; + +import { create_unknownUiFunction } from "./create_unknownUiFunction"; +import type { + Primative_Array, + Primative_Map, +} from "./flatten_arrays_and_lists"; +import { + flatten_to_array, + flatten_to_list, + get_node_is_array, + get_node_is_list, +} from "./flatten_arrays_and_lists"; +import type { Output_Server_Pos } from "./get_assignment_nodes"; +import { + is_ast_branch_node, + is_ast_leaf_node, + is_named_node, +} from "./node_identity_checkers"; +import { Parsing_Error } from "./parsing_error_class"; + +export function ast_to_ui_node(node: Branch_Node): ShinyUiNode { + const [fn_name, ...args] = node.val; + + if (typeof fn_name.val !== "string") { + throw new Parsing_Error({ + message: "Invalid ui node, name is not a primative", + }); + } + + let uiArguments: ShinyUiNode["uiArguments"] = {}; + let uiChildren: ShinyUiNode[] = []; + + args.forEach((sub_node) => { + if (is_named_node(sub_node)) { + uiArguments[sub_node.name] = process_named_arg(sub_node); + } else { + uiChildren.push(process_unnamed_arg(sub_node)); + } + }); + + const full_node: Pick & { + uiName: string; + } = { + uiName: normalize_ui_name(fn_name.val), + uiArguments, + }; + + // Only add ui children if it's not empty + if (uiChildren.length > 0) { + full_node.uiChildren = uiChildren; + } + + if (!isShinyUiNode(full_node)) return create_unknownUiFunction({ node }); + + return full_node; +} + +function process_named_arg( + node: R_AST_Node +): + | Primatives + | Primative_Array + | Primative_Map + | ShinyUiNodeByName["unknownUiFunction"] { + if (is_ast_leaf_node(node)) { + return node.val; + } + + if (get_node_is_array(node)) { + return flatten_to_array(node); + } + + if (get_node_is_list(node)) { + return flatten_to_list(node); + } + + return create_unknownUiFunction({ node }); +} + +function process_unnamed_arg( + node: R_AST_Node, + output_positions?: Output_Server_Pos +): ShinyUiNode { + if (!is_ast_branch_node(node)) { + throw new Parsing_Error({ + message: "Primative found in ui children of ui node.", + }); + } + + return ast_to_ui_node(node); +} diff --git a/inst/ast-parsing/src/code_generation/build_function_text.test.ts b/inst/ast-parsing/src/code_generation/build_function_text.test.ts new file mode 100644 index 000000000..8e5596f4d --- /dev/null +++ b/inst/ast-parsing/src/code_generation/build_function_text.test.ts @@ -0,0 +1,226 @@ +import { build_function_text } from "./build_function_text"; + +describe("Can turn AST into function call text with formatting", () => { + test("Simple one argument function", () => { + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { name: "a", val: 1, type: "n" }, + ]) + ).toBe(`my_fun(a = 1)`); + }); + + test("Multi-argument functions put arguments on their own lines", () => { + // prettier-ignore + const expected_result = +`my_fun( + a = 1, + b = "two" +)`; + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { name: "a", val: 1, type: "n" }, + { name: "b", val: "two", type: "c" }, + ]) + ).toBe(expected_result); + }); + + test("Distinguishes between characters and symbols", () => { + // prettier-ignore + const expected_result = +`my_fun( + char_arg = "a", + sym_arg = b +)`; + + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { name: "char_arg", val: "a", type: "c" }, + { name: "sym_arg", val: "b", type: "s" }, + ]) + ).toBe(expected_result); + }); +}); + +describe("Nested function calls are properly indented", () => { + test("Single arg functions can sit on a single line", () => { + // prettier-ignore + const expected_output = +`my_fun( + char_arg = "a", + nested_arg = nested(a = 1) +)`; + + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { name: "char_arg", val: "a", type: "c" }, + { + name: "nested_arg", + val: [ + { val: "nested", type: "s" }, + { name: "a", val: 1, type: "n" }, + ], + type: "e", + }, + ]) + ).toBe(expected_output); + }); + + test("Multi-arg functions are broken up over multiple lines and indented", () => { + // prettier-ignore + const expected_output = +`my_fun( + char_arg = "a", + nested_arg = nested( + a = 1, + b = 2 + ) +)`; + + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { name: "char_arg", val: "a", type: "c" }, + { + name: "nested_arg", + val: [ + { val: "nested", type: "s" }, + { name: "a", val: 1, type: "n" }, + { name: "b", val: 2, type: "n" }, + ], + type: "e", + }, + ]) + ).toBe(expected_output); + }); + test("Double nesting works", () => { + // prettier-ignore + const expected_output = +`my_fun( + a = 1, + n1 = nested( + b = 2, + n2 = nested2( + c = 3, + d = 4 + ) + ) +)`; + + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { name: "a", val: 1, type: "n" }, + { + name: "n1", + val: [ + { val: "nested", type: "s" }, + { name: "b", val: 2, type: "n" }, + { + name: "n2", + val: [ + { val: "nested2", type: "s" }, + { name: "c", val: 3, type: "n" }, + { name: "d", val: 4, type: "n" }, + ], + type: "e", + }, + ], + type: "e", + }, + ]) + ).toBe(expected_output); + }); + + test("Will smartly put a nested argument on a new line even if it's the only argument", () => { + // prettier-ignore + const expected_output = +`my_fun( + n1 = nested( + b = 2, + c = 3 + ) +)`; + + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { + name: "n1", + val: [ + { val: "nested", type: "s" }, + { name: "b", val: 2, type: "n" }, + { name: "c", val: 3, type: "n" }, + ], + type: "e", + }, + ]) + ).toBe(expected_output); + }); + test("Short arrays or lists can be kept on single line", () => { + // prettier-ignore + const expected_output = `my_fun(vec = c(1, 2, 3))` + + expect( + build_function_text([ + { val: "my_fun", type: "s" }, + { + name: "vec", + val: [ + { val: "c", type: "s" }, + { val: 1, type: "n" }, + { val: 2, type: "n" }, + { val: 3, type: "n" }, + ], + type: "e", + }, + ]) + ).toBe(expected_output); + }); +}); + +describe("Can print arrays and lists with smart line breaks", () => { + test("Short multi-element arrays go on one line", () => { + expect( + build_function_text([ + { val: "c", type: "s" }, + { val: "a", type: "c" }, + { val: "b", type: "c" }, + { val: "c", type: "c" }, + ]) + ).toBe(`c("a", "b", "c")`); + }); + + test("Short multi-element lists go on one line", () => { + expect( + build_function_text([ + { val: "list", type: "s" }, + { name: "a", val: 1, type: "n" }, + { name: "b", val: 2, type: "n" }, + { name: "c", val: 3, type: "n" }, + ]) + ).toBe(`list(a = 1, b = 2, c = 3)`); + }); + + test("Long arguments will cause a multi-line array", () => { + // prettier-ignore + const expected_result = +`c( + "a suuuuper long", + "character vec with many arguments", + "splits to different lines" +)` + + expect( + build_function_text([ + { val: "c", type: "s" }, + { val: "a suuuuper long", type: "c" }, + { val: "character vec with many arguments", type: "c" }, + { val: "splits to different lines", type: "c" }, + ]) + ).toBe(expected_result); + }); +}); diff --git a/inst/ast-parsing/src/code_generation/build_function_text.ts b/inst/ast-parsing/src/code_generation/build_function_text.ts new file mode 100644 index 000000000..e34a21767 --- /dev/null +++ b/inst/ast-parsing/src/code_generation/build_function_text.ts @@ -0,0 +1,114 @@ +import type { R_AST, R_AST_Node } from ".."; +import { get_ast_is_array_or_list } from "../flatten_arrays_and_lists"; +import { indent_text_block } from "../indent_text_block"; + +const INDENT_SPACES = 2; +const INDENT = " ".repeat(INDENT_SPACES); +export const LINE_BREAK_LENGTH = 60; +/** Newline with indent */ +export const NL_INDENT = `\n${INDENT}`; + +export function build_function_text(call_node: R_AST): string { + const [fn_name, ...args] = call_node; + + if (typeof fn_name.val !== "string") { + return "Unknown Ui Code"; + } + + const fn_args_list = args.map( + (node) => `${node.name ? `${node.name} = ` : ""}${print_node_val(node)}` + ); + + const is_multi_line_call = should_line_break({ + fn_name: fn_name.val, + fn_args_list, + max_line_length_for_multi_args: get_ast_is_array_or_list(call_node) + ? LINE_BREAK_LENGTH + : 0, + }); + + const arg_seperator = `,${is_multi_line_call ? NL_INDENT : " "}`; + + return `${fn_name.val}(${ + is_multi_line_call ? NL_INDENT : "" + }${fn_args_list.join(arg_seperator)}${is_multi_line_call ? "\n" : ""})`; +} + +/** + * Decide if we spread the call out over multiple lines, or keep on a single + * line. It's important to note that this logic doesn't account for indentation + * amount. So it could theoretically give poorly formatted code in highly nested + * examples. + * @returns Boolean telling us if we need to use line breaks or not + */ +export function should_line_break({ + fn_name, + fn_args_list, + max_line_length_for_multi_args, +}: { + /** Name of the function. Used to calculate total length of call */ + fn_name: string; + + /** Array of the printed function argument calls. */ + fn_args_list: string[]; + + /** How many characters should we allow a multi-arg function to be before we + * split it up one arg to a line? Set to 0 to automatically make multi-arg + * functions split to new lines */ + max_line_length_for_multi_args: number; +}): boolean { + const args_have_line_breaks = fn_args_list.some((printed_arg) => + printed_arg.includes("\n") + ); + if (args_have_line_breaks) return true; + + // If we're in a standard function call then we always do multi-lines for + // multi-argument calls + if (max_line_length_for_multi_args === 0) { + return fn_args_list.length > 1; + } + + // If we're printing an array or list, then try to fit on a single line, + // unless there are enough args that we'd have an awkwardly long line + const total_args_length = fn_args_list.reduce( + //Add two to account for length of comma and space separating elements + (total_chars, printed_el) => total_chars + printed_el.length + 2, + 0 + ); + + const name_and_parens_length = fn_name.length + 2; + + return ( + total_args_length + name_and_parens_length > max_line_length_for_multi_args + ); +} + +function print_node_val({ val, type }: R_AST_Node): string { + switch (type) { + case "b": { + return val ? "TRUE" : "FALSE"; + } + case "c": { + return `"${val}"`; + } + case "m": { + return ""; + } + case "n": { + return String(val); + } + case "s": { + return val; + } + case "e": { + return indent_line_breaks(build_function_text(val)); + } + case "u": { + return "<...>"; + } + } +} + +export function indent_line_breaks(txt: string): string { + return indent_text_block(txt, INDENT_SPACES); +} diff --git a/inst/ast-parsing/src/code_generation/ui_node_to_R_code.test.ts b/inst/ast-parsing/src/code_generation/ui_node_to_R_code.test.ts new file mode 100644 index 000000000..9143f1110 --- /dev/null +++ b/inst/ast-parsing/src/code_generation/ui_node_to_R_code.test.ts @@ -0,0 +1,348 @@ +import type { ShinyUiNode } from "editor"; + +import { ui_node_to_R_code } from "./ui_node_to_R_code"; + +describe("Can keep or remove namespaces", () => { + const ui_ast: ShinyUiNode = { + uiName: "gridlayout::grid_card", + uiArguments: { + area: "sidebar", + }, + uiChildren: [ + { + uiName: "shiny::sliderInput", + uiArguments: { + inputId: "my_slider", + label: "My Slider", + value: 5, + min: 0, + max: 12, + }, + }, + ], + }; + + test("Keeping namespaces", () => { + // prettier-ignore + const with_namespaces = +`gridlayout::grid_card( + area = "sidebar", + shiny::sliderInput( + inputId = "my_slider", + label = "My Slider", + value = 5, + min = 0, + max = 12 + ) +)`; + const { ui_code, library_calls } = ui_node_to_R_code(ui_ast, { + remove_namespace: false, + }); + expect(ui_code).toBe(with_namespaces); + expect(library_calls).toStrictEqual([]); + }); + + test("Removing namespaces", () => { + // prettier-ignore + const no_namespaces = +`grid_card( + area = "sidebar", + sliderInput( + inputId = "my_slider", + label = "My Slider", + value = 5, + min = 0, + max = 12 + ) +)`; + + const { ui_code, library_calls } = ui_node_to_R_code(ui_ast, { + remove_namespace: true, + }); + expect(ui_code).toBe(no_namespaces); + expect(library_calls).toStrictEqual(["gridlayout", "shiny"]); + }); +}); + +describe("Can turn ShinyUiNode into function call text with formatting", () => { + test("Handles child arguments", () => { + // prettier-ignore + const expected_result = +`gridlayout::grid_card( + area = "sidebar", + shiny::sliderInput( + inputId = "my_slider", + label = "My Slider", + value = 5, + min = 0, + max = 12 + ) +)`; + + expect( + ui_node_to_R_code( + { + uiName: "gridlayout::grid_card", + uiArguments: { + area: "sidebar", + }, + uiChildren: [ + { + uiName: "shiny::sliderInput", + uiArguments: { + inputId: "my_slider", + label: "My Slider", + value: 5, + min: 0, + max: 12, + }, + }, + ], + }, + { remove_namespace: false } + ).ui_code + ).toBe(expected_result); + }); + test("Handles named list arguments", () => { + // prettier-ignore + const expected_result = +`shiny::selectInput( + inputId = "selector", + label = "My Select", + choices = list( + "choice a" = "a", + "choice b" = "b", + "choice c" = "c", + "choice d" = "d" + ) +)`; + + expect( + ui_node_to_R_code( + { + uiName: "shiny::selectInput", + uiArguments: { + inputId: "selector", + label: "My Select", + choices: { + "choice a": "a", + "choice b": "b", + "choice c": "c", + "choice d": "d", + }, + }, + }, + { remove_namespace: false } + ).ui_code + ).toBe(expected_result); + }); + test("Short named lists can be kept on same line", () => { + // prettier-ignore + const expected_result = +`shiny::selectInput( + inputId = "selector", + label = "My Select", + choices = list("choice a" = "a", "choice b" = "b") +)`; + + expect( + ui_node_to_R_code( + { + uiName: "shiny::selectInput", + uiArguments: { + inputId: "selector", + label: "My Select", + choices: { + "choice a": "a", + "choice b": "b", + }, + }, + }, + { remove_namespace: false } + ).ui_code + ).toBe(expected_result); + }); + + test("Handles array arguments", () => { + // prettier-ignore + const expected_result = +`gridlayout::grid_page( + layout = c( + "A B", + "C D" + ), + col_sizes = c( + "100px", + "1fr" + ), + row_sizes = c( + "1fr", + "2fr" + ), + gap_size = "12px" +)`; + + expect( + ui_node_to_R_code( + { + uiName: "gridlayout::grid_page", + uiArguments: { + layout: ["A B", "C D"], + col_sizes: ["100px", "1fr"], + row_sizes: ["1fr", "2fr"], + gap_size: "12px", + }, + }, + { remove_namespace: false } + ).ui_code + ).toBe(expected_result); + }); + + test("Unpacks unknown ui nodes", () => { + // prettier-ignore + const expected_result = +`gridlayout::grid_card( + area = "mystery", + myCoolCustomRFunction(arg1, arg2) +)`; + + expect( + ui_node_to_R_code( + { + uiName: "gridlayout::grid_card", + uiArguments: { area: "mystery" }, + uiChildren: [ + { + uiName: "unknownUiFunction", + uiArguments: { + text: `myCoolCustomRFunction(arg1, arg2)`, + }, + }, + ], + }, + { remove_namespace: false } + ).ui_code + ).toBe(expected_result); + }); +}); + +describe("Full UI example", () => { + // prettier-ignore + const ui_as_r_code = +`grid_page( + layout = c( + "header header", + "sidebar plot", + "sidebar plot" + ), + row_sizes = c( + "100px", + "1fr", + "1fr" + ), + col_sizes = c( + "250px", + "1fr" + ), + gap_size = "1rem", + theme = bslib::bs_theme(), + grid_card_text( + area = "header", + content = "My App", + alignment = "start", + is_title = TRUE + ), + grid_card( + area = "sidebar", + sliderInput( + inputId = "mySlider", + label = "Slider", + min = 2, + max = 11, + value = 7 + ), + numericInput( + inputId = "myNumericInput", + label = "Numeric Input", + min = 2, + max = 11, + value = 7, + width = "100%" + ), + myCoolCustomRFunction(arg1, arg2) + ), + grid_card_plot(area = "plot") +)` + + const ui_ast: ShinyUiNode = { + uiName: "gridlayout::grid_page", + uiArguments: { + layout: ["header header", "sidebar plot", "sidebar plot"], + row_sizes: ["100px", "1fr", "1fr"], + col_sizes: ["250px", "1fr"], + gap_size: "1rem", + theme: { + uiName: "unknownUiFunction", + uiArguments: { + text: "bslib::bs_theme()", + }, + }, + }, + uiChildren: [ + { + uiName: "gridlayout::grid_card_text", + uiArguments: { + area: "header", + content: "My App", + alignment: "start", + is_title: true, + }, + }, + { + uiName: "gridlayout::grid_card", + uiArguments: { + area: "sidebar", + }, + uiChildren: [ + { + uiName: "shiny::sliderInput", + uiArguments: { + inputId: "mySlider", + label: "Slider", + min: 2, + max: 11, + value: 7, + }, + }, + { + uiName: "shiny::numericInput", + uiArguments: { + inputId: "myNumericInput", + label: "Numeric Input", + min: 2, + max: 11, + value: 7, + width: "100%", + }, + }, + { + uiName: "unknownUiFunction", + uiArguments: { + text: `myCoolCustomRFunction(arg1, arg2)`, + }, + }, + ], + }, + { + uiName: "gridlayout::grid_card_plot", + uiArguments: { + area: "plot", + }, + }, + ], + }; + + expect(ui_node_to_R_code(ui_ast, { remove_namespace: true }).ui_code).toBe( + ui_as_r_code + ); +}); diff --git a/inst/ast-parsing/src/code_generation/ui_node_to_R_code.ts b/inst/ast-parsing/src/code_generation/ui_node_to_R_code.ts new file mode 100644 index 000000000..0512e23e9 --- /dev/null +++ b/inst/ast-parsing/src/code_generation/ui_node_to_R_code.ts @@ -0,0 +1,169 @@ +import type { R_Ui_Code } from "communication-types/src/MessageToBackend"; +import type { + ShinyUiNode, + ShinyUiNodeByName, +} from "editor/src/Shiny-Ui-Elements/uiNodeTypes"; +import { is_object } from "editor/src/utils/is_object"; + +import type { Primatives } from ".."; + +import { + indent_line_breaks, + LINE_BREAK_LENGTH, + NL_INDENT, + should_line_break, +} from "./build_function_text"; + +/** + * Convert a ui ast node into formatted R code. + * @param node Ui Node to be converted + * @param opts Options controlling how code generation runs + * @returns Object with constructed code and library calls + */ +export function ui_node_to_R_code( + node: ShinyUiNode, + opts: { remove_namespace: boolean } +): R_Ui_Code { + const { ui_code, removed_namespaces } = ui_node_to_R_code_internal( + node, + opts + ); + + return { ui_code, library_calls: Array.from(removed_namespaces) }; +} + +/** + * Internal version of r code generation. Difference is this one returns a set + * of namespaces/libraries removed instead of concatinated text like the + * exported version. + * @param node + * @param opts + * @returns + */ +function ui_node_to_R_code_internal( + node: ShinyUiNode, + opts: { remove_namespace: boolean } +): { + ui_code: string; + removed_namespaces: Set; +} { + const { uiName, uiArguments, uiChildren } = node; + const removed_namespaces: Set = new Set(); + + if (isUnknownUiNode(node)) { + return { + ui_code: print_unknown_ui_node(node), + removed_namespaces, + }; + } + + let fn_name: string = uiName; + + if (opts.remove_namespace) { + const library_name = fn_name.match(/\w+(?=::)/)?.[0]; + + if (library_name) { + removed_namespaces.add(library_name); + } + + fn_name = fn_name.replace(/\w+::/, ""); + } + + const fn_args_list = Object.keys(uiArguments).map((arg_name) => + indent_line_breaks( + `${arg_name} = ${print_R_argument_value(uiArguments[arg_name])}` + ) + ); + + uiChildren?.forEach((child) => { + const child_code = ui_node_to_R_code_internal(child, opts); + + child_code.removed_namespaces.forEach((name) => + removed_namespaces.add(name) + ); + + fn_args_list.push(indent_line_breaks(child_code.ui_code)); + }); + + const is_multi_line_call = should_line_break({ + fn_name: uiName, + fn_args_list, + max_line_length_for_multi_args: LINE_BREAK_LENGTH, + }); + + const arg_seperator = `,${is_multi_line_call ? NL_INDENT : " "}`; + + return { + removed_namespaces, + ui_code: `${fn_name}(${ + is_multi_line_call ? NL_INDENT : "" + }${fn_args_list.join(arg_seperator)}${is_multi_line_call ? "\n" : ""})`, + }; +} +export type NamedList = Record; + +type UnknownUiNode = ShinyUiNodeByName["unknownUiFunction"]; + +function isUnknownUiNode(x: unknown): x is UnknownUiNode { + return is_object(x) && "uiName" in x && x.uiName === "unknownUiFunction"; +} +function print_unknown_ui_node({ + uiArguments, +}: ShinyUiNodeByName["unknownUiFunction"]) { + return uiArguments.text; +} + +export function isNamedList(x: any): x is NamedList { + if (typeof x !== "object") return false; + + const hasNonStringEntries = Object.values(x).find( + (el) => typeof el !== "string" + ); + if (hasNonStringEntries) return false; + + return true; +} + +function print_named_R_list(vals: NamedList): string { + const values = Object.keys(vals).map((name) => `"${name}" = "${vals[name]}"`); + + // Add 6 for length of `list(` prefix and `)` postfix + const total_list_length = values.reduce((l, a) => l + a.length, 0) + 6; + + const is_multiline = total_list_length > LINE_BREAK_LENGTH; + + const arg_seperator = is_multiline ? `,${NL_INDENT}` : `, `; + + return `list(${is_multiline ? NL_INDENT : ""}${values.join(arg_seperator)}${ + is_multiline ? "\n" : "" + })`; +} + +function print_R_array(vals: Primatives[]): string { + const values = vals.map(print_primative); + + return `c(${NL_INDENT}${values.join(`,${NL_INDENT}`)}\n)`; +} + +function print_primative(val: Primatives): string { + switch (typeof val) { + case "string": + return `"${val}"`; + default: + return String(val); + } +} + +function print_R_argument_value(value: unknown): string { + if (Array.isArray(value)) return print_R_array(value); + + if (isNamedList(value)) return print_named_R_list(value); + + if (typeof value === "boolean") return value ? "TRUE" : "FALSE"; + + if (isUnknownUiNode(value)) { + return print_unknown_ui_node(value); + } + + return JSON.stringify(value); +} diff --git a/inst/ast-parsing/src/create_unknownUiFunction.ts b/inst/ast-parsing/src/create_unknownUiFunction.ts new file mode 100644 index 000000000..6781417b8 --- /dev/null +++ b/inst/ast-parsing/src/create_unknownUiFunction.ts @@ -0,0 +1,31 @@ +import type { ShinyUiNodeByName } from "editor/src/Shiny-Ui-Elements/uiNodeTypes"; + +import type { R_AST_Node } from "."; + +import { build_function_text } from "./code_generation/build_function_text"; +import { is_ast_branch_node } from "./node_identity_checkers"; + +/** + * + * @param node Node that isn't parsable + * @param explanation Optional field to explain why. E.g. don't support nested + * lists etc.. This will show up in the UI giving user hints about what's going + * wrong. + * @returns New ui node containing the unknown code + */ + +export function create_unknownUiFunction({ + node, + explanation, +}: { + node: R_AST_Node; + explanation?: string; +}): ShinyUiNodeByName["unknownUiFunction"] { + return { + uiName: "unknownUiFunction", + uiArguments: { + text: is_ast_branch_node(node) ? build_function_text(node.val) : node.val, + explanation, + }, + }; +} diff --git a/inst/ast-parsing/src/example_ast.ts b/inst/ast-parsing/src/example_ast.ts new file mode 100644 index 000000000..5e4dc200d --- /dev/null +++ b/inst/ast-parsing/src/example_ast.ts @@ -0,0 +1,388 @@ +import type { R_AST } from "."; + +// eslint-disable-next-line @typescript-eslint/no-unused-vars + +export const test_app_ast: R_AST = [ + { + val: [ + { val: "library", type: "s" }, + { val: "shiny", type: "s" }, + ], + type: "e", + pos: [1, 1, 1, 14], + }, + { + val: [ + { val: "library", type: "s" }, + { val: "gridlayout", type: "s" }, + ], + type: "e", + pos: [2, 1, 2, 19], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "ui", type: "s" }, + { + val: [ + { val: "grid_page", type: "s" }, + { + name: "layout", + val: [ + { val: "c", type: "s" }, + { val: "header header ", type: "c" }, + { val: "sidebar bluePlot", type: "c" }, + { val: "sidebar redPlot ", type: "c" }, + ], + type: "e", + }, + { + name: "row_sizes", + val: [ + { val: "c", type: "s" }, + { val: "80px", type: "c" }, + { val: "1fr", type: "c" }, + { val: "1fr", type: "c" }, + ], + type: "e", + }, + { + name: "col_sizes", + val: [ + { val: "c", type: "s" }, + { val: "330px", type: "c" }, + { val: "1fr", type: "c" }, + ], + type: "e", + }, + { name: "gap_size", val: "1rem", type: "c" }, + { + val: [ + { val: "grid_card", type: "s" }, + { name: "area", val: "sidebar", type: "c" }, + { name: "item_alignment", val: "top", type: "c" }, + { name: "title", val: "Settings", type: "c" }, + { name: "item_gap", val: "12px", type: "c" }, + { + val: [ + { val: "sliderInput", type: "s" }, + { name: "inputId", val: "bins", type: "c" }, + { name: "label", val: "Number of Bins", type: "c" }, + { name: "min", val: 12, type: "n" }, + { name: "max", val: 100, type: "n" }, + { name: "value", val: 30, type: "n" }, + { name: "width", val: "100%", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "actionButton", type: "s" }, + { name: "inputId", val: "redraw", type: "c" }, + { name: "label", val: "Redraw", type: "c" }, + ], + type: "e", + }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_text", type: "s" }, + { name: "area", val: "header", type: "c" }, + { name: "content", val: "Single File App", type: "c" }, + { name: "alignment", val: "start", type: "c" }, + { name: "is_title", val: false, type: "b" }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_plot", type: "s" }, + { name: "area", val: "bluePlot", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_plot", type: "s" }, + { name: "area", val: "redPlot", type: "c" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [5, 1, 47, 1], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "other_ui", type: "s" }, + { val: "hello there", type: "c" }, + ], + type: "e", + pos: [49, 1, 49, 25], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "server", type: "s" }, + { + val: [ + { val: "function", type: "s" }, + { + val: [ + { name: "input", val: "", type: "s" }, + { name: "output", val: "", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "{", type: "s", pos: [52, 35, 52, 35] }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "bluePlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [54, 33, 54, 33] }, + { + val: [ + { val: "<-", type: "s" }, + { val: "x", type: "s" }, + { + val: [ + { val: "[", type: "s" }, + { val: "faithful", type: "s" }, + { val: 2, type: "n" }, + ], + type: "e", + }, + ], + type: "e", + pos: [56, 5, 56, 25], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "bins", type: "s" }, + { + val: [ + { val: "seq", type: "s" }, + { + val: [ + { val: "min", type: "s" }, + { val: "x", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "max", type: "s" }, + { val: "x", type: "s" }, + ], + type: "e", + }, + { + name: "length.out", + val: [ + { val: "+", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "input", type: "s" }, + { val: "bins", type: "s" }, + ], + type: "e", + }, + { val: 1, type: "n" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [57, 5, 57, 60], + }, + { + val: [ + { val: "hist", type: "s" }, + { val: "x", type: "s" }, + { name: "breaks", val: "bins", type: "s" }, + { name: "col", val: "steelblue", type: "c" }, + { name: "border", val: "white", type: "c" }, + ], + type: "e", + pos: [60, 5, 60, 63], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [54, 3, 61, 4], + }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "redPlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [63, 32, 63, 32] }, + { + val: [ + { val: "hist", type: "s" }, + { + val: [ + { val: "rnorm", type: "s" }, + { val: 100, type: "n" }, + ], + type: "e", + }, + { name: "col", val: "orangered", type: "c" }, + ], + type: "e", + pos: [65, 5, 65, 39], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [63, 3, 66, 4], + }, + { + val: [ + { val: "%>%", type: "s" }, + { + val: [ + { val: "observe", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [68, 11, 68, 11] }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "redPlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { + val: "{", + type: "s", + pos: [69, 34, 69, 34], + }, + { + val: [ + { val: "hist", type: "s" }, + { + val: [ + { val: "rnorm", type: "s" }, + { val: 100, type: "n" }, + ], + type: "e", + }, + { + name: "col", + val: "orangered", + type: "c", + }, + ], + type: "e", + pos: [70, 7, 70, 41], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [69, 5, 71, 6], + }, + ], + type: "e", + }, + ], + type: "e", + }, + { + val: [ + { val: "bindEvent", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "input", type: "s" }, + { val: "redraw", type: "s" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [68, 3, 72, 32], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [52, 1, 74, 1], + }, + { + val: [ + { val: "shinyApp", type: "s" }, + { val: "ui", type: "s" }, + { val: "server", type: "s" }, + ], + type: "e", + pos: [76, 1, 76, 20], + }, +]; diff --git a/inst/ast-parsing/src/flatten_arrays_and_lists.test.ts b/inst/ast-parsing/src/flatten_arrays_and_lists.test.ts new file mode 100644 index 000000000..7064a8634 --- /dev/null +++ b/inst/ast-parsing/src/flatten_arrays_and_lists.test.ts @@ -0,0 +1,74 @@ +import type { R_AST_Node } from "."; + +import { flatten_to_list, flatten_to_array } from "./flatten_arrays_and_lists"; + +describe("Can flatten arrays", () => { + test("1d arrays", () => { + const array_node: R_AST_Node = { + val: [ + { val: "c", type: "s" }, + { val: "a", type: "c" }, + { val: "b", type: "c" }, + { val: "c", type: "c" }, + ], + type: "e", + }; + + expect(flatten_to_array(array_node)).toStrictEqual(["a", "b", "c"]); + }); + + test("2d arrays", () => { + const array_node: R_AST_Node = { + val: [ + { val: "c", type: "s" }, + { + val: [ + { val: "c", type: "s" }, + { val: "a1", type: "c" }, + { val: "a2", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "c", type: "s" }, + { val: "b1", type: "c" }, + { val: "b2", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "c", type: "s" }, + { val: "c1", type: "c" }, + { val: "c2", type: "c" }, + ], + type: "e", + }, + ], + type: "e", + }; + + expect(flatten_to_array(array_node)).toStrictEqual([ + ["a1", "a2"], + ["b1", "b2"], + ["c1", "c2"], + ]); + }); +}); + +describe("Can flatten lists", () => { + test("1d arrays", () => { + const array_node: R_AST_Node = { + val: [ + { val: "list", type: "s" }, + { name: "a", val: 1, type: "n" }, + { name: "b", val: 2, type: "n" }, + { name: "c", val: 3, type: "n" }, + ], + type: "e", + }; + + expect(flatten_to_list(array_node)).toStrictEqual({ a: 1, b: 2, c: 3 }); + }); +}); diff --git a/inst/ast-parsing/src/flatten_arrays_and_lists.ts b/inst/ast-parsing/src/flatten_arrays_and_lists.ts new file mode 100644 index 000000000..b39acbbf1 --- /dev/null +++ b/inst/ast-parsing/src/flatten_arrays_and_lists.ts @@ -0,0 +1,117 @@ +import type { ShinyUiNodeByName } from "editor/src/Shiny-Ui-Elements/uiNodeTypes"; + +import type { Leaf_Node, Primatives, R_AST, R_AST_Node } from "."; + +import { create_unknownUiFunction } from "./create_unknownUiFunction"; +import { is_ast_branch_node, is_primative } from "./node_identity_checkers"; +import { Parsing_Error } from "./parsing_error_class"; + +export type Primative_Map = Record; + +export type Primative_Array = (Primatives | Primative_Array)[]; + +export type Array_Or_List_AST = [ + { val: "c" | "list"; type: "s" }, + ...Leaf_Node[] +]; + +export type Array_AST = [{ val: "c"; type: "s" }, ...Leaf_Node[]]; + +export function get_ast_is_array(x: R_AST): x is Array_AST { + return x[0].val === "c"; +} +export function get_ast_is_array_or_list(x: R_AST): x is Array_Or_List_AST { + const call_val = x[0].val; + + return call_val === "c" || call_val === "list"; +} + +export function get_node_is_array(node: R_AST_Node): boolean { + return is_ast_branch_node(node) && get_ast_is_array(node.val); +} + +export function get_node_is_list(node: R_AST_Node): boolean { + return is_ast_branch_node(node) && node.val[0].val === "list"; +} + +export function flatten_to_array( + node: R_AST_Node +): Primative_Array | ShinyUiNodeByName["unknownUiFunction"] { + try { + return flatten_array_internal(node); + } catch (e) { + if (!(e instanceof Parsing_Error)) { + throw e; + } + // If there's problems parsing the list then we just return it as an unknown + // node. This might happen if there's nested elements etc.. + return create_unknownUiFunction({ node, explanation: e.message }); + } +} + +// Internal array flattening that we can use recursively. +function flatten_array_internal(node: R_AST_Node): Primative_Array { + if (!is_ast_branch_node(node)) { + throw new Parsing_Error({ + message: "Tried to flatten a leaf/primative node", + }); + } + + const [call, ...vals] = node.val; + + if (call.val !== "c") { + throw new Parsing_Error({ + message: "Tried to flatten non array as array", + }); + } + return vals.map((n) => + is_primative(n.val) ? n.val : flatten_array_internal(n) + ); +} + +export function flatten_to_list( + node: R_AST_Node +): Primative_Map | ShinyUiNodeByName["unknownUiFunction"] { + if (!is_ast_branch_node(node)) { + throw new Parsing_Error({ + message: "Tried to flatten a leaf/primative node", + }); + } + + try { + const [call, ...vals] = node.val; + + if (call.val !== "list") { + throw new Parsing_Error({ + message: "Tried to flatten non array as array", + cause: node, + }); + } + + let res: Primative_Map = {}; + + vals.forEach(({ name, val }) => { + if (typeof name !== "string") { + throw new Parsing_Error({ + message: "All elements in list must have a name", + cause: node, + }); + } + if (!is_primative(val)) { + throw new Parsing_Error({ + message: "Nested lists are not supported", + cause: node, + }); + } + res[name] = val; + }); + return res; + } catch (e) { + if (!(e instanceof Parsing_Error)) { + throw e; + } + // If there's problems parsing the list then we just return it as an unknown + // node. This might happen if there's nested elements etc.. + return create_unknownUiFunction({ node, explanation: e.message }); + } +} diff --git a/inst/ast-parsing/src/get_assignment_nodes.test.ts b/inst/ast-parsing/src/get_assignment_nodes.test.ts new file mode 100644 index 000000000..b13e48f80 --- /dev/null +++ b/inst/ast-parsing/src/get_assignment_nodes.test.ts @@ -0,0 +1,396 @@ +import type { R_AST } from "."; + +import { get_assignment_nodes } from "./get_assignment_nodes"; + +const test_app_ast: R_AST = [ + { + val: [ + { val: "library", type: "s" }, + { val: "shiny", type: "s" }, + ], + type: "e", + pos: [1, 1, 1, 14], + }, + { + val: [ + { val: "library", type: "s" }, + { val: "gridlayout", type: "s" }, + ], + type: "e", + pos: [2, 1, 2, 19], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "ui", type: "s" }, + { + val: [ + { val: "grid_page", type: "s" }, + { + name: "layout", + val: [ + { val: "c", type: "s" }, + { val: "header header ", type: "c" }, + { val: "sidebar bluePlot", type: "c" }, + { val: "sidebar redPlot ", type: "c" }, + ], + type: "e", + }, + { + name: "row_sizes", + val: [ + { val: "c", type: "s" }, + { val: "80px", type: "c" }, + { val: "1fr", type: "c" }, + { val: "1fr", type: "c" }, + ], + type: "e", + }, + { + name: "col_sizes", + val: [ + { val: "c", type: "s" }, + { val: "330px", type: "c" }, + { val: "1fr", type: "c" }, + ], + type: "e", + }, + { name: "gap_size", val: "1rem", type: "c" }, + { + val: [ + { val: "grid_card", type: "s" }, + { name: "area", val: "sidebar", type: "c" }, + { name: "item_alignment", val: "top", type: "c" }, + { name: "title", val: "Settings", type: "c" }, + { name: "item_gap", val: "12px", type: "c" }, + { + val: [ + { val: "sliderInput", type: "s" }, + { name: "inputId", val: "bins", type: "c" }, + { name: "label", val: "Number of Bins", type: "c" }, + { name: "min", val: 12, type: "n" }, + { name: "max", val: 100, type: "n" }, + { name: "value", val: 30, type: "n" }, + { name: "width", val: "100%", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "actionButton", type: "s" }, + { name: "inputId", val: "redraw", type: "c" }, + { name: "label", val: "Redraw", type: "c" }, + ], + type: "e", + }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_text", type: "s" }, + { name: "area", val: "header", type: "c" }, + { name: "content", val: "Single File App", type: "c" }, + { name: "alignment", val: "start", type: "c" }, + { name: "is_title", val: false, type: "b" }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_plot", type: "s" }, + { name: "area", val: "bluePlot", type: "c" }, + ], + type: "e", + }, + { + val: [ + { val: "grid_card_plot", type: "s" }, + { name: "area", val: "redPlot", type: "c" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [5, 1, 47, 1], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "other_ui", type: "s" }, + { val: "hello there", type: "c" }, + ], + type: "e", + pos: [49, 1, 49, 25], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "server", type: "s" }, + { + val: [ + { val: "function", type: "s" }, + { + val: [ + { name: "input", val: "", type: "s" }, + { name: "output", val: "", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "{", type: "s", pos: [52, 35, 52, 35] }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "bluePlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [54, 33, 54, 33] }, + { + val: [ + { val: "<-", type: "s" }, + { val: "x", type: "s" }, + { + val: [ + { val: "[", type: "s" }, + { val: "faithful", type: "s" }, + { val: 2, type: "n" }, + ], + type: "e", + }, + ], + type: "e", + pos: [56, 5, 56, 25], + }, + { + val: [ + { val: "<-", type: "s" }, + { val: "bins", type: "s" }, + { + val: [ + { val: "seq", type: "s" }, + { + val: [ + { val: "min", type: "s" }, + { val: "x", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "max", type: "s" }, + { val: "x", type: "s" }, + ], + type: "e", + }, + { + name: "length.out", + val: [ + { val: "+", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "input", type: "s" }, + { val: "bins", type: "s" }, + ], + type: "e", + }, + { val: 1, type: "n" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [57, 5, 57, 60], + }, + { + val: [ + { val: "hist", type: "s" }, + { val: "x", type: "s" }, + { name: "breaks", val: "bins", type: "s" }, + { name: "col", val: "steelblue", type: "c" }, + { name: "border", val: "white", type: "c" }, + ], + type: "e", + pos: [60, 5, 60, 63], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [54, 3, 61, 4], + }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "redPlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [63, 32, 63, 32] }, + { + val: [ + { val: "hist", type: "s" }, + { + val: [ + { val: "rnorm", type: "s" }, + { val: 100, type: "n" }, + ], + type: "e", + }, + { name: "col", val: "orangered", type: "c" }, + ], + type: "e", + pos: [65, 5, 65, 39], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [63, 3, 66, 4], + }, + { + val: [ + { val: "%>%", type: "s" }, + { + val: [ + { val: "observe", type: "s" }, + { + val: [ + { val: "{", type: "s", pos: [68, 11, 68, 11] }, + { + val: [ + { val: "<-", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "output", type: "s" }, + { val: "redPlot", type: "s" }, + ], + type: "e", + }, + { + val: [ + { val: "renderPlot", type: "s" }, + { + val: [ + { + val: "{", + type: "s", + pos: [69, 34, 69, 34], + }, + { + val: [ + { val: "hist", type: "s" }, + { + val: [ + { val: "rnorm", type: "s" }, + { val: 100, type: "n" }, + ], + type: "e", + }, + { + name: "col", + val: "orangered", + type: "c", + }, + ], + type: "e", + pos: [70, 7, 70, 41], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [69, 5, 71, 6], + }, + ], + type: "e", + }, + ], + type: "e", + }, + { + val: [ + { val: "bindEvent", type: "s" }, + { + val: [ + { val: "$", type: "s" }, + { val: "input", type: "s" }, + { val: "redraw", type: "s" }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [68, 3, 72, 32], + }, + ], + type: "e", + }, + ], + type: "e", + }, + ], + type: "e", + pos: [52, 1, 74, 1], + }, + { + val: [ + { val: "shinyApp", type: "s" }, + { val: "ui", type: "s" }, + { val: "server", type: "s" }, + ], + type: "e", + pos: [76, 1, 76, 20], + }, +]; + +describe("Can recursively parse ast to find all assignments ", () => { + test("Correct number of assignments are found", () => { + const assignment_nodes = get_assignment_nodes(test_app_ast); + + expect(assignment_nodes.map((n) => n.name)).toHaveLength(8); + }); +}); diff --git a/inst/ast-parsing/src/get_assignment_nodes.ts b/inst/ast-parsing/src/get_assignment_nodes.ts new file mode 100644 index 000000000..7e45a708f --- /dev/null +++ b/inst/ast-parsing/src/get_assignment_nodes.ts @@ -0,0 +1,193 @@ +import type { + Branch_Node, + Expression_Node, + R_AST, + R_AST_Node, + Script_Position, + Symbol_Node, +} from "."; + +import { is_ast_branch_node } from "./node_identity_checkers"; +import { Parsing_Error } from "./parsing_error_class"; + +export type Assignment_Operator = "<-" | "="; + +type Output_Node = Expression_Node< + [ + { val: "$"; type: "s" }, + { val: "output"; type: "s" }, + { val: string; type: "s" } + ] +>; + +type Assignment_Node_Gen< + VALUE extends R_AST_Node, + NAME extends R_AST_Node = R_AST_Node +> = Expression_Node< + [assignment: Symbol_Node, name: NAME, value: VALUE] +>; + +export type Assignment_Node = Assignment_Node_Gen; + +function is_assignment_node( + node: R_AST_Node, + var_name?: string +): node is Assignment_Node { + if (!is_ast_branch_node(node)) return false; + + const { val } = node; + + const is_assignment = val[0].val === "<-" || val[0].val === "="; + + if (!is_assignment) return false; + + return var_name ? val[1].val === var_name : true; +} + +export function get_assignment_lhs( + node: Node +): Node["val"][1] { + return node.val[1]; +} + +export function get_assignment_rhs( + node: Node +): Node["val"][2] { + return node.val[2]; +} + +export type Variable_Assignment = { + name: string; + is_output: boolean; + node: Assignment_Node; +}; + +export function get_assignment_nodes(ast: R_AST): Variable_Assignment[] { + let assignment_nodes: Variable_Assignment[] = []; + + ast.forEach((node) => { + if (is_assignment_node(node)) { + const assigned_name = get_assignment_lhs(node); + + if (is_output_node(assigned_name)) { + assignment_nodes.push({ + name: assigned_name.val[2].val, + is_output: true, + node, + }); + } else if (assigned_name.type === "s") { + assignment_nodes.push({ + name: assigned_name.val, + is_output: false, + node, + }); + } else { + // Some other type of assignment we don't really care about. E.g. + // foo["bar"] <- ... + } + } + + if (is_ast_branch_node(node)) { + const sub_assignments = get_assignment_nodes(node.val); + assignment_nodes.push(...sub_assignments); + } + }); + + return assignment_nodes; +} + +function is_output_node(node: R_AST_Node): node is Output_Node { + if (!is_ast_branch_node(node)) return false; + const { val: subnodes } = node; + + return ( + subnodes.length === 3 && + subnodes[1].val === "output" && + typeof subnodes[2].val === "string" + ); +} + +export type Output_Server_Pos = Record; +export function get_output_positions( + all_asignments: Variable_Assignment[] +): Output_Server_Pos { + return all_asignments + .filter(({ is_output }) => is_output) + .reduce((by_name, { name, node }) => { + const { pos } = node; + if (pos) { + by_name[name] = [...(by_name[name] ?? []), pos]; + } + + return by_name; + }, {} as Output_Server_Pos); +} + +export type Ui_Assignment_Node = Required< + Assignment_Node_Gen> +>; + +function is_ui_assignment_node( + node: Assignment_Node +): node is Ui_Assignment_Node { + const has_position = Boolean(node.pos); + if (!has_position) return false; + + const assigns_to_ui = get_assignment_lhs(node).val === "ui"; + if (!assigns_to_ui) return false; + + return is_ast_branch_node(get_assignment_rhs(node)); +} + +export function get_ui_assignment_node( + all_asignments: Variable_Assignment[] +): Ui_Assignment_Node { + const ui_assignment = all_asignments.find( + ({ name, is_output }) => name === "ui" && !is_output + ); + + if (!ui_assignment) { + throw new Parsing_Error({ + message: "No ui assignment node was found in provided ast", + }); + } + + const { node: ui_node } = ui_assignment; + + if (!is_ui_assignment_node(ui_node)) { + throw new Parsing_Error({ + message: "No position info attached to the ui assignment node", + cause: ui_node, + }); + } + + return ui_node; +} + +export type Server_Assignment_Node = Required< + Assignment_Node_Gen> +>; +export function get_server_assignment_node( + all_asignments: Variable_Assignment[] +): Server_Assignment_Node { + const server_assignment = all_asignments.find( + ({ name, is_output }) => name === "server" && !is_output + ); + + if (!server_assignment) { + throw new Parsing_Error({ + message: "No server assignment node was found in provided ast", + }); + } + + const { node: server } = server_assignment; + + if (!server.pos) { + throw new Parsing_Error({ + message: "No position info attached to the ui assignment node", + cause: server, + }); + } + + return server as Server_Assignment_Node; +} diff --git a/inst/ast-parsing/src/globals.d.ts b/inst/ast-parsing/src/globals.d.ts new file mode 100644 index 000000000..6a8121cd8 --- /dev/null +++ b/inst/ast-parsing/src/globals.d.ts @@ -0,0 +1,4 @@ +/// + +declare module "*.module.css"; +declare module "*.png"; diff --git a/inst/ast-parsing/src/indent_text_block.ts b/inst/ast-parsing/src/indent_text_block.ts new file mode 100644 index 000000000..5aaa3e790 --- /dev/null +++ b/inst/ast-parsing/src/indent_text_block.ts @@ -0,0 +1,4 @@ +export function indent_text_block(txt: string, spaces_to_indent: number) { + const INDENT = " ".repeat(spaces_to_indent); + return txt.replaceAll(/\n/g, `\n${INDENT}`); +} diff --git a/inst/ast-parsing/src/index.ts b/inst/ast-parsing/src/index.ts new file mode 100644 index 000000000..fc6ac3676 --- /dev/null +++ b/inst/ast-parsing/src/index.ts @@ -0,0 +1,112 @@ +import type { ShinyUiNode } from "editor"; + +import type { Output_Server_Pos } from "./get_assignment_nodes"; + +export type Primatives = string | number | boolean; + +export type Script_Position = [ + start_row: number, + start_col: number, + end_row: number, + end_col: number +]; + +type Node_Vals_By_Key = { + s: string; // Symbol + c: string; // Characters/ strings + b: boolean; + n: number; + u: unknown; + m: never; // missing + e: R_AST; // another node/expression +}; + +export type AST_Node_By_Key = { + [key in keyof Node_Vals_By_Key]: { + val: Node_Vals_By_Key[key]; + type: key; + name?: string; + pos?: Script_Position; + }; +}; + +export type Expression_Node = { + val: T; + type: "e"; + pos?: Script_Position; +}; +export type Symbol_Node = { + val: Sym; + type: "s"; + pos?: Script_Position; +}; +export type Branch_Node = AST_Node_By_Key["e"]; +export type Leaf_Node = AST_Node_By_Key["c" | "b" | "n"]; +export type Unparsable_Node = AST_Node_By_Key["s" | "m" | "u"]; +export type R_AST_Node = AST_Node_By_Key[keyof Node_Vals_By_Key]; + +export type R_AST = Array; + +export type Raw_Script_Info = { + script: string; + ast: R_AST; +}; + +export type Single_File_App_Type = "SINGLE-FILE"; +export type Multi_File_App_Type = "MULTI-FILE"; +export type App_Type = Single_File_App_Type | Multi_File_App_Type; + +export type Single_File_Raw_App_Info = { + app_type: Single_File_App_Type; + app: Raw_Script_Info; +}; +export type Multi_File_Raw_App_Info = { + app_type: Multi_File_App_Type; + ui: Raw_Script_Info; + server: Raw_Script_Info; +}; + +export type Raw_App_Info = Single_File_Raw_App_Info | Multi_File_Raw_App_Info; + +// Shared by both single and multi-file apps. +export type Full_App_Info_Core = { + ui_tree: ShinyUiNode; +} & ({ output_positions: Output_Server_Pos; server_pos: Script_Position } | {}); + +export type Single_File_Full_Info = Full_App_Info_Core & { + app_type: Single_File_App_Type; + app: { + code: string; + libraries: string[]; + }; +}; + +export type Multi_File_Full_Info = Full_App_Info_Core & { + app_type: Multi_File_App_Type; + ui: { + code: string; + libraries: string[]; + }; + server: { + code: string; + }; +}; + +export const SCRIPT_LOC_KEYS = { + ui: "", + libraries: "", +}; + +export type Full_App_Info = Single_File_Full_Info | Multi_File_Full_Info; + +export type Single_File_App_Script = { + app_type: Single_File_App_Type; + app: string; + info?: Single_File_Full_Info; +}; +export type Multi_File_App_Script = { + app_type: Multi_File_App_Type; + ui: string; + server: string; + info?: Multi_File_Full_Info; +}; diff --git a/inst/ast-parsing/src/node_identity_checkers.ts b/inst/ast-parsing/src/node_identity_checkers.ts new file mode 100644 index 000000000..2833d5e2e --- /dev/null +++ b/inst/ast-parsing/src/node_identity_checkers.ts @@ -0,0 +1,24 @@ +import { is_object } from "editor/src/utils/is_object"; + +import type { Branch_Node, Leaf_Node, Primatives, R_AST_Node } from "."; + +export function is_primative(x: unknown): x is Primatives { + return ( + typeof x === "string" || typeof x === "number" || typeof x === "boolean" + ); +} +export function is_ast_leaf_node(node: unknown): node is Leaf_Node { + return ( + is_object(node) && + "val" in node && + ["string", "boolean", "number"].includes(typeof node.val) + ); +} +export function is_ast_branch_node(node: unknown): node is Branch_Node { + return is_object(node) && "val" in node && Array.isArray(node.val); +} + +type Named_Node = Required>; +export function is_named_node(node: unknown): node is Named_Node { + return is_object(node) && "name" in node; +} diff --git a/inst/ast-parsing/src/parse_app_ast.ts b/inst/ast-parsing/src/parse_app_ast.ts new file mode 100644 index 000000000..677d60e82 --- /dev/null +++ b/inst/ast-parsing/src/parse_app_ast.ts @@ -0,0 +1,104 @@ +import type { ShinyUiNode } from "editor"; + +import type { + Multi_File_App_Type, + Multi_File_Raw_App_Info, + Raw_App_Info, + Script_Position, + Single_File_App_Type, + Single_File_Raw_App_Info, +} from "."; + +import { ast_to_ui_node } from "./ast_to_shiny_ui_node"; +import type { + Assignment_Operator, + Output_Server_Pos, +} from "./get_assignment_nodes"; +import { + get_assignment_nodes, + get_output_positions, + get_server_assignment_node, + get_ui_assignment_node, +} from "./get_assignment_nodes"; + +type Parsed_AST = { + ui_tree: ShinyUiNode; + ui_pos: Script_Position; + ui_assignment_operator: Assignment_Operator; + server_pos: Script_Position; + server_node: ReturnType; + output_positions: Output_Server_Pos; +}; + +export type Parsed_Multi_File_AST = { + app_type: Multi_File_App_Type; + ui: Pick; + server: Pick; +}; + +export type Parsed_Single_File_AST = { + app_type: Single_File_App_Type; + app: Parsed_AST; +}; + +export function parse_app_ast( + info: Multi_File_Raw_App_Info +): Parsed_Multi_File_AST; + +export function parse_app_ast( + info: Single_File_Raw_App_Info +): Parsed_Single_File_AST; + +export function parse_app_ast(info: Raw_App_Info) { + return info.app_type === "SINGLE-FILE" + ? parse_single_file_ast(info) + : parse_multi_file_ast(info); +} + +function parse_single_file_ast({ + app: { ast }, +}: Single_File_Raw_App_Info): Parsed_Single_File_AST { + const assignment_nodes = get_assignment_nodes(ast); + const ui_node = get_ui_assignment_node(assignment_nodes); + const server_node = get_server_assignment_node(assignment_nodes); + const output_positions = get_output_positions(assignment_nodes); + + return { + app_type: "SINGLE-FILE", + app: { + ui_tree: ast_to_ui_node(ui_node.val[2]), + ui_pos: ui_node.pos, + ui_assignment_operator: ui_node.val[0].val, + server_pos: server_node.pos, + server_node, + output_positions, + }, + }; +} + +function parse_multi_file_ast({ + ui, + server, +}: Multi_File_Raw_App_Info): Parsed_Multi_File_AST { + const ui_assignment_nodes = get_assignment_nodes(ui.ast); + const ui_node = get_ui_assignment_node(ui_assignment_nodes); + + const server_assignment_nodes = get_assignment_nodes(server.ast); + const server_node = get_server_assignment_node(server_assignment_nodes); + + const output_positions = get_output_positions(server_assignment_nodes); + + return { + app_type: "MULTI-FILE", + ui: { + ui_tree: ast_to_ui_node(ui_node.val[2]), + ui_pos: ui_node.pos, + ui_assignment_operator: ui_node.val[0].val, + }, + server: { + server_node, + output_positions, + server_pos: server_node.pos, + }, + }; +} diff --git a/inst/ast-parsing/src/parsing_error_class.ts b/inst/ast-parsing/src/parsing_error_class.ts new file mode 100644 index 000000000..6e26bd4a3 --- /dev/null +++ b/inst/ast-parsing/src/parsing_error_class.ts @@ -0,0 +1,12 @@ +export class Parsing_Error extends Error { + name: "AST_PARSING_ERROR"; + message: string; + cause: any; + + constructor({ message, cause }: { message: string; cause?: any }) { + super(); + this.name = "AST_PARSING_ERROR"; + this.message = message; + this.cause = cause; + } +} diff --git a/inst/ast-parsing/tsconfig.json b/inst/ast-parsing/tsconfig.json new file mode 100644 index 000000000..e0f5d9801 --- /dev/null +++ b/inst/ast-parsing/tsconfig.json @@ -0,0 +1,9 @@ +{ + "extends": "tsconfig/base.json", + "compilerOptions": { + "module": "commonjs", + "rootDir": "src" + }, + "include": ["src/"], + "exclude": ["node_modules", ".vscode-test", "build-utils", "editor"] +} diff --git a/inst/communication-types/package.json b/inst/communication-types/package.json index d5ce6f455..1e4b5e22d 100644 --- a/inst/communication-types/package.json +++ b/inst/communication-types/package.json @@ -4,6 +4,7 @@ "version": "0.1.0", "private": true, "dependencies": { + "ast-parsing": "*", "editor": "*", "tsconfig": "*", "typescript": "^4.9.3" diff --git a/inst/communication-types/src/AppTemplates.ts b/inst/communication-types/src/AppTemplates.ts new file mode 100644 index 000000000..4dfa62f0b --- /dev/null +++ b/inst/communication-types/src/AppTemplates.ts @@ -0,0 +1,60 @@ +import type { Multi_File_App_Type, Single_File_App_Type } from "ast-parsing"; +import type { ShinyUiNode } from "editor"; + +import type { R_Ui_Code } from "./MessageToBackend"; + +export type Single_File_Template_Selection = { + outputType: Single_File_App_Type; +} & Omit & + R_Ui_Code; + +export type Multi_File_Template_Selection = { + outputType: Multi_File_App_Type; +} & Omit & + R_Ui_Code; + +export type TemplateSelection = + | Single_File_Template_Selection + | Multi_File_Template_Selection; + +/** + * Defines basic information needed to build an app template for the template viewer + */ + +export type TemplateInfo = { + /** + * Displayed name of the template in the chooser view + */ + title: string; + /** Long form description of the template available on hover. This can use + * markdown formatting + */ + description: string; + /** + * Main tree definining the template. Used for generating preview and also the + * main ui definition of the template + */ + uiTree: ShinyUiNode; + otherCode: { + /** + * Extra code that will be copied unchanged above the ui definition + */ + uiExtra?: string; + + /** + * List of libraries that need to be loaded in server code + */ + serverLibraries?: string[]; + + /** + * Extra code that will be copied unchanged above server funtion definition + */ + serverExtra?: string; + + /** + * Body of server function. This will be wrapped in the code + * `function(input, output){....}` + */ + serverFunctionBody?: string; + }; +}; diff --git a/inst/communication-types/src/messageDispatcher.ts b/inst/communication-types/src/BackendConnection.ts similarity index 56% rename from inst/communication-types/src/messageDispatcher.ts rename to inst/communication-types/src/BackendConnection.ts index dd786c264..7f9591b2f 100644 --- a/inst/communication-types/src/messageDispatcher.ts +++ b/inst/communication-types/src/BackendConnection.ts @@ -1,6 +1,29 @@ -import type { - MessageToClientByPath, -} from "communication-types"; +import type { MessageToBackend } from "./MessageToBackend"; +import type { MessageToClientByPath } from "./MessageToClient"; + +/** + * Communication layer for client and backend + */ + +export type BackendConnection = { + /** + * Function to pass a message to the backend + */ + sendMsg: (msg: MessageToBackend) => void; + /** + * Object to subscribe to incoming messages from backend + */ + incomingMsgs: Omit; + /** + * The different backend runtimes that can be supporting the ui editor client + */ + mode: "VSCODE" | "HTTPUV" | "STATIC"; +}; + + +export const makeMessageDispatcher = makeMessageDispatcherGeneric; + +export type MessageDispatcher = ReturnType; export function makeMessageDispatcherGeneric< Payload extends Record @@ -35,7 +58,3 @@ export function makeMessageDispatcherGeneric< }; } -export const makeMessageDispatcher = - makeMessageDispatcherGeneric; - -export type MessageDispatcher = ReturnType; diff --git a/inst/communication-types/src/MessageToBackend.ts b/inst/communication-types/src/MessageToBackend.ts new file mode 100644 index 000000000..9c59df078 --- /dev/null +++ b/inst/communication-types/src/MessageToBackend.ts @@ -0,0 +1,65 @@ +import type { + App_Type, + Multi_File_App_Script, + Script_Position, + Single_File_App_Script, +} from "ast-parsing"; +import type { ShinyUiNode } from "editor"; + +import { isRecord } from "./isRecord"; +import type { MessageUnion } from "./MessageUnion"; + +/** + * Messages keyed by path that can be sent to the backend from the client + */ +export type MessageToBackendByPath = { + "READY-FOR-STATE": null; + "UPDATED-APP": Single_File_App_Script | Multi_File_App_Script; + "NODE-SELECTION": string[]; + "ENTERED-TEMPLATE-SELECTOR": null; + "APP-PREVIEW-REQUEST": null; + "APP-PREVIEW-RESTART": null; + "APP-PREVIEW-STOP": null; + "OPEN-COMPANION-EDITOR": CompanionEditorPosition; + "SHOW-APP-LINES": Script_Position[]; + "INSERT-SNIPPET": SnippetInsertRequest; + "FIND-INPUT-USES": InputSourceRequest; +}; + +/** + * Union form of the backend messages with path and payload pairings for + * callbacks + */ +export type MessageToBackend = MessageUnion; + +export type SnippetInsertRequest = { snippet: string; below_line: number }; +export type InputSourceRequest = { + type: "Input"; + /** The current input id used to bind to ui output fn */ + inputId: string; +}; + +export type R_Ui_Code = { + /** String with formatted R code defining a shiny ui */ + ui_code: string; + /** String with all the library calls to accompany the ui code*/ + library_calls: string[]; +}; + +/** + * Positions the user can request the companion editor to be placed in + */ +export type CompanionEditorPosition = "BESIDE"; + +export type ParsedAppInfo = { + file_lines: string[]; + loaded_libraries: string[]; + type: App_Type; + ui_bounds: { start: number; end: number }; + ui_tree: ShinyUiNode; +}; + +export function isMessageToBackend(x: unknown): x is MessageToBackend { + if (!isRecord(x)) return false; + return "path" in x; +} diff --git a/inst/communication-types/src/MessageToClient.ts b/inst/communication-types/src/MessageToClient.ts new file mode 100644 index 000000000..718ceb72d --- /dev/null +++ b/inst/communication-types/src/MessageToClient.ts @@ -0,0 +1,30 @@ +import type { App_Type, Full_App_Info, Raw_App_Info } from "ast-parsing"; + +import { isRecord } from "./isRecord"; +import type { MessageUnion } from "./MessageUnion"; + +/** + * All the paths and their payloads that can be sent to the client from the + * backend + */ +export type MessageToClientByPath = { + "APP-INFO": Raw_App_Info | Full_App_Info; + "BACKEND-ERROR": { + context: string; + msg: string; + }; + "APP-PREVIEW-STATUS": "LOADING" | { url: string }; + "APP-PREVIEW-CRASH": string; + "APP-PREVIEW-LOGS": string[]; + TEMPLATE_CHOOSER: App_Type | "USER-CHOICE"; +}; + +/** + * Union form of the message that can be received from backend + */ +export type MessageToClient = MessageUnion; + +export function isMessageToClient(x: unknown): x is MessageToClient { + if (!isRecord(x)) return false; + return "path" in x; +} diff --git a/inst/communication-types/src/MessageUnion.ts b/inst/communication-types/src/MessageUnion.ts new file mode 100644 index 000000000..b138a9085 --- /dev/null +++ b/inst/communication-types/src/MessageUnion.ts @@ -0,0 +1,30 @@ +import type { MessageToBackendByPath } from "./MessageToBackend"; +import type { MessageToClientByPath } from "./MessageToClient"; + +export type MessageUnion< + MsgObj extends MessageToBackendByPath | MessageToClientByPath +> = + | { + [T in PathsWithPayload]: { + path: T; + payload: MsgObj[T]; + }; + }[PathsWithPayload] + | { + [T in PathsWithoutPayload]: { + path: T; + }; + }[PathsWithoutPayload]; +// ============================================================================= +// Helper generics to turn our simple message object type into unions that have +// smart payload slots +type PathsWithPayload< + MsgObj extends MessageToBackendByPath | MessageToClientByPath +> = { + [K in keyof MsgObj]-?: MsgObj[K] extends null ? never : K; +}[keyof MsgObj]; +type PathsWithoutPayload< + MsgObj extends MessageToBackendByPath | MessageToClientByPath +> = { + [K in keyof MsgObj]-?: MsgObj[K] extends null ? K : never; +}[keyof MsgObj]; diff --git a/inst/communication-types/src/index.ts b/inst/communication-types/src/index.ts index a3e6333a2..548bd12b0 100644 --- a/inst/communication-types/src/index.ts +++ b/inst/communication-types/src/index.ts @@ -1,169 +1,9 @@ -// import { runSUE } from "@editor/main"; -import type { ShinyUiNode } from "editor"; - -import type { MessageDispatcher } from "./messageDispatcher"; - -// type ShinyUiNode = { -// uiName: string; -// uiArguments: Record; -// uiChildren?: ShinyUiNode[]; -// }; - -/** - * Defines basic information needed to build an app template for the template viewer - */ -export type TemplateInfo = { - /** - * Displayed name of the template in the chooser view - */ - title: string; - /** Long form description of the template available on hover. This can use - * markdown formatting - */ - description: string; - /** - * Main tree definining the template. Used for generating preview and also the - * main ui definition of the template - */ - uiTree: ShinyUiNode; - otherCode: { - /** - * Extra code that will be copied unchanged above the ui definition - */ - uiExtra?: string; - - /** - * List of libraries that need to be loaded in server code - */ - serverLibraries?: string[]; - - /** - * Extra code that will be copied unchanged above server funtion definition - */ - serverExtra?: string; - - /** - * Body of server function. This will be wrapped in the code - * `function(input, output){....}` - */ - serverFunctionBody?: string; - }; -}; -export type OutputType = "SINGLE-FILE" | "MULTI-FILE"; - -export type TemplateSelection = Omit & { - outputType: OutputType; -}; - -export type ParsedAppInfo = { - file_lines: string[]; - loaded_libraries: string[]; - type: OutputType; - ui_bounds: { start: number; end: number }; - ui_tree: ShinyUiNode; -}; - -/** - * Messages keyed by path that can be sent to the backend - */ -type MessageToBackendByPath = { - "READY-FOR-STATE": null; - "UPDATED-TREE": ShinyUiNode; - "NODE-SELECTION": string[]; - "ENTERED-TEMPLATE-SELECTOR": null; - "TEMPLATE-SELECTION": TemplateSelection; - "APP-PREVIEW-REQUEST": null; - "APP-PREVIEW-RESTART": null; - "APP-PREVIEW-STOP": null; - "OPEN-COMPANION-EDITOR": CompanionEditorPosition; -}; - -/** - * Positions the user can request the companion editor to be placed in - */ -export type CompanionEditorPosition = "BESIDE"; - -/** - * All the paths and their payloads that can be received from the backend - */ -export type MessageToClientByPath = { - "UPDATED-TREE": ShinyUiNode; - "BACKEND-ERROR": { - context: string; - msg: string; - }; - "APP-PREVIEW-STATUS": "FAKE-PREVIEW" | "LOADING" | { url: string }; - "APP-PREVIEW-CRASH": string; - "APP-PREVIEW-LOGS": string[]; - TEMPLATE_CHOOSER: OutputType | "USER-CHOICE"; -}; - -/** - * Union form of the backend messages with path and payload pairings for - * callbacks - */ -export type MessageToBackend = MessageUnion; -/** - * Union form of the message that can be received from backend - */ -export type MessageToClient = MessageUnion; - -/** - * Communication layer for client and backend - */ -export type BackendConnection = { - /** - * Function to pass a message to the backend - */ - sendMsg: (msg: MessageToBackend) => void; - /** - * Object to subscribe to incoming messages from backend - */ - incomingMsgs: Omit; - /** - * The different backend runtimes that can be supporting the ui editor client - */ - mode: "VSCODE" | "HTTPUV" | "STATIC"; -}; - -function isRecord(value: unknown): value is Record { - return typeof value === "object" && value !== null; -} -export function isMessageFromBackend(x: unknown): x is MessageToClient { - if (!isRecord(x)) return false; - return "path" in x; -} -export function isMessageFromClient(x: unknown): x is MessageToBackend { - if (!isRecord(x)) return false; - return "path" in x; -} - -// ============================================================================= -// Helper generics to turn our simple message object type into unions that have -// smart payload slots -type PathsWithPayload< - MsgObj extends MessageToBackendByPath | MessageToClientByPath -> = { - [K in keyof MsgObj]-?: MsgObj[K] extends null ? never : K; -}[keyof MsgObj]; - -type PathsWithoutPayload< - MsgObj extends MessageToBackendByPath | MessageToClientByPath -> = { - [K in keyof MsgObj]-?: MsgObj[K] extends null ? K : never; -}[keyof MsgObj]; - -type MessageUnion< - MsgObj extends MessageToBackendByPath | MessageToClientByPath -> = - | { - [T in PathsWithPayload]: { - path: T; - payload: MsgObj[T]; - }; - }[PathsWithPayload] - | { - [T in PathsWithoutPayload]: { - path: T; - }; - }[PathsWithoutPayload]; +export type { BackendConnection, MessageDispatcher } from "./BackendConnection"; +export { makeMessageDispatcherGeneric } from "./BackendConnection"; +export type { MessageToClient, MessageToClientByPath } from "./MessageToClient"; +export type { + MessageToBackend, + MessageToBackendByPath, +} from "./MessageToBackend"; +export type { TemplateSelection } from "./AppTemplates"; +export type { InputSourceRequest } from "./MessageToBackend"; diff --git a/inst/communication-types/src/isRecord.ts b/inst/communication-types/src/isRecord.ts new file mode 100644 index 000000000..65324b004 --- /dev/null +++ b/inst/communication-types/src/isRecord.ts @@ -0,0 +1,3 @@ +export function isRecord(value: unknown): value is Record { + return typeof value === "object" && value !== null; +} diff --git a/inst/editor/build/build/bundle.css b/inst/editor/build/build/bundle.css index 20cbba65e..769d3c59c 100644 --- a/inst/editor/build/build/bundle.css +++ b/inst/editor/build/build/bundle.css @@ -1,4 +1,4 @@ -@charset "UTF-8";:root{--bs-blue: #0d6efd;--bs-indigo: #6610f2;--bs-purple: #6f42c1;--bs-pink: #d63384;--bs-red: #dc3545;--bs-orange: #fd7e14;--bs-yellow: #ffc107;--bs-green: #198754;--bs-teal: #20c997;--bs-cyan: #0dcaf0;--bs-black: #000;--bs-white: #fff;--bs-gray: #6c757d;--bs-gray-dark: #343a40;--bs-gray-100: #f8f9fa;--bs-gray-200: #e9ecef;--bs-gray-300: #dee2e6;--bs-gray-400: #ced4da;--bs-gray-500: #adb5bd;--bs-gray-600: #6c757d;--bs-gray-700: #495057;--bs-gray-800: #343a40;--bs-gray-900: #212529;--bs-primary: #0d6efd;--bs-secondary: #6c757d;--bs-success: #198754;--bs-info: #0dcaf0;--bs-warning: #ffc107;--bs-danger: #dc3545;--bs-light: #f8f9fa;--bs-dark: #212529;--bs-primary-rgb: 13, 110, 253;--bs-secondary-rgb: 108, 117, 125;--bs-success-rgb: 25, 135, 84;--bs-info-rgb: 13, 202, 240;--bs-warning-rgb: 255, 193, 7;--bs-danger-rgb: 220, 53, 69;--bs-light-rgb: 248, 249, 250;--bs-dark-rgb: 33, 37, 41;--bs-white-rgb: 255, 255, 255;--bs-black-rgb: 0, 0, 0;--bs-body-color-rgb: 33, 37, 41;--bs-body-bg-rgb: 255, 255, 255;--bs-font-sans-serif: system-ui, -apple-system, "Segoe UI", Roboto, "Helvetica Neue", "Noto Sans", "Liberation Sans", Arial, sans-serif, "Apple Color Emoji", "Segoe UI Emoji", "Segoe UI Symbol", "Noto Color Emoji";--bs-font-monospace: SFMono-Regular, Menlo, Monaco, Consolas, "Liberation Mono", "Courier New", monospace;--bs-gradient: linear-gradient(180deg, rgba(255, 255, 255, .15), rgba(255, 255, 255, 0));--bs-body-font-family: var(--bs-font-sans-serif);--bs-body-font-size: 1rem;--bs-body-font-weight: 400;--bs-body-line-height: 1.5;--bs-body-color: #212529;--bs-body-bg: #fff;--bs-border-width: 1px;--bs-border-style: solid;--bs-border-color: #dee2e6;--bs-border-color-translucent: rgba(0, 0, 0, .175);--bs-border-radius: .375rem;--bs-border-radius-sm: .25rem;--bs-border-radius-lg: .5rem;--bs-border-radius-xl: 1rem;--bs-border-radius-2xl: 2rem;--bs-border-radius-pill: 50rem;--bs-link-color: #0d6efd;--bs-link-hover-color: #0a58ca;--bs-code-color: #d63384;--bs-highlight-bg: #fff3cd}*,*:before,*:after{box-sizing:border-box}@media (prefers-reduced-motion: no-preference){:root{scroll-behavior:smooth}}body{margin:0;font-family:var(--bs-body-font-family);font-size:var(--bs-body-font-size);font-weight:var(--bs-body-font-weight);line-height:var(--bs-body-line-height);color:var(--bs-body-color);text-align:var(--bs-body-text-align);background-color:var(--bs-body-bg);-webkit-text-size-adjust:100%;-webkit-tap-highlight-color:rgba(0,0,0,0)}hr{margin:1rem 0;color:inherit;border:0;border-top:1px solid;opacity:.25}h6,.h6,h5,.h5,h4,.h4,h3,.h3,h2,.h2,h1,.h1{margin-top:0;margin-bottom:.5rem;font-weight:500;line-height:1.2}h1,.h1{font-size:calc(1.375rem + 1.5vw)}@media (min-width: 1200px){h1,.h1{font-size:2.5rem}}h2,.h2{font-size:calc(1.325rem + .9vw)}@media (min-width: 1200px){h2,.h2{font-size:2rem}}h3,.h3{font-size:calc(1.3rem + .6vw)}@media (min-width: 1200px){h3,.h3{font-size:1.75rem}}h4,.h4{font-size:calc(1.275rem + .3vw)}@media (min-width: 1200px){h4,.h4{font-size:1.5rem}}h5,.h5{font-size:1.25rem}h6,.h6{font-size:1rem}p{margin-top:0;margin-bottom:1rem}abbr[title]{-webkit-text-decoration:underline dotted;text-decoration:underline dotted;cursor:help;-webkit-text-decoration-skip-ink:none;text-decoration-skip-ink:none}address{margin-bottom:1rem;font-style:normal;line-height:inherit}ol,ul{padding-left:2rem}ol,ul,dl{margin-top:0;margin-bottom:1rem}ol ol,ul ul,ol ul,ul ol{margin-bottom:0}dt{font-weight:700}dd{margin-bottom:.5rem;margin-left:0}blockquote{margin:0 0 1rem}b,strong{font-weight:bolder}small,.small{font-size:.875em}mark,.mark{padding:.1875em;background-color:var(--bs-highlight-bg)}sub,sup{position:relative;font-size:.75em;line-height:0;vertical-align:baseline}sub{bottom:-.25em}sup{top:-.5em}a{color:var(--bs-link-color);text-decoration:underline}a:hover{color:var(--bs-link-hover-color)}a:not([href]):not([class]),a:not([href]):not([class]):hover{color:inherit;text-decoration:none}pre,code,kbd,samp{font-family:var(--bs-font-monospace);font-size:1em}pre{display:block;margin-top:0;margin-bottom:1rem;overflow:auto;font-size:.875em}pre code{font-size:inherit;color:inherit;word-break:normal}code{font-size:.875em;color:var(--bs-code-color);word-wrap:break-word}a>code{color:inherit}kbd{padding:.1875rem .375rem;font-size:.875em;color:var(--bs-body-bg);background-color:var(--bs-body-color);border-radius:.25rem}kbd kbd{padding:0;font-size:1em}figure{margin:0 0 1rem}img,svg{vertical-align:middle}table{caption-side:bottom;border-collapse:collapse}caption{padding-top:.5rem;padding-bottom:.5rem;color:#6c757d;text-align:left}th{text-align:inherit;text-align:-webkit-match-parent}thead,tbody,tfoot,tr,td,th{border-color:inherit;border-style:solid;border-width:0}label{display:inline-block}button{border-radius:0}button:focus:not(:focus-visible){outline:0}input,button,select,optgroup,textarea{margin:0;font-family:inherit;font-size:inherit;line-height:inherit}button,select{text-transform:none}[role=button]{cursor:pointer}select{word-wrap:normal}select:disabled{opacity:1}[list]:not([type=date]):not([type=datetime-local]):not([type=month]):not([type=week]):not([type=time])::-webkit-calendar-picker-indicator{display:none!important}button,[type=button],[type=reset],[type=submit]{-webkit-appearance:button}button:not(:disabled),[type=button]:not(:disabled),[type=reset]:not(:disabled),[type=submit]:not(:disabled){cursor:pointer}::-moz-focus-inner{padding:0;border-style:none}textarea{resize:vertical}fieldset{min-width:0;padding:0;margin:0;border:0}legend{float:left;width:100%;padding:0;margin-bottom:.5rem;font-size:calc(1.275rem + .3vw);line-height:inherit}@media (min-width: 1200px){legend{font-size:1.5rem}}legend+*{clear:left}::-webkit-datetime-edit-fields-wrapper,::-webkit-datetime-edit-text,::-webkit-datetime-edit-minute,::-webkit-datetime-edit-hour-field,::-webkit-datetime-edit-day-field,::-webkit-datetime-edit-month-field,::-webkit-datetime-edit-year-field{padding:0}::-webkit-inner-spin-button{height:auto}[type=search]{outline-offset:-2px;-webkit-appearance:textfield}::-webkit-search-decoration{-webkit-appearance:none}::-webkit-color-swatch-wrapper{padding:0}::-webkit-file-upload-button{font:inherit;-webkit-appearance:button}::file-selector-button{font:inherit;-webkit-appearance:button}output{display:inline-block}iframe{border:0}summary{display:list-item;cursor:pointer}progress{vertical-align:baseline}[hidden]{display:none!important}.lead{font-size:1.25rem;font-weight:300}.display-1{font-size:calc(1.625rem + 4.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-1{font-size:5rem}}.display-2{font-size:calc(1.575rem + 3.9vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-2{font-size:4.5rem}}.display-3{font-size:calc(1.525rem + 3.3vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-3{font-size:4rem}}.display-4{font-size:calc(1.475rem + 2.7vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-4{font-size:3.5rem}}.display-5{font-size:calc(1.425rem + 2.1vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-5{font-size:3rem}}.display-6{font-size:calc(1.375rem + 1.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-6{font-size:2.5rem}}.list-unstyled,.list-inline{padding-left:0;list-style:none}.list-inline-item{display:inline-block}.list-inline-item:not(:last-child){margin-right:.5rem}.initialism{font-size:.875em;text-transform:uppercase}.blockquote{margin-bottom:1rem;font-size:1.25rem}.blockquote>:last-child{margin-bottom:0}.blockquote-footer{margin-top:-1rem;margin-bottom:1rem;font-size:.875em;color:#6c757d}.blockquote-footer:before{content:"\2014\a0"}.img-fluid{max-width:100%;height:auto}.img-thumbnail{padding:.25rem;background-color:#fff;border:1px solid var(--bs-border-color);border-radius:.375rem;max-width:100%;height:auto}.figure{display:inline-block}.figure-img{margin-bottom:.5rem;line-height:1}.figure-caption{font-size:.875em;color:#6c757d}.container,.container-fluid,.container-xxl,.container-xl,.container-lg,.container-md,.container-sm{--bs-gutter-x: 1.5rem;--bs-gutter-y: 0;width:100%;padding-right:calc(var(--bs-gutter-x) * .5);padding-left:calc(var(--bs-gutter-x) * .5);margin-right:auto;margin-left:auto}@media (min-width: 576px){.container-sm,.container{max-width:540px}}@media (min-width: 768px){.container-md,.container-sm,.container{max-width:720px}}@media (min-width: 992px){.container-lg,.container-md,.container-sm,.container{max-width:960px}}@media (min-width: 1200px){.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1140px}}@media (min-width: 1400px){.container-xxl,.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1320px}}.row{--bs-gutter-x: 1.5rem;--bs-gutter-y: 0;display:flex;flex-wrap:wrap;margin-top:calc(-1 * var(--bs-gutter-y));margin-right:calc(-.5 * var(--bs-gutter-x));margin-left:calc(-.5 * var(--bs-gutter-x))}.row>*{flex-shrink:0;width:100%;max-width:100%;padding-right:calc(var(--bs-gutter-x) * .5);padding-left:calc(var(--bs-gutter-x) * .5);margin-top:var(--bs-gutter-y)}.col{flex:1 0 0%}.row-cols-auto>*{flex:0 0 auto;width:auto}.row-cols-1>*{flex:0 0 auto;width:100%}.row-cols-2>*{flex:0 0 auto;width:50%}.row-cols-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-4>*{flex:0 0 auto;width:25%}.row-cols-5>*{flex:0 0 auto;width:20%}.row-cols-6>*{flex:0 0 auto;width:16.6666666667%}.col-auto{flex:0 0 auto;width:auto}.col-1{flex:0 0 auto;width:8.33333333%}.col-2{flex:0 0 auto;width:16.66666667%}.col-3{flex:0 0 auto;width:25%}.col-4{flex:0 0 auto;width:33.33333333%}.col-5{flex:0 0 auto;width:41.66666667%}.col-6{flex:0 0 auto;width:50%}.col-7{flex:0 0 auto;width:58.33333333%}.col-8{flex:0 0 auto;width:66.66666667%}.col-9{flex:0 0 auto;width:75%}.col-10{flex:0 0 auto;width:83.33333333%}.col-11{flex:0 0 auto;width:91.66666667%}.col-12{flex:0 0 auto;width:100%}.offset-1{margin-left:8.33333333%}.offset-2{margin-left:16.66666667%}.offset-3{margin-left:25%}.offset-4{margin-left:33.33333333%}.offset-5{margin-left:41.66666667%}.offset-6{margin-left:50%}.offset-7{margin-left:58.33333333%}.offset-8{margin-left:66.66666667%}.offset-9{margin-left:75%}.offset-10{margin-left:83.33333333%}.offset-11{margin-left:91.66666667%}.g-0,.gx-0{--bs-gutter-x: 0}.g-0,.gy-0{--bs-gutter-y: 0}.g-1,.gx-1{--bs-gutter-x: .25rem}.g-1,.gy-1{--bs-gutter-y: .25rem}.g-2,.gx-2{--bs-gutter-x: .5rem}.g-2,.gy-2{--bs-gutter-y: .5rem}.g-3,.gx-3{--bs-gutter-x: 1rem}.g-3,.gy-3{--bs-gutter-y: 1rem}.g-4,.gx-4{--bs-gutter-x: 1.5rem}.g-4,.gy-4{--bs-gutter-y: 1.5rem}.g-5,.gx-5{--bs-gutter-x: 3rem}.g-5,.gy-5{--bs-gutter-y: 3rem}@media (min-width: 576px){.col-sm{flex:1 0 0%}.row-cols-sm-auto>*{flex:0 0 auto;width:auto}.row-cols-sm-1>*{flex:0 0 auto;width:100%}.row-cols-sm-2>*{flex:0 0 auto;width:50%}.row-cols-sm-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-sm-4>*{flex:0 0 auto;width:25%}.row-cols-sm-5>*{flex:0 0 auto;width:20%}.row-cols-sm-6>*{flex:0 0 auto;width:16.6666666667%}.col-sm-auto{flex:0 0 auto;width:auto}.col-sm-1{flex:0 0 auto;width:8.33333333%}.col-sm-2{flex:0 0 auto;width:16.66666667%}.col-sm-3{flex:0 0 auto;width:25%}.col-sm-4{flex:0 0 auto;width:33.33333333%}.col-sm-5{flex:0 0 auto;width:41.66666667%}.col-sm-6{flex:0 0 auto;width:50%}.col-sm-7{flex:0 0 auto;width:58.33333333%}.col-sm-8{flex:0 0 auto;width:66.66666667%}.col-sm-9{flex:0 0 auto;width:75%}.col-sm-10{flex:0 0 auto;width:83.33333333%}.col-sm-11{flex:0 0 auto;width:91.66666667%}.col-sm-12{flex:0 0 auto;width:100%}.offset-sm-0{margin-left:0}.offset-sm-1{margin-left:8.33333333%}.offset-sm-2{margin-left:16.66666667%}.offset-sm-3{margin-left:25%}.offset-sm-4{margin-left:33.33333333%}.offset-sm-5{margin-left:41.66666667%}.offset-sm-6{margin-left:50%}.offset-sm-7{margin-left:58.33333333%}.offset-sm-8{margin-left:66.66666667%}.offset-sm-9{margin-left:75%}.offset-sm-10{margin-left:83.33333333%}.offset-sm-11{margin-left:91.66666667%}.g-sm-0,.gx-sm-0{--bs-gutter-x: 0}.g-sm-0,.gy-sm-0{--bs-gutter-y: 0}.g-sm-1,.gx-sm-1{--bs-gutter-x: .25rem}.g-sm-1,.gy-sm-1{--bs-gutter-y: .25rem}.g-sm-2,.gx-sm-2{--bs-gutter-x: .5rem}.g-sm-2,.gy-sm-2{--bs-gutter-y: .5rem}.g-sm-3,.gx-sm-3{--bs-gutter-x: 1rem}.g-sm-3,.gy-sm-3{--bs-gutter-y: 1rem}.g-sm-4,.gx-sm-4{--bs-gutter-x: 1.5rem}.g-sm-4,.gy-sm-4{--bs-gutter-y: 1.5rem}.g-sm-5,.gx-sm-5{--bs-gutter-x: 3rem}.g-sm-5,.gy-sm-5{--bs-gutter-y: 3rem}}@media (min-width: 768px){.col-md{flex:1 0 0%}.row-cols-md-auto>*{flex:0 0 auto;width:auto}.row-cols-md-1>*{flex:0 0 auto;width:100%}.row-cols-md-2>*{flex:0 0 auto;width:50%}.row-cols-md-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-md-4>*{flex:0 0 auto;width:25%}.row-cols-md-5>*{flex:0 0 auto;width:20%}.row-cols-md-6>*{flex:0 0 auto;width:16.6666666667%}.col-md-auto{flex:0 0 auto;width:auto}.col-md-1{flex:0 0 auto;width:8.33333333%}.col-md-2{flex:0 0 auto;width:16.66666667%}.col-md-3{flex:0 0 auto;width:25%}.col-md-4{flex:0 0 auto;width:33.33333333%}.col-md-5{flex:0 0 auto;width:41.66666667%}.col-md-6{flex:0 0 auto;width:50%}.col-md-7{flex:0 0 auto;width:58.33333333%}.col-md-8{flex:0 0 auto;width:66.66666667%}.col-md-9{flex:0 0 auto;width:75%}.col-md-10{flex:0 0 auto;width:83.33333333%}.col-md-11{flex:0 0 auto;width:91.66666667%}.col-md-12{flex:0 0 auto;width:100%}.offset-md-0{margin-left:0}.offset-md-1{margin-left:8.33333333%}.offset-md-2{margin-left:16.66666667%}.offset-md-3{margin-left:25%}.offset-md-4{margin-left:33.33333333%}.offset-md-5{margin-left:41.66666667%}.offset-md-6{margin-left:50%}.offset-md-7{margin-left:58.33333333%}.offset-md-8{margin-left:66.66666667%}.offset-md-9{margin-left:75%}.offset-md-10{margin-left:83.33333333%}.offset-md-11{margin-left:91.66666667%}.g-md-0,.gx-md-0{--bs-gutter-x: 0}.g-md-0,.gy-md-0{--bs-gutter-y: 0}.g-md-1,.gx-md-1{--bs-gutter-x: .25rem}.g-md-1,.gy-md-1{--bs-gutter-y: .25rem}.g-md-2,.gx-md-2{--bs-gutter-x: .5rem}.g-md-2,.gy-md-2{--bs-gutter-y: .5rem}.g-md-3,.gx-md-3{--bs-gutter-x: 1rem}.g-md-3,.gy-md-3{--bs-gutter-y: 1rem}.g-md-4,.gx-md-4{--bs-gutter-x: 1.5rem}.g-md-4,.gy-md-4{--bs-gutter-y: 1.5rem}.g-md-5,.gx-md-5{--bs-gutter-x: 3rem}.g-md-5,.gy-md-5{--bs-gutter-y: 3rem}}@media (min-width: 992px){.col-lg{flex:1 0 0%}.row-cols-lg-auto>*{flex:0 0 auto;width:auto}.row-cols-lg-1>*{flex:0 0 auto;width:100%}.row-cols-lg-2>*{flex:0 0 auto;width:50%}.row-cols-lg-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-lg-4>*{flex:0 0 auto;width:25%}.row-cols-lg-5>*{flex:0 0 auto;width:20%}.row-cols-lg-6>*{flex:0 0 auto;width:16.6666666667%}.col-lg-auto{flex:0 0 auto;width:auto}.col-lg-1{flex:0 0 auto;width:8.33333333%}.col-lg-2{flex:0 0 auto;width:16.66666667%}.col-lg-3{flex:0 0 auto;width:25%}.col-lg-4{flex:0 0 auto;width:33.33333333%}.col-lg-5{flex:0 0 auto;width:41.66666667%}.col-lg-6{flex:0 0 auto;width:50%}.col-lg-7{flex:0 0 auto;width:58.33333333%}.col-lg-8{flex:0 0 auto;width:66.66666667%}.col-lg-9{flex:0 0 auto;width:75%}.col-lg-10{flex:0 0 auto;width:83.33333333%}.col-lg-11{flex:0 0 auto;width:91.66666667%}.col-lg-12{flex:0 0 auto;width:100%}.offset-lg-0{margin-left:0}.offset-lg-1{margin-left:8.33333333%}.offset-lg-2{margin-left:16.66666667%}.offset-lg-3{margin-left:25%}.offset-lg-4{margin-left:33.33333333%}.offset-lg-5{margin-left:41.66666667%}.offset-lg-6{margin-left:50%}.offset-lg-7{margin-left:58.33333333%}.offset-lg-8{margin-left:66.66666667%}.offset-lg-9{margin-left:75%}.offset-lg-10{margin-left:83.33333333%}.offset-lg-11{margin-left:91.66666667%}.g-lg-0,.gx-lg-0{--bs-gutter-x: 0}.g-lg-0,.gy-lg-0{--bs-gutter-y: 0}.g-lg-1,.gx-lg-1{--bs-gutter-x: .25rem}.g-lg-1,.gy-lg-1{--bs-gutter-y: .25rem}.g-lg-2,.gx-lg-2{--bs-gutter-x: .5rem}.g-lg-2,.gy-lg-2{--bs-gutter-y: .5rem}.g-lg-3,.gx-lg-3{--bs-gutter-x: 1rem}.g-lg-3,.gy-lg-3{--bs-gutter-y: 1rem}.g-lg-4,.gx-lg-4{--bs-gutter-x: 1.5rem}.g-lg-4,.gy-lg-4{--bs-gutter-y: 1.5rem}.g-lg-5,.gx-lg-5{--bs-gutter-x: 3rem}.g-lg-5,.gy-lg-5{--bs-gutter-y: 3rem}}@media (min-width: 1200px){.col-xl{flex:1 0 0%}.row-cols-xl-auto>*{flex:0 0 auto;width:auto}.row-cols-xl-1>*{flex:0 0 auto;width:100%}.row-cols-xl-2>*{flex:0 0 auto;width:50%}.row-cols-xl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xl-4>*{flex:0 0 auto;width:25%}.row-cols-xl-5>*{flex:0 0 auto;width:20%}.row-cols-xl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xl-auto{flex:0 0 auto;width:auto}.col-xl-1{flex:0 0 auto;width:8.33333333%}.col-xl-2{flex:0 0 auto;width:16.66666667%}.col-xl-3{flex:0 0 auto;width:25%}.col-xl-4{flex:0 0 auto;width:33.33333333%}.col-xl-5{flex:0 0 auto;width:41.66666667%}.col-xl-6{flex:0 0 auto;width:50%}.col-xl-7{flex:0 0 auto;width:58.33333333%}.col-xl-8{flex:0 0 auto;width:66.66666667%}.col-xl-9{flex:0 0 auto;width:75%}.col-xl-10{flex:0 0 auto;width:83.33333333%}.col-xl-11{flex:0 0 auto;width:91.66666667%}.col-xl-12{flex:0 0 auto;width:100%}.offset-xl-0{margin-left:0}.offset-xl-1{margin-left:8.33333333%}.offset-xl-2{margin-left:16.66666667%}.offset-xl-3{margin-left:25%}.offset-xl-4{margin-left:33.33333333%}.offset-xl-5{margin-left:41.66666667%}.offset-xl-6{margin-left:50%}.offset-xl-7{margin-left:58.33333333%}.offset-xl-8{margin-left:66.66666667%}.offset-xl-9{margin-left:75%}.offset-xl-10{margin-left:83.33333333%}.offset-xl-11{margin-left:91.66666667%}.g-xl-0,.gx-xl-0{--bs-gutter-x: 0}.g-xl-0,.gy-xl-0{--bs-gutter-y: 0}.g-xl-1,.gx-xl-1{--bs-gutter-x: .25rem}.g-xl-1,.gy-xl-1{--bs-gutter-y: .25rem}.g-xl-2,.gx-xl-2{--bs-gutter-x: .5rem}.g-xl-2,.gy-xl-2{--bs-gutter-y: .5rem}.g-xl-3,.gx-xl-3{--bs-gutter-x: 1rem}.g-xl-3,.gy-xl-3{--bs-gutter-y: 1rem}.g-xl-4,.gx-xl-4{--bs-gutter-x: 1.5rem}.g-xl-4,.gy-xl-4{--bs-gutter-y: 1.5rem}.g-xl-5,.gx-xl-5{--bs-gutter-x: 3rem}.g-xl-5,.gy-xl-5{--bs-gutter-y: 3rem}}@media (min-width: 1400px){.col-xxl{flex:1 0 0%}.row-cols-xxl-auto>*{flex:0 0 auto;width:auto}.row-cols-xxl-1>*{flex:0 0 auto;width:100%}.row-cols-xxl-2>*{flex:0 0 auto;width:50%}.row-cols-xxl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xxl-4>*{flex:0 0 auto;width:25%}.row-cols-xxl-5>*{flex:0 0 auto;width:20%}.row-cols-xxl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xxl-auto{flex:0 0 auto;width:auto}.col-xxl-1{flex:0 0 auto;width:8.33333333%}.col-xxl-2{flex:0 0 auto;width:16.66666667%}.col-xxl-3{flex:0 0 auto;width:25%}.col-xxl-4{flex:0 0 auto;width:33.33333333%}.col-xxl-5{flex:0 0 auto;width:41.66666667%}.col-xxl-6{flex:0 0 auto;width:50%}.col-xxl-7{flex:0 0 auto;width:58.33333333%}.col-xxl-8{flex:0 0 auto;width:66.66666667%}.col-xxl-9{flex:0 0 auto;width:75%}.col-xxl-10{flex:0 0 auto;width:83.33333333%}.col-xxl-11{flex:0 0 auto;width:91.66666667%}.col-xxl-12{flex:0 0 auto;width:100%}.offset-xxl-0{margin-left:0}.offset-xxl-1{margin-left:8.33333333%}.offset-xxl-2{margin-left:16.66666667%}.offset-xxl-3{margin-left:25%}.offset-xxl-4{margin-left:33.33333333%}.offset-xxl-5{margin-left:41.66666667%}.offset-xxl-6{margin-left:50%}.offset-xxl-7{margin-left:58.33333333%}.offset-xxl-8{margin-left:66.66666667%}.offset-xxl-9{margin-left:75%}.offset-xxl-10{margin-left:83.33333333%}.offset-xxl-11{margin-left:91.66666667%}.g-xxl-0,.gx-xxl-0{--bs-gutter-x: 0}.g-xxl-0,.gy-xxl-0{--bs-gutter-y: 0}.g-xxl-1,.gx-xxl-1{--bs-gutter-x: .25rem}.g-xxl-1,.gy-xxl-1{--bs-gutter-y: .25rem}.g-xxl-2,.gx-xxl-2{--bs-gutter-x: .5rem}.g-xxl-2,.gy-xxl-2{--bs-gutter-y: .5rem}.g-xxl-3,.gx-xxl-3{--bs-gutter-x: 1rem}.g-xxl-3,.gy-xxl-3{--bs-gutter-y: 1rem}.g-xxl-4,.gx-xxl-4{--bs-gutter-x: 1.5rem}.g-xxl-4,.gy-xxl-4{--bs-gutter-y: 1.5rem}.g-xxl-5,.gx-xxl-5{--bs-gutter-x: 3rem}.g-xxl-5,.gy-xxl-5{--bs-gutter-y: 3rem}}.table{--bs-table-color: var(--bs-body-color);--bs-table-bg: transparent;--bs-table-border-color: var(--bs-border-color);--bs-table-accent-bg: transparent;--bs-table-striped-color: var(--bs-body-color);--bs-table-striped-bg: rgba(0, 0, 0, .05);--bs-table-active-color: var(--bs-body-color);--bs-table-active-bg: rgba(0, 0, 0, .1);--bs-table-hover-color: var(--bs-body-color);--bs-table-hover-bg: rgba(0, 0, 0, .075);width:100%;margin-bottom:1rem;color:var(--bs-table-color);vertical-align:top;border-color:var(--bs-table-border-color)}.table>:not(caption)>*>*{padding:.5rem;background-color:var(--bs-table-bg);border-bottom-width:1px;box-shadow:inset 0 0 0 9999px var(--bs-table-accent-bg)}.table>tbody{vertical-align:inherit}.table>thead{vertical-align:bottom}.table-group-divider{border-top:2px solid currentcolor}.caption-top{caption-side:top}.table-sm>:not(caption)>*>*{padding:.25rem}.table-bordered>:not(caption)>*{border-width:1px 0}.table-bordered>:not(caption)>*>*{border-width:0 1px}.table-borderless>:not(caption)>*>*{border-bottom-width:0}.table-borderless>:not(:first-child){border-top-width:0}.table-striped>tbody>tr:nth-of-type(odd)>*{--bs-table-accent-bg: var(--bs-table-striped-bg);color:var(--bs-table-striped-color)}.table-striped-columns>:not(caption)>tr>:nth-child(even){--bs-table-accent-bg: var(--bs-table-striped-bg);color:var(--bs-table-striped-color)}.table-active{--bs-table-accent-bg: var(--bs-table-active-bg);color:var(--bs-table-active-color)}.table-hover>tbody>tr:hover>*{--bs-table-accent-bg: var(--bs-table-hover-bg);color:var(--bs-table-hover-color)}.table-primary{--bs-table-color: #000;--bs-table-bg: #cfe2ff;--bs-table-border-color: #bacbe6;--bs-table-striped-bg: #c5d7f2;--bs-table-striped-color: #000;--bs-table-active-bg: #bacbe6;--bs-table-active-color: #000;--bs-table-hover-bg: #bfd1ec;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-secondary{--bs-table-color: #000;--bs-table-bg: #e2e3e5;--bs-table-border-color: #cbccce;--bs-table-striped-bg: #d7d8da;--bs-table-striped-color: #000;--bs-table-active-bg: #cbccce;--bs-table-active-color: #000;--bs-table-hover-bg: #d1d2d4;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-success{--bs-table-color: #000;--bs-table-bg: #d1e7dd;--bs-table-border-color: #bcd0c7;--bs-table-striped-bg: #c7dbd2;--bs-table-striped-color: #000;--bs-table-active-bg: #bcd0c7;--bs-table-active-color: #000;--bs-table-hover-bg: #c1d6cc;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-info{--bs-table-color: #000;--bs-table-bg: #cff4fc;--bs-table-border-color: #badce3;--bs-table-striped-bg: #c5e8ef;--bs-table-striped-color: #000;--bs-table-active-bg: #badce3;--bs-table-active-color: #000;--bs-table-hover-bg: #bfe2e9;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-warning{--bs-table-color: #000;--bs-table-bg: #fff3cd;--bs-table-border-color: #e6dbb9;--bs-table-striped-bg: #f2e7c3;--bs-table-striped-color: #000;--bs-table-active-bg: #e6dbb9;--bs-table-active-color: #000;--bs-table-hover-bg: #ece1be;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-danger{--bs-table-color: #000;--bs-table-bg: #f8d7da;--bs-table-border-color: #dfc2c4;--bs-table-striped-bg: #eccccf;--bs-table-striped-color: #000;--bs-table-active-bg: #dfc2c4;--bs-table-active-color: #000;--bs-table-hover-bg: #e5c7ca;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-light{--bs-table-color: #000;--bs-table-bg: #f8f9fa;--bs-table-border-color: #dfe0e1;--bs-table-striped-bg: #ecedee;--bs-table-striped-color: #000;--bs-table-active-bg: #dfe0e1;--bs-table-active-color: #000;--bs-table-hover-bg: #e5e6e7;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-dark{--bs-table-color: #fff;--bs-table-bg: #212529;--bs-table-border-color: #373b3e;--bs-table-striped-bg: #2c3034;--bs-table-striped-color: #fff;--bs-table-active-bg: #373b3e;--bs-table-active-color: #fff;--bs-table-hover-bg: #323539;--bs-table-hover-color: #fff;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-responsive{overflow-x:auto;-webkit-overflow-scrolling:touch}@media (max-width: 575.98px){.table-responsive-sm{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 767.98px){.table-responsive-md{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 991.98px){.table-responsive-lg{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1199.98px){.table-responsive-xl{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1399.98px){.table-responsive-xxl{overflow-x:auto;-webkit-overflow-scrolling:touch}}.form-label{margin-bottom:.5rem}.col-form-label{padding-top:calc(.375rem + 1px);padding-bottom:calc(.375rem + 1px);margin-bottom:0;font-size:inherit;line-height:1.5}.col-form-label-lg{padding-top:calc(.5rem + 1px);padding-bottom:calc(.5rem + 1px);font-size:1.25rem}.col-form-label-sm{padding-top:calc(.25rem + 1px);padding-bottom:calc(.25rem + 1px);font-size:.875rem}.form-text{margin-top:.25rem;font-size:.875em;color:#6c757d}.form-control{display:block;width:100%;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-clip:padding-box;border:1px solid #ced4da;-webkit-appearance:none;-moz-appearance:none;appearance:none;border-radius:.375rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control{transition:none}}.form-control[type=file]{overflow:hidden}.form-control[type=file]:not(:disabled):not([readonly]){cursor:pointer}.form-control:focus{color:#212529;background-color:#fff;border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-control::-webkit-date-and-time-value{height:1.5em}.form-control::-moz-placeholder{color:#6c757d;opacity:1}.form-control::placeholder{color:#6c757d;opacity:1}.form-control:disabled{background-color:#e9ecef;opacity:1}.form-control::-webkit-file-upload-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;-webkit-transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}.form-control::file-selector-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control::-webkit-file-upload-button{-webkit-transition:none;transition:none}.form-control::file-selector-button{transition:none}}.form-control:hover:not(:disabled):not([readonly])::-webkit-file-upload-button{background-color:#dde0e3}.form-control:hover:not(:disabled):not([readonly])::file-selector-button{background-color:#dde0e3}.form-control-plaintext{display:block;width:100%;padding:.375rem 0;margin-bottom:0;line-height:1.5;color:#212529;background-color:transparent;border:solid transparent;border-width:1px 0}.form-control-plaintext:focus{outline:0}.form-control-plaintext.form-control-sm,.form-control-plaintext.form-control-lg{padding-right:0;padding-left:0}.form-control-sm{min-height:calc(1.5em + .5rem + 2px);padding:.25rem .5rem;font-size:.875rem;border-radius:.25rem}.form-control-sm::-webkit-file-upload-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-sm::file-selector-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-lg{min-height:calc(1.5em + 1rem + 2px);padding:.5rem 1rem;font-size:1.25rem;border-radius:.5rem}.form-control-lg::-webkit-file-upload-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}.form-control-lg::file-selector-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}textarea.form-control{min-height:calc(1.5em + .75rem + 2px)}textarea.form-control-sm{min-height:calc(1.5em + .5rem + 2px)}textarea.form-control-lg{min-height:calc(1.5em + 1rem + 2px)}.form-control-color{width:3rem;height:calc(1.5em + .75rem + 2px);padding:.375rem}.form-control-color:not(:disabled):not([readonly]){cursor:pointer}.form-control-color::-moz-color-swatch{border:0!important;border-radius:.375rem}.form-control-color::-webkit-color-swatch{border-radius:.375rem}.form-control-color.form-control-sm{height:calc(1.5em + .5rem + 2px)}.form-control-color.form-control-lg{height:calc(1.5em + 1rem + 2px)}.form-select{display:block;width:100%;padding:.375rem 2.25rem .375rem .75rem;-moz-padding-start:calc(.75rem - 3px);font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='m2 5 6 6 6-6'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right .75rem center;background-size:16px 12px;border:1px solid #ced4da;border-radius:.375rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-select{transition:none}}.form-select:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-select[multiple],.form-select[size]:not([size="1"]){padding-right:.75rem;background-image:none}.form-select:disabled{background-color:#e9ecef}.form-select:-moz-focusring{color:transparent;text-shadow:0 0 0 #212529}.form-select-sm{padding-top:.25rem;padding-bottom:.25rem;padding-left:.5rem;font-size:.875rem;border-radius:.25rem}.form-select-lg{padding-top:.5rem;padding-bottom:.5rem;padding-left:1rem;font-size:1.25rem;border-radius:.5rem}.form-check{display:block;min-height:1.5rem;padding-left:1.5em;margin-bottom:.125rem}.form-check .form-check-input{float:left;margin-left:-1.5em}.form-check-reverse{padding-right:1.5em;padding-left:0;text-align:right}.form-check-reverse .form-check-input{float:right;margin-right:-1.5em;margin-left:0}.form-check-input{width:1em;height:1em;margin-top:.25em;vertical-align:top;background-color:#fff;background-repeat:no-repeat;background-position:center;background-size:contain;border:1px solid rgba(0,0,0,.25);-webkit-appearance:none;-moz-appearance:none;appearance:none;-webkit-print-color-adjust:exact;color-adjust:exact;print-color-adjust:exact}.form-check-input[type=checkbox]{border-radius:.25em}.form-check-input[type=radio]{border-radius:50%}.form-check-input:active{filter:brightness(90%)}.form-check-input:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-check-input:checked{background-color:#0d6efd;border-color:#0d6efd}.form-check-input:checked[type=checkbox]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='m6 10 3 3 6-6'/%3e%3c/svg%3e")}.form-check-input:checked[type=radio]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='2' fill='%23fff'/%3e%3c/svg%3e")}.form-check-input[type=checkbox]:indeterminate{background-color:#0d6efd;border-color:#0d6efd;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='M6 10h8'/%3e%3c/svg%3e")}.form-check-input:disabled{pointer-events:none;filter:none;opacity:.5}.form-check-input[disabled]~.form-check-label,.form-check-input:disabled~.form-check-label{cursor:default;opacity:.5}.form-switch{padding-left:2.5em}.form-switch .form-check-input{width:2em;margin-left:-2.5em;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='rgba%280, 0, 0, 0.25%29'/%3e%3c/svg%3e");background-position:left center;border-radius:2em;transition:background-position .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-switch .form-check-input{transition:none}}.form-switch .form-check-input:focus{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%2386b7fe'/%3e%3c/svg%3e")}.form-switch .form-check-input:checked{background-position:right center;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%23fff'/%3e%3c/svg%3e")}.form-switch.form-check-reverse{padding-right:2.5em;padding-left:0}.form-switch.form-check-reverse .form-check-input{margin-right:-2.5em;margin-left:0}.form-check-inline{display:inline-block;margin-right:1rem}.btn-check{position:absolute;clip:rect(0,0,0,0);pointer-events:none}.btn-check[disabled]+.btn,.btn-check:disabled+.btn{pointer-events:none;filter:none;opacity:.65}.form-range{width:100%;height:1.5rem;padding:0;background-color:transparent;-webkit-appearance:none;-moz-appearance:none;appearance:none}.form-range:focus{outline:0}.form-range:focus::-webkit-slider-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range:focus::-moz-range-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range::-moz-focus-outer{border:0}.form-range::-webkit-slider-thumb{width:1rem;height:1rem;margin-top:-.25rem;background-color:#0d6efd;border:0;border-radius:1rem;-webkit-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-webkit-slider-thumb{-webkit-transition:none;transition:none}}.form-range::-webkit-slider-thumb:active{background-color:#b6d4fe}.form-range::-webkit-slider-runnable-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range::-moz-range-thumb{width:1rem;height:1rem;background-color:#0d6efd;border:0;border-radius:1rem;-moz-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-moz-range-thumb{-moz-transition:none;transition:none}}.form-range::-moz-range-thumb:active{background-color:#b6d4fe}.form-range::-moz-range-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range:disabled{pointer-events:none}.form-range:disabled::-webkit-slider-thumb{background-color:#adb5bd}.form-range:disabled::-moz-range-thumb{background-color:#adb5bd}.form-floating{position:relative}.form-floating>.form-control,.form-floating>.form-control-plaintext,.form-floating>.form-select{height:calc(3.5rem + 2px);line-height:1.25}.form-floating>label{position:absolute;top:0;left:0;width:100%;height:100%;padding:1rem .75rem;overflow:hidden;text-align:start;text-overflow:ellipsis;white-space:nowrap;pointer-events:none;border:1px solid transparent;transform-origin:0 0;transition:opacity .1s ease-in-out,transform .1s ease-in-out}@media (prefers-reduced-motion: reduce){.form-floating>label{transition:none}}.form-floating>.form-control,.form-floating>.form-control-plaintext{padding:1rem .75rem}.form-floating>.form-control::-moz-placeholder,.form-floating>.form-control-plaintext::-moz-placeholder{color:transparent}.form-floating>.form-control::placeholder,.form-floating>.form-control-plaintext::placeholder{color:transparent}.form-floating>.form-control:not(:-moz-placeholder-shown),.form-floating>.form-control-plaintext:not(:-moz-placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:focus,.form-floating>.form-control:not(:placeholder-shown),.form-floating>.form-control-plaintext:focus,.form-floating>.form-control-plaintext:not(:placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:-webkit-autofill,.form-floating>.form-control-plaintext:-webkit-autofill{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-select{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:not(:-moz-placeholder-shown)~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:focus~label,.form-floating>.form-control:not(:placeholder-shown)~label,.form-floating>.form-control-plaintext~label,.form-floating>.form-select~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:-webkit-autofill~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control-plaintext~label{border-width:1px 0}.input-group{position:relative;display:flex;flex-wrap:wrap;align-items:stretch;width:100%}.input-group>.form-control,.input-group>.form-select,.input-group>.form-floating{position:relative;flex:1 1 auto;width:1%;min-width:0}.input-group>.form-control:focus,.input-group>.form-select:focus,.input-group>.form-floating:focus-within{z-index:5}.input-group .btn{position:relative;z-index:2}.input-group .btn:focus{z-index:5}.input-group-text{display:flex;align-items:center;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;text-align:center;white-space:nowrap;background-color:#e9ecef;border:1px solid #ced4da;border-radius:.375rem}.input-group-lg>.form-control,.input-group-lg>.form-select,.input-group-lg>.input-group-text,.input-group-lg>.btn{padding:.5rem 1rem;font-size:1.25rem;border-radius:.5rem}.input-group-sm>.form-control,.input-group-sm>.form-select,.input-group-sm>.input-group-text,.input-group-sm>.btn{padding:.25rem .5rem;font-size:.875rem;border-radius:.25rem}.input-group-lg>.form-select,.input-group-sm>.form-select{padding-right:3rem}.input-group:not(.has-validation)>:not(:last-child):not(.dropdown-toggle):not(.dropdown-menu):not(.form-floating),.input-group:not(.has-validation)>.dropdown-toggle:nth-last-child(n+3),.input-group:not(.has-validation)>.form-floating:not(:last-child)>.form-control,.input-group:not(.has-validation)>.form-floating:not(:last-child)>.form-select{border-top-right-radius:0;border-bottom-right-radius:0}.input-group.has-validation>:nth-last-child(n+3):not(.dropdown-toggle):not(.dropdown-menu):not(.form-floating),.input-group.has-validation>.dropdown-toggle:nth-last-child(n+4),.input-group.has-validation>.form-floating:nth-last-child(n+3)>.form-control,.input-group.has-validation>.form-floating:nth-last-child(n+3)>.form-select{border-top-right-radius:0;border-bottom-right-radius:0}.input-group>:not(:first-child):not(.dropdown-menu):not(.valid-tooltip):not(.valid-feedback):not(.invalid-tooltip):not(.invalid-feedback){margin-left:-1px;border-top-left-radius:0;border-bottom-left-radius:0}.input-group>.form-floating:not(:first-child)>.form-control,.input-group>.form-floating:not(:first-child)>.form-select{border-top-left-radius:0;border-bottom-left-radius:0}.valid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#198754}.valid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#198754e6;border-radius:.375rem}.was-validated :valid~.valid-feedback,.was-validated :valid~.valid-tooltip,.is-valid~.valid-feedback,.is-valid~.valid-tooltip{display:block}.was-validated .form-control:valid,.form-control.is-valid{border-color:#198754;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:valid:focus,.form-control.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated textarea.form-control:valid,textarea.form-control.is-valid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:valid,.form-select.is-valid{border-color:#198754}.was-validated .form-select:valid:not([multiple]):not([size]),.was-validated .form-select:valid:not([multiple])[size="1"],.form-select.is-valid:not([multiple]):not([size]),.form-select.is-valid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='m2 5 6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:valid:focus,.form-select.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated .form-control-color:valid,.form-control-color.is-valid{width:calc(3.75rem + 1.5em)}.was-validated .form-check-input:valid,.form-check-input.is-valid{border-color:#198754}.was-validated .form-check-input:valid:checked,.form-check-input.is-valid:checked{background-color:#198754}.was-validated .form-check-input:valid:focus,.form-check-input.is-valid:focus{box-shadow:0 0 0 .25rem #19875440}.was-validated .form-check-input:valid~.form-check-label,.form-check-input.is-valid~.form-check-label{color:#198754}.form-check-inline .form-check-input~.valid-feedback{margin-left:.5em}.was-validated .input-group>.form-control:not(:focus):valid,.input-group>.form-control:not(:focus).is-valid,.was-validated .input-group>.form-select:not(:focus):valid,.input-group>.form-select:not(:focus).is-valid,.was-validated .input-group>.form-floating:not(:focus-within):valid,.input-group>.form-floating:not(:focus-within).is-valid{z-index:3}.invalid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#dc3545}.invalid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#dc3545e6;border-radius:.375rem}.was-validated :invalid~.invalid-feedback,.was-validated :invalid~.invalid-tooltip,.is-invalid~.invalid-feedback,.is-invalid~.invalid-tooltip{display:block}.was-validated .form-control:invalid,.form-control.is-invalid{border-color:#dc3545;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:invalid:focus,.form-control.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated textarea.form-control:invalid,textarea.form-control.is-invalid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:invalid,.form-select.is-invalid{border-color:#dc3545}.was-validated .form-select:invalid:not([multiple]):not([size]),.was-validated .form-select:invalid:not([multiple])[size="1"],.form-select.is-invalid:not([multiple]):not([size]),.form-select.is-invalid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='m2 5 6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:invalid:focus,.form-select.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-control-color:invalid,.form-control-color.is-invalid{width:calc(3.75rem + 1.5em)}.was-validated .form-check-input:invalid,.form-check-input.is-invalid{border-color:#dc3545}.was-validated .form-check-input:invalid:checked,.form-check-input.is-invalid:checked{background-color:#dc3545}.was-validated .form-check-input:invalid:focus,.form-check-input.is-invalid:focus{box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-check-input:invalid~.form-check-label,.form-check-input.is-invalid~.form-check-label{color:#dc3545}.form-check-inline .form-check-input~.invalid-feedback{margin-left:.5em}.was-validated .input-group>.form-control:not(:focus):invalid,.input-group>.form-control:not(:focus).is-invalid,.was-validated .input-group>.form-select:not(:focus):invalid,.input-group>.form-select:not(:focus).is-invalid,.was-validated .input-group>.form-floating:not(:focus-within):invalid,.input-group>.form-floating:not(:focus-within).is-invalid{z-index:4}.btn{--bs-btn-padding-x: .75rem;--bs-btn-padding-y: .375rem;--bs-btn-font-family: ;--bs-btn-font-size: 1rem;--bs-btn-font-weight: 400;--bs-btn-line-height: 1.5;--bs-btn-color: #212529;--bs-btn-bg: transparent;--bs-btn-border-width: 1px;--bs-btn-border-color: transparent;--bs-btn-border-radius: .375rem;--bs-btn-hover-border-color: transparent;--bs-btn-box-shadow: inset 0 1px 0 rgba(255, 255, 255, .15), 0 1px 1px rgba(0, 0, 0, .075);--bs-btn-disabled-opacity: .65;--bs-btn-focus-box-shadow: 0 0 0 .25rem rgba(var(--bs-btn-focus-shadow-rgb), .5);display:inline-block;padding:var(--bs-btn-padding-y) var(--bs-btn-padding-x);font-family:var(--bs-btn-font-family);font-size:var(--bs-btn-font-size);font-weight:var(--bs-btn-font-weight);line-height:var(--bs-btn-line-height);color:var(--bs-btn-color);text-align:center;text-decoration:none;vertical-align:middle;cursor:pointer;-webkit-user-select:none;-moz-user-select:none;user-select:none;border:var(--bs-btn-border-width) solid var(--bs-btn-border-color);border-radius:var(--bs-btn-border-radius);background-color:var(--bs-btn-bg);transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.btn{transition:none}}.btn:hover{color:var(--bs-btn-hover-color);background-color:var(--bs-btn-hover-bg);border-color:var(--bs-btn-hover-border-color)}.btn-check+.btn:hover{color:var(--bs-btn-color);background-color:var(--bs-btn-bg);border-color:var(--bs-btn-border-color)}.btn:focus-visible{color:var(--bs-btn-hover-color);background-color:var(--bs-btn-hover-bg);border-color:var(--bs-btn-hover-border-color);outline:0;box-shadow:var(--bs-btn-focus-box-shadow)}.btn-check:focus-visible+.btn{border-color:var(--bs-btn-hover-border-color);outline:0;box-shadow:var(--bs-btn-focus-box-shadow)}.btn-check:checked+.btn,:not(.btn-check)+.btn:active,.btn:first-child:active,.btn.active,.btn.show{color:var(--bs-btn-active-color);background-color:var(--bs-btn-active-bg);border-color:var(--bs-btn-active-border-color)}.btn-check:checked+.btn:focus-visible,:not(.btn-check)+.btn:active:focus-visible,.btn:first-child:active:focus-visible,.btn.active:focus-visible,.btn.show:focus-visible{box-shadow:var(--bs-btn-focus-box-shadow)}.btn:disabled,.btn.disabled,fieldset:disabled .btn{color:var(--bs-btn-disabled-color);pointer-events:none;background-color:var(--bs-btn-disabled-bg);border-color:var(--bs-btn-disabled-border-color);opacity:var(--bs-btn-disabled-opacity)}.btn-primary{--bs-btn-color: #fff;--bs-btn-bg: #0d6efd;--bs-btn-border-color: #0d6efd;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #0b5ed7;--bs-btn-hover-border-color: #0a58ca;--bs-btn-focus-shadow-rgb: 49, 132, 253;--bs-btn-active-color: #fff;--bs-btn-active-bg: #0a58ca;--bs-btn-active-border-color: #0a53be;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #0d6efd;--bs-btn-disabled-border-color: #0d6efd}.btn-secondary{--bs-btn-color: #fff;--bs-btn-bg: #6c757d;--bs-btn-border-color: #6c757d;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #5c636a;--bs-btn-hover-border-color: #565e64;--bs-btn-focus-shadow-rgb: 130, 138, 145;--bs-btn-active-color: #fff;--bs-btn-active-bg: #565e64;--bs-btn-active-border-color: #51585e;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #6c757d;--bs-btn-disabled-border-color: #6c757d}.btn-success{--bs-btn-color: #fff;--bs-btn-bg: #198754;--bs-btn-border-color: #198754;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #157347;--bs-btn-hover-border-color: #146c43;--bs-btn-focus-shadow-rgb: 60, 153, 110;--bs-btn-active-color: #fff;--bs-btn-active-bg: #146c43;--bs-btn-active-border-color: #13653f;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #198754;--bs-btn-disabled-border-color: #198754}.btn-info{--bs-btn-color: #000;--bs-btn-bg: #0dcaf0;--bs-btn-border-color: #0dcaf0;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #31d2f2;--bs-btn-hover-border-color: #25cff2;--bs-btn-focus-shadow-rgb: 11, 172, 204;--bs-btn-active-color: #000;--bs-btn-active-bg: #3dd5f3;--bs-btn-active-border-color: #25cff2;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #000;--bs-btn-disabled-bg: #0dcaf0;--bs-btn-disabled-border-color: #0dcaf0}.btn-warning{--bs-btn-color: #000;--bs-btn-bg: #ffc107;--bs-btn-border-color: #ffc107;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #ffca2c;--bs-btn-hover-border-color: #ffc720;--bs-btn-focus-shadow-rgb: 217, 164, 6;--bs-btn-active-color: #000;--bs-btn-active-bg: #ffcd39;--bs-btn-active-border-color: #ffc720;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #000;--bs-btn-disabled-bg: #ffc107;--bs-btn-disabled-border-color: #ffc107}.btn-danger{--bs-btn-color: #fff;--bs-btn-bg: #dc3545;--bs-btn-border-color: #dc3545;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #bb2d3b;--bs-btn-hover-border-color: #b02a37;--bs-btn-focus-shadow-rgb: 225, 83, 97;--bs-btn-active-color: #fff;--bs-btn-active-bg: #b02a37;--bs-btn-active-border-color: #a52834;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #dc3545;--bs-btn-disabled-border-color: #dc3545}.btn-light{--bs-btn-color: #000;--bs-btn-bg: #f8f9fa;--bs-btn-border-color: #f8f9fa;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #d3d4d5;--bs-btn-hover-border-color: #c6c7c8;--bs-btn-focus-shadow-rgb: 211, 212, 213;--bs-btn-active-color: #000;--bs-btn-active-bg: #c6c7c8;--bs-btn-active-border-color: #babbbc;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #000;--bs-btn-disabled-bg: #f8f9fa;--bs-btn-disabled-border-color: #f8f9fa}.btn-dark{--bs-btn-color: #fff;--bs-btn-bg: #212529;--bs-btn-border-color: #212529;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #424649;--bs-btn-hover-border-color: #373b3e;--bs-btn-focus-shadow-rgb: 66, 70, 73;--bs-btn-active-color: #fff;--bs-btn-active-bg: #4d5154;--bs-btn-active-border-color: #373b3e;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #212529;--bs-btn-disabled-border-color: #212529}.btn-outline-primary{--bs-btn-color: #0d6efd;--bs-btn-border-color: #0d6efd;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #0d6efd;--bs-btn-hover-border-color: #0d6efd;--bs-btn-focus-shadow-rgb: 13, 110, 253;--bs-btn-active-color: #fff;--bs-btn-active-bg: #0d6efd;--bs-btn-active-border-color: #0d6efd;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #0d6efd;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #0d6efd;--bs-gradient: none}.btn-outline-secondary{--bs-btn-color: #6c757d;--bs-btn-border-color: #6c757d;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #6c757d;--bs-btn-hover-border-color: #6c757d;--bs-btn-focus-shadow-rgb: 108, 117, 125;--bs-btn-active-color: #fff;--bs-btn-active-bg: #6c757d;--bs-btn-active-border-color: #6c757d;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #6c757d;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #6c757d;--bs-gradient: none}.btn-outline-success{--bs-btn-color: #198754;--bs-btn-border-color: #198754;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #198754;--bs-btn-hover-border-color: #198754;--bs-btn-focus-shadow-rgb: 25, 135, 84;--bs-btn-active-color: #fff;--bs-btn-active-bg: #198754;--bs-btn-active-border-color: #198754;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #198754;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #198754;--bs-gradient: none}.btn-outline-info{--bs-btn-color: #0dcaf0;--bs-btn-border-color: #0dcaf0;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #0dcaf0;--bs-btn-hover-border-color: #0dcaf0;--bs-btn-focus-shadow-rgb: 13, 202, 240;--bs-btn-active-color: #000;--bs-btn-active-bg: #0dcaf0;--bs-btn-active-border-color: #0dcaf0;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #0dcaf0;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #0dcaf0;--bs-gradient: none}.btn-outline-warning{--bs-btn-color: #ffc107;--bs-btn-border-color: #ffc107;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #ffc107;--bs-btn-hover-border-color: #ffc107;--bs-btn-focus-shadow-rgb: 255, 193, 7;--bs-btn-active-color: #000;--bs-btn-active-bg: #ffc107;--bs-btn-active-border-color: #ffc107;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #ffc107;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #ffc107;--bs-gradient: none}.btn-outline-danger{--bs-btn-color: #dc3545;--bs-btn-border-color: #dc3545;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #dc3545;--bs-btn-hover-border-color: #dc3545;--bs-btn-focus-shadow-rgb: 220, 53, 69;--bs-btn-active-color: #fff;--bs-btn-active-bg: #dc3545;--bs-btn-active-border-color: #dc3545;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #dc3545;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #dc3545;--bs-gradient: none}.btn-outline-light{--bs-btn-color: #f8f9fa;--bs-btn-border-color: #f8f9fa;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #f8f9fa;--bs-btn-hover-border-color: #f8f9fa;--bs-btn-focus-shadow-rgb: 248, 249, 250;--bs-btn-active-color: #000;--bs-btn-active-bg: #f8f9fa;--bs-btn-active-border-color: #f8f9fa;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #f8f9fa;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #f8f9fa;--bs-gradient: none}.btn-outline-dark{--bs-btn-color: #212529;--bs-btn-border-color: #212529;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #212529;--bs-btn-hover-border-color: #212529;--bs-btn-focus-shadow-rgb: 33, 37, 41;--bs-btn-active-color: #fff;--bs-btn-active-bg: #212529;--bs-btn-active-border-color: #212529;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #212529;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #212529;--bs-gradient: none}.btn-link{--bs-btn-font-weight: 400;--bs-btn-color: var(--bs-link-color);--bs-btn-bg: transparent;--bs-btn-border-color: transparent;--bs-btn-hover-color: var(--bs-link-hover-color);--bs-btn-hover-border-color: transparent;--bs-btn-active-color: var(--bs-link-hover-color);--bs-btn-active-border-color: transparent;--bs-btn-disabled-color: #6c757d;--bs-btn-disabled-border-color: transparent;--bs-btn-box-shadow: none;--bs-btn-focus-shadow-rgb: 49, 132, 253;text-decoration:underline}.btn-link:focus-visible{color:var(--bs-btn-color)}.btn-link:hover{color:var(--bs-btn-hover-color)}.btn-lg,.btn-group-lg>.btn{--bs-btn-padding-y: .5rem;--bs-btn-padding-x: 1rem;--bs-btn-font-size: 1.25rem;--bs-btn-border-radius: .5rem}.btn-sm,.btn-group-sm>.btn{--bs-btn-padding-y: .25rem;--bs-btn-padding-x: .5rem;--bs-btn-font-size: .875rem;--bs-btn-border-radius: .25rem}.fade{transition:opacity .15s linear}@media (prefers-reduced-motion: reduce){.fade{transition:none}}.fade:not(.show){opacity:0}.collapse:not(.show){display:none}.collapsing{height:0;overflow:hidden;transition:height .35s ease}@media (prefers-reduced-motion: reduce){.collapsing{transition:none}}.collapsing.collapse-horizontal{width:0;height:auto;transition:width .35s ease}@media (prefers-reduced-motion: reduce){.collapsing.collapse-horizontal{transition:none}}.dropup,.dropend,.dropdown,.dropstart,.dropup-center,.dropdown-center{position:relative}.dropdown-toggle{white-space:nowrap}.dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid;border-right:.3em solid transparent;border-bottom:0;border-left:.3em solid transparent}.dropdown-toggle:empty:after{margin-left:0}.dropdown-menu{--bs-dropdown-zindex: 1000;--bs-dropdown-min-width: 10rem;--bs-dropdown-padding-x: 0;--bs-dropdown-padding-y: .5rem;--bs-dropdown-spacer: .125rem;--bs-dropdown-font-size: 1rem;--bs-dropdown-color: #212529;--bs-dropdown-bg: #fff;--bs-dropdown-border-color: var(--bs-border-color-translucent);--bs-dropdown-border-radius: .375rem;--bs-dropdown-border-width: 1px;--bs-dropdown-inner-border-radius:calc(.375rem - 1px);--bs-dropdown-divider-bg: var(--bs-border-color-translucent);--bs-dropdown-divider-margin-y: .5rem;--bs-dropdown-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15);--bs-dropdown-link-color: #212529;--bs-dropdown-link-hover-color: #1e2125;--bs-dropdown-link-hover-bg: #e9ecef;--bs-dropdown-link-active-color: #fff;--bs-dropdown-link-active-bg: #0d6efd;--bs-dropdown-link-disabled-color: #adb5bd;--bs-dropdown-item-padding-x: 1rem;--bs-dropdown-item-padding-y: .25rem;--bs-dropdown-header-color: #6c757d;--bs-dropdown-header-padding-x: 1rem;--bs-dropdown-header-padding-y: .5rem;position:absolute;z-index:var(--bs-dropdown-zindex);display:none;min-width:var(--bs-dropdown-min-width);padding:var(--bs-dropdown-padding-y) var(--bs-dropdown-padding-x);margin:0;font-size:var(--bs-dropdown-font-size);color:var(--bs-dropdown-color);text-align:left;list-style:none;background-color:var(--bs-dropdown-bg);background-clip:padding-box;border:var(--bs-dropdown-border-width) solid var(--bs-dropdown-border-color);border-radius:var(--bs-dropdown-border-radius)}.dropdown-menu[data-bs-popper]{top:100%;left:0;margin-top:var(--bs-dropdown-spacer)}.dropdown-menu-start{--bs-position: start}.dropdown-menu-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-end{--bs-position: end}.dropdown-menu-end[data-bs-popper]{right:0;left:auto}@media (min-width: 576px){.dropdown-menu-sm-start{--bs-position: start}.dropdown-menu-sm-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-sm-end{--bs-position: end}.dropdown-menu-sm-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 768px){.dropdown-menu-md-start{--bs-position: start}.dropdown-menu-md-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-md-end{--bs-position: end}.dropdown-menu-md-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 992px){.dropdown-menu-lg-start{--bs-position: start}.dropdown-menu-lg-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-lg-end{--bs-position: end}.dropdown-menu-lg-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1200px){.dropdown-menu-xl-start{--bs-position: start}.dropdown-menu-xl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xl-end{--bs-position: end}.dropdown-menu-xl-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1400px){.dropdown-menu-xxl-start{--bs-position: start}.dropdown-menu-xxl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xxl-end{--bs-position: end}.dropdown-menu-xxl-end[data-bs-popper]{right:0;left:auto}}.dropup .dropdown-menu[data-bs-popper]{top:auto;bottom:100%;margin-top:0;margin-bottom:var(--bs-dropdown-spacer)}.dropup .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:0;border-right:.3em solid transparent;border-bottom:.3em solid;border-left:.3em solid transparent}.dropup .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-menu[data-bs-popper]{top:0;right:auto;left:100%;margin-top:0;margin-left:var(--bs-dropdown-spacer)}.dropend .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:0;border-bottom:.3em solid transparent;border-left:.3em solid}.dropend .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-toggle:after{vertical-align:0}.dropstart .dropdown-menu[data-bs-popper]{top:0;right:100%;left:auto;margin-top:0;margin-right:var(--bs-dropdown-spacer)}.dropstart .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:""}.dropstart .dropdown-toggle:after{display:none}.dropstart .dropdown-toggle:before{display:inline-block;margin-right:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:.3em solid;border-bottom:.3em solid transparent}.dropstart .dropdown-toggle:empty:after{margin-left:0}.dropstart .dropdown-toggle:before{vertical-align:0}.dropdown-divider{height:0;margin:var(--bs-dropdown-divider-margin-y) 0;overflow:hidden;border-top:1px solid var(--bs-dropdown-divider-bg);opacity:1}.dropdown-item{display:block;width:100%;padding:var(--bs-dropdown-item-padding-y) var(--bs-dropdown-item-padding-x);clear:both;font-weight:400;color:var(--bs-dropdown-link-color);text-align:inherit;text-decoration:none;white-space:nowrap;background-color:transparent;border:0}.dropdown-item:hover,.dropdown-item:focus{color:var(--bs-dropdown-link-hover-color);background-color:var(--bs-dropdown-link-hover-bg)}.dropdown-item.active,.dropdown-item:active{color:var(--bs-dropdown-link-active-color);text-decoration:none;background-color:var(--bs-dropdown-link-active-bg)}.dropdown-item.disabled,.dropdown-item:disabled{color:var(--bs-dropdown-link-disabled-color);pointer-events:none;background-color:transparent}.dropdown-menu.show{display:block}.dropdown-header{display:block;padding:var(--bs-dropdown-header-padding-y) var(--bs-dropdown-header-padding-x);margin-bottom:0;font-size:.875rem;color:var(--bs-dropdown-header-color);white-space:nowrap}.dropdown-item-text{display:block;padding:var(--bs-dropdown-item-padding-y) var(--bs-dropdown-item-padding-x);color:var(--bs-dropdown-link-color)}.dropdown-menu-dark{--bs-dropdown-color: #dee2e6;--bs-dropdown-bg: #343a40;--bs-dropdown-border-color: var(--bs-border-color-translucent);--bs-dropdown-box-shadow: ;--bs-dropdown-link-color: #dee2e6;--bs-dropdown-link-hover-color: #fff;--bs-dropdown-divider-bg: var(--bs-border-color-translucent);--bs-dropdown-link-hover-bg: rgba(255, 255, 255, .15);--bs-dropdown-link-active-color: #fff;--bs-dropdown-link-active-bg: #0d6efd;--bs-dropdown-link-disabled-color: #adb5bd;--bs-dropdown-header-color: #adb5bd}.btn-group,.btn-group-vertical{position:relative;display:inline-flex;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;flex:1 1 auto}.btn-group>.btn-check:checked+.btn,.btn-group>.btn-check:focus+.btn,.btn-group>.btn:hover,.btn-group>.btn:focus,.btn-group>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn-check:checked+.btn,.btn-group-vertical>.btn-check:focus+.btn,.btn-group-vertical>.btn:hover,.btn-group-vertical>.btn:focus,.btn-group-vertical>.btn:active,.btn-group-vertical>.btn.active{z-index:1}.btn-toolbar{display:flex;flex-wrap:wrap;justify-content:flex-start}.btn-toolbar .input-group{width:auto}.btn-group{border-radius:.375rem}.btn-group>:not(.btn-check:first-child)+.btn,.btn-group>.btn-group:not(:first-child){margin-left:-1px}.btn-group>.btn:not(:last-child):not(.dropdown-toggle),.btn-group>.btn.dropdown-toggle-split:first-child,.btn-group>.btn-group:not(:last-child)>.btn{border-top-right-radius:0;border-bottom-right-radius:0}.btn-group>.btn:nth-child(n+3),.btn-group>:not(.btn-check)+.btn,.btn-group>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-bottom-left-radius:0}.dropdown-toggle-split{padding-right:.5625rem;padding-left:.5625rem}.dropdown-toggle-split:after,.dropup .dropdown-toggle-split:after,.dropend .dropdown-toggle-split:after{margin-left:0}.dropstart .dropdown-toggle-split:before{margin-right:0}.btn-sm+.dropdown-toggle-split,.btn-group-sm>.btn+.dropdown-toggle-split{padding-right:.375rem;padding-left:.375rem}.btn-lg+.dropdown-toggle-split,.btn-group-lg>.btn+.dropdown-toggle-split{padding-right:.75rem;padding-left:.75rem}.btn-group-vertical{flex-direction:column;align-items:flex-start;justify-content:center}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group{width:100%}.btn-group-vertical>.btn:not(:first-child),.btn-group-vertical>.btn-group:not(:first-child){margin-top:-1px}.btn-group-vertical>.btn:not(:last-child):not(.dropdown-toggle),.btn-group-vertical>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn~.btn,.btn-group-vertical>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-top-right-radius:0}.nav{--bs-nav-link-padding-x: 1rem;--bs-nav-link-padding-y: .5rem;--bs-nav-link-font-weight: ;--bs-nav-link-color: var(--bs-link-color);--bs-nav-link-hover-color: var(--bs-link-hover-color);--bs-nav-link-disabled-color: #6c757d;display:flex;flex-wrap:wrap;padding-left:0;margin-bottom:0;list-style:none}.nav-link{display:block;padding:var(--bs-nav-link-padding-y) var(--bs-nav-link-padding-x);font-size:var(--bs-nav-link-font-size);font-weight:var(--bs-nav-link-font-weight);color:var(--bs-nav-link-color);text-decoration:none;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out}@media (prefers-reduced-motion: reduce){.nav-link{transition:none}}.nav-link:hover,.nav-link:focus{color:var(--bs-nav-link-hover-color)}.nav-link.disabled{color:var(--bs-nav-link-disabled-color);pointer-events:none;cursor:default}.nav-tabs{--bs-nav-tabs-border-width: 1px;--bs-nav-tabs-border-color: #dee2e6;--bs-nav-tabs-border-radius: .375rem;--bs-nav-tabs-link-hover-border-color: #e9ecef #e9ecef #dee2e6;--bs-nav-tabs-link-active-color: #495057;--bs-nav-tabs-link-active-bg: #fff;--bs-nav-tabs-link-active-border-color: #dee2e6 #dee2e6 #fff;border-bottom:var(--bs-nav-tabs-border-width) solid var(--bs-nav-tabs-border-color)}.nav-tabs .nav-link{margin-bottom:calc(-1 * var(--bs-nav-tabs-border-width));background:none;border:var(--bs-nav-tabs-border-width) solid transparent;border-top-left-radius:var(--bs-nav-tabs-border-radius);border-top-right-radius:var(--bs-nav-tabs-border-radius)}.nav-tabs .nav-link:hover,.nav-tabs .nav-link:focus{isolation:isolate;border-color:var(--bs-nav-tabs-link-hover-border-color)}.nav-tabs .nav-link.disabled,.nav-tabs .nav-link:disabled{color:var(--bs-nav-link-disabled-color);background-color:transparent;border-color:transparent}.nav-tabs .nav-link.active,.nav-tabs .nav-item.show .nav-link{color:var(--bs-nav-tabs-link-active-color);background-color:var(--bs-nav-tabs-link-active-bg);border-color:var(--bs-nav-tabs-link-active-border-color)}.nav-tabs .dropdown-menu{margin-top:calc(-1 * var(--bs-nav-tabs-border-width));border-top-left-radius:0;border-top-right-radius:0}.nav-pills{--bs-nav-pills-border-radius: .375rem;--bs-nav-pills-link-active-color: #fff;--bs-nav-pills-link-active-bg: #0d6efd}.nav-pills .nav-link{background:none;border:0;border-radius:var(--bs-nav-pills-border-radius)}.nav-pills .nav-link:disabled{color:var(--bs-nav-link-disabled-color);background-color:transparent;border-color:transparent}.nav-pills .nav-link.active,.nav-pills .show>.nav-link{color:var(--bs-nav-pills-link-active-color);background-color:var(--bs-nav-pills-link-active-bg)}.nav-fill>.nav-link,.nav-fill .nav-item{flex:1 1 auto;text-align:center}.nav-justified>.nav-link,.nav-justified .nav-item{flex-basis:0;flex-grow:1;text-align:center}.nav-fill .nav-item .nav-link,.nav-justified .nav-item .nav-link{width:100%}.tab-content>.tab-pane{display:none}.tab-content>.active{display:block}.navbar{--bs-navbar-padding-x: 0;--bs-navbar-padding-y: .5rem;--bs-navbar-color: rgba(0, 0, 0, .55);--bs-navbar-hover-color: rgba(0, 0, 0, .7);--bs-navbar-disabled-color: rgba(0, 0, 0, .3);--bs-navbar-active-color: rgba(0, 0, 0, .9);--bs-navbar-brand-padding-y: .3125rem;--bs-navbar-brand-margin-end: 1rem;--bs-navbar-brand-font-size: 1.25rem;--bs-navbar-brand-color: rgba(0, 0, 0, .9);--bs-navbar-brand-hover-color: rgba(0, 0, 0, .9);--bs-navbar-nav-link-padding-x: .5rem;--bs-navbar-toggler-padding-y: .25rem;--bs-navbar-toggler-padding-x: .75rem;--bs-navbar-toggler-font-size: 1.25rem;--bs-navbar-toggler-icon-bg: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%280, 0, 0, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e");--bs-navbar-toggler-border-color: rgba(0, 0, 0, .1);--bs-navbar-toggler-border-radius: .375rem;--bs-navbar-toggler-focus-width: .25rem;--bs-navbar-toggler-transition: box-shadow .15s ease-in-out;position:relative;display:flex;flex-wrap:wrap;align-items:center;justify-content:space-between;padding:var(--bs-navbar-padding-y) var(--bs-navbar-padding-x)}.navbar>.container,.navbar>.container-fluid,.navbar>.container-sm,.navbar>.container-md,.navbar>.container-lg,.navbar>.container-xl,.navbar>.container-xxl{display:flex;flex-wrap:inherit;align-items:center;justify-content:space-between}.navbar-brand{padding-top:var(--bs-navbar-brand-padding-y);padding-bottom:var(--bs-navbar-brand-padding-y);margin-right:var(--bs-navbar-brand-margin-end);font-size:var(--bs-navbar-brand-font-size);color:var(--bs-navbar-brand-color);text-decoration:none;white-space:nowrap}.navbar-brand:hover,.navbar-brand:focus{color:var(--bs-navbar-brand-hover-color)}.navbar-nav{--bs-nav-link-padding-x: 0;--bs-nav-link-padding-y: .5rem;--bs-nav-link-font-weight: ;--bs-nav-link-color: var(--bs-navbar-color);--bs-nav-link-hover-color: var(--bs-navbar-hover-color);--bs-nav-link-disabled-color: var(--bs-navbar-disabled-color);display:flex;flex-direction:column;padding-left:0;margin-bottom:0;list-style:none}.navbar-nav .show>.nav-link,.navbar-nav .nav-link.active{color:var(--bs-navbar-active-color)}.navbar-nav .dropdown-menu{position:static}.navbar-text{padding-top:.5rem;padding-bottom:.5rem;color:var(--bs-navbar-color)}.navbar-text a,.navbar-text a:hover,.navbar-text a:focus{color:var(--bs-navbar-active-color)}.navbar-collapse{flex-basis:100%;flex-grow:1;align-items:center}.navbar-toggler{padding:var(--bs-navbar-toggler-padding-y) var(--bs-navbar-toggler-padding-x);font-size:var(--bs-navbar-toggler-font-size);line-height:1;color:var(--bs-navbar-color);background-color:transparent;border:var(--bs-border-width) solid var(--bs-navbar-toggler-border-color);border-radius:var(--bs-navbar-toggler-border-radius);transition:var(--bs-navbar-toggler-transition)}@media (prefers-reduced-motion: reduce){.navbar-toggler{transition:none}}.navbar-toggler:hover{text-decoration:none}.navbar-toggler:focus{text-decoration:none;outline:0;box-shadow:0 0 0 var(--bs-navbar-toggler-focus-width)}.navbar-toggler-icon{display:inline-block;width:1.5em;height:1.5em;vertical-align:middle;background-image:var(--bs-navbar-toggler-icon-bg);background-repeat:no-repeat;background-position:center;background-size:100%}.navbar-nav-scroll{max-height:var(--bs-scroll-height, 75vh);overflow-y:auto}@media (min-width: 576px){.navbar-expand-sm{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-sm .navbar-nav{flex-direction:row}.navbar-expand-sm .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-sm .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-sm .navbar-nav-scroll{overflow:visible}.navbar-expand-sm .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-sm .navbar-toggler{display:none}.navbar-expand-sm .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-sm .offcanvas .offcanvas-header{display:none}.navbar-expand-sm .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 768px){.navbar-expand-md{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-md .navbar-nav{flex-direction:row}.navbar-expand-md .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-md .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-md .navbar-nav-scroll{overflow:visible}.navbar-expand-md .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-md .navbar-toggler{display:none}.navbar-expand-md .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-md .offcanvas .offcanvas-header{display:none}.navbar-expand-md .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 992px){.navbar-expand-lg{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-lg .navbar-nav{flex-direction:row}.navbar-expand-lg .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-lg .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-lg .navbar-nav-scroll{overflow:visible}.navbar-expand-lg .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-lg .navbar-toggler{display:none}.navbar-expand-lg .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-lg .offcanvas .offcanvas-header{display:none}.navbar-expand-lg .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1200px){.navbar-expand-xl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xl .navbar-nav{flex-direction:row}.navbar-expand-xl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xl .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-xl .navbar-nav-scroll{overflow:visible}.navbar-expand-xl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xl .navbar-toggler{display:none}.navbar-expand-xl .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-xl .offcanvas .offcanvas-header{display:none}.navbar-expand-xl .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1400px){.navbar-expand-xxl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xxl .navbar-nav{flex-direction:row}.navbar-expand-xxl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xxl .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-xxl .navbar-nav-scroll{overflow:visible}.navbar-expand-xxl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xxl .navbar-toggler{display:none}.navbar-expand-xxl .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-xxl .offcanvas .offcanvas-header{display:none}.navbar-expand-xxl .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}.navbar-expand{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand .navbar-nav{flex-direction:row}.navbar-expand .navbar-nav .dropdown-menu{position:absolute}.navbar-expand .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand .navbar-nav-scroll{overflow:visible}.navbar-expand .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand .navbar-toggler{display:none}.navbar-expand .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand .offcanvas .offcanvas-header{display:none}.navbar-expand .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}.navbar-dark{--bs-navbar-color: rgba(255, 255, 255, .55);--bs-navbar-hover-color: rgba(255, 255, 255, .75);--bs-navbar-disabled-color: rgba(255, 255, 255, .25);--bs-navbar-active-color: #fff;--bs-navbar-brand-color: #fff;--bs-navbar-brand-hover-color: #fff;--bs-navbar-toggler-border-color: rgba(255, 255, 255, .1);--bs-navbar-toggler-icon-bg: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%28255, 255, 255, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e")}.card{--bs-card-spacer-y: 1rem;--bs-card-spacer-x: 1rem;--bs-card-title-spacer-y: .5rem;--bs-card-border-width: 1px;--bs-card-border-color: var(--bs-border-color-translucent);--bs-card-border-radius: .375rem;--bs-card-box-shadow: ;--bs-card-inner-border-radius:calc(.375rem - 1px);--bs-card-cap-padding-y: .5rem;--bs-card-cap-padding-x: 1rem;--bs-card-cap-bg: rgba(0, 0, 0, .03);--bs-card-cap-color: ;--bs-card-height: ;--bs-card-color: ;--bs-card-bg: #fff;--bs-card-img-overlay-padding: 1rem;--bs-card-group-margin: .75rem;position:relative;display:flex;flex-direction:column;min-width:0;height:var(--bs-card-height);word-wrap:break-word;background-color:var(--bs-card-bg);background-clip:border-box;border:var(--bs-card-border-width) solid var(--bs-card-border-color);border-radius:var(--bs-card-border-radius)}.card>hr{margin-right:0;margin-left:0}.card>.list-group{border-top:inherit;border-bottom:inherit}.card>.list-group:first-child{border-top-width:0;border-top-left-radius:var(--bs-card-inner-border-radius);border-top-right-radius:var(--bs-card-inner-border-radius)}.card>.list-group:last-child{border-bottom-width:0;border-bottom-right-radius:var(--bs-card-inner-border-radius);border-bottom-left-radius:var(--bs-card-inner-border-radius)}.card>.card-header+.list-group,.card>.list-group+.card-footer{border-top:0}.card-body{flex:1 1 auto;padding:var(--bs-card-spacer-y) var(--bs-card-spacer-x);color:var(--bs-card-color)}.card-title{margin-bottom:var(--bs-card-title-spacer-y)}.card-subtitle{margin-top:calc(-.5 * var(--bs-card-title-spacer-y));margin-bottom:0}.card-text:last-child{margin-bottom:0}.card-link+.card-link{margin-left:var(--bs-card-spacer-x)}.card-header{padding:var(--bs-card-cap-padding-y) var(--bs-card-cap-padding-x);margin-bottom:0;color:var(--bs-card-cap-color);background-color:var(--bs-card-cap-bg);border-bottom:var(--bs-card-border-width) solid var(--bs-card-border-color)}.card-header:first-child{border-radius:var(--bs-card-inner-border-radius) var(--bs-card-inner-border-radius) 0 0}.card-footer{padding:var(--bs-card-cap-padding-y) var(--bs-card-cap-padding-x);color:var(--bs-card-cap-color);background-color:var(--bs-card-cap-bg);border-top:var(--bs-card-border-width) solid var(--bs-card-border-color)}.card-footer:last-child{border-radius:0 0 var(--bs-card-inner-border-radius) var(--bs-card-inner-border-radius)}.card-header-tabs{margin-right:calc(-.5 * var(--bs-card-cap-padding-x));margin-bottom:calc(-1 * var(--bs-card-cap-padding-y));margin-left:calc(-.5 * var(--bs-card-cap-padding-x));border-bottom:0}.card-header-tabs .nav-link.active{background-color:var(--bs-card-bg);border-bottom-color:var(--bs-card-bg)}.card-header-pills{margin-right:calc(-.5 * var(--bs-card-cap-padding-x));margin-left:calc(-.5 * var(--bs-card-cap-padding-x))}.card-img-overlay{position:absolute;inset:0;padding:var(--bs-card-img-overlay-padding);border-radius:var(--bs-card-inner-border-radius)}.card-img,.card-img-top,.card-img-bottom{width:100%}.card-img,.card-img-top{border-top-left-radius:var(--bs-card-inner-border-radius);border-top-right-radius:var(--bs-card-inner-border-radius)}.card-img,.card-img-bottom{border-bottom-right-radius:var(--bs-card-inner-border-radius);border-bottom-left-radius:var(--bs-card-inner-border-radius)}.card-group>.card{margin-bottom:var(--bs-card-group-margin)}@media (min-width: 576px){.card-group{display:flex;flex-flow:row wrap}.card-group>.card{flex:1 0 0%;margin-bottom:0}.card-group>.card+.card{margin-left:0;border-left:0}.card-group>.card:not(:last-child){border-top-right-radius:0;border-bottom-right-radius:0}.card-group>.card:not(:last-child) .card-img-top,.card-group>.card:not(:last-child) .card-header{border-top-right-radius:0}.card-group>.card:not(:last-child) .card-img-bottom,.card-group>.card:not(:last-child) .card-footer{border-bottom-right-radius:0}.card-group>.card:not(:first-child){border-top-left-radius:0;border-bottom-left-radius:0}.card-group>.card:not(:first-child) .card-img-top,.card-group>.card:not(:first-child) .card-header{border-top-left-radius:0}.card-group>.card:not(:first-child) .card-img-bottom,.card-group>.card:not(:first-child) .card-footer{border-bottom-left-radius:0}}.accordion{--bs-accordion-color: #212529;--bs-accordion-bg: #fff;--bs-accordion-transition: color .15s ease-in-out, background-color .15s ease-in-out, border-color .15s ease-in-out, box-shadow .15s ease-in-out, border-radius .15s ease;--bs-accordion-border-color: var(--bs-border-color);--bs-accordion-border-width: 1px;--bs-accordion-border-radius: .375rem;--bs-accordion-inner-border-radius:calc(.375rem - 1px);--bs-accordion-btn-padding-x: 1.25rem;--bs-accordion-btn-padding-y: 1rem;--bs-accordion-btn-color: #212529;--bs-accordion-btn-bg: var(--bs-accordion-bg);--bs-accordion-btn-icon: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23212529'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");--bs-accordion-btn-icon-width: 1.25rem;--bs-accordion-btn-icon-transform: rotate(-180deg);--bs-accordion-btn-icon-transition: transform .2s ease-in-out;--bs-accordion-btn-active-icon: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%230c63e4'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");--bs-accordion-btn-focus-border-color: #86b7fe;--bs-accordion-btn-focus-box-shadow: 0 0 0 .25rem rgba(13, 110, 253, .25);--bs-accordion-body-padding-x: 1.25rem;--bs-accordion-body-padding-y: 1rem;--bs-accordion-active-color: #0c63e4;--bs-accordion-active-bg: #e7f1ff}.accordion-button{position:relative;display:flex;align-items:center;width:100%;padding:var(--bs-accordion-btn-padding-y) var(--bs-accordion-btn-padding-x);font-size:1rem;color:var(--bs-accordion-btn-color);text-align:left;background-color:var(--bs-accordion-btn-bg);border:0;border-radius:0;overflow-anchor:none;transition:var(--bs-accordion-transition)}@media (prefers-reduced-motion: reduce){.accordion-button{transition:none}}.accordion-button:not(.collapsed){color:var(--bs-accordion-active-color);background-color:var(--bs-accordion-active-bg);box-shadow:inset 0 calc(-1 * var(--bs-accordion-border-width)) 0 var(--bs-accordion-border-color)}.accordion-button:not(.collapsed):after{background-image:var(--bs-accordion-btn-active-icon);transform:var(--bs-accordion-btn-icon-transform)}.accordion-button:after{flex-shrink:0;width:var(--bs-accordion-btn-icon-width);height:var(--bs-accordion-btn-icon-width);margin-left:auto;content:"";background-image:var(--bs-accordion-btn-icon);background-repeat:no-repeat;background-size:var(--bs-accordion-btn-icon-width);transition:var(--bs-accordion-btn-icon-transition)}@media (prefers-reduced-motion: reduce){.accordion-button:after{transition:none}}.accordion-button:hover{z-index:2}.accordion-button:focus{z-index:3;border-color:var(--bs-accordion-btn-focus-border-color);outline:0;box-shadow:var(--bs-accordion-btn-focus-box-shadow)}.accordion-header{margin-bottom:0}.accordion-item{color:var(--bs-accordion-color);background-color:var(--bs-accordion-bg);border:var(--bs-accordion-border-width) solid var(--bs-accordion-border-color)}.accordion-item:first-of-type{border-top-left-radius:var(--bs-accordion-border-radius);border-top-right-radius:var(--bs-accordion-border-radius)}.accordion-item:first-of-type .accordion-button{border-top-left-radius:var(--bs-accordion-inner-border-radius);border-top-right-radius:var(--bs-accordion-inner-border-radius)}.accordion-item:not(:first-of-type){border-top:0}.accordion-item:last-of-type{border-bottom-right-radius:var(--bs-accordion-border-radius);border-bottom-left-radius:var(--bs-accordion-border-radius)}.accordion-item:last-of-type .accordion-button.collapsed{border-bottom-right-radius:var(--bs-accordion-inner-border-radius);border-bottom-left-radius:var(--bs-accordion-inner-border-radius)}.accordion-item:last-of-type .accordion-collapse{border-bottom-right-radius:var(--bs-accordion-border-radius);border-bottom-left-radius:var(--bs-accordion-border-radius)}.accordion-body{padding:var(--bs-accordion-body-padding-y) var(--bs-accordion-body-padding-x)}.accordion-flush .accordion-collapse{border-width:0}.accordion-flush .accordion-item{border-right:0;border-left:0;border-radius:0}.accordion-flush .accordion-item:first-child{border-top:0}.accordion-flush .accordion-item:last-child{border-bottom:0}.accordion-flush .accordion-item .accordion-button,.accordion-flush .accordion-item .accordion-button.collapsed{border-radius:0}.breadcrumb{--bs-breadcrumb-padding-x: 0;--bs-breadcrumb-padding-y: 0;--bs-breadcrumb-margin-bottom: 1rem;--bs-breadcrumb-bg: ;--bs-breadcrumb-border-radius: ;--bs-breadcrumb-divider-color: #6c757d;--bs-breadcrumb-item-padding-x: .5rem;--bs-breadcrumb-item-active-color: #6c757d;display:flex;flex-wrap:wrap;padding:var(--bs-breadcrumb-padding-y) var(--bs-breadcrumb-padding-x);margin-bottom:var(--bs-breadcrumb-margin-bottom);font-size:var(--bs-breadcrumb-font-size);list-style:none;background-color:var(--bs-breadcrumb-bg);border-radius:var(--bs-breadcrumb-border-radius)}.breadcrumb-item+.breadcrumb-item{padding-left:var(--bs-breadcrumb-item-padding-x)}.breadcrumb-item+.breadcrumb-item:before{float:left;padding-right:var(--bs-breadcrumb-item-padding-x);color:var(--bs-breadcrumb-divider-color);content:var(--bs-breadcrumb-divider, "/")}.breadcrumb-item.active{color:var(--bs-breadcrumb-item-active-color)}.pagination{--bs-pagination-padding-x: .75rem;--bs-pagination-padding-y: .375rem;--bs-pagination-font-size: 1rem;--bs-pagination-color: var(--bs-link-color);--bs-pagination-bg: #fff;--bs-pagination-border-width: 1px;--bs-pagination-border-color: #dee2e6;--bs-pagination-border-radius: .375rem;--bs-pagination-hover-color: var(--bs-link-hover-color);--bs-pagination-hover-bg: #e9ecef;--bs-pagination-hover-border-color: #dee2e6;--bs-pagination-focus-color: var(--bs-link-hover-color);--bs-pagination-focus-bg: #e9ecef;--bs-pagination-focus-box-shadow: 0 0 0 .25rem rgba(13, 110, 253, .25);--bs-pagination-active-color: #fff;--bs-pagination-active-bg: #0d6efd;--bs-pagination-active-border-color: #0d6efd;--bs-pagination-disabled-color: #6c757d;--bs-pagination-disabled-bg: #fff;--bs-pagination-disabled-border-color: #dee2e6;display:flex;padding-left:0;list-style:none}.page-link{position:relative;display:block;padding:var(--bs-pagination-padding-y) var(--bs-pagination-padding-x);font-size:var(--bs-pagination-font-size);color:var(--bs-pagination-color);text-decoration:none;background-color:var(--bs-pagination-bg);border:var(--bs-pagination-border-width) solid var(--bs-pagination-border-color);transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.page-link{transition:none}}.page-link:hover{z-index:2;color:var(--bs-pagination-hover-color);background-color:var(--bs-pagination-hover-bg);border-color:var(--bs-pagination-hover-border-color)}.page-link:focus{z-index:3;color:var(--bs-pagination-focus-color);background-color:var(--bs-pagination-focus-bg);outline:0;box-shadow:var(--bs-pagination-focus-box-shadow)}.page-link.active,.active>.page-link{z-index:3;color:var(--bs-pagination-active-color);background-color:var(--bs-pagination-active-bg);border-color:var(--bs-pagination-active-border-color)}.page-link.disabled,.disabled>.page-link{color:var(--bs-pagination-disabled-color);pointer-events:none;background-color:var(--bs-pagination-disabled-bg);border-color:var(--bs-pagination-disabled-border-color)}.page-item:not(:first-child) .page-link{margin-left:-1px}.page-item:first-child .page-link{border-top-left-radius:var(--bs-pagination-border-radius);border-bottom-left-radius:var(--bs-pagination-border-radius)}.page-item:last-child .page-link{border-top-right-radius:var(--bs-pagination-border-radius);border-bottom-right-radius:var(--bs-pagination-border-radius)}.pagination-lg{--bs-pagination-padding-x: 1.5rem;--bs-pagination-padding-y: .75rem;--bs-pagination-font-size: 1.25rem;--bs-pagination-border-radius: .5rem}.pagination-sm{--bs-pagination-padding-x: .5rem;--bs-pagination-padding-y: .25rem;--bs-pagination-font-size: .875rem;--bs-pagination-border-radius: .25rem}.badge{--bs-badge-padding-x: .65em;--bs-badge-padding-y: .35em;--bs-badge-font-size: .75em;--bs-badge-font-weight: 700;--bs-badge-color: #fff;--bs-badge-border-radius: .375rem;display:inline-block;padding:var(--bs-badge-padding-y) var(--bs-badge-padding-x);font-size:var(--bs-badge-font-size);font-weight:var(--bs-badge-font-weight);line-height:1;color:var(--bs-badge-color);text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:var(--bs-badge-border-radius)}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.alert{--bs-alert-bg: transparent;--bs-alert-padding-x: 1rem;--bs-alert-padding-y: 1rem;--bs-alert-margin-bottom: 1rem;--bs-alert-color: inherit;--bs-alert-border-color: transparent;--bs-alert-border: 1px solid var(--bs-alert-border-color);--bs-alert-border-radius: .375rem;position:relative;padding:var(--bs-alert-padding-y) var(--bs-alert-padding-x);margin-bottom:var(--bs-alert-margin-bottom);color:var(--bs-alert-color);background-color:var(--bs-alert-bg);border:var(--bs-alert-border);border-radius:var(--bs-alert-border-radius)}.alert-heading{color:inherit}.alert-link{font-weight:700}.alert-dismissible{padding-right:3rem}.alert-dismissible .btn-close{position:absolute;top:0;right:0;z-index:2;padding:1.25rem 1rem}.alert-primary{--bs-alert-color: #084298;--bs-alert-bg: #cfe2ff;--bs-alert-border-color: #b6d4fe}.alert-primary .alert-link{color:#06357a}.alert-secondary{--bs-alert-color: #41464b;--bs-alert-bg: #e2e3e5;--bs-alert-border-color: #d3d6d8}.alert-secondary .alert-link{color:#34383c}.alert-success{--bs-alert-color: #0f5132;--bs-alert-bg: #d1e7dd;--bs-alert-border-color: #badbcc}.alert-success .alert-link{color:#0c4128}.alert-info{--bs-alert-color: #055160;--bs-alert-bg: #cff4fc;--bs-alert-border-color: #b6effb}.alert-info .alert-link{color:#04414d}.alert-warning{--bs-alert-color: #664d03;--bs-alert-bg: #fff3cd;--bs-alert-border-color: #ffecb5}.alert-warning .alert-link{color:#523e02}.alert-danger{--bs-alert-color: #842029;--bs-alert-bg: #f8d7da;--bs-alert-border-color: #f5c2c7}.alert-danger .alert-link{color:#6a1a21}.alert-light{--bs-alert-color: #636464;--bs-alert-bg: #fefefe;--bs-alert-border-color: #fdfdfe}.alert-light .alert-link{color:#4f5050}.alert-dark{--bs-alert-color: #141619;--bs-alert-bg: #d3d3d4;--bs-alert-border-color: #bcbebf}.alert-dark .alert-link{color:#101214}@keyframes progress-bar-stripes{0%{background-position-x:1rem}}.progress{--bs-progress-height: 1rem;--bs-progress-font-size: .75rem;--bs-progress-bg: #e9ecef;--bs-progress-border-radius: .375rem;--bs-progress-box-shadow: inset 0 1px 2px rgba(0, 0, 0, .075);--bs-progress-bar-color: #fff;--bs-progress-bar-bg: #0d6efd;--bs-progress-bar-transition: width .6s ease;display:flex;height:var(--bs-progress-height);overflow:hidden;font-size:var(--bs-progress-font-size);background-color:var(--bs-progress-bg);border-radius:var(--bs-progress-border-radius)}.progress-bar{display:flex;flex-direction:column;justify-content:center;overflow:hidden;color:var(--bs-progress-bar-color);text-align:center;white-space:nowrap;background-color:var(--bs-progress-bar-bg);transition:var(--bs-progress-bar-transition)}@media (prefers-reduced-motion: reduce){.progress-bar{transition:none}}.progress-bar-striped{background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-size:var(--bs-progress-height) var(--bs-progress-height)}.progress-bar-animated{animation:1s linear infinite progress-bar-stripes}@media (prefers-reduced-motion: reduce){.progress-bar-animated{animation:none}}.list-group{--bs-list-group-color: #212529;--bs-list-group-bg: #fff;--bs-list-group-border-color: rgba(0, 0, 0, .125);--bs-list-group-border-width: 1px;--bs-list-group-border-radius: .375rem;--bs-list-group-item-padding-x: 1rem;--bs-list-group-item-padding-y: .5rem;--bs-list-group-action-color: #495057;--bs-list-group-action-hover-color: #495057;--bs-list-group-action-hover-bg: #f8f9fa;--bs-list-group-action-active-color: #212529;--bs-list-group-action-active-bg: #e9ecef;--bs-list-group-disabled-color: #6c757d;--bs-list-group-disabled-bg: #fff;--bs-list-group-active-color: #fff;--bs-list-group-active-bg: #0d6efd;--bs-list-group-active-border-color: #0d6efd;display:flex;flex-direction:column;padding-left:0;margin-bottom:0;border-radius:var(--bs-list-group-border-radius)}.list-group-numbered{list-style-type:none;counter-reset:section}.list-group-numbered>.list-group-item:before{content:counters(section,".") ". ";counter-increment:section}.list-group-item-action{width:100%;color:var(--bs-list-group-action-color);text-align:inherit}.list-group-item-action:hover,.list-group-item-action:focus{z-index:1;color:var(--bs-list-group-action-hover-color);text-decoration:none;background-color:var(--bs-list-group-action-hover-bg)}.list-group-item-action:active{color:var(--bs-list-group-action-active-color);background-color:var(--bs-list-group-action-active-bg)}.list-group-item{position:relative;display:block;padding:var(--bs-list-group-item-padding-y) var(--bs-list-group-item-padding-x);color:var(--bs-list-group-color);text-decoration:none;background-color:var(--bs-list-group-bg);border:var(--bs-list-group-border-width) solid var(--bs-list-group-border-color)}.list-group-item:first-child{border-top-left-radius:inherit;border-top-right-radius:inherit}.list-group-item:last-child{border-bottom-right-radius:inherit;border-bottom-left-radius:inherit}.list-group-item.disabled,.list-group-item:disabled{color:var(--bs-list-group-disabled-color);pointer-events:none;background-color:var(--bs-list-group-disabled-bg)}.list-group-item.active{z-index:2;color:var(--bs-list-group-active-color);background-color:var(--bs-list-group-active-bg);border-color:var(--bs-list-group-active-border-color)}.list-group-item+.list-group-item{border-top-width:0}.list-group-item+.list-group-item.active{margin-top:calc(-1 * var(--bs-list-group-border-width));border-top-width:var(--bs-list-group-border-width)}.list-group-horizontal{flex-direction:row}.list-group-horizontal>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal>.list-group-item.active{margin-top:0}.list-group-horizontal>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}@media (min-width: 576px){.list-group-horizontal-sm{flex-direction:row}.list-group-horizontal-sm>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-sm>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-sm>.list-group-item.active{margin-top:0}.list-group-horizontal-sm>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-sm>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 768px){.list-group-horizontal-md{flex-direction:row}.list-group-horizontal-md>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-md>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-md>.list-group-item.active{margin-top:0}.list-group-horizontal-md>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-md>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 992px){.list-group-horizontal-lg{flex-direction:row}.list-group-horizontal-lg>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-lg>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-lg>.list-group-item.active{margin-top:0}.list-group-horizontal-lg>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-lg>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 1200px){.list-group-horizontal-xl{flex-direction:row}.list-group-horizontal-xl>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-xl>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-xl>.list-group-item.active{margin-top:0}.list-group-horizontal-xl>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-xl>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 1400px){.list-group-horizontal-xxl{flex-direction:row}.list-group-horizontal-xxl>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-xxl>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-xxl>.list-group-item.active{margin-top:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}.list-group-flush{border-radius:0}.list-group-flush>.list-group-item{border-width:0 0 var(--bs-list-group-border-width)}.list-group-flush>.list-group-item:last-child{border-bottom-width:0}.list-group-item-primary{color:#084298;background-color:#cfe2ff}.list-group-item-primary.list-group-item-action:hover,.list-group-item-primary.list-group-item-action:focus{color:#084298;background-color:#bacbe6}.list-group-item-primary.list-group-item-action.active{color:#fff;background-color:#084298;border-color:#084298}.list-group-item-secondary{color:#41464b;background-color:#e2e3e5}.list-group-item-secondary.list-group-item-action:hover,.list-group-item-secondary.list-group-item-action:focus{color:#41464b;background-color:#cbccce}.list-group-item-secondary.list-group-item-action.active{color:#fff;background-color:#41464b;border-color:#41464b}.list-group-item-success{color:#0f5132;background-color:#d1e7dd}.list-group-item-success.list-group-item-action:hover,.list-group-item-success.list-group-item-action:focus{color:#0f5132;background-color:#bcd0c7}.list-group-item-success.list-group-item-action.active{color:#fff;background-color:#0f5132;border-color:#0f5132}.list-group-item-info{color:#055160;background-color:#cff4fc}.list-group-item-info.list-group-item-action:hover,.list-group-item-info.list-group-item-action:focus{color:#055160;background-color:#badce3}.list-group-item-info.list-group-item-action.active{color:#fff;background-color:#055160;border-color:#055160}.list-group-item-warning{color:#664d03;background-color:#fff3cd}.list-group-item-warning.list-group-item-action:hover,.list-group-item-warning.list-group-item-action:focus{color:#664d03;background-color:#e6dbb9}.list-group-item-warning.list-group-item-action.active{color:#fff;background-color:#664d03;border-color:#664d03}.list-group-item-danger{color:#842029;background-color:#f8d7da}.list-group-item-danger.list-group-item-action:hover,.list-group-item-danger.list-group-item-action:focus{color:#842029;background-color:#dfc2c4}.list-group-item-danger.list-group-item-action.active{color:#fff;background-color:#842029;border-color:#842029}.list-group-item-light{color:#636464;background-color:#fefefe}.list-group-item-light.list-group-item-action:hover,.list-group-item-light.list-group-item-action:focus{color:#636464;background-color:#e5e5e5}.list-group-item-light.list-group-item-action.active{color:#fff;background-color:#636464;border-color:#636464}.list-group-item-dark{color:#141619;background-color:#d3d3d4}.list-group-item-dark.list-group-item-action:hover,.list-group-item-dark.list-group-item-action:focus{color:#141619;background-color:#bebebf}.list-group-item-dark.list-group-item-action.active{color:#fff;background-color:#141619;border-color:#141619}.btn-close{box-sizing:content-box;width:1em;height:1em;padding:.25em;color:#000;background:transparent url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23000'%3e%3cpath d='M.293.293a1 1 0 0 1 1.414 0L8 6.586 14.293.293a1 1 0 1 1 1.414 1.414L9.414 8l6.293 6.293a1 1 0 0 1-1.414 1.414L8 9.414l-6.293 6.293a1 1 0 0 1-1.414-1.414L6.586 8 .293 1.707a1 1 0 0 1 0-1.414z'/%3e%3c/svg%3e") center/1em auto no-repeat;border:0;border-radius:.375rem;opacity:.5}.btn-close:hover{color:#000;text-decoration:none;opacity:.75}.btn-close:focus{outline:0;box-shadow:0 0 0 .25rem #0d6efd40;opacity:1}.btn-close:disabled,.btn-close.disabled{pointer-events:none;-webkit-user-select:none;-moz-user-select:none;user-select:none;opacity:.25}.btn-close-white{filter:invert(1) grayscale(100%) brightness(200%)}.toast{--bs-toast-zindex: 1090;--bs-toast-padding-x: .75rem;--bs-toast-padding-y: .5rem;--bs-toast-spacing: 1.5rem;--bs-toast-max-width: 350px;--bs-toast-font-size: .875rem;--bs-toast-color: ;--bs-toast-bg: rgba(255, 255, 255, .85);--bs-toast-border-width: 1px;--bs-toast-border-color: var(--bs-border-color-translucent);--bs-toast-border-radius: .375rem;--bs-toast-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15);--bs-toast-header-color: #6c757d;--bs-toast-header-bg: rgba(255, 255, 255, .85);--bs-toast-header-border-color: rgba(0, 0, 0, .05);width:var(--bs-toast-max-width);max-width:100%;font-size:var(--bs-toast-font-size);color:var(--bs-toast-color);pointer-events:auto;background-color:var(--bs-toast-bg);background-clip:padding-box;border:var(--bs-toast-border-width) solid var(--bs-toast-border-color);box-shadow:var(--bs-toast-box-shadow);border-radius:var(--bs-toast-border-radius)}.toast.showing{opacity:0}.toast:not(.show){display:none}.toast-container{--bs-toast-zindex: 1090;position:absolute;z-index:var(--bs-toast-zindex);width:-webkit-max-content;width:-moz-max-content;width:max-content;max-width:100%;pointer-events:none}.toast-container>:not(:last-child){margin-bottom:var(--bs-toast-spacing)}.toast-header{display:flex;align-items:center;padding:var(--bs-toast-padding-y) var(--bs-toast-padding-x);color:var(--bs-toast-header-color);background-color:var(--bs-toast-header-bg);background-clip:padding-box;border-bottom:var(--bs-toast-border-width) solid var(--bs-toast-header-border-color);border-top-left-radius:calc(var(--bs-toast-border-radius) - var(--bs-toast-border-width));border-top-right-radius:calc(var(--bs-toast-border-radius) - var(--bs-toast-border-width))}.toast-header .btn-close{margin-right:calc(-.5 * var(--bs-toast-padding-x));margin-left:var(--bs-toast-padding-x)}.toast-body{padding:var(--bs-toast-padding-x);word-wrap:break-word}.modal{--bs-modal-zindex: 1055;--bs-modal-width: 500px;--bs-modal-padding: 1rem;--bs-modal-margin: .5rem;--bs-modal-color: ;--bs-modal-bg: #fff;--bs-modal-border-color: var(--bs-border-color-translucent);--bs-modal-border-width: 1px;--bs-modal-border-radius: .5rem;--bs-modal-box-shadow: 0 .125rem .25rem rgba(0, 0, 0, .075);--bs-modal-inner-border-radius:calc(.5rem - 1px);--bs-modal-header-padding-x: 1rem;--bs-modal-header-padding-y: 1rem;--bs-modal-header-padding: 1rem 1rem;--bs-modal-header-border-color: var(--bs-border-color);--bs-modal-header-border-width: 1px;--bs-modal-title-line-height: 1.5;--bs-modal-footer-gap: .5rem;--bs-modal-footer-bg: ;--bs-modal-footer-border-color: var(--bs-border-color);--bs-modal-footer-border-width: 1px;position:fixed;top:0;left:0;z-index:var(--bs-modal-zindex);display:none;width:100%;height:100%;overflow-x:hidden;overflow-y:auto;outline:0}.modal-dialog{position:relative;width:auto;margin:var(--bs-modal-margin);pointer-events:none}.modal.fade .modal-dialog{transition:transform .3s ease-out;transform:translateY(-50px)}@media (prefers-reduced-motion: reduce){.modal.fade .modal-dialog{transition:none}}.modal.show .modal-dialog{transform:none}.modal.modal-static .modal-dialog{transform:scale(1.02)}.modal-dialog-scrollable{height:calc(100% - var(--bs-modal-margin) * 2)}.modal-dialog-scrollable .modal-content{max-height:100%;overflow:hidden}.modal-dialog-scrollable .modal-body{overflow-y:auto}.modal-dialog-centered{display:flex;align-items:center;min-height:calc(100% - var(--bs-modal-margin) * 2)}.modal-content{position:relative;display:flex;flex-direction:column;width:100%;color:var(--bs-modal-color);pointer-events:auto;background-color:var(--bs-modal-bg);background-clip:padding-box;border:var(--bs-modal-border-width) solid var(--bs-modal-border-color);border-radius:var(--bs-modal-border-radius);outline:0}.modal-backdrop{--bs-backdrop-zindex: 1050;--bs-backdrop-bg: #000;--bs-backdrop-opacity: .5;position:fixed;top:0;left:0;z-index:var(--bs-backdrop-zindex);width:100vw;height:100vh;background-color:var(--bs-backdrop-bg)}.modal-backdrop.fade{opacity:0}.modal-backdrop.show{opacity:var(--bs-backdrop-opacity)}.modal-header{display:flex;flex-shrink:0;align-items:center;justify-content:space-between;padding:var(--bs-modal-header-padding);border-bottom:var(--bs-modal-header-border-width) solid var(--bs-modal-header-border-color);border-top-left-radius:var(--bs-modal-inner-border-radius);border-top-right-radius:var(--bs-modal-inner-border-radius)}.modal-header .btn-close{padding:calc(var(--bs-modal-header-padding-y) * .5) calc(var(--bs-modal-header-padding-x) * .5);margin:calc(-.5 * var(--bs-modal-header-padding-y)) calc(-.5 * var(--bs-modal-header-padding-x)) calc(-.5 * var(--bs-modal-header-padding-y)) auto}.modal-title{margin-bottom:0;line-height:var(--bs-modal-title-line-height)}.modal-body{position:relative;flex:1 1 auto;padding:var(--bs-modal-padding)}.modal-footer{display:flex;flex-shrink:0;flex-wrap:wrap;align-items:center;justify-content:flex-end;padding:calc(var(--bs-modal-padding) - var(--bs-modal-footer-gap) * .5);background-color:var(--bs-modal-footer-bg);border-top:var(--bs-modal-footer-border-width) solid var(--bs-modal-footer-border-color);border-bottom-right-radius:var(--bs-modal-inner-border-radius);border-bottom-left-radius:var(--bs-modal-inner-border-radius)}.modal-footer>*{margin:calc(var(--bs-modal-footer-gap) * .5)}@media (min-width: 576px){.modal{--bs-modal-margin: 1.75rem;--bs-modal-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15)}.modal-dialog{max-width:var(--bs-modal-width);margin-right:auto;margin-left:auto}.modal-sm{--bs-modal-width: 300px}}@media (min-width: 992px){.modal-lg,.modal-xl{--bs-modal-width: 800px}}@media (min-width: 1200px){.modal-xl{--bs-modal-width: 1140px}}.modal-fullscreen{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen .modal-header,.modal-fullscreen .modal-footer{border-radius:0}.modal-fullscreen .modal-body{overflow-y:auto}@media (max-width: 575.98px){.modal-fullscreen-sm-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-sm-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-sm-down .modal-header,.modal-fullscreen-sm-down .modal-footer{border-radius:0}.modal-fullscreen-sm-down .modal-body{overflow-y:auto}}@media (max-width: 767.98px){.modal-fullscreen-md-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-md-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-md-down .modal-header,.modal-fullscreen-md-down .modal-footer{border-radius:0}.modal-fullscreen-md-down .modal-body{overflow-y:auto}}@media (max-width: 991.98px){.modal-fullscreen-lg-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-lg-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-lg-down .modal-header,.modal-fullscreen-lg-down .modal-footer{border-radius:0}.modal-fullscreen-lg-down .modal-body{overflow-y:auto}}@media (max-width: 1199.98px){.modal-fullscreen-xl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xl-down .modal-header,.modal-fullscreen-xl-down .modal-footer{border-radius:0}.modal-fullscreen-xl-down .modal-body{overflow-y:auto}}@media (max-width: 1399.98px){.modal-fullscreen-xxl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xxl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xxl-down .modal-header,.modal-fullscreen-xxl-down .modal-footer{border-radius:0}.modal-fullscreen-xxl-down .modal-body{overflow-y:auto}}.tooltip{--bs-tooltip-zindex: 1080;--bs-tooltip-max-width: 200px;--bs-tooltip-padding-x: .5rem;--bs-tooltip-padding-y: .25rem;--bs-tooltip-margin: ;--bs-tooltip-font-size: .875rem;--bs-tooltip-color: #fff;--bs-tooltip-bg: #000;--bs-tooltip-border-radius: .375rem;--bs-tooltip-opacity: .9;--bs-tooltip-arrow-width: .8rem;--bs-tooltip-arrow-height: .4rem;z-index:var(--bs-tooltip-zindex);display:block;padding:var(--bs-tooltip-arrow-height);margin:var(--bs-tooltip-margin);font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;white-space:normal;word-spacing:normal;line-break:auto;font-size:var(--bs-tooltip-font-size);word-wrap:break-word;opacity:0}.tooltip.show{opacity:var(--bs-tooltip-opacity)}.tooltip .tooltip-arrow{display:block;width:var(--bs-tooltip-arrow-width);height:var(--bs-tooltip-arrow-height)}.tooltip .tooltip-arrow:before{position:absolute;content:"";border-color:transparent;border-style:solid}.bs-tooltip-top .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow{bottom:0}.bs-tooltip-top .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow:before{top:-1px;border-width:var(--bs-tooltip-arrow-height) calc(var(--bs-tooltip-arrow-width) * .5) 0;border-top-color:var(--bs-tooltip-bg)}.bs-tooltip-end .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow{left:0;width:var(--bs-tooltip-arrow-height);height:var(--bs-tooltip-arrow-width)}.bs-tooltip-end .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow:before{right:-1px;border-width:calc(var(--bs-tooltip-arrow-width) * .5) var(--bs-tooltip-arrow-height) calc(var(--bs-tooltip-arrow-width) * .5) 0;border-right-color:var(--bs-tooltip-bg)}.bs-tooltip-bottom .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow{top:0}.bs-tooltip-bottom .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow:before{bottom:-1px;border-width:0 calc(var(--bs-tooltip-arrow-width) * .5) var(--bs-tooltip-arrow-height);border-bottom-color:var(--bs-tooltip-bg)}.bs-tooltip-start .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow{right:0;width:var(--bs-tooltip-arrow-height);height:var(--bs-tooltip-arrow-width)}.bs-tooltip-start .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow:before{left:-1px;border-width:calc(var(--bs-tooltip-arrow-width) * .5) 0 calc(var(--bs-tooltip-arrow-width) * .5) var(--bs-tooltip-arrow-height);border-left-color:var(--bs-tooltip-bg)}.tooltip-inner{max-width:var(--bs-tooltip-max-width);padding:var(--bs-tooltip-padding-y) var(--bs-tooltip-padding-x);color:var(--bs-tooltip-color);text-align:center;background-color:var(--bs-tooltip-bg);border-radius:var(--bs-tooltip-border-radius)}.popover{--bs-popover-zindex: 1070;--bs-popover-max-width: 276px;--bs-popover-font-size: .875rem;--bs-popover-bg: #fff;--bs-popover-border-width: 1px;--bs-popover-border-color: var(--bs-border-color-translucent);--bs-popover-border-radius: .5rem;--bs-popover-inner-border-radius:calc(.5rem - 1px);--bs-popover-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15);--bs-popover-header-padding-x: 1rem;--bs-popover-header-padding-y: .5rem;--bs-popover-header-font-size: 1rem;--bs-popover-header-color: ;--bs-popover-header-bg: #f0f0f0;--bs-popover-body-padding-x: 1rem;--bs-popover-body-padding-y: 1rem;--bs-popover-body-color: #212529;--bs-popover-arrow-width: 1rem;--bs-popover-arrow-height: .5rem;--bs-popover-arrow-border: var(--bs-popover-border-color);z-index:var(--bs-popover-zindex);display:block;max-width:var(--bs-popover-max-width);font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;white-space:normal;word-spacing:normal;line-break:auto;font-size:var(--bs-popover-font-size);word-wrap:break-word;background-color:var(--bs-popover-bg);background-clip:padding-box;border:var(--bs-popover-border-width) solid var(--bs-popover-border-color);border-radius:var(--bs-popover-border-radius)}.popover .popover-arrow{display:block;width:var(--bs-popover-arrow-width);height:var(--bs-popover-arrow-height)}.popover .popover-arrow:before,.popover .popover-arrow:after{position:absolute;display:block;content:"";border-color:transparent;border-style:solid;border-width:0}.bs-popover-top>.popover-arrow,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow{bottom:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width))}.bs-popover-top>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:before,.bs-popover-top>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:after{border-width:var(--bs-popover-arrow-height) calc(var(--bs-popover-arrow-width) * .5) 0}.bs-popover-top>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:before{bottom:0;border-top-color:var(--bs-popover-arrow-border)}.bs-popover-top>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:after{bottom:var(--bs-popover-border-width);border-top-color:var(--bs-popover-bg)}.bs-popover-end>.popover-arrow,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow{left:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width));width:var(--bs-popover-arrow-height);height:var(--bs-popover-arrow-width)}.bs-popover-end>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:before,.bs-popover-end>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:after{border-width:calc(var(--bs-popover-arrow-width) * .5) var(--bs-popover-arrow-height) calc(var(--bs-popover-arrow-width) * .5) 0}.bs-popover-end>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:before{left:0;border-right-color:var(--bs-popover-arrow-border)}.bs-popover-end>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:after{left:var(--bs-popover-border-width);border-right-color:var(--bs-popover-bg)}.bs-popover-bottom>.popover-arrow,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow{top:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width))}.bs-popover-bottom>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:before,.bs-popover-bottom>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:after{border-width:0 calc(var(--bs-popover-arrow-width) * .5) var(--bs-popover-arrow-height)}.bs-popover-bottom>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:before{top:0;border-bottom-color:var(--bs-popover-arrow-border)}.bs-popover-bottom>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:after{top:var(--bs-popover-border-width);border-bottom-color:var(--bs-popover-bg)}.bs-popover-bottom .popover-header:before,.bs-popover-auto[data-popper-placement^=bottom] .popover-header:before{position:absolute;top:0;left:50%;display:block;width:var(--bs-popover-arrow-width);margin-left:calc(-.5 * var(--bs-popover-arrow-width));content:"";border-bottom:var(--bs-popover-border-width) solid var(--bs-popover-header-bg)}.bs-popover-start>.popover-arrow,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow{right:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width));width:var(--bs-popover-arrow-height);height:var(--bs-popover-arrow-width)}.bs-popover-start>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:before,.bs-popover-start>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:after{border-width:calc(var(--bs-popover-arrow-width) * .5) 0 calc(var(--bs-popover-arrow-width) * .5) var(--bs-popover-arrow-height)}.bs-popover-start>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:before{right:0;border-left-color:var(--bs-popover-arrow-border)}.bs-popover-start>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:after{right:var(--bs-popover-border-width);border-left-color:var(--bs-popover-bg)}.popover-header{padding:var(--bs-popover-header-padding-y) var(--bs-popover-header-padding-x);margin-bottom:0;font-size:var(--bs-popover-header-font-size);color:var(--bs-popover-header-color);background-color:var(--bs-popover-header-bg);border-bottom:var(--bs-popover-border-width) solid var(--bs-popover-border-color);border-top-left-radius:var(--bs-popover-inner-border-radius);border-top-right-radius:var(--bs-popover-inner-border-radius)}.popover-header:empty{display:none}.popover-body{padding:var(--bs-popover-body-padding-y) var(--bs-popover-body-padding-x);color:var(--bs-popover-body-color)}.carousel{position:relative}.carousel.pointer-event{touch-action:pan-y}.carousel-inner{position:relative;width:100%;overflow:hidden}.carousel-inner:after{display:block;clear:both;content:""}.carousel-item{position:relative;display:none;float:left;width:100%;margin-right:-100%;-webkit-backface-visibility:hidden;backface-visibility:hidden;transition:transform .6s ease-in-out}@media (prefers-reduced-motion: reduce){.carousel-item{transition:none}}.carousel-item.active,.carousel-item-next,.carousel-item-prev{display:block}.carousel-item-next:not(.carousel-item-start),.active.carousel-item-end{transform:translate(100%)}.carousel-item-prev:not(.carousel-item-end),.active.carousel-item-start{transform:translate(-100%)}.carousel-fade .carousel-item{opacity:0;transition-property:opacity;transform:none}.carousel-fade .carousel-item.active,.carousel-fade .carousel-item-next.carousel-item-start,.carousel-fade .carousel-item-prev.carousel-item-end{z-index:1;opacity:1}.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{z-index:0;opacity:0;transition:opacity 0s .6s}@media (prefers-reduced-motion: reduce){.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{transition:none}}.carousel-control-prev,.carousel-control-next{position:absolute;top:0;bottom:0;z-index:1;display:flex;align-items:center;justify-content:center;width:15%;padding:0;color:#fff;text-align:center;background:none;border:0;opacity:.5;transition:opacity .15s ease}@media (prefers-reduced-motion: reduce){.carousel-control-prev,.carousel-control-next{transition:none}}.carousel-control-prev:hover,.carousel-control-prev:focus,.carousel-control-next:hover,.carousel-control-next:focus{color:#fff;text-decoration:none;outline:0;opacity:.9}.carousel-control-prev{left:0}.carousel-control-next{right:0}.carousel-control-prev-icon,.carousel-control-next-icon{display:inline-block;width:2rem;height:2rem;background-repeat:no-repeat;background-position:50%;background-size:100% 100%}.carousel-control-prev-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M11.354 1.646a.5.5 0 0 1 0 .708L5.707 8l5.647 5.646a.5.5 0 0 1-.708.708l-6-6a.5.5 0 0 1 0-.708l6-6a.5.5 0 0 1 .708 0z'/%3e%3c/svg%3e")}.carousel-control-next-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M4.646 1.646a.5.5 0 0 1 .708 0l6 6a.5.5 0 0 1 0 .708l-6 6a.5.5 0 0 1-.708-.708L10.293 8 4.646 2.354a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e")}.carousel-indicators{position:absolute;right:0;bottom:0;left:0;z-index:2;display:flex;justify-content:center;padding:0;margin-right:15%;margin-bottom:1rem;margin-left:15%;list-style:none}.carousel-indicators [data-bs-target]{box-sizing:content-box;flex:0 1 auto;width:30px;height:3px;padding:0;margin-right:3px;margin-left:3px;text-indent:-999px;cursor:pointer;background-color:#fff;background-clip:padding-box;border:0;border-top:10px solid transparent;border-bottom:10px solid transparent;opacity:.5;transition:opacity .6s ease}@media (prefers-reduced-motion: reduce){.carousel-indicators [data-bs-target]{transition:none}}.carousel-indicators .active{opacity:1}.carousel-caption{position:absolute;right:15%;bottom:1.25rem;left:15%;padding-top:1.25rem;padding-bottom:1.25rem;color:#fff;text-align:center}.carousel-dark .carousel-control-prev-icon,.carousel-dark .carousel-control-next-icon{filter:invert(1) grayscale(100)}.carousel-dark .carousel-indicators [data-bs-target]{background-color:#000}.carousel-dark .carousel-caption{color:#000}.spinner-grow,.spinner-border{display:inline-block;width:var(--bs-spinner-width);height:var(--bs-spinner-height);vertical-align:var(--bs-spinner-vertical-align);border-radius:50%;animation:var(--bs-spinner-animation-speed) linear infinite var(--bs-spinner-animation-name)}@keyframes spinner-border{to{transform:rotate(360deg)}}.spinner-border{--bs-spinner-width: 2rem;--bs-spinner-height: 2rem;--bs-spinner-vertical-align: -.125em;--bs-spinner-border-width: .25em;--bs-spinner-animation-speed: .75s;--bs-spinner-animation-name: spinner-border;border:var(--bs-spinner-border-width) solid currentcolor;border-right-color:transparent}.spinner-border-sm{--bs-spinner-width: 1rem;--bs-spinner-height: 1rem;--bs-spinner-border-width: .2em}@keyframes spinner-grow{0%{transform:scale(0)}50%{opacity:1;transform:none}}.spinner-grow{--bs-spinner-width: 2rem;--bs-spinner-height: 2rem;--bs-spinner-vertical-align: -.125em;--bs-spinner-animation-speed: .75s;--bs-spinner-animation-name: spinner-grow;background-color:currentcolor;opacity:0}.spinner-grow-sm{--bs-spinner-width: 1rem;--bs-spinner-height: 1rem}@media (prefers-reduced-motion: reduce){.spinner-border,.spinner-grow{--bs-spinner-animation-speed: 1.5s}}.offcanvas,.offcanvas-xxl,.offcanvas-xl,.offcanvas-lg,.offcanvas-md,.offcanvas-sm{--bs-offcanvas-zindex: 1045;--bs-offcanvas-width: 400px;--bs-offcanvas-height: 30vh;--bs-offcanvas-padding-x: 1rem;--bs-offcanvas-padding-y: 1rem;--bs-offcanvas-color: ;--bs-offcanvas-bg: #fff;--bs-offcanvas-border-width: 1px;--bs-offcanvas-border-color: var(--bs-border-color-translucent);--bs-offcanvas-box-shadow: 0 .125rem .25rem rgba(0, 0, 0, .075)}@media (max-width: 575.98px){.offcanvas-sm{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 575.98px) and (prefers-reduced-motion: reduce){.offcanvas-sm{transition:none}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 575.98px){.offcanvas-sm.showing,.offcanvas-sm.show:not(.hiding){transform:none}}@media (max-width: 575.98px){.offcanvas-sm.showing,.offcanvas-sm.hiding,.offcanvas-sm.show{visibility:visible}}@media (min-width: 576px){.offcanvas-sm{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-sm .offcanvas-header{display:none}.offcanvas-sm .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 767.98px){.offcanvas-md{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 767.98px) and (prefers-reduced-motion: reduce){.offcanvas-md{transition:none}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 767.98px){.offcanvas-md.showing,.offcanvas-md.show:not(.hiding){transform:none}}@media (max-width: 767.98px){.offcanvas-md.showing,.offcanvas-md.hiding,.offcanvas-md.show{visibility:visible}}@media (min-width: 768px){.offcanvas-md{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-md .offcanvas-header{display:none}.offcanvas-md .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 991.98px){.offcanvas-lg{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 991.98px) and (prefers-reduced-motion: reduce){.offcanvas-lg{transition:none}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 991.98px){.offcanvas-lg.showing,.offcanvas-lg.show:not(.hiding){transform:none}}@media (max-width: 991.98px){.offcanvas-lg.showing,.offcanvas-lg.hiding,.offcanvas-lg.show{visibility:visible}}@media (min-width: 992px){.offcanvas-lg{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-lg .offcanvas-header{display:none}.offcanvas-lg .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 1199.98px){.offcanvas-xl{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 1199.98px) and (prefers-reduced-motion: reduce){.offcanvas-xl{transition:none}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 1199.98px){.offcanvas-xl.showing,.offcanvas-xl.show:not(.hiding){transform:none}}@media (max-width: 1199.98px){.offcanvas-xl.showing,.offcanvas-xl.hiding,.offcanvas-xl.show{visibility:visible}}@media (min-width: 1200px){.offcanvas-xl{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-xl .offcanvas-header{display:none}.offcanvas-xl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 1399.98px){.offcanvas-xxl{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 1399.98px) and (prefers-reduced-motion: reduce){.offcanvas-xxl{transition:none}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.showing,.offcanvas-xxl.show:not(.hiding){transform:none}}@media (max-width: 1399.98px){.offcanvas-xxl.showing,.offcanvas-xxl.hiding,.offcanvas-xxl.show{visibility:visible}}@media (min-width: 1400px){.offcanvas-xxl{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-xxl .offcanvas-header{display:none}.offcanvas-xxl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}.offcanvas{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}@media (prefers-reduced-motion: reduce){.offcanvas{transition:none}}.offcanvas.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}.offcanvas.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}.offcanvas.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}.offcanvas.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}.offcanvas.showing,.offcanvas.show:not(.hiding){transform:none}.offcanvas.showing,.offcanvas.hiding,.offcanvas.show{visibility:visible}.offcanvas-backdrop{position:fixed;top:0;left:0;z-index:1040;width:100vw;height:100vh;background-color:#000}.offcanvas-backdrop.fade{opacity:0}.offcanvas-backdrop.show{opacity:.5}.offcanvas-header{display:flex;align-items:center;justify-content:space-between;padding:var(--bs-offcanvas-padding-y) var(--bs-offcanvas-padding-x)}.offcanvas-header .btn-close{padding:calc(var(--bs-offcanvas-padding-y) * .5) calc(var(--bs-offcanvas-padding-x) * .5);margin-top:calc(-.5 * var(--bs-offcanvas-padding-y));margin-right:calc(-.5 * var(--bs-offcanvas-padding-x));margin-bottom:calc(-.5 * var(--bs-offcanvas-padding-y))}.offcanvas-title{margin-bottom:0;line-height:1.5}.offcanvas-body{flex-grow:1;padding:var(--bs-offcanvas-padding-y) var(--bs-offcanvas-padding-x);overflow-y:auto}.placeholder{display:inline-block;min-height:1em;vertical-align:middle;cursor:wait;background-color:currentcolor;opacity:.5}.placeholder.btn:before{display:inline-block;content:""}.placeholder-xs{min-height:.6em}.placeholder-sm{min-height:.8em}.placeholder-lg{min-height:1.2em}.placeholder-glow .placeholder{animation:placeholder-glow 2s ease-in-out infinite}@keyframes placeholder-glow{50%{opacity:.2}}.placeholder-wave{-webkit-mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);-webkit-mask-size:200% 100%;mask-size:200% 100%;animation:placeholder-wave 2s linear infinite}@keyframes placeholder-wave{to{-webkit-mask-position:-200% 0%;mask-position:-200% 0%}}.clearfix:after{display:block;clear:both;content:""}.text-bg-primary{color:#fff!important;background-color:RGBA(13,110,253,var(--bs-bg-opacity, 1))!important}.text-bg-secondary{color:#fff!important;background-color:RGBA(108,117,125,var(--bs-bg-opacity, 1))!important}.text-bg-success{color:#fff!important;background-color:RGBA(25,135,84,var(--bs-bg-opacity, 1))!important}.text-bg-info{color:#000!important;background-color:RGBA(13,202,240,var(--bs-bg-opacity, 1))!important}.text-bg-warning{color:#000!important;background-color:RGBA(255,193,7,var(--bs-bg-opacity, 1))!important}.text-bg-danger{color:#fff!important;background-color:RGBA(220,53,69,var(--bs-bg-opacity, 1))!important}.text-bg-light{color:#000!important;background-color:RGBA(248,249,250,var(--bs-bg-opacity, 1))!important}.text-bg-dark{color:#fff!important;background-color:RGBA(33,37,41,var(--bs-bg-opacity, 1))!important}.link-primary{color:#0d6efd!important}.link-primary:hover,.link-primary:focus{color:#0a58ca!important}.link-secondary{color:#6c757d!important}.link-secondary:hover,.link-secondary:focus{color:#565e64!important}.link-success{color:#198754!important}.link-success:hover,.link-success:focus{color:#146c43!important}.link-info{color:#0dcaf0!important}.link-info:hover,.link-info:focus{color:#3dd5f3!important}.link-warning{color:#ffc107!important}.link-warning:hover,.link-warning:focus{color:#ffcd39!important}.link-danger{color:#dc3545!important}.link-danger:hover,.link-danger:focus{color:#b02a37!important}.link-light{color:#f8f9fa!important}.link-light:hover,.link-light:focus{color:#f9fafb!important}.link-dark{color:#212529!important}.link-dark:hover,.link-dark:focus{color:#1a1e21!important}.ratio{position:relative;width:100%}.ratio:before{display:block;padding-top:var(--bs-aspect-ratio);content:""}.ratio>*{position:absolute;top:0;left:0;width:100%;height:100%}.ratio-1x1{--bs-aspect-ratio: 100%}.ratio-4x3{--bs-aspect-ratio: 75%}.ratio-16x9{--bs-aspect-ratio: 56.25%}.ratio-21x9{--bs-aspect-ratio: 42.8571428571%}.fixed-top{position:fixed;top:0;right:0;left:0;z-index:1030}.fixed-bottom{position:fixed;right:0;bottom:0;left:0;z-index:1030}.sticky-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}@media (min-width: 576px){.sticky-sm-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-sm-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 768px){.sticky-md-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-md-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 992px){.sticky-lg-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-lg-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 1200px){.sticky-xl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-xl-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 1400px){.sticky-xxl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-xxl-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}.hstack{display:flex;flex-direction:row;align-items:center;align-self:stretch}.vstack{display:flex;flex:1 1 auto;flex-direction:column;align-self:stretch}.visually-hidden,.visually-hidden-focusable:not(:focus):not(:focus-within){position:absolute!important;width:1px!important;height:1px!important;padding:0!important;margin:-1px!important;overflow:hidden!important;clip:rect(0,0,0,0)!important;white-space:nowrap!important;border:0!important}.stretched-link:after{position:absolute;inset:0;z-index:1;content:""}.text-truncate{overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.vr{display:inline-block;align-self:stretch;width:1px;min-height:1em;background-color:currentcolor;opacity:.25}.align-baseline{vertical-align:baseline!important}.align-top{vertical-align:top!important}.align-middle{vertical-align:middle!important}.align-bottom{vertical-align:bottom!important}.align-text-bottom{vertical-align:text-bottom!important}.align-text-top{vertical-align:text-top!important}.float-start{float:left!important}.float-end{float:right!important}.float-none{float:none!important}.opacity-0{opacity:0!important}.opacity-25{opacity:.25!important}.opacity-50{opacity:.5!important}.opacity-75{opacity:.75!important}.opacity-100{opacity:1!important}.overflow-auto{overflow:auto!important}.overflow-hidden{overflow:hidden!important}.overflow-visible{overflow:visible!important}.overflow-scroll{overflow:scroll!important}.d-inline{display:inline!important}.d-inline-block{display:inline-block!important}.d-block{display:block!important}.d-grid{display:grid!important}.d-table{display:table!important}.d-table-row{display:table-row!important}.d-table-cell{display:table-cell!important}.d-flex{display:flex!important}.d-inline-flex{display:inline-flex!important}.d-none{display:none!important}.shadow{box-shadow:0 .5rem 1rem #00000026!important}.shadow-sm{box-shadow:0 .125rem .25rem #00000013!important}.shadow-lg{box-shadow:0 1rem 3rem #0000002d!important}.shadow-none{box-shadow:none!important}.position-static{position:static!important}.position-relative{position:relative!important}.position-absolute{position:absolute!important}.position-fixed{position:fixed!important}.position-sticky{position:-webkit-sticky!important;position:sticky!important}.top-0{top:0!important}.top-50{top:50%!important}.top-100{top:100%!important}.bottom-0{bottom:0!important}.bottom-50{bottom:50%!important}.bottom-100{bottom:100%!important}.start-0{left:0!important}.start-50{left:50%!important}.start-100{left:100%!important}.end-0{right:0!important}.end-50{right:50%!important}.end-100{right:100%!important}.translate-middle{transform:translate(-50%,-50%)!important}.translate-middle-x{transform:translate(-50%)!important}.translate-middle-y{transform:translateY(-50%)!important}.border{border:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-0{border:0!important}.border-top{border-top:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-top-0{border-top:0!important}.border-end{border-right:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-end-0{border-right:0!important}.border-bottom{border-bottom:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-bottom-0{border-bottom:0!important}.border-start{border-left:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-start-0{border-left:0!important}.border-primary{--bs-border-opacity: 1;border-color:rgba(var(--bs-primary-rgb),var(--bs-border-opacity))!important}.border-secondary{--bs-border-opacity: 1;border-color:rgba(var(--bs-secondary-rgb),var(--bs-border-opacity))!important}.border-success{--bs-border-opacity: 1;border-color:rgba(var(--bs-success-rgb),var(--bs-border-opacity))!important}.border-info{--bs-border-opacity: 1;border-color:rgba(var(--bs-info-rgb),var(--bs-border-opacity))!important}.border-warning{--bs-border-opacity: 1;border-color:rgba(var(--bs-warning-rgb),var(--bs-border-opacity))!important}.border-danger{--bs-border-opacity: 1;border-color:rgba(var(--bs-danger-rgb),var(--bs-border-opacity))!important}.border-light{--bs-border-opacity: 1;border-color:rgba(var(--bs-light-rgb),var(--bs-border-opacity))!important}.border-dark{--bs-border-opacity: 1;border-color:rgba(var(--bs-dark-rgb),var(--bs-border-opacity))!important}.border-white{--bs-border-opacity: 1;border-color:rgba(var(--bs-white-rgb),var(--bs-border-opacity))!important}.border-1{--bs-border-width: 1px}.border-2{--bs-border-width: 2px}.border-3{--bs-border-width: 3px}.border-4{--bs-border-width: 4px}.border-5{--bs-border-width: 5px}.border-opacity-10{--bs-border-opacity: .1}.border-opacity-25{--bs-border-opacity: .25}.border-opacity-50{--bs-border-opacity: .5}.border-opacity-75{--bs-border-opacity: .75}.border-opacity-100{--bs-border-opacity: 1}.w-25{width:25%!important}.w-50{width:50%!important}.w-75{width:75%!important}.w-100{width:100%!important}.w-auto{width:auto!important}.mw-100{max-width:100%!important}.vw-100{width:100vw!important}.min-vw-100{min-width:100vw!important}.h-25{height:25%!important}.h-50{height:50%!important}.h-75{height:75%!important}.h-100{height:100%!important}.h-auto{height:auto!important}.mh-100{max-height:100%!important}.vh-100{height:100vh!important}.min-vh-100{min-height:100vh!important}.flex-fill{flex:1 1 auto!important}.flex-row{flex-direction:row!important}.flex-column{flex-direction:column!important}.flex-row-reverse{flex-direction:row-reverse!important}.flex-column-reverse{flex-direction:column-reverse!important}.flex-grow-0{flex-grow:0!important}.flex-grow-1{flex-grow:1!important}.flex-shrink-0{flex-shrink:0!important}.flex-shrink-1{flex-shrink:1!important}.flex-wrap{flex-wrap:wrap!important}.flex-nowrap{flex-wrap:nowrap!important}.flex-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-start{justify-content:flex-start!important}.justify-content-end{justify-content:flex-end!important}.justify-content-center{justify-content:center!important}.justify-content-between{justify-content:space-between!important}.justify-content-around{justify-content:space-around!important}.justify-content-evenly{justify-content:space-evenly!important}.align-items-start{align-items:flex-start!important}.align-items-end{align-items:flex-end!important}.align-items-center{align-items:center!important}.align-items-baseline{align-items:baseline!important}.align-items-stretch{align-items:stretch!important}.align-content-start{align-content:flex-start!important}.align-content-end{align-content:flex-end!important}.align-content-center{align-content:center!important}.align-content-between{align-content:space-between!important}.align-content-around{align-content:space-around!important}.align-content-stretch{align-content:stretch!important}.align-self-auto{align-self:auto!important}.align-self-start{align-self:flex-start!important}.align-self-end{align-self:flex-end!important}.align-self-center{align-self:center!important}.align-self-baseline{align-self:baseline!important}.align-self-stretch{align-self:stretch!important}.order-first{order:-1!important}.order-0{order:0!important}.order-1{order:1!important}.order-2{order:2!important}.order-3{order:3!important}.order-4{order:4!important}.order-5{order:5!important}.order-last{order:6!important}.m-0{margin:0!important}.m-1{margin:.25rem!important}.m-2{margin:.5rem!important}.m-3{margin:1rem!important}.m-4{margin:1.5rem!important}.m-5{margin:3rem!important}.m-auto{margin:auto!important}.mx-0{margin-right:0!important;margin-left:0!important}.mx-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-3{margin-right:1rem!important;margin-left:1rem!important}.mx-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-5{margin-right:3rem!important;margin-left:3rem!important}.mx-auto{margin-right:auto!important;margin-left:auto!important}.my-0{margin-top:0!important;margin-bottom:0!important}.my-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-0{margin-top:0!important}.mt-1{margin-top:.25rem!important}.mt-2{margin-top:.5rem!important}.mt-3{margin-top:1rem!important}.mt-4{margin-top:1.5rem!important}.mt-5{margin-top:3rem!important}.mt-auto{margin-top:auto!important}.me-0{margin-right:0!important}.me-1{margin-right:.25rem!important}.me-2{margin-right:.5rem!important}.me-3{margin-right:1rem!important}.me-4{margin-right:1.5rem!important}.me-5{margin-right:3rem!important}.me-auto{margin-right:auto!important}.mb-0{margin-bottom:0!important}.mb-1{margin-bottom:.25rem!important}.mb-2{margin-bottom:.5rem!important}.mb-3{margin-bottom:1rem!important}.mb-4{margin-bottom:1.5rem!important}.mb-5{margin-bottom:3rem!important}.mb-auto{margin-bottom:auto!important}.ms-0{margin-left:0!important}.ms-1{margin-left:.25rem!important}.ms-2{margin-left:.5rem!important}.ms-3{margin-left:1rem!important}.ms-4{margin-left:1.5rem!important}.ms-5{margin-left:3rem!important}.ms-auto{margin-left:auto!important}.p-0{padding:0!important}.p-1{padding:.25rem!important}.p-2{padding:.5rem!important}.p-3{padding:1rem!important}.p-4{padding:1.5rem!important}.p-5{padding:3rem!important}.px-0{padding-right:0!important;padding-left:0!important}.px-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-3{padding-right:1rem!important;padding-left:1rem!important}.px-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-5{padding-right:3rem!important;padding-left:3rem!important}.py-0{padding-top:0!important;padding-bottom:0!important}.py-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-0{padding-top:0!important}.pt-1{padding-top:.25rem!important}.pt-2{padding-top:.5rem!important}.pt-3{padding-top:1rem!important}.pt-4{padding-top:1.5rem!important}.pt-5{padding-top:3rem!important}.pe-0{padding-right:0!important}.pe-1{padding-right:.25rem!important}.pe-2{padding-right:.5rem!important}.pe-3{padding-right:1rem!important}.pe-4{padding-right:1.5rem!important}.pe-5{padding-right:3rem!important}.pb-0{padding-bottom:0!important}.pb-1{padding-bottom:.25rem!important}.pb-2{padding-bottom:.5rem!important}.pb-3{padding-bottom:1rem!important}.pb-4{padding-bottom:1.5rem!important}.pb-5{padding-bottom:3rem!important}.ps-0{padding-left:0!important}.ps-1{padding-left:.25rem!important}.ps-2{padding-left:.5rem!important}.ps-3{padding-left:1rem!important}.ps-4{padding-left:1.5rem!important}.ps-5{padding-left:3rem!important}.gap-0{gap:0!important}.gap-1{gap:.25rem!important}.gap-2{gap:.5rem!important}.gap-3{gap:1rem!important}.gap-4{gap:1.5rem!important}.gap-5{gap:3rem!important}.font-monospace{font-family:var(--bs-font-monospace)!important}.fs-1{font-size:calc(1.375rem + 1.5vw)!important}.fs-2{font-size:calc(1.325rem + .9vw)!important}.fs-3{font-size:calc(1.3rem + .6vw)!important}.fs-4{font-size:calc(1.275rem + .3vw)!important}.fs-5{font-size:1.25rem!important}.fs-6{font-size:1rem!important}.fst-italic{font-style:italic!important}.fst-normal{font-style:normal!important}.fw-light{font-weight:300!important}.fw-lighter{font-weight:lighter!important}.fw-normal{font-weight:400!important}.fw-bold{font-weight:700!important}.fw-semibold{font-weight:600!important}.fw-bolder{font-weight:bolder!important}.lh-1{line-height:1!important}.lh-sm{line-height:1.25!important}.lh-base{line-height:1.5!important}.lh-lg{line-height:2!important}.text-start{text-align:left!important}.text-end{text-align:right!important}.text-center{text-align:center!important}.text-decoration-none{text-decoration:none!important}.text-decoration-underline{text-decoration:underline!important}.text-decoration-line-through{text-decoration:line-through!important}.text-lowercase{text-transform:lowercase!important}.text-uppercase{text-transform:uppercase!important}.text-capitalize{text-transform:capitalize!important}.text-wrap{white-space:normal!important}.text-nowrap{white-space:nowrap!important}.text-break{word-wrap:break-word!important;word-break:break-word!important}.text-primary{--bs-text-opacity: 1;color:rgba(var(--bs-primary-rgb),var(--bs-text-opacity))!important}.text-secondary{--bs-text-opacity: 1;color:rgba(var(--bs-secondary-rgb),var(--bs-text-opacity))!important}.text-success{--bs-text-opacity: 1;color:rgba(var(--bs-success-rgb),var(--bs-text-opacity))!important}.text-info{--bs-text-opacity: 1;color:rgba(var(--bs-info-rgb),var(--bs-text-opacity))!important}.text-warning{--bs-text-opacity: 1;color:rgba(var(--bs-warning-rgb),var(--bs-text-opacity))!important}.text-danger{--bs-text-opacity: 1;color:rgba(var(--bs-danger-rgb),var(--bs-text-opacity))!important}.text-light{--bs-text-opacity: 1;color:rgba(var(--bs-light-rgb),var(--bs-text-opacity))!important}.text-dark{--bs-text-opacity: 1;color:rgba(var(--bs-dark-rgb),var(--bs-text-opacity))!important}.text-black{--bs-text-opacity: 1;color:rgba(var(--bs-black-rgb),var(--bs-text-opacity))!important}.text-white{--bs-text-opacity: 1;color:rgba(var(--bs-white-rgb),var(--bs-text-opacity))!important}.text-body{--bs-text-opacity: 1;color:rgba(var(--bs-body-color-rgb),var(--bs-text-opacity))!important}.text-muted{--bs-text-opacity: 1;color:#6c757d!important}.text-black-50{--bs-text-opacity: 1;color:#00000080!important}.text-white-50{--bs-text-opacity: 1;color:#ffffff80!important}.text-reset{--bs-text-opacity: 1;color:inherit!important}.text-opacity-25{--bs-text-opacity: .25}.text-opacity-50{--bs-text-opacity: .5}.text-opacity-75{--bs-text-opacity: .75}.text-opacity-100{--bs-text-opacity: 1}.bg-primary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-primary-rgb),var(--bs-bg-opacity))!important}.bg-secondary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-secondary-rgb),var(--bs-bg-opacity))!important}.bg-success{--bs-bg-opacity: 1;background-color:rgba(var(--bs-success-rgb),var(--bs-bg-opacity))!important}.bg-info{--bs-bg-opacity: 1;background-color:rgba(var(--bs-info-rgb),var(--bs-bg-opacity))!important}.bg-warning{--bs-bg-opacity: 1;background-color:rgba(var(--bs-warning-rgb),var(--bs-bg-opacity))!important}.bg-danger{--bs-bg-opacity: 1;background-color:rgba(var(--bs-danger-rgb),var(--bs-bg-opacity))!important}.bg-light{--bs-bg-opacity: 1;background-color:rgba(var(--bs-light-rgb),var(--bs-bg-opacity))!important}.bg-dark{--bs-bg-opacity: 1;background-color:rgba(var(--bs-dark-rgb),var(--bs-bg-opacity))!important}.bg-black{--bs-bg-opacity: 1;background-color:rgba(var(--bs-black-rgb),var(--bs-bg-opacity))!important}.bg-white{--bs-bg-opacity: 1;background-color:rgba(var(--bs-white-rgb),var(--bs-bg-opacity))!important}.bg-body{--bs-bg-opacity: 1;background-color:rgba(var(--bs-body-bg-rgb),var(--bs-bg-opacity))!important}.bg-transparent{--bs-bg-opacity: 1;background-color:transparent!important}.bg-opacity-10{--bs-bg-opacity: .1}.bg-opacity-25{--bs-bg-opacity: .25}.bg-opacity-50{--bs-bg-opacity: .5}.bg-opacity-75{--bs-bg-opacity: .75}.bg-opacity-100{--bs-bg-opacity: 1}.bg-gradient{background-image:var(--bs-gradient)!important}.user-select-all{-webkit-user-select:all!important;-moz-user-select:all!important;user-select:all!important}.user-select-auto{-webkit-user-select:auto!important;-moz-user-select:auto!important;user-select:auto!important}.user-select-none{-webkit-user-select:none!important;-moz-user-select:none!important;user-select:none!important}.pe-none{pointer-events:none!important}.pe-auto{pointer-events:auto!important}.rounded{border-radius:var(--bs-border-radius)!important}.rounded-0{border-radius:0!important}.rounded-1{border-radius:var(--bs-border-radius-sm)!important}.rounded-2{border-radius:var(--bs-border-radius)!important}.rounded-3{border-radius:var(--bs-border-radius-lg)!important}.rounded-4{border-radius:var(--bs-border-radius-xl)!important}.rounded-5{border-radius:var(--bs-border-radius-2xl)!important}.rounded-circle{border-radius:50%!important}.rounded-pill{border-radius:var(--bs-border-radius-pill)!important}.rounded-top{border-top-left-radius:var(--bs-border-radius)!important;border-top-right-radius:var(--bs-border-radius)!important}.rounded-end{border-top-right-radius:var(--bs-border-radius)!important;border-bottom-right-radius:var(--bs-border-radius)!important}.rounded-bottom{border-bottom-right-radius:var(--bs-border-radius)!important;border-bottom-left-radius:var(--bs-border-radius)!important}.rounded-start{border-bottom-left-radius:var(--bs-border-radius)!important;border-top-left-radius:var(--bs-border-radius)!important}.visible{visibility:visible!important}.invisible{visibility:hidden!important}@media (min-width: 576px){.float-sm-start{float:left!important}.float-sm-end{float:right!important}.float-sm-none{float:none!important}.d-sm-inline{display:inline!important}.d-sm-inline-block{display:inline-block!important}.d-sm-block{display:block!important}.d-sm-grid{display:grid!important}.d-sm-table{display:table!important}.d-sm-table-row{display:table-row!important}.d-sm-table-cell{display:table-cell!important}.d-sm-flex{display:flex!important}.d-sm-inline-flex{display:inline-flex!important}.d-sm-none{display:none!important}.flex-sm-fill{flex:1 1 auto!important}.flex-sm-row{flex-direction:row!important}.flex-sm-column{flex-direction:column!important}.flex-sm-row-reverse{flex-direction:row-reverse!important}.flex-sm-column-reverse{flex-direction:column-reverse!important}.flex-sm-grow-0{flex-grow:0!important}.flex-sm-grow-1{flex-grow:1!important}.flex-sm-shrink-0{flex-shrink:0!important}.flex-sm-shrink-1{flex-shrink:1!important}.flex-sm-wrap{flex-wrap:wrap!important}.flex-sm-nowrap{flex-wrap:nowrap!important}.flex-sm-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-sm-start{justify-content:flex-start!important}.justify-content-sm-end{justify-content:flex-end!important}.justify-content-sm-center{justify-content:center!important}.justify-content-sm-between{justify-content:space-between!important}.justify-content-sm-around{justify-content:space-around!important}.justify-content-sm-evenly{justify-content:space-evenly!important}.align-items-sm-start{align-items:flex-start!important}.align-items-sm-end{align-items:flex-end!important}.align-items-sm-center{align-items:center!important}.align-items-sm-baseline{align-items:baseline!important}.align-items-sm-stretch{align-items:stretch!important}.align-content-sm-start{align-content:flex-start!important}.align-content-sm-end{align-content:flex-end!important}.align-content-sm-center{align-content:center!important}.align-content-sm-between{align-content:space-between!important}.align-content-sm-around{align-content:space-around!important}.align-content-sm-stretch{align-content:stretch!important}.align-self-sm-auto{align-self:auto!important}.align-self-sm-start{align-self:flex-start!important}.align-self-sm-end{align-self:flex-end!important}.align-self-sm-center{align-self:center!important}.align-self-sm-baseline{align-self:baseline!important}.align-self-sm-stretch{align-self:stretch!important}.order-sm-first{order:-1!important}.order-sm-0{order:0!important}.order-sm-1{order:1!important}.order-sm-2{order:2!important}.order-sm-3{order:3!important}.order-sm-4{order:4!important}.order-sm-5{order:5!important}.order-sm-last{order:6!important}.m-sm-0{margin:0!important}.m-sm-1{margin:.25rem!important}.m-sm-2{margin:.5rem!important}.m-sm-3{margin:1rem!important}.m-sm-4{margin:1.5rem!important}.m-sm-5{margin:3rem!important}.m-sm-auto{margin:auto!important}.mx-sm-0{margin-right:0!important;margin-left:0!important}.mx-sm-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-sm-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-sm-3{margin-right:1rem!important;margin-left:1rem!important}.mx-sm-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-sm-5{margin-right:3rem!important;margin-left:3rem!important}.mx-sm-auto{margin-right:auto!important;margin-left:auto!important}.my-sm-0{margin-top:0!important;margin-bottom:0!important}.my-sm-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-sm-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-sm-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-sm-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-sm-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-sm-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-sm-0{margin-top:0!important}.mt-sm-1{margin-top:.25rem!important}.mt-sm-2{margin-top:.5rem!important}.mt-sm-3{margin-top:1rem!important}.mt-sm-4{margin-top:1.5rem!important}.mt-sm-5{margin-top:3rem!important}.mt-sm-auto{margin-top:auto!important}.me-sm-0{margin-right:0!important}.me-sm-1{margin-right:.25rem!important}.me-sm-2{margin-right:.5rem!important}.me-sm-3{margin-right:1rem!important}.me-sm-4{margin-right:1.5rem!important}.me-sm-5{margin-right:3rem!important}.me-sm-auto{margin-right:auto!important}.mb-sm-0{margin-bottom:0!important}.mb-sm-1{margin-bottom:.25rem!important}.mb-sm-2{margin-bottom:.5rem!important}.mb-sm-3{margin-bottom:1rem!important}.mb-sm-4{margin-bottom:1.5rem!important}.mb-sm-5{margin-bottom:3rem!important}.mb-sm-auto{margin-bottom:auto!important}.ms-sm-0{margin-left:0!important}.ms-sm-1{margin-left:.25rem!important}.ms-sm-2{margin-left:.5rem!important}.ms-sm-3{margin-left:1rem!important}.ms-sm-4{margin-left:1.5rem!important}.ms-sm-5{margin-left:3rem!important}.ms-sm-auto{margin-left:auto!important}.p-sm-0{padding:0!important}.p-sm-1{padding:.25rem!important}.p-sm-2{padding:.5rem!important}.p-sm-3{padding:1rem!important}.p-sm-4{padding:1.5rem!important}.p-sm-5{padding:3rem!important}.px-sm-0{padding-right:0!important;padding-left:0!important}.px-sm-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-sm-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-sm-3{padding-right:1rem!important;padding-left:1rem!important}.px-sm-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-sm-5{padding-right:3rem!important;padding-left:3rem!important}.py-sm-0{padding-top:0!important;padding-bottom:0!important}.py-sm-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-sm-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-sm-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-sm-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-sm-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-sm-0{padding-top:0!important}.pt-sm-1{padding-top:.25rem!important}.pt-sm-2{padding-top:.5rem!important}.pt-sm-3{padding-top:1rem!important}.pt-sm-4{padding-top:1.5rem!important}.pt-sm-5{padding-top:3rem!important}.pe-sm-0{padding-right:0!important}.pe-sm-1{padding-right:.25rem!important}.pe-sm-2{padding-right:.5rem!important}.pe-sm-3{padding-right:1rem!important}.pe-sm-4{padding-right:1.5rem!important}.pe-sm-5{padding-right:3rem!important}.pb-sm-0{padding-bottom:0!important}.pb-sm-1{padding-bottom:.25rem!important}.pb-sm-2{padding-bottom:.5rem!important}.pb-sm-3{padding-bottom:1rem!important}.pb-sm-4{padding-bottom:1.5rem!important}.pb-sm-5{padding-bottom:3rem!important}.ps-sm-0{padding-left:0!important}.ps-sm-1{padding-left:.25rem!important}.ps-sm-2{padding-left:.5rem!important}.ps-sm-3{padding-left:1rem!important}.ps-sm-4{padding-left:1.5rem!important}.ps-sm-5{padding-left:3rem!important}.gap-sm-0{gap:0!important}.gap-sm-1{gap:.25rem!important}.gap-sm-2{gap:.5rem!important}.gap-sm-3{gap:1rem!important}.gap-sm-4{gap:1.5rem!important}.gap-sm-5{gap:3rem!important}.text-sm-start{text-align:left!important}.text-sm-end{text-align:right!important}.text-sm-center{text-align:center!important}}@media (min-width: 768px){.float-md-start{float:left!important}.float-md-end{float:right!important}.float-md-none{float:none!important}.d-md-inline{display:inline!important}.d-md-inline-block{display:inline-block!important}.d-md-block{display:block!important}.d-md-grid{display:grid!important}.d-md-table{display:table!important}.d-md-table-row{display:table-row!important}.d-md-table-cell{display:table-cell!important}.d-md-flex{display:flex!important}.d-md-inline-flex{display:inline-flex!important}.d-md-none{display:none!important}.flex-md-fill{flex:1 1 auto!important}.flex-md-row{flex-direction:row!important}.flex-md-column{flex-direction:column!important}.flex-md-row-reverse{flex-direction:row-reverse!important}.flex-md-column-reverse{flex-direction:column-reverse!important}.flex-md-grow-0{flex-grow:0!important}.flex-md-grow-1{flex-grow:1!important}.flex-md-shrink-0{flex-shrink:0!important}.flex-md-shrink-1{flex-shrink:1!important}.flex-md-wrap{flex-wrap:wrap!important}.flex-md-nowrap{flex-wrap:nowrap!important}.flex-md-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-md-start{justify-content:flex-start!important}.justify-content-md-end{justify-content:flex-end!important}.justify-content-md-center{justify-content:center!important}.justify-content-md-between{justify-content:space-between!important}.justify-content-md-around{justify-content:space-around!important}.justify-content-md-evenly{justify-content:space-evenly!important}.align-items-md-start{align-items:flex-start!important}.align-items-md-end{align-items:flex-end!important}.align-items-md-center{align-items:center!important}.align-items-md-baseline{align-items:baseline!important}.align-items-md-stretch{align-items:stretch!important}.align-content-md-start{align-content:flex-start!important}.align-content-md-end{align-content:flex-end!important}.align-content-md-center{align-content:center!important}.align-content-md-between{align-content:space-between!important}.align-content-md-around{align-content:space-around!important}.align-content-md-stretch{align-content:stretch!important}.align-self-md-auto{align-self:auto!important}.align-self-md-start{align-self:flex-start!important}.align-self-md-end{align-self:flex-end!important}.align-self-md-center{align-self:center!important}.align-self-md-baseline{align-self:baseline!important}.align-self-md-stretch{align-self:stretch!important}.order-md-first{order:-1!important}.order-md-0{order:0!important}.order-md-1{order:1!important}.order-md-2{order:2!important}.order-md-3{order:3!important}.order-md-4{order:4!important}.order-md-5{order:5!important}.order-md-last{order:6!important}.m-md-0{margin:0!important}.m-md-1{margin:.25rem!important}.m-md-2{margin:.5rem!important}.m-md-3{margin:1rem!important}.m-md-4{margin:1.5rem!important}.m-md-5{margin:3rem!important}.m-md-auto{margin:auto!important}.mx-md-0{margin-right:0!important;margin-left:0!important}.mx-md-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-md-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-md-3{margin-right:1rem!important;margin-left:1rem!important}.mx-md-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-md-5{margin-right:3rem!important;margin-left:3rem!important}.mx-md-auto{margin-right:auto!important;margin-left:auto!important}.my-md-0{margin-top:0!important;margin-bottom:0!important}.my-md-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-md-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-md-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-md-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-md-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-md-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-md-0{margin-top:0!important}.mt-md-1{margin-top:.25rem!important}.mt-md-2{margin-top:.5rem!important}.mt-md-3{margin-top:1rem!important}.mt-md-4{margin-top:1.5rem!important}.mt-md-5{margin-top:3rem!important}.mt-md-auto{margin-top:auto!important}.me-md-0{margin-right:0!important}.me-md-1{margin-right:.25rem!important}.me-md-2{margin-right:.5rem!important}.me-md-3{margin-right:1rem!important}.me-md-4{margin-right:1.5rem!important}.me-md-5{margin-right:3rem!important}.me-md-auto{margin-right:auto!important}.mb-md-0{margin-bottom:0!important}.mb-md-1{margin-bottom:.25rem!important}.mb-md-2{margin-bottom:.5rem!important}.mb-md-3{margin-bottom:1rem!important}.mb-md-4{margin-bottom:1.5rem!important}.mb-md-5{margin-bottom:3rem!important}.mb-md-auto{margin-bottom:auto!important}.ms-md-0{margin-left:0!important}.ms-md-1{margin-left:.25rem!important}.ms-md-2{margin-left:.5rem!important}.ms-md-3{margin-left:1rem!important}.ms-md-4{margin-left:1.5rem!important}.ms-md-5{margin-left:3rem!important}.ms-md-auto{margin-left:auto!important}.p-md-0{padding:0!important}.p-md-1{padding:.25rem!important}.p-md-2{padding:.5rem!important}.p-md-3{padding:1rem!important}.p-md-4{padding:1.5rem!important}.p-md-5{padding:3rem!important}.px-md-0{padding-right:0!important;padding-left:0!important}.px-md-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-md-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-md-3{padding-right:1rem!important;padding-left:1rem!important}.px-md-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-md-5{padding-right:3rem!important;padding-left:3rem!important}.py-md-0{padding-top:0!important;padding-bottom:0!important}.py-md-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-md-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-md-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-md-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-md-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-md-0{padding-top:0!important}.pt-md-1{padding-top:.25rem!important}.pt-md-2{padding-top:.5rem!important}.pt-md-3{padding-top:1rem!important}.pt-md-4{padding-top:1.5rem!important}.pt-md-5{padding-top:3rem!important}.pe-md-0{padding-right:0!important}.pe-md-1{padding-right:.25rem!important}.pe-md-2{padding-right:.5rem!important}.pe-md-3{padding-right:1rem!important}.pe-md-4{padding-right:1.5rem!important}.pe-md-5{padding-right:3rem!important}.pb-md-0{padding-bottom:0!important}.pb-md-1{padding-bottom:.25rem!important}.pb-md-2{padding-bottom:.5rem!important}.pb-md-3{padding-bottom:1rem!important}.pb-md-4{padding-bottom:1.5rem!important}.pb-md-5{padding-bottom:3rem!important}.ps-md-0{padding-left:0!important}.ps-md-1{padding-left:.25rem!important}.ps-md-2{padding-left:.5rem!important}.ps-md-3{padding-left:1rem!important}.ps-md-4{padding-left:1.5rem!important}.ps-md-5{padding-left:3rem!important}.gap-md-0{gap:0!important}.gap-md-1{gap:.25rem!important}.gap-md-2{gap:.5rem!important}.gap-md-3{gap:1rem!important}.gap-md-4{gap:1.5rem!important}.gap-md-5{gap:3rem!important}.text-md-start{text-align:left!important}.text-md-end{text-align:right!important}.text-md-center{text-align:center!important}}@media (min-width: 992px){.float-lg-start{float:left!important}.float-lg-end{float:right!important}.float-lg-none{float:none!important}.d-lg-inline{display:inline!important}.d-lg-inline-block{display:inline-block!important}.d-lg-block{display:block!important}.d-lg-grid{display:grid!important}.d-lg-table{display:table!important}.d-lg-table-row{display:table-row!important}.d-lg-table-cell{display:table-cell!important}.d-lg-flex{display:flex!important}.d-lg-inline-flex{display:inline-flex!important}.d-lg-none{display:none!important}.flex-lg-fill{flex:1 1 auto!important}.flex-lg-row{flex-direction:row!important}.flex-lg-column{flex-direction:column!important}.flex-lg-row-reverse{flex-direction:row-reverse!important}.flex-lg-column-reverse{flex-direction:column-reverse!important}.flex-lg-grow-0{flex-grow:0!important}.flex-lg-grow-1{flex-grow:1!important}.flex-lg-shrink-0{flex-shrink:0!important}.flex-lg-shrink-1{flex-shrink:1!important}.flex-lg-wrap{flex-wrap:wrap!important}.flex-lg-nowrap{flex-wrap:nowrap!important}.flex-lg-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-lg-start{justify-content:flex-start!important}.justify-content-lg-end{justify-content:flex-end!important}.justify-content-lg-center{justify-content:center!important}.justify-content-lg-between{justify-content:space-between!important}.justify-content-lg-around{justify-content:space-around!important}.justify-content-lg-evenly{justify-content:space-evenly!important}.align-items-lg-start{align-items:flex-start!important}.align-items-lg-end{align-items:flex-end!important}.align-items-lg-center{align-items:center!important}.align-items-lg-baseline{align-items:baseline!important}.align-items-lg-stretch{align-items:stretch!important}.align-content-lg-start{align-content:flex-start!important}.align-content-lg-end{align-content:flex-end!important}.align-content-lg-center{align-content:center!important}.align-content-lg-between{align-content:space-between!important}.align-content-lg-around{align-content:space-around!important}.align-content-lg-stretch{align-content:stretch!important}.align-self-lg-auto{align-self:auto!important}.align-self-lg-start{align-self:flex-start!important}.align-self-lg-end{align-self:flex-end!important}.align-self-lg-center{align-self:center!important}.align-self-lg-baseline{align-self:baseline!important}.align-self-lg-stretch{align-self:stretch!important}.order-lg-first{order:-1!important}.order-lg-0{order:0!important}.order-lg-1{order:1!important}.order-lg-2{order:2!important}.order-lg-3{order:3!important}.order-lg-4{order:4!important}.order-lg-5{order:5!important}.order-lg-last{order:6!important}.m-lg-0{margin:0!important}.m-lg-1{margin:.25rem!important}.m-lg-2{margin:.5rem!important}.m-lg-3{margin:1rem!important}.m-lg-4{margin:1.5rem!important}.m-lg-5{margin:3rem!important}.m-lg-auto{margin:auto!important}.mx-lg-0{margin-right:0!important;margin-left:0!important}.mx-lg-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-lg-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-lg-3{margin-right:1rem!important;margin-left:1rem!important}.mx-lg-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-lg-5{margin-right:3rem!important;margin-left:3rem!important}.mx-lg-auto{margin-right:auto!important;margin-left:auto!important}.my-lg-0{margin-top:0!important;margin-bottom:0!important}.my-lg-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-lg-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-lg-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-lg-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-lg-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-lg-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-lg-0{margin-top:0!important}.mt-lg-1{margin-top:.25rem!important}.mt-lg-2{margin-top:.5rem!important}.mt-lg-3{margin-top:1rem!important}.mt-lg-4{margin-top:1.5rem!important}.mt-lg-5{margin-top:3rem!important}.mt-lg-auto{margin-top:auto!important}.me-lg-0{margin-right:0!important}.me-lg-1{margin-right:.25rem!important}.me-lg-2{margin-right:.5rem!important}.me-lg-3{margin-right:1rem!important}.me-lg-4{margin-right:1.5rem!important}.me-lg-5{margin-right:3rem!important}.me-lg-auto{margin-right:auto!important}.mb-lg-0{margin-bottom:0!important}.mb-lg-1{margin-bottom:.25rem!important}.mb-lg-2{margin-bottom:.5rem!important}.mb-lg-3{margin-bottom:1rem!important}.mb-lg-4{margin-bottom:1.5rem!important}.mb-lg-5{margin-bottom:3rem!important}.mb-lg-auto{margin-bottom:auto!important}.ms-lg-0{margin-left:0!important}.ms-lg-1{margin-left:.25rem!important}.ms-lg-2{margin-left:.5rem!important}.ms-lg-3{margin-left:1rem!important}.ms-lg-4{margin-left:1.5rem!important}.ms-lg-5{margin-left:3rem!important}.ms-lg-auto{margin-left:auto!important}.p-lg-0{padding:0!important}.p-lg-1{padding:.25rem!important}.p-lg-2{padding:.5rem!important}.p-lg-3{padding:1rem!important}.p-lg-4{padding:1.5rem!important}.p-lg-5{padding:3rem!important}.px-lg-0{padding-right:0!important;padding-left:0!important}.px-lg-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-lg-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-lg-3{padding-right:1rem!important;padding-left:1rem!important}.px-lg-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-lg-5{padding-right:3rem!important;padding-left:3rem!important}.py-lg-0{padding-top:0!important;padding-bottom:0!important}.py-lg-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-lg-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-lg-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-lg-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-lg-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-lg-0{padding-top:0!important}.pt-lg-1{padding-top:.25rem!important}.pt-lg-2{padding-top:.5rem!important}.pt-lg-3{padding-top:1rem!important}.pt-lg-4{padding-top:1.5rem!important}.pt-lg-5{padding-top:3rem!important}.pe-lg-0{padding-right:0!important}.pe-lg-1{padding-right:.25rem!important}.pe-lg-2{padding-right:.5rem!important}.pe-lg-3{padding-right:1rem!important}.pe-lg-4{padding-right:1.5rem!important}.pe-lg-5{padding-right:3rem!important}.pb-lg-0{padding-bottom:0!important}.pb-lg-1{padding-bottom:.25rem!important}.pb-lg-2{padding-bottom:.5rem!important}.pb-lg-3{padding-bottom:1rem!important}.pb-lg-4{padding-bottom:1.5rem!important}.pb-lg-5{padding-bottom:3rem!important}.ps-lg-0{padding-left:0!important}.ps-lg-1{padding-left:.25rem!important}.ps-lg-2{padding-left:.5rem!important}.ps-lg-3{padding-left:1rem!important}.ps-lg-4{padding-left:1.5rem!important}.ps-lg-5{padding-left:3rem!important}.gap-lg-0{gap:0!important}.gap-lg-1{gap:.25rem!important}.gap-lg-2{gap:.5rem!important}.gap-lg-3{gap:1rem!important}.gap-lg-4{gap:1.5rem!important}.gap-lg-5{gap:3rem!important}.text-lg-start{text-align:left!important}.text-lg-end{text-align:right!important}.text-lg-center{text-align:center!important}}@media (min-width: 1200px){.float-xl-start{float:left!important}.float-xl-end{float:right!important}.float-xl-none{float:none!important}.d-xl-inline{display:inline!important}.d-xl-inline-block{display:inline-block!important}.d-xl-block{display:block!important}.d-xl-grid{display:grid!important}.d-xl-table{display:table!important}.d-xl-table-row{display:table-row!important}.d-xl-table-cell{display:table-cell!important}.d-xl-flex{display:flex!important}.d-xl-inline-flex{display:inline-flex!important}.d-xl-none{display:none!important}.flex-xl-fill{flex:1 1 auto!important}.flex-xl-row{flex-direction:row!important}.flex-xl-column{flex-direction:column!important}.flex-xl-row-reverse{flex-direction:row-reverse!important}.flex-xl-column-reverse{flex-direction:column-reverse!important}.flex-xl-grow-0{flex-grow:0!important}.flex-xl-grow-1{flex-grow:1!important}.flex-xl-shrink-0{flex-shrink:0!important}.flex-xl-shrink-1{flex-shrink:1!important}.flex-xl-wrap{flex-wrap:wrap!important}.flex-xl-nowrap{flex-wrap:nowrap!important}.flex-xl-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-xl-start{justify-content:flex-start!important}.justify-content-xl-end{justify-content:flex-end!important}.justify-content-xl-center{justify-content:center!important}.justify-content-xl-between{justify-content:space-between!important}.justify-content-xl-around{justify-content:space-around!important}.justify-content-xl-evenly{justify-content:space-evenly!important}.align-items-xl-start{align-items:flex-start!important}.align-items-xl-end{align-items:flex-end!important}.align-items-xl-center{align-items:center!important}.align-items-xl-baseline{align-items:baseline!important}.align-items-xl-stretch{align-items:stretch!important}.align-content-xl-start{align-content:flex-start!important}.align-content-xl-end{align-content:flex-end!important}.align-content-xl-center{align-content:center!important}.align-content-xl-between{align-content:space-between!important}.align-content-xl-around{align-content:space-around!important}.align-content-xl-stretch{align-content:stretch!important}.align-self-xl-auto{align-self:auto!important}.align-self-xl-start{align-self:flex-start!important}.align-self-xl-end{align-self:flex-end!important}.align-self-xl-center{align-self:center!important}.align-self-xl-baseline{align-self:baseline!important}.align-self-xl-stretch{align-self:stretch!important}.order-xl-first{order:-1!important}.order-xl-0{order:0!important}.order-xl-1{order:1!important}.order-xl-2{order:2!important}.order-xl-3{order:3!important}.order-xl-4{order:4!important}.order-xl-5{order:5!important}.order-xl-last{order:6!important}.m-xl-0{margin:0!important}.m-xl-1{margin:.25rem!important}.m-xl-2{margin:.5rem!important}.m-xl-3{margin:1rem!important}.m-xl-4{margin:1.5rem!important}.m-xl-5{margin:3rem!important}.m-xl-auto{margin:auto!important}.mx-xl-0{margin-right:0!important;margin-left:0!important}.mx-xl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xl-auto{margin-right:auto!important;margin-left:auto!important}.my-xl-0{margin-top:0!important;margin-bottom:0!important}.my-xl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xl-0{margin-top:0!important}.mt-xl-1{margin-top:.25rem!important}.mt-xl-2{margin-top:.5rem!important}.mt-xl-3{margin-top:1rem!important}.mt-xl-4{margin-top:1.5rem!important}.mt-xl-5{margin-top:3rem!important}.mt-xl-auto{margin-top:auto!important}.me-xl-0{margin-right:0!important}.me-xl-1{margin-right:.25rem!important}.me-xl-2{margin-right:.5rem!important}.me-xl-3{margin-right:1rem!important}.me-xl-4{margin-right:1.5rem!important}.me-xl-5{margin-right:3rem!important}.me-xl-auto{margin-right:auto!important}.mb-xl-0{margin-bottom:0!important}.mb-xl-1{margin-bottom:.25rem!important}.mb-xl-2{margin-bottom:.5rem!important}.mb-xl-3{margin-bottom:1rem!important}.mb-xl-4{margin-bottom:1.5rem!important}.mb-xl-5{margin-bottom:3rem!important}.mb-xl-auto{margin-bottom:auto!important}.ms-xl-0{margin-left:0!important}.ms-xl-1{margin-left:.25rem!important}.ms-xl-2{margin-left:.5rem!important}.ms-xl-3{margin-left:1rem!important}.ms-xl-4{margin-left:1.5rem!important}.ms-xl-5{margin-left:3rem!important}.ms-xl-auto{margin-left:auto!important}.p-xl-0{padding:0!important}.p-xl-1{padding:.25rem!important}.p-xl-2{padding:.5rem!important}.p-xl-3{padding:1rem!important}.p-xl-4{padding:1.5rem!important}.p-xl-5{padding:3rem!important}.px-xl-0{padding-right:0!important;padding-left:0!important}.px-xl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xl-0{padding-top:0!important;padding-bottom:0!important}.py-xl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xl-0{padding-top:0!important}.pt-xl-1{padding-top:.25rem!important}.pt-xl-2{padding-top:.5rem!important}.pt-xl-3{padding-top:1rem!important}.pt-xl-4{padding-top:1.5rem!important}.pt-xl-5{padding-top:3rem!important}.pe-xl-0{padding-right:0!important}.pe-xl-1{padding-right:.25rem!important}.pe-xl-2{padding-right:.5rem!important}.pe-xl-3{padding-right:1rem!important}.pe-xl-4{padding-right:1.5rem!important}.pe-xl-5{padding-right:3rem!important}.pb-xl-0{padding-bottom:0!important}.pb-xl-1{padding-bottom:.25rem!important}.pb-xl-2{padding-bottom:.5rem!important}.pb-xl-3{padding-bottom:1rem!important}.pb-xl-4{padding-bottom:1.5rem!important}.pb-xl-5{padding-bottom:3rem!important}.ps-xl-0{padding-left:0!important}.ps-xl-1{padding-left:.25rem!important}.ps-xl-2{padding-left:.5rem!important}.ps-xl-3{padding-left:1rem!important}.ps-xl-4{padding-left:1.5rem!important}.ps-xl-5{padding-left:3rem!important}.gap-xl-0{gap:0!important}.gap-xl-1{gap:.25rem!important}.gap-xl-2{gap:.5rem!important}.gap-xl-3{gap:1rem!important}.gap-xl-4{gap:1.5rem!important}.gap-xl-5{gap:3rem!important}.text-xl-start{text-align:left!important}.text-xl-end{text-align:right!important}.text-xl-center{text-align:center!important}}@media (min-width: 1400px){.float-xxl-start{float:left!important}.float-xxl-end{float:right!important}.float-xxl-none{float:none!important}.d-xxl-inline{display:inline!important}.d-xxl-inline-block{display:inline-block!important}.d-xxl-block{display:block!important}.d-xxl-grid{display:grid!important}.d-xxl-table{display:table!important}.d-xxl-table-row{display:table-row!important}.d-xxl-table-cell{display:table-cell!important}.d-xxl-flex{display:flex!important}.d-xxl-inline-flex{display:inline-flex!important}.d-xxl-none{display:none!important}.flex-xxl-fill{flex:1 1 auto!important}.flex-xxl-row{flex-direction:row!important}.flex-xxl-column{flex-direction:column!important}.flex-xxl-row-reverse{flex-direction:row-reverse!important}.flex-xxl-column-reverse{flex-direction:column-reverse!important}.flex-xxl-grow-0{flex-grow:0!important}.flex-xxl-grow-1{flex-grow:1!important}.flex-xxl-shrink-0{flex-shrink:0!important}.flex-xxl-shrink-1{flex-shrink:1!important}.flex-xxl-wrap{flex-wrap:wrap!important}.flex-xxl-nowrap{flex-wrap:nowrap!important}.flex-xxl-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-xxl-start{justify-content:flex-start!important}.justify-content-xxl-end{justify-content:flex-end!important}.justify-content-xxl-center{justify-content:center!important}.justify-content-xxl-between{justify-content:space-between!important}.justify-content-xxl-around{justify-content:space-around!important}.justify-content-xxl-evenly{justify-content:space-evenly!important}.align-items-xxl-start{align-items:flex-start!important}.align-items-xxl-end{align-items:flex-end!important}.align-items-xxl-center{align-items:center!important}.align-items-xxl-baseline{align-items:baseline!important}.align-items-xxl-stretch{align-items:stretch!important}.align-content-xxl-start{align-content:flex-start!important}.align-content-xxl-end{align-content:flex-end!important}.align-content-xxl-center{align-content:center!important}.align-content-xxl-between{align-content:space-between!important}.align-content-xxl-around{align-content:space-around!important}.align-content-xxl-stretch{align-content:stretch!important}.align-self-xxl-auto{align-self:auto!important}.align-self-xxl-start{align-self:flex-start!important}.align-self-xxl-end{align-self:flex-end!important}.align-self-xxl-center{align-self:center!important}.align-self-xxl-baseline{align-self:baseline!important}.align-self-xxl-stretch{align-self:stretch!important}.order-xxl-first{order:-1!important}.order-xxl-0{order:0!important}.order-xxl-1{order:1!important}.order-xxl-2{order:2!important}.order-xxl-3{order:3!important}.order-xxl-4{order:4!important}.order-xxl-5{order:5!important}.order-xxl-last{order:6!important}.m-xxl-0{margin:0!important}.m-xxl-1{margin:.25rem!important}.m-xxl-2{margin:.5rem!important}.m-xxl-3{margin:1rem!important}.m-xxl-4{margin:1.5rem!important}.m-xxl-5{margin:3rem!important}.m-xxl-auto{margin:auto!important}.mx-xxl-0{margin-right:0!important;margin-left:0!important}.mx-xxl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xxl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xxl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xxl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xxl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xxl-auto{margin-right:auto!important;margin-left:auto!important}.my-xxl-0{margin-top:0!important;margin-bottom:0!important}.my-xxl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xxl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xxl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xxl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xxl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xxl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xxl-0{margin-top:0!important}.mt-xxl-1{margin-top:.25rem!important}.mt-xxl-2{margin-top:.5rem!important}.mt-xxl-3{margin-top:1rem!important}.mt-xxl-4{margin-top:1.5rem!important}.mt-xxl-5{margin-top:3rem!important}.mt-xxl-auto{margin-top:auto!important}.me-xxl-0{margin-right:0!important}.me-xxl-1{margin-right:.25rem!important}.me-xxl-2{margin-right:.5rem!important}.me-xxl-3{margin-right:1rem!important}.me-xxl-4{margin-right:1.5rem!important}.me-xxl-5{margin-right:3rem!important}.me-xxl-auto{margin-right:auto!important}.mb-xxl-0{margin-bottom:0!important}.mb-xxl-1{margin-bottom:.25rem!important}.mb-xxl-2{margin-bottom:.5rem!important}.mb-xxl-3{margin-bottom:1rem!important}.mb-xxl-4{margin-bottom:1.5rem!important}.mb-xxl-5{margin-bottom:3rem!important}.mb-xxl-auto{margin-bottom:auto!important}.ms-xxl-0{margin-left:0!important}.ms-xxl-1{margin-left:.25rem!important}.ms-xxl-2{margin-left:.5rem!important}.ms-xxl-3{margin-left:1rem!important}.ms-xxl-4{margin-left:1.5rem!important}.ms-xxl-5{margin-left:3rem!important}.ms-xxl-auto{margin-left:auto!important}.p-xxl-0{padding:0!important}.p-xxl-1{padding:.25rem!important}.p-xxl-2{padding:.5rem!important}.p-xxl-3{padding:1rem!important}.p-xxl-4{padding:1.5rem!important}.p-xxl-5{padding:3rem!important}.px-xxl-0{padding-right:0!important;padding-left:0!important}.px-xxl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xxl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xxl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xxl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xxl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xxl-0{padding-top:0!important;padding-bottom:0!important}.py-xxl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xxl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xxl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xxl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xxl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xxl-0{padding-top:0!important}.pt-xxl-1{padding-top:.25rem!important}.pt-xxl-2{padding-top:.5rem!important}.pt-xxl-3{padding-top:1rem!important}.pt-xxl-4{padding-top:1.5rem!important}.pt-xxl-5{padding-top:3rem!important}.pe-xxl-0{padding-right:0!important}.pe-xxl-1{padding-right:.25rem!important}.pe-xxl-2{padding-right:.5rem!important}.pe-xxl-3{padding-right:1rem!important}.pe-xxl-4{padding-right:1.5rem!important}.pe-xxl-5{padding-right:3rem!important}.pb-xxl-0{padding-bottom:0!important}.pb-xxl-1{padding-bottom:.25rem!important}.pb-xxl-2{padding-bottom:.5rem!important}.pb-xxl-3{padding-bottom:1rem!important}.pb-xxl-4{padding-bottom:1.5rem!important}.pb-xxl-5{padding-bottom:3rem!important}.ps-xxl-0{padding-left:0!important}.ps-xxl-1{padding-left:.25rem!important}.ps-xxl-2{padding-left:.5rem!important}.ps-xxl-3{padding-left:1rem!important}.ps-xxl-4{padding-left:1.5rem!important}.ps-xxl-5{padding-left:3rem!important}.gap-xxl-0{gap:0!important}.gap-xxl-1{gap:.25rem!important}.gap-xxl-2{gap:.5rem!important}.gap-xxl-3{gap:1rem!important}.gap-xxl-4{gap:1.5rem!important}.gap-xxl-5{gap:3rem!important}.text-xxl-start{text-align:left!important}.text-xxl-end{text-align:right!important}.text-xxl-center{text-align:center!important}}@media (min-width: 1200px){.fs-1{font-size:2.5rem!important}.fs-2{font-size:2rem!important}.fs-3{font-size:1.75rem!important}.fs-4{font-size:1.5rem!important}}@media print{.d-print-inline{display:inline!important}.d-print-inline-block{display:inline-block!important}.d-print-block{display:block!important}.d-print-grid{display:grid!important}.d-print-table{display:table!important}.d-print-table-row{display:table-row!important}.d-print-table-cell{display:table-cell!important}.d-print-flex{display:flex!important}.d-print-inline-flex{display:inline-flex!important}.d-print-none{display:none!important}}:root{--bg-color: #edf2f7;--rstudio-blue-h: 209;--rstudio-blue-s: 59%;--rstudio-blue-l: 66%;--rstudio-blue-hsl: var(--rstudio-blue-h) var(--rstudio-blue-s) var(--rstudio-blue-l);--rstudio-blue: hsl(var(--rstudio-blue-hsl));--rstudio-blue-transparent: hsl(var(--rstudio-blue-hsl) / .5);--rstudio-grey-h: 0;--rstudio-grey-s: 0%;--rstudio-grey-l: 25%;--rstudio-grey-hsl: var(--rstudio-grey-h) var(--rstudio-grey-s) var(--rstudio-grey-l);--rstudio-grey: hsl(var(--rstudio-grey-hsl));--rstudio-grey-transparent: hsl(var(--rstudio-grey-hsl) / .5);--rstudio-white-h: 0;--rstudio-white-s: 0%;--rstudio-white-l: 100%;--rstudio-white-hsl: var(--rstudio-white-h) var(--rstudio-white-s) var(--rstudio-white-l);--rstudio-white: hsl(var(--rstudio-white-hsl));--rstudio-white-transparent: hsl(var(--rstudio-white-hsl) / .9);--grey: hsl(211 19% 70%);--light-grey: #e9edf3;--dark-grey: hsl(211 19% 50%);--divider-color: #a5b3c2;--icon-color: #76838f;--background-grey: var(--light-grey);--header-grey: var(--grey);--red: rgb(250, 83, 22);--font-color: hsl(214 9% 15%);--font-color-disabled: hsl(214 9% 15% / .5);--font-size: 13px;--selected-outline-color: var(--rstudio-blue);--selected-outline-width: 3px;--selected-outline: var(--selected-outline-width) solid var(--selected-outline-color);--outline-color: var(--grey);--disabled-color: hsl(var(--rstudio-grey-hsl) / .5);--disabled-outline: 1px solid hsl(var(--rstudio-grey-hsl) / .15);--corner-radius: 8px;--vertical-spacing: 10px;--horizontal-spacing: 15px;--animation-speed: .2s;--animation-curve: ease-in-out;--outline: 1px solid var(--outline-color);--input-height: 23px;--input-vertical-padding: 1px;--input-horizontal-padding: 5px;--fonts: "Lucida Sans", "DejaVu Sans", "Lucida Grande", "Segoe UI", -apple-system, BlinkMacSystemFont, Verdana, Helvetica, sans-serif;--mono-fonts: Consolas, "Lucida Console", Monaco, monospace;--shadow-color: 0deg 0% 13%;--shadow-elevation-medium: .3px .5px .7px hsl(var(--shadow-color) / .36), .8px 1.6px 2px -.8px hsl(var(--shadow-color) / .36), 2.1px 4.1px 5.2px -1.7px hsl(var(--shadow-color) / .36), 5px 10px 12.6px -2.5px hsl(var(--shadow-color) / .36)}*{box-sizing:border-box}html{height:100%}body{overflow:hidden}body,input{font-family:var(--fonts);line-height:1.5;color:var(--font-color);margin:0;font-size:var(--font-size)}input{height:var(--input-height)}h1,h2,h3{margin:0;color:var(--rstudio-grey)}.disable-text-selection *{user-select:none}button{border:none;background:none;cursor:pointer}h1,h2,h3{font-weight:unset;line-height:unset}code{color:unset;font-family:unset;font-size:unset}dialog::backdrop{backdrop-filter:blur(2px)}[data-is-selected-node=true]{position:relative}[data-is-selected-node=true]:before{content:"";position:absolute;inset:0;outline:var(--selected-outline);pointer-events:none;border-radius:inherit}.can-accept-drop{--start-opacity: .1;--end-opacity: .5;position:relative;background-color:var(--red);opacity:.2;animation-duration:3s;animation-name:pulse;animation-timing-function:ease-in-out;animation-iteration-count:infinite}.can-accept-drop:after{content:"";position:absolute;inset:0;text-align:center;display:grid;place-content:center;overflow:hidden;color:var(--rstudio-white)}@keyframes pulse{0%{opacity:var(--start-opacity)}50%{opacity:var(--end-opacity)}to{opacity:var(--start-opacity)}}div.can-accept-drop.hovering-over{--start-opacity: 1;--end-opacity: 1;z-index:10}div.can-accept-drop.hovering-over:after{content:"release to add"}.dtDTOutput{position:relative;height:100%;width:100%;padding:14px}.dtDTOutput .faux-table{border-radius:var(--corner-radius);outline:1px solid var(--rstudio-grey);overflow:hidden;height:var(--table-h, 100%);width:var(--table-w, 100%);position:relative}.dtDTOutput .faux-table .faux-header{background-color:#d3dbe9;padding:5px}.dtDTOutput .faux-table .faux-table-body{overflow:hidden;display:flex;flex-direction:column;height:100%}.dtDTOutput .faux-table .faux-table-body .faux-row{flex-basis:18px;flex-grow:1;flex-shrink:0;display:flex;flex-direction:row;--spacing: 2px;gap:var(--spacing);margin-block-start:var(--spacing)}.dtDTOutput .faux-table .faux-table-body .faux-row .faux-cell{flex:1;background-color:var(--cell-color, pink);outline:1px solid white;color:transparent}.dtDTOutput .faux-table .faux-table-body .faux-row:nth-child(even){--cell-color: #d3dbe9}.dtDTOutput .faux-table .faux-table-body .faux-row:nth-child(odd){--cell-color: hsl(218deg, 33%, 97%)}.NumberInput{--increment-btn-w: 20px;height:var(--input-height);width:100%;position:relative}.NumberInput input{width:100%;-moz-appearance:textfield;padding-inline-end:var(--increment-btn-w)}.NumberInput input::-webkit-inner-spin-button,.NumberInput input::-webkit-outer-spin-button{-webkit-appearance:none}.NumberInput .incrementer-buttons{position:absolute;inset-block:0;inset-inline-end:0;display:inline-grid;grid-template-areas:"up " "down";grid-template-rows:50% 50%}.NumberInput .incrementer-buttons .up-button,.NumberInput .incrementer-buttons .down-button{position:relative;--shift-to-center: 2px;width:var(--increment-btn-w);font-size:10px}.NumberInput .incrementer-buttons .up-button svg,.NumberInput .incrementer-buttons .down-button svg{display:block;position:absolute;inset-inline-end:6px;inset-block:0px}.NumberInput .incrementer-buttons .up-button{grid-area:up;translate:0px var(--shift-to-center)}.NumberInput .incrementer-buttons .down-button{translate:0px calc(-1 * var(--shift-to-center));grid-area:down}.NumberInput[aria-disabled=true]{cursor:default}.NumberInput[aria-disabled=true] .incrementer-buttons{display:none}.NumberInput[aria-disabled=true] input[type=number]{color:transparent;cursor:inherit}:root{--balloon-border-radius: 2px;--balloon-color: rgba(16,16,16,.95);--balloon-text-color: #fff;--balloon-font-size: 12px;--balloon-move: 4px}button[aria-label][data-balloon-pos]{overflow:visible}[aria-label][data-balloon-pos]{position:relative;cursor:pointer}[aria-label][data-balloon-pos]:after{opacity:0;pointer-events:none;transition:all .18s ease-out .18s;text-indent:0;font-family:-apple-system,BlinkMacSystemFont,Segoe UI,Roboto,Oxygen,Ubuntu,Cantarell,Open Sans,Helvetica Neue,sans-serif;font-weight:400;font-style:normal;text-shadow:none;font-size:var(--balloon-font-size);background:var(--balloon-color);border-radius:2px;color:var(--balloon-text-color);border-radius:var(--balloon-border-radius);content:attr(aria-label);padding:.5em 1em;position:absolute;white-space:nowrap;z-index:10}[aria-label][data-balloon-pos]:before{width:0;height:0;border:5px solid transparent;border-top-color:var(--balloon-color);opacity:0;pointer-events:none;transition:all .18s ease-out .18s;content:"";position:absolute;z-index:10}[aria-label][data-balloon-pos]:hover:before,[aria-label][data-balloon-pos]:hover:after,[aria-label][data-balloon-pos][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-visible]:after,[aria-label][data-balloon-pos]:not([data-balloon-nofocus]):focus:before,[aria-label][data-balloon-pos]:not([data-balloon-nofocus]):focus:after{opacity:1;pointer-events:none}[aria-label][data-balloon-pos].font-awesome:after{font-family:FontAwesome,-apple-system,BlinkMacSystemFont,Segoe UI,Roboto,Oxygen,Ubuntu,Cantarell,Open Sans,Helvetica Neue,sans-serif}[aria-label][data-balloon-pos][data-balloon-break]:after{white-space:pre}[aria-label][data-balloon-pos][data-balloon-break][data-balloon-length]:after{white-space:pre-line;word-break:break-word}[aria-label][data-balloon-pos][data-balloon-blunt]:before,[aria-label][data-balloon-pos][data-balloon-blunt]:after{transition:none}[aria-label][data-balloon-pos][data-balloon-pos=up]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=up][data-balloon-visible]:after,[aria-label][data-balloon-pos][data-balloon-pos=down]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=down][data-balloon-visible]:after{transform:translate(-50%)}[aria-label][data-balloon-pos][data-balloon-pos=up]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=up][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-pos=down]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=down][data-balloon-visible]:before{transform:translate(-50%)}[aria-label][data-balloon-pos][data-balloon-pos*=-left]:after{left:0}[aria-label][data-balloon-pos][data-balloon-pos*=-left]:before{left:5px}[aria-label][data-balloon-pos][data-balloon-pos*=-right]:after{right:0}[aria-label][data-balloon-pos][data-balloon-pos*=-right]:before{right:5px}[aria-label][data-balloon-pos][data-balloon-po*=-left]:hover:after,[aria-label][data-balloon-pos][data-balloon-po*=-left][data-balloon-visible]:after,[aria-label][data-balloon-pos][data-balloon-pos*=-right]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos*=-right][data-balloon-visible]:after{transform:translate(0)}[aria-label][data-balloon-pos][data-balloon-po*=-left]:hover:before,[aria-label][data-balloon-pos][data-balloon-po*=-left][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-pos*=-right]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos*=-right][data-balloon-visible]:before{transform:translate(0)}[aria-label][data-balloon-pos][data-balloon-pos^=up]:before,[aria-label][data-balloon-pos][data-balloon-pos^=up]:after{bottom:100%;transform-origin:top;transform:translateY(var(--balloon-move))}[aria-label][data-balloon-pos][data-balloon-pos^=up]:after{margin-bottom:10px}[aria-label][data-balloon-pos][data-balloon-pos=up]:before,[aria-label][data-balloon-pos][data-balloon-pos=up]:after{left:50%;transform:translate(-50%,var(--balloon-move))}[aria-label][data-balloon-pos][data-balloon-pos^=down]:before,[aria-label][data-balloon-pos][data-balloon-pos^=down]:after{top:100%;transform:translateY(calc(var(--balloon-move) * -1))}[aria-label][data-balloon-pos][data-balloon-pos^=down]:after{margin-top:10px}[aria-label][data-balloon-pos][data-balloon-pos^=down]:before{width:0;height:0;border:5px solid transparent;border-bottom-color:var(--balloon-color)}[aria-label][data-balloon-pos][data-balloon-pos=down]:after,[aria-label][data-balloon-pos][data-balloon-pos=down]:before{left:50%;transform:translate(-50%,calc(var(--balloon-move) * -1))}[aria-label][data-balloon-pos][data-balloon-pos=left]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=left][data-balloon-visible]:after,[aria-label][data-balloon-pos][data-balloon-pos=right]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=right][data-balloon-visible]:after{transform:translateY(-50%)}[aria-label][data-balloon-pos][data-balloon-pos=left]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=left][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-pos=right]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=right][data-balloon-visible]:before{transform:translateY(-50%)}[aria-label][data-balloon-pos][data-balloon-pos=left]:after,[aria-label][data-balloon-pos][data-balloon-pos=left]:before{right:100%;top:50%;transform:translate(var(--balloon-move),-50%)}[aria-label][data-balloon-pos][data-balloon-pos=left]:after{margin-right:10px}[aria-label][data-balloon-pos][data-balloon-pos=left]:before{width:0;height:0;border:5px solid transparent;border-left-color:var(--balloon-color)}[aria-label][data-balloon-pos][data-balloon-pos=right]:after,[aria-label][data-balloon-pos][data-balloon-pos=right]:before{left:100%;top:50%;transform:translate(calc(var(--balloon-move) * -1),-50%)}[aria-label][data-balloon-pos][data-balloon-pos=right]:after{margin-left:10px}[aria-label][data-balloon-pos][data-balloon-pos=right]:before{width:0;height:0;border:5px solid transparent;border-right-color:var(--balloon-color)}[aria-label][data-balloon-pos][data-balloon-length]:after{white-space:normal}[aria-label][data-balloon-pos][data-balloon-length=small]:after{width:80px}[aria-label][data-balloon-pos][data-balloon-length=medium]:after{width:150px}[aria-label][data-balloon-pos][data-balloon-length=large]:after{width:260px}[aria-label][data-balloon-pos][data-balloon-length=xlarge]:after{width:380px}@media screen and (max-width: 768px){[aria-label][data-balloon-pos][data-balloon-length=xlarge]:after{width:90vw}}[aria-label][data-balloon-pos][data-balloon-length=fit]:after{width:100%}.EditorSkeleton{--header-height: 31px;--padding: var(--horizontal-spacing);width:100%;display:grid;grid-template-columns:auto 1fr auto;grid-template-rows:1fr auto;grid-template-areas:"elements editor properties" "elements editor preview"}.EditorSkeleton .app-view{grid-area:editor;z-index:2;background-color:var(--rstudio-white);padding:32px;height:100%;width:100%;position:relative}.EditorSkeleton .elements-panel{grid-area:elements;z-index:3}.EditorSkeleton .properties-panel{grid-area:properties;z-index:4}.EditorSkeleton .app-preview{grid-area:preview;z-index:5}.EditorSkeleton .properties-panel,.EditorSkeleton .app-preview{max-width:var(--properties-panel-width);width:var(--properties-panel-width)}.EditorSkeleton .properties-panel:empty,.EditorSkeleton .app-preview:empty{display:none}.EditorSkeleton>div{outline:1px solid var(--header-grey);min-width:0;min-height:0;isolation:isolate}.EditorSkeleton .panel{display:grid;grid-template-rows:var(--header-height) 1fr;background-color:var(--background-grey);isolation:isolate}.EditorSkeleton .panel>*{min-width:0}.EditorSkeleton .panel .panel-title{text-align:center;line-height:var(--header-height);background-color:var(--header-grey);font-size:1.05rem;font-weight:lighter;color:var(--rstudio-white)}.SUE-SettingsInput{display:block;margin-block:var(--vertical-spacing-top) var(--vertical-spacing-bottom);width:100%;max-width:100%;padding-inline:2px}.SUE-SettingsInput .info{display:flex;gap:5px;margin-bottom:4px;height:20px}.SUE-SettingsInput .info input[type=checkbox]{translate:0px -1px}.SUE-SettingsInput [data-unset=true]{color:var(--disabled-color)}.SUE-SettingsInput input,.SUE-SettingsInput .unset-input{display:block}.SUE-SettingsInput .missing-required-argument-message{color:var(--red, orangered)}.SUE-SettingsInput .mismatched-argument-types{color:var(--dark-grey, pink)}.SUE-SettingsInput .unset-argument{color:var(--dark-grey, pink);text-align:center;background-color:var(--rstudio-white);opacity:.7}.SUE-SettingsInput .SUE-Input{width:100%}.SUE-SettingsInput label:after{content:":"}.OptionsDropdown{border-radius:var(--corner-radius);padding:2px 5px;width:100%}.container{position:relative;height:100%;width:100%}.PlotPlaceholder{container-type:size;height:100%}.PlotPlaceholder .plot{padding:5px;--x-axis-padding: 4px;--y-axis-padding: 7px;--axis-color: var(--grey);--axis-border: 2px solid var(--axis-color);--x-axis-border: var(--axis-border);--y-axis-border: var(--axis-border);--main-color: var(--rstudio-blue);--hover-color: hsl( var(--rstudio-blue-h) var(--rstudio-blue-s) calc(var(--rstudio-blue-l) * .8) );--bar-spacing: 5px;--bar-roundness: 5px;display:flex;flex-direction:column;height:100%}.PlotPlaceholder .plot .title{padding-block:5px;padding-inline:10px;display:grid;align-items:center}.PlotPlaceholder .plot .title:empty{display:none}.PlotPlaceholder .plot .plot-body{flex:1;display:flex;overflow:hidden;gap:var(--bar-spacing);align-items:flex-end;padding-inline-start:var(--y-axis-padding);padding-block-end:var(--x-axis-padding);border-left:var(--y-axis-border);border-bottom:var(--x-axis-border)}.PlotPlaceholder .plot .bar{flex:1;background-color:var(--main-color);height:var(--value, "50%");border-radius:var(--bar-roundness)}.PlotPlaceholder .plot .bar:nth-child(n+8){display:none}.PlotPlaceholder .plot .bar:hover{background-color:var(--hover-color)}@container (max-width: 180px){.PlotPlaceholder .plot .bar:nth-child(n+6){display:none}}@container (min-width: 350px){.PlotPlaceholder .plot .bar:nth-child(n){display:block}}@container (max-height: 175px){.PlotPlaceholder .plot .plot-body{--y-axis-border: none;--y-axis-padding: 0}}.plotlyPlotlyOutput{position:relative;height:100%;width:100%}.plotlyPlotlyOutput .title-bar{display:flex;flex-wrap:wrap;justify-content:space-between}.plotlyPlotlyOutput .plotly-name{color:var(--rstudio-blue)}.unknown-ui-function-display{--gap: 10px;width:calc(100% - var(--gap));margin:auto;height:min(100% - var(--gap),75px);padding:4px;background-color:var(--light-grey);border-radius:var(--corner-radius);position:relative;display:grid;place-content:center}.unknown-ui-function-settings .info-msg svg{color:var(--rstudio-blue);margin-right:4px;margin-bottom:-2px}.unknown-ui-function-settings .code-holder{overflow:auto;font-family:var(--mono-fonts);border:1px solid var(--rstudio-grey);background-color:var(--rstudio-white);padding:5px}.AppTemplatePreview{overflow:hidden;isolation:isolate}.AppTemplatePreview .template-container{position:relative;width:var(--full-w, 100px);height:var(--full-h, 100px);transform:scale(var(--shrink-ratio, .5));transform-origin:top left}.AppTemplatePreview .template-container:after{content:"";position:absolute;inset:0;pointer-events:all}.AppTemplateCard{--outline-color: #caced3;--outline-thickness: 1px;--footer-color: #e9edf3;--padding: var(--card-pad, 5px);cursor:pointer;outline:var(--outline-thickness) solid var(--outline-color);width:--moz-fit-content;width:fit-content;border-radius:var(--corner-radius)}.AppTemplateCard>*{padding:var(--padding)}.AppTemplateCard footer{background-color:var(--footer-color);height:calc(40px - 2 * var(--padding));display:flex;align-items:center;justify-content:space-between;border-radius:0 0 var(--corner-radius) var(--corner-radius)}.AppTemplateCard footer .layout-icon{display:block;width:42px;translate:6px 2px}.AppTemplateCard footer .layout-icon[data-type=navbarPage]{width:42px;translate:6px 1px}.AppTemplateCard[data-selected=true]{--outline-thickness: 4px;--outline-color: var(--rstudio-blue)}.TemplatePreviewGrid{display:grid;gap:53px 44px;grid-template-columns:repeat(auto-fit,var(--card-w));justify-content:center}.TemplatePreviewGrid.empty-results{height:100%;place-content:center;color:var(--red);grid-template-columns:unset;font-size:1.1rem}.TemplateChooserSidebar{width:218px;padding-block:18px;padding-inline:15px;display:flex;flex-direction:column;gap:32px}.TemplateChooserSidebar button{--inset: 5px;margin-top:auto;width:calc(100% - 2 * var(--inset));background-color:var(--rstudio-blue);color:var(--rstudio-white)}.TemplateChooserSidebar button:disabled{background-color:var(--grey);border-color:var(--grey)}.TemplateChooserSidebar legend{font-size:var(--font-size, 1rem);margin:0}.TemplateFiltersForm .layout-options{display:flex;justify-content:space-around}.labeled-form-option{display:flex;align-items:center;gap:3px}.FormBuilder{--vertical-spacing-top: 12px;--vertical-spacing-bottom: 14px}.FormBuilder .grouped-inputs{display:grid;grid-template-columns:repeat(2,1fr);row-gap:var(--vertical-spacing-bottom);padding-block:var(--vertical-spacing-top) var(--vertical-spacing-bottom)}.FormBuilder .grouped-inputs *{margin-block:0}input{padding:var(--input-vertical-padding) var(--input-horizontal-padding);border:1px solid var(--light-grey);border-radius:var(--corner-radius)}.unknown-arguments-list .unknown-form-fields{padding-inline:3px 0;padding-block:5px 0;font-family:var(--mono-fonts)}.unknown-arguments-list .unknown-form-fields button{color:var(--red, orangered)}.unknown-arguments-list .unknown-form-fields .unknown-argument{margin-block:2px;display:flex;align-items:center;width:100%}.unknown-arguments-list .unknown-form-fields .unknown-argument button{background:transparent}.LabeledInputCategory{margin-block-end:18px}.divider-line{display:block;position:relative;isolation:isolate;display:flex}.divider-line>*{background-color:var(--light-grey)}.divider-line:before{content:"";position:absolute;top:50%;left:0;width:100%;height:1px;background-color:var(--divider-color);z-index:-1;opacity:.5}.EditorContainer{--header-height: 31px;--padding: var(--horizontal-spacing);background-color:var(--background-grey, #edf2f7);height:100%;width:100%}.EditorContainer header{height:var(--header-height);gap:var(--padding);display:flex;justify-content:flex-start;align-items:center}.EditorContainer header button{padding:0}.EditorContainer header .right{margin-left:auto;display:flex;align-items:center;justify-content:end}.EditorContainer header .right .react-joyride{display:none}.EditorContainer header .right .undo-redo-buttons{transform:translate(-1px,-1px)}.EditorContainer header .right .spacer{height:20px}.EditorContainer header .right .spacer.last{width:58px}.EditorContainer header .right .divider{margin-inline-end:12px;margin-inline-start:14px}.EditorContainer header .shiny-logo{display:inline-block;height:100%;border-radius:0 15px 15px 0;padding-block:3px;padding-inline:5px;background-color:var(--rstudio-blue)}.EditorContainer header .app-title{font-size:1.15rem;color:var(--rstudio-blue)}.EditorContainer header .divider{height:20px;background-color:var(--divider-color);width:2px}.EditorContainer header .OpenSideBySideWindowButton{background-color:transparent;font-size:18px;color:var(--icon-color);margin-inline:7px}.EditorContainer header .OpenSideBySideWindowButton+.divider{margin-inline-end:3px;margin-inline-start:6px}.EditorContainer .EditorSkeleton{height:calc(100% - var(--header-height))}.EditorContainer .message-mode{background-color:#fff;border-radius:var(--corner-radius);border:var(--outline);width:min(95%,600px);padding:25px;margin-inline:auto}.EditorContainer .message-mode>h2{font-size:24px;margin-block-end:18px}.EditorContainer .message-mode>p{margin:0;padding:0}.EditorContainer .message-mode .error-msg{color:var(--red);font-family:var(--mono-fonts)} +@charset "UTF-8";:root{--bs-blue: #0d6efd;--bs-indigo: #6610f2;--bs-purple: #6f42c1;--bs-pink: #d63384;--bs-red: #dc3545;--bs-orange: #fd7e14;--bs-yellow: #ffc107;--bs-green: #198754;--bs-teal: #20c997;--bs-cyan: #0dcaf0;--bs-black: #000;--bs-white: #fff;--bs-gray: #6c757d;--bs-gray-dark: #343a40;--bs-gray-100: #f8f9fa;--bs-gray-200: #e9ecef;--bs-gray-300: #dee2e6;--bs-gray-400: #ced4da;--bs-gray-500: #adb5bd;--bs-gray-600: #6c757d;--bs-gray-700: #495057;--bs-gray-800: #343a40;--bs-gray-900: #212529;--bs-primary: #0d6efd;--bs-secondary: #6c757d;--bs-success: #198754;--bs-info: #0dcaf0;--bs-warning: #ffc107;--bs-danger: #dc3545;--bs-light: #f8f9fa;--bs-dark: #212529;--bs-primary-rgb: 13, 110, 253;--bs-secondary-rgb: 108, 117, 125;--bs-success-rgb: 25, 135, 84;--bs-info-rgb: 13, 202, 240;--bs-warning-rgb: 255, 193, 7;--bs-danger-rgb: 220, 53, 69;--bs-light-rgb: 248, 249, 250;--bs-dark-rgb: 33, 37, 41;--bs-white-rgb: 255, 255, 255;--bs-black-rgb: 0, 0, 0;--bs-body-color-rgb: 33, 37, 41;--bs-body-bg-rgb: 255, 255, 255;--bs-font-sans-serif: system-ui, -apple-system, "Segoe UI", Roboto, "Helvetica Neue", "Noto Sans", "Liberation Sans", Arial, sans-serif, "Apple Color Emoji", "Segoe UI Emoji", "Segoe UI Symbol", "Noto Color Emoji";--bs-font-monospace: SFMono-Regular, Menlo, Monaco, Consolas, "Liberation Mono", "Courier New", monospace;--bs-gradient: linear-gradient(180deg, rgba(255, 255, 255, .15), rgba(255, 255, 255, 0));--bs-body-font-family: var(--bs-font-sans-serif);--bs-body-font-size: 1rem;--bs-body-font-weight: 400;--bs-body-line-height: 1.5;--bs-body-color: #212529;--bs-body-bg: #fff;--bs-border-width: 1px;--bs-border-style: solid;--bs-border-color: #dee2e6;--bs-border-color-translucent: rgba(0, 0, 0, .175);--bs-border-radius: .375rem;--bs-border-radius-sm: .25rem;--bs-border-radius-lg: .5rem;--bs-border-radius-xl: 1rem;--bs-border-radius-2xl: 2rem;--bs-border-radius-pill: 50rem;--bs-link-color: #0d6efd;--bs-link-hover-color: #0a58ca;--bs-code-color: #d63384;--bs-highlight-bg: #fff3cd}*,*:before,*:after{box-sizing:border-box}@media (prefers-reduced-motion: no-preference){:root{scroll-behavior:smooth}}body{margin:0;font-family:var(--bs-body-font-family);font-size:var(--bs-body-font-size);font-weight:var(--bs-body-font-weight);line-height:var(--bs-body-line-height);color:var(--bs-body-color);text-align:var(--bs-body-text-align);background-color:var(--bs-body-bg);-webkit-text-size-adjust:100%;-webkit-tap-highlight-color:rgba(0,0,0,0)}hr{margin:1rem 0;color:inherit;border:0;border-top:1px solid;opacity:.25}h6,.h6,h5,.h5,h4,.h4,h3,.h3,h2,.h2,h1,.h1{margin-top:0;margin-bottom:.5rem;font-weight:500;line-height:1.2}h1,.h1{font-size:calc(1.375rem + 1.5vw)}@media (min-width: 1200px){h1,.h1{font-size:2.5rem}}h2,.h2{font-size:calc(1.325rem + .9vw)}@media (min-width: 1200px){h2,.h2{font-size:2rem}}h3,.h3{font-size:calc(1.3rem + .6vw)}@media (min-width: 1200px){h3,.h3{font-size:1.75rem}}h4,.h4{font-size:calc(1.275rem + .3vw)}@media (min-width: 1200px){h4,.h4{font-size:1.5rem}}h5,.h5{font-size:1.25rem}h6,.h6{font-size:1rem}p{margin-top:0;margin-bottom:1rem}abbr[title]{-webkit-text-decoration:underline dotted;text-decoration:underline dotted;cursor:help;-webkit-text-decoration-skip-ink:none;text-decoration-skip-ink:none}address{margin-bottom:1rem;font-style:normal;line-height:inherit}ol,ul{padding-left:2rem}ol,ul,dl{margin-top:0;margin-bottom:1rem}ol ol,ul ul,ol ul,ul ol{margin-bottom:0}dt{font-weight:700}dd{margin-bottom:.5rem;margin-left:0}blockquote{margin:0 0 1rem}b,strong{font-weight:bolder}small,.small{font-size:.875em}mark,.mark{padding:.1875em;background-color:var(--bs-highlight-bg)}sub,sup{position:relative;font-size:.75em;line-height:0;vertical-align:baseline}sub{bottom:-.25em}sup{top:-.5em}a{color:var(--bs-link-color);text-decoration:underline}a:hover{color:var(--bs-link-hover-color)}a:not([href]):not([class]),a:not([href]):not([class]):hover{color:inherit;text-decoration:none}pre,code,kbd,samp{font-family:var(--bs-font-monospace);font-size:1em}pre{display:block;margin-top:0;margin-bottom:1rem;overflow:auto;font-size:.875em}pre code{font-size:inherit;color:inherit;word-break:normal}code{font-size:.875em;color:var(--bs-code-color);word-wrap:break-word}a>code{color:inherit}kbd{padding:.1875rem .375rem;font-size:.875em;color:var(--bs-body-bg);background-color:var(--bs-body-color);border-radius:.25rem}kbd kbd{padding:0;font-size:1em}figure{margin:0 0 1rem}img,svg{vertical-align:middle}table{caption-side:bottom;border-collapse:collapse}caption{padding-top:.5rem;padding-bottom:.5rem;color:#6c757d;text-align:left}th{text-align:inherit;text-align:-webkit-match-parent}thead,tbody,tfoot,tr,td,th{border-color:inherit;border-style:solid;border-width:0}label{display:inline-block}button{border-radius:0}button:focus:not(:focus-visible){outline:0}input,button,select,optgroup,textarea{margin:0;font-family:inherit;font-size:inherit;line-height:inherit}button,select{text-transform:none}[role=button]{cursor:pointer}select{word-wrap:normal}select:disabled{opacity:1}[list]:not([type=date]):not([type=datetime-local]):not([type=month]):not([type=week]):not([type=time])::-webkit-calendar-picker-indicator{display:none!important}button,[type=button],[type=reset],[type=submit]{-webkit-appearance:button}button:not(:disabled),[type=button]:not(:disabled),[type=reset]:not(:disabled),[type=submit]:not(:disabled){cursor:pointer}::-moz-focus-inner{padding:0;border-style:none}textarea{resize:vertical}fieldset{min-width:0;padding:0;margin:0;border:0}legend{float:left;width:100%;padding:0;margin-bottom:.5rem;font-size:calc(1.275rem + .3vw);line-height:inherit}@media (min-width: 1200px){legend{font-size:1.5rem}}legend+*{clear:left}::-webkit-datetime-edit-fields-wrapper,::-webkit-datetime-edit-text,::-webkit-datetime-edit-minute,::-webkit-datetime-edit-hour-field,::-webkit-datetime-edit-day-field,::-webkit-datetime-edit-month-field,::-webkit-datetime-edit-year-field{padding:0}::-webkit-inner-spin-button{height:auto}[type=search]{outline-offset:-2px;-webkit-appearance:textfield}::-webkit-search-decoration{-webkit-appearance:none}::-webkit-color-swatch-wrapper{padding:0}::-webkit-file-upload-button{font:inherit;-webkit-appearance:button}::file-selector-button{font:inherit;-webkit-appearance:button}output{display:inline-block}iframe{border:0}summary{display:list-item;cursor:pointer}progress{vertical-align:baseline}[hidden]{display:none!important}.lead{font-size:1.25rem;font-weight:300}.display-1{font-size:calc(1.625rem + 4.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-1{font-size:5rem}}.display-2{font-size:calc(1.575rem + 3.9vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-2{font-size:4.5rem}}.display-3{font-size:calc(1.525rem + 3.3vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-3{font-size:4rem}}.display-4{font-size:calc(1.475rem + 2.7vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-4{font-size:3.5rem}}.display-5{font-size:calc(1.425rem + 2.1vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-5{font-size:3rem}}.display-6{font-size:calc(1.375rem + 1.5vw);font-weight:300;line-height:1.2}@media (min-width: 1200px){.display-6{font-size:2.5rem}}.list-unstyled,.list-inline{padding-left:0;list-style:none}.list-inline-item{display:inline-block}.list-inline-item:not(:last-child){margin-right:.5rem}.initialism{font-size:.875em;text-transform:uppercase}.blockquote{margin-bottom:1rem;font-size:1.25rem}.blockquote>:last-child{margin-bottom:0}.blockquote-footer{margin-top:-1rem;margin-bottom:1rem;font-size:.875em;color:#6c757d}.blockquote-footer:before{content:"\2014\a0"}.img-fluid{max-width:100%;height:auto}.img-thumbnail{padding:.25rem;background-color:#fff;border:1px solid var(--bs-border-color);border-radius:.375rem;max-width:100%;height:auto}.figure{display:inline-block}.figure-img{margin-bottom:.5rem;line-height:1}.figure-caption{font-size:.875em;color:#6c757d}.container,.container-fluid,.container-xxl,.container-xl,.container-lg,.container-md,.container-sm{--bs-gutter-x: 1.5rem;--bs-gutter-y: 0;width:100%;padding-right:calc(var(--bs-gutter-x) * .5);padding-left:calc(var(--bs-gutter-x) * .5);margin-right:auto;margin-left:auto}@media (min-width: 576px){.container-sm,.container{max-width:540px}}@media (min-width: 768px){.container-md,.container-sm,.container{max-width:720px}}@media (min-width: 992px){.container-lg,.container-md,.container-sm,.container{max-width:960px}}@media (min-width: 1200px){.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1140px}}@media (min-width: 1400px){.container-xxl,.container-xl,.container-lg,.container-md,.container-sm,.container{max-width:1320px}}.row{--bs-gutter-x: 1.5rem;--bs-gutter-y: 0;display:flex;flex-wrap:wrap;margin-top:calc(-1 * var(--bs-gutter-y));margin-right:calc(-.5 * var(--bs-gutter-x));margin-left:calc(-.5 * var(--bs-gutter-x))}.row>*{flex-shrink:0;width:100%;max-width:100%;padding-right:calc(var(--bs-gutter-x) * .5);padding-left:calc(var(--bs-gutter-x) * .5);margin-top:var(--bs-gutter-y)}.col{flex:1 0 0%}.row-cols-auto>*{flex:0 0 auto;width:auto}.row-cols-1>*{flex:0 0 auto;width:100%}.row-cols-2>*{flex:0 0 auto;width:50%}.row-cols-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-4>*{flex:0 0 auto;width:25%}.row-cols-5>*{flex:0 0 auto;width:20%}.row-cols-6>*{flex:0 0 auto;width:16.6666666667%}.col-auto{flex:0 0 auto;width:auto}.col-1{flex:0 0 auto;width:8.33333333%}.col-2{flex:0 0 auto;width:16.66666667%}.col-3{flex:0 0 auto;width:25%}.col-4{flex:0 0 auto;width:33.33333333%}.col-5{flex:0 0 auto;width:41.66666667%}.col-6{flex:0 0 auto;width:50%}.col-7{flex:0 0 auto;width:58.33333333%}.col-8{flex:0 0 auto;width:66.66666667%}.col-9{flex:0 0 auto;width:75%}.col-10{flex:0 0 auto;width:83.33333333%}.col-11{flex:0 0 auto;width:91.66666667%}.col-12{flex:0 0 auto;width:100%}.offset-1{margin-left:8.33333333%}.offset-2{margin-left:16.66666667%}.offset-3{margin-left:25%}.offset-4{margin-left:33.33333333%}.offset-5{margin-left:41.66666667%}.offset-6{margin-left:50%}.offset-7{margin-left:58.33333333%}.offset-8{margin-left:66.66666667%}.offset-9{margin-left:75%}.offset-10{margin-left:83.33333333%}.offset-11{margin-left:91.66666667%}.g-0,.gx-0{--bs-gutter-x: 0}.g-0,.gy-0{--bs-gutter-y: 0}.g-1,.gx-1{--bs-gutter-x: .25rem}.g-1,.gy-1{--bs-gutter-y: .25rem}.g-2,.gx-2{--bs-gutter-x: .5rem}.g-2,.gy-2{--bs-gutter-y: .5rem}.g-3,.gx-3{--bs-gutter-x: 1rem}.g-3,.gy-3{--bs-gutter-y: 1rem}.g-4,.gx-4{--bs-gutter-x: 1.5rem}.g-4,.gy-4{--bs-gutter-y: 1.5rem}.g-5,.gx-5{--bs-gutter-x: 3rem}.g-5,.gy-5{--bs-gutter-y: 3rem}@media (min-width: 576px){.col-sm{flex:1 0 0%}.row-cols-sm-auto>*{flex:0 0 auto;width:auto}.row-cols-sm-1>*{flex:0 0 auto;width:100%}.row-cols-sm-2>*{flex:0 0 auto;width:50%}.row-cols-sm-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-sm-4>*{flex:0 0 auto;width:25%}.row-cols-sm-5>*{flex:0 0 auto;width:20%}.row-cols-sm-6>*{flex:0 0 auto;width:16.6666666667%}.col-sm-auto{flex:0 0 auto;width:auto}.col-sm-1{flex:0 0 auto;width:8.33333333%}.col-sm-2{flex:0 0 auto;width:16.66666667%}.col-sm-3{flex:0 0 auto;width:25%}.col-sm-4{flex:0 0 auto;width:33.33333333%}.col-sm-5{flex:0 0 auto;width:41.66666667%}.col-sm-6{flex:0 0 auto;width:50%}.col-sm-7{flex:0 0 auto;width:58.33333333%}.col-sm-8{flex:0 0 auto;width:66.66666667%}.col-sm-9{flex:0 0 auto;width:75%}.col-sm-10{flex:0 0 auto;width:83.33333333%}.col-sm-11{flex:0 0 auto;width:91.66666667%}.col-sm-12{flex:0 0 auto;width:100%}.offset-sm-0{margin-left:0}.offset-sm-1{margin-left:8.33333333%}.offset-sm-2{margin-left:16.66666667%}.offset-sm-3{margin-left:25%}.offset-sm-4{margin-left:33.33333333%}.offset-sm-5{margin-left:41.66666667%}.offset-sm-6{margin-left:50%}.offset-sm-7{margin-left:58.33333333%}.offset-sm-8{margin-left:66.66666667%}.offset-sm-9{margin-left:75%}.offset-sm-10{margin-left:83.33333333%}.offset-sm-11{margin-left:91.66666667%}.g-sm-0,.gx-sm-0{--bs-gutter-x: 0}.g-sm-0,.gy-sm-0{--bs-gutter-y: 0}.g-sm-1,.gx-sm-1{--bs-gutter-x: .25rem}.g-sm-1,.gy-sm-1{--bs-gutter-y: .25rem}.g-sm-2,.gx-sm-2{--bs-gutter-x: .5rem}.g-sm-2,.gy-sm-2{--bs-gutter-y: .5rem}.g-sm-3,.gx-sm-3{--bs-gutter-x: 1rem}.g-sm-3,.gy-sm-3{--bs-gutter-y: 1rem}.g-sm-4,.gx-sm-4{--bs-gutter-x: 1.5rem}.g-sm-4,.gy-sm-4{--bs-gutter-y: 1.5rem}.g-sm-5,.gx-sm-5{--bs-gutter-x: 3rem}.g-sm-5,.gy-sm-5{--bs-gutter-y: 3rem}}@media (min-width: 768px){.col-md{flex:1 0 0%}.row-cols-md-auto>*{flex:0 0 auto;width:auto}.row-cols-md-1>*{flex:0 0 auto;width:100%}.row-cols-md-2>*{flex:0 0 auto;width:50%}.row-cols-md-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-md-4>*{flex:0 0 auto;width:25%}.row-cols-md-5>*{flex:0 0 auto;width:20%}.row-cols-md-6>*{flex:0 0 auto;width:16.6666666667%}.col-md-auto{flex:0 0 auto;width:auto}.col-md-1{flex:0 0 auto;width:8.33333333%}.col-md-2{flex:0 0 auto;width:16.66666667%}.col-md-3{flex:0 0 auto;width:25%}.col-md-4{flex:0 0 auto;width:33.33333333%}.col-md-5{flex:0 0 auto;width:41.66666667%}.col-md-6{flex:0 0 auto;width:50%}.col-md-7{flex:0 0 auto;width:58.33333333%}.col-md-8{flex:0 0 auto;width:66.66666667%}.col-md-9{flex:0 0 auto;width:75%}.col-md-10{flex:0 0 auto;width:83.33333333%}.col-md-11{flex:0 0 auto;width:91.66666667%}.col-md-12{flex:0 0 auto;width:100%}.offset-md-0{margin-left:0}.offset-md-1{margin-left:8.33333333%}.offset-md-2{margin-left:16.66666667%}.offset-md-3{margin-left:25%}.offset-md-4{margin-left:33.33333333%}.offset-md-5{margin-left:41.66666667%}.offset-md-6{margin-left:50%}.offset-md-7{margin-left:58.33333333%}.offset-md-8{margin-left:66.66666667%}.offset-md-9{margin-left:75%}.offset-md-10{margin-left:83.33333333%}.offset-md-11{margin-left:91.66666667%}.g-md-0,.gx-md-0{--bs-gutter-x: 0}.g-md-0,.gy-md-0{--bs-gutter-y: 0}.g-md-1,.gx-md-1{--bs-gutter-x: .25rem}.g-md-1,.gy-md-1{--bs-gutter-y: .25rem}.g-md-2,.gx-md-2{--bs-gutter-x: .5rem}.g-md-2,.gy-md-2{--bs-gutter-y: .5rem}.g-md-3,.gx-md-3{--bs-gutter-x: 1rem}.g-md-3,.gy-md-3{--bs-gutter-y: 1rem}.g-md-4,.gx-md-4{--bs-gutter-x: 1.5rem}.g-md-4,.gy-md-4{--bs-gutter-y: 1.5rem}.g-md-5,.gx-md-5{--bs-gutter-x: 3rem}.g-md-5,.gy-md-5{--bs-gutter-y: 3rem}}@media (min-width: 992px){.col-lg{flex:1 0 0%}.row-cols-lg-auto>*{flex:0 0 auto;width:auto}.row-cols-lg-1>*{flex:0 0 auto;width:100%}.row-cols-lg-2>*{flex:0 0 auto;width:50%}.row-cols-lg-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-lg-4>*{flex:0 0 auto;width:25%}.row-cols-lg-5>*{flex:0 0 auto;width:20%}.row-cols-lg-6>*{flex:0 0 auto;width:16.6666666667%}.col-lg-auto{flex:0 0 auto;width:auto}.col-lg-1{flex:0 0 auto;width:8.33333333%}.col-lg-2{flex:0 0 auto;width:16.66666667%}.col-lg-3{flex:0 0 auto;width:25%}.col-lg-4{flex:0 0 auto;width:33.33333333%}.col-lg-5{flex:0 0 auto;width:41.66666667%}.col-lg-6{flex:0 0 auto;width:50%}.col-lg-7{flex:0 0 auto;width:58.33333333%}.col-lg-8{flex:0 0 auto;width:66.66666667%}.col-lg-9{flex:0 0 auto;width:75%}.col-lg-10{flex:0 0 auto;width:83.33333333%}.col-lg-11{flex:0 0 auto;width:91.66666667%}.col-lg-12{flex:0 0 auto;width:100%}.offset-lg-0{margin-left:0}.offset-lg-1{margin-left:8.33333333%}.offset-lg-2{margin-left:16.66666667%}.offset-lg-3{margin-left:25%}.offset-lg-4{margin-left:33.33333333%}.offset-lg-5{margin-left:41.66666667%}.offset-lg-6{margin-left:50%}.offset-lg-7{margin-left:58.33333333%}.offset-lg-8{margin-left:66.66666667%}.offset-lg-9{margin-left:75%}.offset-lg-10{margin-left:83.33333333%}.offset-lg-11{margin-left:91.66666667%}.g-lg-0,.gx-lg-0{--bs-gutter-x: 0}.g-lg-0,.gy-lg-0{--bs-gutter-y: 0}.g-lg-1,.gx-lg-1{--bs-gutter-x: .25rem}.g-lg-1,.gy-lg-1{--bs-gutter-y: .25rem}.g-lg-2,.gx-lg-2{--bs-gutter-x: .5rem}.g-lg-2,.gy-lg-2{--bs-gutter-y: .5rem}.g-lg-3,.gx-lg-3{--bs-gutter-x: 1rem}.g-lg-3,.gy-lg-3{--bs-gutter-y: 1rem}.g-lg-4,.gx-lg-4{--bs-gutter-x: 1.5rem}.g-lg-4,.gy-lg-4{--bs-gutter-y: 1.5rem}.g-lg-5,.gx-lg-5{--bs-gutter-x: 3rem}.g-lg-5,.gy-lg-5{--bs-gutter-y: 3rem}}@media (min-width: 1200px){.col-xl{flex:1 0 0%}.row-cols-xl-auto>*{flex:0 0 auto;width:auto}.row-cols-xl-1>*{flex:0 0 auto;width:100%}.row-cols-xl-2>*{flex:0 0 auto;width:50%}.row-cols-xl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xl-4>*{flex:0 0 auto;width:25%}.row-cols-xl-5>*{flex:0 0 auto;width:20%}.row-cols-xl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xl-auto{flex:0 0 auto;width:auto}.col-xl-1{flex:0 0 auto;width:8.33333333%}.col-xl-2{flex:0 0 auto;width:16.66666667%}.col-xl-3{flex:0 0 auto;width:25%}.col-xl-4{flex:0 0 auto;width:33.33333333%}.col-xl-5{flex:0 0 auto;width:41.66666667%}.col-xl-6{flex:0 0 auto;width:50%}.col-xl-7{flex:0 0 auto;width:58.33333333%}.col-xl-8{flex:0 0 auto;width:66.66666667%}.col-xl-9{flex:0 0 auto;width:75%}.col-xl-10{flex:0 0 auto;width:83.33333333%}.col-xl-11{flex:0 0 auto;width:91.66666667%}.col-xl-12{flex:0 0 auto;width:100%}.offset-xl-0{margin-left:0}.offset-xl-1{margin-left:8.33333333%}.offset-xl-2{margin-left:16.66666667%}.offset-xl-3{margin-left:25%}.offset-xl-4{margin-left:33.33333333%}.offset-xl-5{margin-left:41.66666667%}.offset-xl-6{margin-left:50%}.offset-xl-7{margin-left:58.33333333%}.offset-xl-8{margin-left:66.66666667%}.offset-xl-9{margin-left:75%}.offset-xl-10{margin-left:83.33333333%}.offset-xl-11{margin-left:91.66666667%}.g-xl-0,.gx-xl-0{--bs-gutter-x: 0}.g-xl-0,.gy-xl-0{--bs-gutter-y: 0}.g-xl-1,.gx-xl-1{--bs-gutter-x: .25rem}.g-xl-1,.gy-xl-1{--bs-gutter-y: .25rem}.g-xl-2,.gx-xl-2{--bs-gutter-x: .5rem}.g-xl-2,.gy-xl-2{--bs-gutter-y: .5rem}.g-xl-3,.gx-xl-3{--bs-gutter-x: 1rem}.g-xl-3,.gy-xl-3{--bs-gutter-y: 1rem}.g-xl-4,.gx-xl-4{--bs-gutter-x: 1.5rem}.g-xl-4,.gy-xl-4{--bs-gutter-y: 1.5rem}.g-xl-5,.gx-xl-5{--bs-gutter-x: 3rem}.g-xl-5,.gy-xl-5{--bs-gutter-y: 3rem}}@media (min-width: 1400px){.col-xxl{flex:1 0 0%}.row-cols-xxl-auto>*{flex:0 0 auto;width:auto}.row-cols-xxl-1>*{flex:0 0 auto;width:100%}.row-cols-xxl-2>*{flex:0 0 auto;width:50%}.row-cols-xxl-3>*{flex:0 0 auto;width:33.3333333333%}.row-cols-xxl-4>*{flex:0 0 auto;width:25%}.row-cols-xxl-5>*{flex:0 0 auto;width:20%}.row-cols-xxl-6>*{flex:0 0 auto;width:16.6666666667%}.col-xxl-auto{flex:0 0 auto;width:auto}.col-xxl-1{flex:0 0 auto;width:8.33333333%}.col-xxl-2{flex:0 0 auto;width:16.66666667%}.col-xxl-3{flex:0 0 auto;width:25%}.col-xxl-4{flex:0 0 auto;width:33.33333333%}.col-xxl-5{flex:0 0 auto;width:41.66666667%}.col-xxl-6{flex:0 0 auto;width:50%}.col-xxl-7{flex:0 0 auto;width:58.33333333%}.col-xxl-8{flex:0 0 auto;width:66.66666667%}.col-xxl-9{flex:0 0 auto;width:75%}.col-xxl-10{flex:0 0 auto;width:83.33333333%}.col-xxl-11{flex:0 0 auto;width:91.66666667%}.col-xxl-12{flex:0 0 auto;width:100%}.offset-xxl-0{margin-left:0}.offset-xxl-1{margin-left:8.33333333%}.offset-xxl-2{margin-left:16.66666667%}.offset-xxl-3{margin-left:25%}.offset-xxl-4{margin-left:33.33333333%}.offset-xxl-5{margin-left:41.66666667%}.offset-xxl-6{margin-left:50%}.offset-xxl-7{margin-left:58.33333333%}.offset-xxl-8{margin-left:66.66666667%}.offset-xxl-9{margin-left:75%}.offset-xxl-10{margin-left:83.33333333%}.offset-xxl-11{margin-left:91.66666667%}.g-xxl-0,.gx-xxl-0{--bs-gutter-x: 0}.g-xxl-0,.gy-xxl-0{--bs-gutter-y: 0}.g-xxl-1,.gx-xxl-1{--bs-gutter-x: .25rem}.g-xxl-1,.gy-xxl-1{--bs-gutter-y: .25rem}.g-xxl-2,.gx-xxl-2{--bs-gutter-x: .5rem}.g-xxl-2,.gy-xxl-2{--bs-gutter-y: .5rem}.g-xxl-3,.gx-xxl-3{--bs-gutter-x: 1rem}.g-xxl-3,.gy-xxl-3{--bs-gutter-y: 1rem}.g-xxl-4,.gx-xxl-4{--bs-gutter-x: 1.5rem}.g-xxl-4,.gy-xxl-4{--bs-gutter-y: 1.5rem}.g-xxl-5,.gx-xxl-5{--bs-gutter-x: 3rem}.g-xxl-5,.gy-xxl-5{--bs-gutter-y: 3rem}}.table{--bs-table-color: var(--bs-body-color);--bs-table-bg: transparent;--bs-table-border-color: var(--bs-border-color);--bs-table-accent-bg: transparent;--bs-table-striped-color: var(--bs-body-color);--bs-table-striped-bg: rgba(0, 0, 0, .05);--bs-table-active-color: var(--bs-body-color);--bs-table-active-bg: rgba(0, 0, 0, .1);--bs-table-hover-color: var(--bs-body-color);--bs-table-hover-bg: rgba(0, 0, 0, .075);width:100%;margin-bottom:1rem;color:var(--bs-table-color);vertical-align:top;border-color:var(--bs-table-border-color)}.table>:not(caption)>*>*{padding:.5rem;background-color:var(--bs-table-bg);border-bottom-width:1px;box-shadow:inset 0 0 0 9999px var(--bs-table-accent-bg)}.table>tbody{vertical-align:inherit}.table>thead{vertical-align:bottom}.table-group-divider{border-top:2px solid currentcolor}.caption-top{caption-side:top}.table-sm>:not(caption)>*>*{padding:.25rem}.table-bordered>:not(caption)>*{border-width:1px 0}.table-bordered>:not(caption)>*>*{border-width:0 1px}.table-borderless>:not(caption)>*>*{border-bottom-width:0}.table-borderless>:not(:first-child){border-top-width:0}.table-striped>tbody>tr:nth-of-type(odd)>*{--bs-table-accent-bg: var(--bs-table-striped-bg);color:var(--bs-table-striped-color)}.table-striped-columns>:not(caption)>tr>:nth-child(even){--bs-table-accent-bg: var(--bs-table-striped-bg);color:var(--bs-table-striped-color)}.table-active{--bs-table-accent-bg: var(--bs-table-active-bg);color:var(--bs-table-active-color)}.table-hover>tbody>tr:hover>*{--bs-table-accent-bg: var(--bs-table-hover-bg);color:var(--bs-table-hover-color)}.table-primary{--bs-table-color: #000;--bs-table-bg: #cfe2ff;--bs-table-border-color: #bacbe6;--bs-table-striped-bg: #c5d7f2;--bs-table-striped-color: #000;--bs-table-active-bg: #bacbe6;--bs-table-active-color: #000;--bs-table-hover-bg: #bfd1ec;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-secondary{--bs-table-color: #000;--bs-table-bg: #e2e3e5;--bs-table-border-color: #cbccce;--bs-table-striped-bg: #d7d8da;--bs-table-striped-color: #000;--bs-table-active-bg: #cbccce;--bs-table-active-color: #000;--bs-table-hover-bg: #d1d2d4;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-success{--bs-table-color: #000;--bs-table-bg: #d1e7dd;--bs-table-border-color: #bcd0c7;--bs-table-striped-bg: #c7dbd2;--bs-table-striped-color: #000;--bs-table-active-bg: #bcd0c7;--bs-table-active-color: #000;--bs-table-hover-bg: #c1d6cc;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-info{--bs-table-color: #000;--bs-table-bg: #cff4fc;--bs-table-border-color: #badce3;--bs-table-striped-bg: #c5e8ef;--bs-table-striped-color: #000;--bs-table-active-bg: #badce3;--bs-table-active-color: #000;--bs-table-hover-bg: #bfe2e9;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-warning{--bs-table-color: #000;--bs-table-bg: #fff3cd;--bs-table-border-color: #e6dbb9;--bs-table-striped-bg: #f2e7c3;--bs-table-striped-color: #000;--bs-table-active-bg: #e6dbb9;--bs-table-active-color: #000;--bs-table-hover-bg: #ece1be;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-danger{--bs-table-color: #000;--bs-table-bg: #f8d7da;--bs-table-border-color: #dfc2c4;--bs-table-striped-bg: #eccccf;--bs-table-striped-color: #000;--bs-table-active-bg: #dfc2c4;--bs-table-active-color: #000;--bs-table-hover-bg: #e5c7ca;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-light{--bs-table-color: #000;--bs-table-bg: #f8f9fa;--bs-table-border-color: #dfe0e1;--bs-table-striped-bg: #ecedee;--bs-table-striped-color: #000;--bs-table-active-bg: #dfe0e1;--bs-table-active-color: #000;--bs-table-hover-bg: #e5e6e7;--bs-table-hover-color: #000;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-dark{--bs-table-color: #fff;--bs-table-bg: #212529;--bs-table-border-color: #373b3e;--bs-table-striped-bg: #2c3034;--bs-table-striped-color: #fff;--bs-table-active-bg: #373b3e;--bs-table-active-color: #fff;--bs-table-hover-bg: #323539;--bs-table-hover-color: #fff;color:var(--bs-table-color);border-color:var(--bs-table-border-color)}.table-responsive{overflow-x:auto;-webkit-overflow-scrolling:touch}@media (max-width: 575.98px){.table-responsive-sm{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 767.98px){.table-responsive-md{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 991.98px){.table-responsive-lg{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1199.98px){.table-responsive-xl{overflow-x:auto;-webkit-overflow-scrolling:touch}}@media (max-width: 1399.98px){.table-responsive-xxl{overflow-x:auto;-webkit-overflow-scrolling:touch}}.form-label{margin-bottom:.5rem}.col-form-label{padding-top:calc(.375rem + 1px);padding-bottom:calc(.375rem + 1px);margin-bottom:0;font-size:inherit;line-height:1.5}.col-form-label-lg{padding-top:calc(.5rem + 1px);padding-bottom:calc(.5rem + 1px);font-size:1.25rem}.col-form-label-sm{padding-top:calc(.25rem + 1px);padding-bottom:calc(.25rem + 1px);font-size:.875rem}.form-text{margin-top:.25rem;font-size:.875em;color:#6c757d}.form-control{display:block;width:100%;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-clip:padding-box;border:1px solid #ced4da;-webkit-appearance:none;-moz-appearance:none;appearance:none;border-radius:.375rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control{transition:none}}.form-control[type=file]{overflow:hidden}.form-control[type=file]:not(:disabled):not([readonly]){cursor:pointer}.form-control:focus{color:#212529;background-color:#fff;border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-control::-webkit-date-and-time-value{height:1.5em}.form-control::-moz-placeholder{color:#6c757d;opacity:1}.form-control::placeholder{color:#6c757d;opacity:1}.form-control:disabled{background-color:#e9ecef;opacity:1}.form-control::-webkit-file-upload-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;-webkit-transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}.form-control::file-selector-button{padding:.375rem .75rem;margin:-.375rem -.75rem;-webkit-margin-end:.75rem;margin-inline-end:.75rem;color:#212529;background-color:#e9ecef;pointer-events:none;border-color:inherit;border-style:solid;border-width:0;border-inline-end-width:1px;border-radius:0;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-control::-webkit-file-upload-button{-webkit-transition:none;transition:none}.form-control::file-selector-button{transition:none}}.form-control:hover:not(:disabled):not([readonly])::-webkit-file-upload-button{background-color:#dde0e3}.form-control:hover:not(:disabled):not([readonly])::file-selector-button{background-color:#dde0e3}.form-control-plaintext{display:block;width:100%;padding:.375rem 0;margin-bottom:0;line-height:1.5;color:#212529;background-color:transparent;border:solid transparent;border-width:1px 0}.form-control-plaintext:focus{outline:0}.form-control-plaintext.form-control-sm,.form-control-plaintext.form-control-lg{padding-right:0;padding-left:0}.form-control-sm{min-height:calc(1.5em + .5rem + 2px);padding:.25rem .5rem;font-size:.875rem;border-radius:.25rem}.form-control-sm::-webkit-file-upload-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-sm::file-selector-button{padding:.25rem .5rem;margin:-.25rem -.5rem;-webkit-margin-end:.5rem;margin-inline-end:.5rem}.form-control-lg{min-height:calc(1.5em + 1rem + 2px);padding:.5rem 1rem;font-size:1.25rem;border-radius:.5rem}.form-control-lg::-webkit-file-upload-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}.form-control-lg::file-selector-button{padding:.5rem 1rem;margin:-.5rem -1rem;-webkit-margin-end:1rem;margin-inline-end:1rem}textarea.form-control{min-height:calc(1.5em + .75rem + 2px)}textarea.form-control-sm{min-height:calc(1.5em + .5rem + 2px)}textarea.form-control-lg{min-height:calc(1.5em + 1rem + 2px)}.form-control-color{width:3rem;height:calc(1.5em + .75rem + 2px);padding:.375rem}.form-control-color:not(:disabled):not([readonly]){cursor:pointer}.form-control-color::-moz-color-swatch{border:0!important;border-radius:.375rem}.form-control-color::-webkit-color-swatch{border-radius:.375rem}.form-control-color.form-control-sm{height:calc(1.5em + .5rem + 2px)}.form-control-color.form-control-lg{height:calc(1.5em + 1rem + 2px)}.form-select{display:block;width:100%;padding:.375rem 2.25rem .375rem .75rem;-moz-padding-start:calc(.75rem - 3px);font-size:1rem;font-weight:400;line-height:1.5;color:#212529;background-color:#fff;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='m2 5 6 6 6-6'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right .75rem center;background-size:16px 12px;border:1px solid #ced4da;border-radius:.375rem;transition:border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-select{transition:none}}.form-select:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-select[multiple],.form-select[size]:not([size="1"]){padding-right:.75rem;background-image:none}.form-select:disabled{background-color:#e9ecef}.form-select:-moz-focusring{color:transparent;text-shadow:0 0 0 #212529}.form-select-sm{padding-top:.25rem;padding-bottom:.25rem;padding-left:.5rem;font-size:.875rem;border-radius:.25rem}.form-select-lg{padding-top:.5rem;padding-bottom:.5rem;padding-left:1rem;font-size:1.25rem;border-radius:.5rem}.form-check{display:block;min-height:1.5rem;padding-left:1.5em;margin-bottom:.125rem}.form-check .form-check-input{float:left;margin-left:-1.5em}.form-check-reverse{padding-right:1.5em;padding-left:0;text-align:right}.form-check-reverse .form-check-input{float:right;margin-right:-1.5em;margin-left:0}.form-check-input{width:1em;height:1em;margin-top:.25em;vertical-align:top;background-color:#fff;background-repeat:no-repeat;background-position:center;background-size:contain;border:1px solid rgba(0,0,0,.25);-webkit-appearance:none;-moz-appearance:none;appearance:none;-webkit-print-color-adjust:exact;color-adjust:exact;print-color-adjust:exact}.form-check-input[type=checkbox]{border-radius:.25em}.form-check-input[type=radio]{border-radius:50%}.form-check-input:active{filter:brightness(90%)}.form-check-input:focus{border-color:#86b7fe;outline:0;box-shadow:0 0 0 .25rem #0d6efd40}.form-check-input:checked{background-color:#0d6efd;border-color:#0d6efd}.form-check-input:checked[type=checkbox]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='m6 10 3 3 6-6'/%3e%3c/svg%3e")}.form-check-input:checked[type=radio]{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='2' fill='%23fff'/%3e%3c/svg%3e")}.form-check-input[type=checkbox]:indeterminate{background-color:#0d6efd;border-color:#0d6efd;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 20 20'%3e%3cpath fill='none' stroke='%23fff' stroke-linecap='round' stroke-linejoin='round' stroke-width='3' d='M6 10h8'/%3e%3c/svg%3e")}.form-check-input:disabled{pointer-events:none;filter:none;opacity:.5}.form-check-input[disabled]~.form-check-label,.form-check-input:disabled~.form-check-label{cursor:default;opacity:.5}.form-switch{padding-left:2.5em}.form-switch .form-check-input{width:2em;margin-left:-2.5em;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='rgba%280, 0, 0, 0.25%29'/%3e%3c/svg%3e");background-position:left center;border-radius:2em;transition:background-position .15s ease-in-out}@media (prefers-reduced-motion: reduce){.form-switch .form-check-input{transition:none}}.form-switch .form-check-input:focus{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%2386b7fe'/%3e%3c/svg%3e")}.form-switch .form-check-input:checked{background-position:right center;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='-4 -4 8 8'%3e%3ccircle r='3' fill='%23fff'/%3e%3c/svg%3e")}.form-switch.form-check-reverse{padding-right:2.5em;padding-left:0}.form-switch.form-check-reverse .form-check-input{margin-right:-2.5em;margin-left:0}.form-check-inline{display:inline-block;margin-right:1rem}.btn-check{position:absolute;clip:rect(0,0,0,0);pointer-events:none}.btn-check[disabled]+.btn,.btn-check:disabled+.btn{pointer-events:none;filter:none;opacity:.65}.form-range{width:100%;height:1.5rem;padding:0;background-color:transparent;-webkit-appearance:none;-moz-appearance:none;appearance:none}.form-range:focus{outline:0}.form-range:focus::-webkit-slider-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range:focus::-moz-range-thumb{box-shadow:0 0 0 1px #fff,0 0 0 .25rem #0d6efd40}.form-range::-moz-focus-outer{border:0}.form-range::-webkit-slider-thumb{width:1rem;height:1rem;margin-top:-.25rem;background-color:#0d6efd;border:0;border-radius:1rem;-webkit-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-webkit-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-webkit-slider-thumb{-webkit-transition:none;transition:none}}.form-range::-webkit-slider-thumb:active{background-color:#b6d4fe}.form-range::-webkit-slider-runnable-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range::-moz-range-thumb{width:1rem;height:1rem;background-color:#0d6efd;border:0;border-radius:1rem;-moz-transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;transition:background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out;-moz-appearance:none;appearance:none}@media (prefers-reduced-motion: reduce){.form-range::-moz-range-thumb{-moz-transition:none;transition:none}}.form-range::-moz-range-thumb:active{background-color:#b6d4fe}.form-range::-moz-range-track{width:100%;height:.5rem;color:transparent;cursor:pointer;background-color:#dee2e6;border-color:transparent;border-radius:1rem}.form-range:disabled{pointer-events:none}.form-range:disabled::-webkit-slider-thumb{background-color:#adb5bd}.form-range:disabled::-moz-range-thumb{background-color:#adb5bd}.form-floating{position:relative}.form-floating>.form-control,.form-floating>.form-control-plaintext,.form-floating>.form-select{height:calc(3.5rem + 2px);line-height:1.25}.form-floating>label{position:absolute;top:0;left:0;width:100%;height:100%;padding:1rem .75rem;overflow:hidden;text-align:start;text-overflow:ellipsis;white-space:nowrap;pointer-events:none;border:1px solid transparent;transform-origin:0 0;transition:opacity .1s ease-in-out,transform .1s ease-in-out}@media (prefers-reduced-motion: reduce){.form-floating>label{transition:none}}.form-floating>.form-control,.form-floating>.form-control-plaintext{padding:1rem .75rem}.form-floating>.form-control::-moz-placeholder,.form-floating>.form-control-plaintext::-moz-placeholder{color:transparent}.form-floating>.form-control::placeholder,.form-floating>.form-control-plaintext::placeholder{color:transparent}.form-floating>.form-control:not(:-moz-placeholder-shown),.form-floating>.form-control-plaintext:not(:-moz-placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:focus,.form-floating>.form-control:not(:placeholder-shown),.form-floating>.form-control-plaintext:focus,.form-floating>.form-control-plaintext:not(:placeholder-shown){padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:-webkit-autofill,.form-floating>.form-control-plaintext:-webkit-autofill{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-select{padding-top:1.625rem;padding-bottom:.625rem}.form-floating>.form-control:not(:-moz-placeholder-shown)~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:focus~label,.form-floating>.form-control:not(:placeholder-shown)~label,.form-floating>.form-control-plaintext~label,.form-floating>.form-select~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control:-webkit-autofill~label{opacity:.65;transform:scale(.85) translateY(-.5rem) translate(.15rem)}.form-floating>.form-control-plaintext~label{border-width:1px 0}.input-group{position:relative;display:flex;flex-wrap:wrap;align-items:stretch;width:100%}.input-group>.form-control,.input-group>.form-select,.input-group>.form-floating{position:relative;flex:1 1 auto;width:1%;min-width:0}.input-group>.form-control:focus,.input-group>.form-select:focus,.input-group>.form-floating:focus-within{z-index:5}.input-group .btn{position:relative;z-index:2}.input-group .btn:focus{z-index:5}.input-group-text{display:flex;align-items:center;padding:.375rem .75rem;font-size:1rem;font-weight:400;line-height:1.5;color:#212529;text-align:center;white-space:nowrap;background-color:#e9ecef;border:1px solid #ced4da;border-radius:.375rem}.input-group-lg>.form-control,.input-group-lg>.form-select,.input-group-lg>.input-group-text,.input-group-lg>.btn{padding:.5rem 1rem;font-size:1.25rem;border-radius:.5rem}.input-group-sm>.form-control,.input-group-sm>.form-select,.input-group-sm>.input-group-text,.input-group-sm>.btn{padding:.25rem .5rem;font-size:.875rem;border-radius:.25rem}.input-group-lg>.form-select,.input-group-sm>.form-select{padding-right:3rem}.input-group:not(.has-validation)>:not(:last-child):not(.dropdown-toggle):not(.dropdown-menu):not(.form-floating),.input-group:not(.has-validation)>.dropdown-toggle:nth-last-child(n+3),.input-group:not(.has-validation)>.form-floating:not(:last-child)>.form-control,.input-group:not(.has-validation)>.form-floating:not(:last-child)>.form-select{border-top-right-radius:0;border-bottom-right-radius:0}.input-group.has-validation>:nth-last-child(n+3):not(.dropdown-toggle):not(.dropdown-menu):not(.form-floating),.input-group.has-validation>.dropdown-toggle:nth-last-child(n+4),.input-group.has-validation>.form-floating:nth-last-child(n+3)>.form-control,.input-group.has-validation>.form-floating:nth-last-child(n+3)>.form-select{border-top-right-radius:0;border-bottom-right-radius:0}.input-group>:not(:first-child):not(.dropdown-menu):not(.valid-tooltip):not(.valid-feedback):not(.invalid-tooltip):not(.invalid-feedback){margin-left:-1px;border-top-left-radius:0;border-bottom-left-radius:0}.input-group>.form-floating:not(:first-child)>.form-control,.input-group>.form-floating:not(:first-child)>.form-select{border-top-left-radius:0;border-bottom-left-radius:0}.valid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#198754}.valid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#198754e6;border-radius:.375rem}.was-validated :valid~.valid-feedback,.was-validated :valid~.valid-tooltip,.is-valid~.valid-feedback,.is-valid~.valid-tooltip{display:block}.was-validated .form-control:valid,.form-control.is-valid{border-color:#198754;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:valid:focus,.form-control.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated textarea.form-control:valid,textarea.form-control.is-valid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:valid,.form-select.is-valid{border-color:#198754}.was-validated .form-select:valid:not([multiple]):not([size]),.was-validated .form-select:valid:not([multiple])[size="1"],.form-select.is-valid:not([multiple]):not([size]),.form-select.is-valid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='m2 5 6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 8 8'%3e%3cpath fill='%23198754' d='M2.3 6.73.6 4.53c-.4-1.04.46-1.4 1.1-.8l1.1 1.4 3.4-3.8c.6-.63 1.6-.27 1.2.7l-4 4.6c-.43.5-.8.4-1.1.1z'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:valid:focus,.form-select.is-valid:focus{border-color:#198754;box-shadow:0 0 0 .25rem #19875440}.was-validated .form-control-color:valid,.form-control-color.is-valid{width:calc(3.75rem + 1.5em)}.was-validated .form-check-input:valid,.form-check-input.is-valid{border-color:#198754}.was-validated .form-check-input:valid:checked,.form-check-input.is-valid:checked{background-color:#198754}.was-validated .form-check-input:valid:focus,.form-check-input.is-valid:focus{box-shadow:0 0 0 .25rem #19875440}.was-validated .form-check-input:valid~.form-check-label,.form-check-input.is-valid~.form-check-label{color:#198754}.form-check-inline .form-check-input~.valid-feedback{margin-left:.5em}.was-validated .input-group>.form-control:not(:focus):valid,.input-group>.form-control:not(:focus).is-valid,.was-validated .input-group>.form-select:not(:focus):valid,.input-group>.form-select:not(:focus).is-valid,.was-validated .input-group>.form-floating:not(:focus-within):valid,.input-group>.form-floating:not(:focus-within).is-valid{z-index:3}.invalid-feedback{display:none;width:100%;margin-top:.25rem;font-size:.875em;color:#dc3545}.invalid-tooltip{position:absolute;top:100%;z-index:5;display:none;max-width:100%;padding:.25rem .5rem;margin-top:.1rem;font-size:.875rem;color:#fff;background-color:#dc3545e6;border-radius:.375rem}.was-validated :invalid~.invalid-feedback,.was-validated :invalid~.invalid-tooltip,.is-invalid~.invalid-feedback,.is-invalid~.invalid-tooltip{display:block}.was-validated .form-control:invalid,.form-control.is-invalid{border-color:#dc3545;padding-right:calc(1.5em + .75rem);background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-repeat:no-repeat;background-position:right calc(.375em + .1875rem) center;background-size:calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-control:invalid:focus,.form-control.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated textarea.form-control:invalid,textarea.form-control.is-invalid{padding-right:calc(1.5em + .75rem);background-position:top calc(.375em + .1875rem) right calc(.375em + .1875rem)}.was-validated .form-select:invalid,.form-select.is-invalid{border-color:#dc3545}.was-validated .form-select:invalid:not([multiple]):not([size]),.was-validated .form-select:invalid:not([multiple])[size="1"],.form-select.is-invalid:not([multiple]):not([size]),.form-select.is-invalid:not([multiple])[size="1"]{padding-right:4.125rem;background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16'%3e%3cpath fill='none' stroke='%23343a40' stroke-linecap='round' stroke-linejoin='round' stroke-width='2' d='m2 5 6 6 6-6'/%3e%3c/svg%3e"),url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 12 12' width='12' height='12' fill='none' stroke='%23dc3545'%3e%3ccircle cx='6' cy='6' r='4.5'/%3e%3cpath stroke-linejoin='round' d='M5.8 3.6h.4L6 6.5z'/%3e%3ccircle cx='6' cy='8.2' r='.6' fill='%23dc3545' stroke='none'/%3e%3c/svg%3e");background-position:right .75rem center,center right 2.25rem;background-size:16px 12px,calc(.75em + .375rem) calc(.75em + .375rem)}.was-validated .form-select:invalid:focus,.form-select.is-invalid:focus{border-color:#dc3545;box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-control-color:invalid,.form-control-color.is-invalid{width:calc(3.75rem + 1.5em)}.was-validated .form-check-input:invalid,.form-check-input.is-invalid{border-color:#dc3545}.was-validated .form-check-input:invalid:checked,.form-check-input.is-invalid:checked{background-color:#dc3545}.was-validated .form-check-input:invalid:focus,.form-check-input.is-invalid:focus{box-shadow:0 0 0 .25rem #dc354540}.was-validated .form-check-input:invalid~.form-check-label,.form-check-input.is-invalid~.form-check-label{color:#dc3545}.form-check-inline .form-check-input~.invalid-feedback{margin-left:.5em}.was-validated .input-group>.form-control:not(:focus):invalid,.input-group>.form-control:not(:focus).is-invalid,.was-validated .input-group>.form-select:not(:focus):invalid,.input-group>.form-select:not(:focus).is-invalid,.was-validated .input-group>.form-floating:not(:focus-within):invalid,.input-group>.form-floating:not(:focus-within).is-invalid{z-index:4}.btn{--bs-btn-padding-x: .75rem;--bs-btn-padding-y: .375rem;--bs-btn-font-family: ;--bs-btn-font-size: 1rem;--bs-btn-font-weight: 400;--bs-btn-line-height: 1.5;--bs-btn-color: #212529;--bs-btn-bg: transparent;--bs-btn-border-width: 1px;--bs-btn-border-color: transparent;--bs-btn-border-radius: .375rem;--bs-btn-hover-border-color: transparent;--bs-btn-box-shadow: inset 0 1px 0 rgba(255, 255, 255, .15), 0 1px 1px rgba(0, 0, 0, .075);--bs-btn-disabled-opacity: .65;--bs-btn-focus-box-shadow: 0 0 0 .25rem rgba(var(--bs-btn-focus-shadow-rgb), .5);display:inline-block;padding:var(--bs-btn-padding-y) var(--bs-btn-padding-x);font-family:var(--bs-btn-font-family);font-size:var(--bs-btn-font-size);font-weight:var(--bs-btn-font-weight);line-height:var(--bs-btn-line-height);color:var(--bs-btn-color);text-align:center;text-decoration:none;vertical-align:middle;cursor:pointer;-webkit-user-select:none;-moz-user-select:none;user-select:none;border:var(--bs-btn-border-width) solid var(--bs-btn-border-color);border-radius:var(--bs-btn-border-radius);background-color:var(--bs-btn-bg);transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.btn{transition:none}}.btn:hover{color:var(--bs-btn-hover-color);background-color:var(--bs-btn-hover-bg);border-color:var(--bs-btn-hover-border-color)}.btn-check+.btn:hover{color:var(--bs-btn-color);background-color:var(--bs-btn-bg);border-color:var(--bs-btn-border-color)}.btn:focus-visible{color:var(--bs-btn-hover-color);background-color:var(--bs-btn-hover-bg);border-color:var(--bs-btn-hover-border-color);outline:0;box-shadow:var(--bs-btn-focus-box-shadow)}.btn-check:focus-visible+.btn{border-color:var(--bs-btn-hover-border-color);outline:0;box-shadow:var(--bs-btn-focus-box-shadow)}.btn-check:checked+.btn,:not(.btn-check)+.btn:active,.btn:first-child:active,.btn.active,.btn.show{color:var(--bs-btn-active-color);background-color:var(--bs-btn-active-bg);border-color:var(--bs-btn-active-border-color)}.btn-check:checked+.btn:focus-visible,:not(.btn-check)+.btn:active:focus-visible,.btn:first-child:active:focus-visible,.btn.active:focus-visible,.btn.show:focus-visible{box-shadow:var(--bs-btn-focus-box-shadow)}.btn:disabled,.btn.disabled,fieldset:disabled .btn{color:var(--bs-btn-disabled-color);pointer-events:none;background-color:var(--bs-btn-disabled-bg);border-color:var(--bs-btn-disabled-border-color);opacity:var(--bs-btn-disabled-opacity)}.btn-primary{--bs-btn-color: #fff;--bs-btn-bg: #0d6efd;--bs-btn-border-color: #0d6efd;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #0b5ed7;--bs-btn-hover-border-color: #0a58ca;--bs-btn-focus-shadow-rgb: 49, 132, 253;--bs-btn-active-color: #fff;--bs-btn-active-bg: #0a58ca;--bs-btn-active-border-color: #0a53be;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #0d6efd;--bs-btn-disabled-border-color: #0d6efd}.btn-secondary{--bs-btn-color: #fff;--bs-btn-bg: #6c757d;--bs-btn-border-color: #6c757d;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #5c636a;--bs-btn-hover-border-color: #565e64;--bs-btn-focus-shadow-rgb: 130, 138, 145;--bs-btn-active-color: #fff;--bs-btn-active-bg: #565e64;--bs-btn-active-border-color: #51585e;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #6c757d;--bs-btn-disabled-border-color: #6c757d}.btn-success{--bs-btn-color: #fff;--bs-btn-bg: #198754;--bs-btn-border-color: #198754;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #157347;--bs-btn-hover-border-color: #146c43;--bs-btn-focus-shadow-rgb: 60, 153, 110;--bs-btn-active-color: #fff;--bs-btn-active-bg: #146c43;--bs-btn-active-border-color: #13653f;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #198754;--bs-btn-disabled-border-color: #198754}.btn-info{--bs-btn-color: #000;--bs-btn-bg: #0dcaf0;--bs-btn-border-color: #0dcaf0;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #31d2f2;--bs-btn-hover-border-color: #25cff2;--bs-btn-focus-shadow-rgb: 11, 172, 204;--bs-btn-active-color: #000;--bs-btn-active-bg: #3dd5f3;--bs-btn-active-border-color: #25cff2;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #000;--bs-btn-disabled-bg: #0dcaf0;--bs-btn-disabled-border-color: #0dcaf0}.btn-warning{--bs-btn-color: #000;--bs-btn-bg: #ffc107;--bs-btn-border-color: #ffc107;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #ffca2c;--bs-btn-hover-border-color: #ffc720;--bs-btn-focus-shadow-rgb: 217, 164, 6;--bs-btn-active-color: #000;--bs-btn-active-bg: #ffcd39;--bs-btn-active-border-color: #ffc720;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #000;--bs-btn-disabled-bg: #ffc107;--bs-btn-disabled-border-color: #ffc107}.btn-danger{--bs-btn-color: #fff;--bs-btn-bg: #dc3545;--bs-btn-border-color: #dc3545;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #bb2d3b;--bs-btn-hover-border-color: #b02a37;--bs-btn-focus-shadow-rgb: 225, 83, 97;--bs-btn-active-color: #fff;--bs-btn-active-bg: #b02a37;--bs-btn-active-border-color: #a52834;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #dc3545;--bs-btn-disabled-border-color: #dc3545}.btn-light{--bs-btn-color: #000;--bs-btn-bg: #f8f9fa;--bs-btn-border-color: #f8f9fa;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #d3d4d5;--bs-btn-hover-border-color: #c6c7c8;--bs-btn-focus-shadow-rgb: 211, 212, 213;--bs-btn-active-color: #000;--bs-btn-active-bg: #c6c7c8;--bs-btn-active-border-color: #babbbc;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #000;--bs-btn-disabled-bg: #f8f9fa;--bs-btn-disabled-border-color: #f8f9fa}.btn-dark{--bs-btn-color: #fff;--bs-btn-bg: #212529;--bs-btn-border-color: #212529;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #424649;--bs-btn-hover-border-color: #373b3e;--bs-btn-focus-shadow-rgb: 66, 70, 73;--bs-btn-active-color: #fff;--bs-btn-active-bg: #4d5154;--bs-btn-active-border-color: #373b3e;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #fff;--bs-btn-disabled-bg: #212529;--bs-btn-disabled-border-color: #212529}.btn-outline-primary{--bs-btn-color: #0d6efd;--bs-btn-border-color: #0d6efd;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #0d6efd;--bs-btn-hover-border-color: #0d6efd;--bs-btn-focus-shadow-rgb: 13, 110, 253;--bs-btn-active-color: #fff;--bs-btn-active-bg: #0d6efd;--bs-btn-active-border-color: #0d6efd;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #0d6efd;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #0d6efd;--bs-gradient: none}.btn-outline-secondary{--bs-btn-color: #6c757d;--bs-btn-border-color: #6c757d;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #6c757d;--bs-btn-hover-border-color: #6c757d;--bs-btn-focus-shadow-rgb: 108, 117, 125;--bs-btn-active-color: #fff;--bs-btn-active-bg: #6c757d;--bs-btn-active-border-color: #6c757d;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #6c757d;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #6c757d;--bs-gradient: none}.btn-outline-success{--bs-btn-color: #198754;--bs-btn-border-color: #198754;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #198754;--bs-btn-hover-border-color: #198754;--bs-btn-focus-shadow-rgb: 25, 135, 84;--bs-btn-active-color: #fff;--bs-btn-active-bg: #198754;--bs-btn-active-border-color: #198754;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #198754;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #198754;--bs-gradient: none}.btn-outline-info{--bs-btn-color: #0dcaf0;--bs-btn-border-color: #0dcaf0;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #0dcaf0;--bs-btn-hover-border-color: #0dcaf0;--bs-btn-focus-shadow-rgb: 13, 202, 240;--bs-btn-active-color: #000;--bs-btn-active-bg: #0dcaf0;--bs-btn-active-border-color: #0dcaf0;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #0dcaf0;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #0dcaf0;--bs-gradient: none}.btn-outline-warning{--bs-btn-color: #ffc107;--bs-btn-border-color: #ffc107;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #ffc107;--bs-btn-hover-border-color: #ffc107;--bs-btn-focus-shadow-rgb: 255, 193, 7;--bs-btn-active-color: #000;--bs-btn-active-bg: #ffc107;--bs-btn-active-border-color: #ffc107;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #ffc107;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #ffc107;--bs-gradient: none}.btn-outline-danger{--bs-btn-color: #dc3545;--bs-btn-border-color: #dc3545;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #dc3545;--bs-btn-hover-border-color: #dc3545;--bs-btn-focus-shadow-rgb: 220, 53, 69;--bs-btn-active-color: #fff;--bs-btn-active-bg: #dc3545;--bs-btn-active-border-color: #dc3545;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #dc3545;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #dc3545;--bs-gradient: none}.btn-outline-light{--bs-btn-color: #f8f9fa;--bs-btn-border-color: #f8f9fa;--bs-btn-hover-color: #000;--bs-btn-hover-bg: #f8f9fa;--bs-btn-hover-border-color: #f8f9fa;--bs-btn-focus-shadow-rgb: 248, 249, 250;--bs-btn-active-color: #000;--bs-btn-active-bg: #f8f9fa;--bs-btn-active-border-color: #f8f9fa;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #f8f9fa;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #f8f9fa;--bs-gradient: none}.btn-outline-dark{--bs-btn-color: #212529;--bs-btn-border-color: #212529;--bs-btn-hover-color: #fff;--bs-btn-hover-bg: #212529;--bs-btn-hover-border-color: #212529;--bs-btn-focus-shadow-rgb: 33, 37, 41;--bs-btn-active-color: #fff;--bs-btn-active-bg: #212529;--bs-btn-active-border-color: #212529;--bs-btn-active-shadow: inset 0 3px 5px rgba(0, 0, 0, .125);--bs-btn-disabled-color: #212529;--bs-btn-disabled-bg: transparent;--bs-btn-disabled-border-color: #212529;--bs-gradient: none}.btn-link{--bs-btn-font-weight: 400;--bs-btn-color: var(--bs-link-color);--bs-btn-bg: transparent;--bs-btn-border-color: transparent;--bs-btn-hover-color: var(--bs-link-hover-color);--bs-btn-hover-border-color: transparent;--bs-btn-active-color: var(--bs-link-hover-color);--bs-btn-active-border-color: transparent;--bs-btn-disabled-color: #6c757d;--bs-btn-disabled-border-color: transparent;--bs-btn-box-shadow: none;--bs-btn-focus-shadow-rgb: 49, 132, 253;text-decoration:underline}.btn-link:focus-visible{color:var(--bs-btn-color)}.btn-link:hover{color:var(--bs-btn-hover-color)}.btn-lg,.btn-group-lg>.btn{--bs-btn-padding-y: .5rem;--bs-btn-padding-x: 1rem;--bs-btn-font-size: 1.25rem;--bs-btn-border-radius: .5rem}.btn-sm,.btn-group-sm>.btn{--bs-btn-padding-y: .25rem;--bs-btn-padding-x: .5rem;--bs-btn-font-size: .875rem;--bs-btn-border-radius: .25rem}.fade{transition:opacity .15s linear}@media (prefers-reduced-motion: reduce){.fade{transition:none}}.fade:not(.show){opacity:0}.collapse:not(.show){display:none}.collapsing{height:0;overflow:hidden;transition:height .35s ease}@media (prefers-reduced-motion: reduce){.collapsing{transition:none}}.collapsing.collapse-horizontal{width:0;height:auto;transition:width .35s ease}@media (prefers-reduced-motion: reduce){.collapsing.collapse-horizontal{transition:none}}.dropup,.dropend,.dropdown,.dropstart,.dropup-center,.dropdown-center{position:relative}.dropdown-toggle{white-space:nowrap}.dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid;border-right:.3em solid transparent;border-bottom:0;border-left:.3em solid transparent}.dropdown-toggle:empty:after{margin-left:0}.dropdown-menu{--bs-dropdown-zindex: 1000;--bs-dropdown-min-width: 10rem;--bs-dropdown-padding-x: 0;--bs-dropdown-padding-y: .5rem;--bs-dropdown-spacer: .125rem;--bs-dropdown-font-size: 1rem;--bs-dropdown-color: #212529;--bs-dropdown-bg: #fff;--bs-dropdown-border-color: var(--bs-border-color-translucent);--bs-dropdown-border-radius: .375rem;--bs-dropdown-border-width: 1px;--bs-dropdown-inner-border-radius:calc(.375rem - 1px);--bs-dropdown-divider-bg: var(--bs-border-color-translucent);--bs-dropdown-divider-margin-y: .5rem;--bs-dropdown-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15);--bs-dropdown-link-color: #212529;--bs-dropdown-link-hover-color: #1e2125;--bs-dropdown-link-hover-bg: #e9ecef;--bs-dropdown-link-active-color: #fff;--bs-dropdown-link-active-bg: #0d6efd;--bs-dropdown-link-disabled-color: #adb5bd;--bs-dropdown-item-padding-x: 1rem;--bs-dropdown-item-padding-y: .25rem;--bs-dropdown-header-color: #6c757d;--bs-dropdown-header-padding-x: 1rem;--bs-dropdown-header-padding-y: .5rem;position:absolute;z-index:var(--bs-dropdown-zindex);display:none;min-width:var(--bs-dropdown-min-width);padding:var(--bs-dropdown-padding-y) var(--bs-dropdown-padding-x);margin:0;font-size:var(--bs-dropdown-font-size);color:var(--bs-dropdown-color);text-align:left;list-style:none;background-color:var(--bs-dropdown-bg);background-clip:padding-box;border:var(--bs-dropdown-border-width) solid var(--bs-dropdown-border-color);border-radius:var(--bs-dropdown-border-radius)}.dropdown-menu[data-bs-popper]{top:100%;left:0;margin-top:var(--bs-dropdown-spacer)}.dropdown-menu-start{--bs-position: start}.dropdown-menu-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-end{--bs-position: end}.dropdown-menu-end[data-bs-popper]{right:0;left:auto}@media (min-width: 576px){.dropdown-menu-sm-start{--bs-position: start}.dropdown-menu-sm-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-sm-end{--bs-position: end}.dropdown-menu-sm-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 768px){.dropdown-menu-md-start{--bs-position: start}.dropdown-menu-md-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-md-end{--bs-position: end}.dropdown-menu-md-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 992px){.dropdown-menu-lg-start{--bs-position: start}.dropdown-menu-lg-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-lg-end{--bs-position: end}.dropdown-menu-lg-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1200px){.dropdown-menu-xl-start{--bs-position: start}.dropdown-menu-xl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xl-end{--bs-position: end}.dropdown-menu-xl-end[data-bs-popper]{right:0;left:auto}}@media (min-width: 1400px){.dropdown-menu-xxl-start{--bs-position: start}.dropdown-menu-xxl-start[data-bs-popper]{right:auto;left:0}.dropdown-menu-xxl-end{--bs-position: end}.dropdown-menu-xxl-end[data-bs-popper]{right:0;left:auto}}.dropup .dropdown-menu[data-bs-popper]{top:auto;bottom:100%;margin-top:0;margin-bottom:var(--bs-dropdown-spacer)}.dropup .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:0;border-right:.3em solid transparent;border-bottom:.3em solid;border-left:.3em solid transparent}.dropup .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-menu[data-bs-popper]{top:0;right:auto;left:100%;margin-top:0;margin-left:var(--bs-dropdown-spacer)}.dropend .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:0;border-bottom:.3em solid transparent;border-left:.3em solid}.dropend .dropdown-toggle:empty:after{margin-left:0}.dropend .dropdown-toggle:after{vertical-align:0}.dropstart .dropdown-menu[data-bs-popper]{top:0;right:100%;left:auto;margin-top:0;margin-right:var(--bs-dropdown-spacer)}.dropstart .dropdown-toggle:after{display:inline-block;margin-left:.255em;vertical-align:.255em;content:""}.dropstart .dropdown-toggle:after{display:none}.dropstart .dropdown-toggle:before{display:inline-block;margin-right:.255em;vertical-align:.255em;content:"";border-top:.3em solid transparent;border-right:.3em solid;border-bottom:.3em solid transparent}.dropstart .dropdown-toggle:empty:after{margin-left:0}.dropstart .dropdown-toggle:before{vertical-align:0}.dropdown-divider{height:0;margin:var(--bs-dropdown-divider-margin-y) 0;overflow:hidden;border-top:1px solid var(--bs-dropdown-divider-bg);opacity:1}.dropdown-item{display:block;width:100%;padding:var(--bs-dropdown-item-padding-y) var(--bs-dropdown-item-padding-x);clear:both;font-weight:400;color:var(--bs-dropdown-link-color);text-align:inherit;text-decoration:none;white-space:nowrap;background-color:transparent;border:0}.dropdown-item:hover,.dropdown-item:focus{color:var(--bs-dropdown-link-hover-color);background-color:var(--bs-dropdown-link-hover-bg)}.dropdown-item.active,.dropdown-item:active{color:var(--bs-dropdown-link-active-color);text-decoration:none;background-color:var(--bs-dropdown-link-active-bg)}.dropdown-item.disabled,.dropdown-item:disabled{color:var(--bs-dropdown-link-disabled-color);pointer-events:none;background-color:transparent}.dropdown-menu.show{display:block}.dropdown-header{display:block;padding:var(--bs-dropdown-header-padding-y) var(--bs-dropdown-header-padding-x);margin-bottom:0;font-size:.875rem;color:var(--bs-dropdown-header-color);white-space:nowrap}.dropdown-item-text{display:block;padding:var(--bs-dropdown-item-padding-y) var(--bs-dropdown-item-padding-x);color:var(--bs-dropdown-link-color)}.dropdown-menu-dark{--bs-dropdown-color: #dee2e6;--bs-dropdown-bg: #343a40;--bs-dropdown-border-color: var(--bs-border-color-translucent);--bs-dropdown-box-shadow: ;--bs-dropdown-link-color: #dee2e6;--bs-dropdown-link-hover-color: #fff;--bs-dropdown-divider-bg: var(--bs-border-color-translucent);--bs-dropdown-link-hover-bg: rgba(255, 255, 255, .15);--bs-dropdown-link-active-color: #fff;--bs-dropdown-link-active-bg: #0d6efd;--bs-dropdown-link-disabled-color: #adb5bd;--bs-dropdown-header-color: #adb5bd}.btn-group,.btn-group-vertical{position:relative;display:inline-flex;vertical-align:middle}.btn-group>.btn,.btn-group-vertical>.btn{position:relative;flex:1 1 auto}.btn-group>.btn-check:checked+.btn,.btn-group>.btn-check:focus+.btn,.btn-group>.btn:hover,.btn-group>.btn:focus,.btn-group>.btn:active,.btn-group>.btn.active,.btn-group-vertical>.btn-check:checked+.btn,.btn-group-vertical>.btn-check:focus+.btn,.btn-group-vertical>.btn:hover,.btn-group-vertical>.btn:focus,.btn-group-vertical>.btn:active,.btn-group-vertical>.btn.active{z-index:1}.btn-toolbar{display:flex;flex-wrap:wrap;justify-content:flex-start}.btn-toolbar .input-group{width:auto}.btn-group{border-radius:.375rem}.btn-group>:not(.btn-check:first-child)+.btn,.btn-group>.btn-group:not(:first-child){margin-left:-1px}.btn-group>.btn:not(:last-child):not(.dropdown-toggle),.btn-group>.btn.dropdown-toggle-split:first-child,.btn-group>.btn-group:not(:last-child)>.btn{border-top-right-radius:0;border-bottom-right-radius:0}.btn-group>.btn:nth-child(n+3),.btn-group>:not(.btn-check)+.btn,.btn-group>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-bottom-left-radius:0}.dropdown-toggle-split{padding-right:.5625rem;padding-left:.5625rem}.dropdown-toggle-split:after,.dropup .dropdown-toggle-split:after,.dropend .dropdown-toggle-split:after{margin-left:0}.dropstart .dropdown-toggle-split:before{margin-right:0}.btn-sm+.dropdown-toggle-split,.btn-group-sm>.btn+.dropdown-toggle-split{padding-right:.375rem;padding-left:.375rem}.btn-lg+.dropdown-toggle-split,.btn-group-lg>.btn+.dropdown-toggle-split{padding-right:.75rem;padding-left:.75rem}.btn-group-vertical{flex-direction:column;align-items:flex-start;justify-content:center}.btn-group-vertical>.btn,.btn-group-vertical>.btn-group{width:100%}.btn-group-vertical>.btn:not(:first-child),.btn-group-vertical>.btn-group:not(:first-child){margin-top:-1px}.btn-group-vertical>.btn:not(:last-child):not(.dropdown-toggle),.btn-group-vertical>.btn-group:not(:last-child)>.btn{border-bottom-right-radius:0;border-bottom-left-radius:0}.btn-group-vertical>.btn~.btn,.btn-group-vertical>.btn-group:not(:first-child)>.btn{border-top-left-radius:0;border-top-right-radius:0}.nav{--bs-nav-link-padding-x: 1rem;--bs-nav-link-padding-y: .5rem;--bs-nav-link-font-weight: ;--bs-nav-link-color: var(--bs-link-color);--bs-nav-link-hover-color: var(--bs-link-hover-color);--bs-nav-link-disabled-color: #6c757d;display:flex;flex-wrap:wrap;padding-left:0;margin-bottom:0;list-style:none}.nav-link{display:block;padding:var(--bs-nav-link-padding-y) var(--bs-nav-link-padding-x);font-size:var(--bs-nav-link-font-size);font-weight:var(--bs-nav-link-font-weight);color:var(--bs-nav-link-color);text-decoration:none;transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out}@media (prefers-reduced-motion: reduce){.nav-link{transition:none}}.nav-link:hover,.nav-link:focus{color:var(--bs-nav-link-hover-color)}.nav-link.disabled{color:var(--bs-nav-link-disabled-color);pointer-events:none;cursor:default}.nav-tabs{--bs-nav-tabs-border-width: 1px;--bs-nav-tabs-border-color: #dee2e6;--bs-nav-tabs-border-radius: .375rem;--bs-nav-tabs-link-hover-border-color: #e9ecef #e9ecef #dee2e6;--bs-nav-tabs-link-active-color: #495057;--bs-nav-tabs-link-active-bg: #fff;--bs-nav-tabs-link-active-border-color: #dee2e6 #dee2e6 #fff;border-bottom:var(--bs-nav-tabs-border-width) solid var(--bs-nav-tabs-border-color)}.nav-tabs .nav-link{margin-bottom:calc(-1 * var(--bs-nav-tabs-border-width));background:none;border:var(--bs-nav-tabs-border-width) solid transparent;border-top-left-radius:var(--bs-nav-tabs-border-radius);border-top-right-radius:var(--bs-nav-tabs-border-radius)}.nav-tabs .nav-link:hover,.nav-tabs .nav-link:focus{isolation:isolate;border-color:var(--bs-nav-tabs-link-hover-border-color)}.nav-tabs .nav-link.disabled,.nav-tabs .nav-link:disabled{color:var(--bs-nav-link-disabled-color);background-color:transparent;border-color:transparent}.nav-tabs .nav-link.active,.nav-tabs .nav-item.show .nav-link{color:var(--bs-nav-tabs-link-active-color);background-color:var(--bs-nav-tabs-link-active-bg);border-color:var(--bs-nav-tabs-link-active-border-color)}.nav-tabs .dropdown-menu{margin-top:calc(-1 * var(--bs-nav-tabs-border-width));border-top-left-radius:0;border-top-right-radius:0}.nav-pills{--bs-nav-pills-border-radius: .375rem;--bs-nav-pills-link-active-color: #fff;--bs-nav-pills-link-active-bg: #0d6efd}.nav-pills .nav-link{background:none;border:0;border-radius:var(--bs-nav-pills-border-radius)}.nav-pills .nav-link:disabled{color:var(--bs-nav-link-disabled-color);background-color:transparent;border-color:transparent}.nav-pills .nav-link.active,.nav-pills .show>.nav-link{color:var(--bs-nav-pills-link-active-color);background-color:var(--bs-nav-pills-link-active-bg)}.nav-fill>.nav-link,.nav-fill .nav-item{flex:1 1 auto;text-align:center}.nav-justified>.nav-link,.nav-justified .nav-item{flex-basis:0;flex-grow:1;text-align:center}.nav-fill .nav-item .nav-link,.nav-justified .nav-item .nav-link{width:100%}.tab-content>.tab-pane{display:none}.tab-content>.active{display:block}.navbar{--bs-navbar-padding-x: 0;--bs-navbar-padding-y: .5rem;--bs-navbar-color: rgba(0, 0, 0, .55);--bs-navbar-hover-color: rgba(0, 0, 0, .7);--bs-navbar-disabled-color: rgba(0, 0, 0, .3);--bs-navbar-active-color: rgba(0, 0, 0, .9);--bs-navbar-brand-padding-y: .3125rem;--bs-navbar-brand-margin-end: 1rem;--bs-navbar-brand-font-size: 1.25rem;--bs-navbar-brand-color: rgba(0, 0, 0, .9);--bs-navbar-brand-hover-color: rgba(0, 0, 0, .9);--bs-navbar-nav-link-padding-x: .5rem;--bs-navbar-toggler-padding-y: .25rem;--bs-navbar-toggler-padding-x: .75rem;--bs-navbar-toggler-font-size: 1.25rem;--bs-navbar-toggler-icon-bg: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%280, 0, 0, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e");--bs-navbar-toggler-border-color: rgba(0, 0, 0, .1);--bs-navbar-toggler-border-radius: .375rem;--bs-navbar-toggler-focus-width: .25rem;--bs-navbar-toggler-transition: box-shadow .15s ease-in-out;position:relative;display:flex;flex-wrap:wrap;align-items:center;justify-content:space-between;padding:var(--bs-navbar-padding-y) var(--bs-navbar-padding-x)}.navbar>.container,.navbar>.container-fluid,.navbar>.container-sm,.navbar>.container-md,.navbar>.container-lg,.navbar>.container-xl,.navbar>.container-xxl{display:flex;flex-wrap:inherit;align-items:center;justify-content:space-between}.navbar-brand{padding-top:var(--bs-navbar-brand-padding-y);padding-bottom:var(--bs-navbar-brand-padding-y);margin-right:var(--bs-navbar-brand-margin-end);font-size:var(--bs-navbar-brand-font-size);color:var(--bs-navbar-brand-color);text-decoration:none;white-space:nowrap}.navbar-brand:hover,.navbar-brand:focus{color:var(--bs-navbar-brand-hover-color)}.navbar-nav{--bs-nav-link-padding-x: 0;--bs-nav-link-padding-y: .5rem;--bs-nav-link-font-weight: ;--bs-nav-link-color: var(--bs-navbar-color);--bs-nav-link-hover-color: var(--bs-navbar-hover-color);--bs-nav-link-disabled-color: var(--bs-navbar-disabled-color);display:flex;flex-direction:column;padding-left:0;margin-bottom:0;list-style:none}.navbar-nav .show>.nav-link,.navbar-nav .nav-link.active{color:var(--bs-navbar-active-color)}.navbar-nav .dropdown-menu{position:static}.navbar-text{padding-top:.5rem;padding-bottom:.5rem;color:var(--bs-navbar-color)}.navbar-text a,.navbar-text a:hover,.navbar-text a:focus{color:var(--bs-navbar-active-color)}.navbar-collapse{flex-basis:100%;flex-grow:1;align-items:center}.navbar-toggler{padding:var(--bs-navbar-toggler-padding-y) var(--bs-navbar-toggler-padding-x);font-size:var(--bs-navbar-toggler-font-size);line-height:1;color:var(--bs-navbar-color);background-color:transparent;border:var(--bs-border-width) solid var(--bs-navbar-toggler-border-color);border-radius:var(--bs-navbar-toggler-border-radius);transition:var(--bs-navbar-toggler-transition)}@media (prefers-reduced-motion: reduce){.navbar-toggler{transition:none}}.navbar-toggler:hover{text-decoration:none}.navbar-toggler:focus{text-decoration:none;outline:0;box-shadow:0 0 0 var(--bs-navbar-toggler-focus-width)}.navbar-toggler-icon{display:inline-block;width:1.5em;height:1.5em;vertical-align:middle;background-image:var(--bs-navbar-toggler-icon-bg);background-repeat:no-repeat;background-position:center;background-size:100%}.navbar-nav-scroll{max-height:var(--bs-scroll-height, 75vh);overflow-y:auto}@media (min-width: 576px){.navbar-expand-sm{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-sm .navbar-nav{flex-direction:row}.navbar-expand-sm .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-sm .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-sm .navbar-nav-scroll{overflow:visible}.navbar-expand-sm .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-sm .navbar-toggler{display:none}.navbar-expand-sm .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-sm .offcanvas .offcanvas-header{display:none}.navbar-expand-sm .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 768px){.navbar-expand-md{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-md .navbar-nav{flex-direction:row}.navbar-expand-md .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-md .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-md .navbar-nav-scroll{overflow:visible}.navbar-expand-md .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-md .navbar-toggler{display:none}.navbar-expand-md .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-md .offcanvas .offcanvas-header{display:none}.navbar-expand-md .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 992px){.navbar-expand-lg{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-lg .navbar-nav{flex-direction:row}.navbar-expand-lg .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-lg .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-lg .navbar-nav-scroll{overflow:visible}.navbar-expand-lg .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-lg .navbar-toggler{display:none}.navbar-expand-lg .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-lg .offcanvas .offcanvas-header{display:none}.navbar-expand-lg .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1200px){.navbar-expand-xl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xl .navbar-nav{flex-direction:row}.navbar-expand-xl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xl .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-xl .navbar-nav-scroll{overflow:visible}.navbar-expand-xl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xl .navbar-toggler{display:none}.navbar-expand-xl .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-xl .offcanvas .offcanvas-header{display:none}.navbar-expand-xl .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}@media (min-width: 1400px){.navbar-expand-xxl{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand-xxl .navbar-nav{flex-direction:row}.navbar-expand-xxl .navbar-nav .dropdown-menu{position:absolute}.navbar-expand-xxl .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand-xxl .navbar-nav-scroll{overflow:visible}.navbar-expand-xxl .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand-xxl .navbar-toggler{display:none}.navbar-expand-xxl .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand-xxl .offcanvas .offcanvas-header{display:none}.navbar-expand-xxl .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}}.navbar-expand{flex-wrap:nowrap;justify-content:flex-start}.navbar-expand .navbar-nav{flex-direction:row}.navbar-expand .navbar-nav .dropdown-menu{position:absolute}.navbar-expand .navbar-nav .nav-link{padding-right:var(--bs-navbar-nav-link-padding-x);padding-left:var(--bs-navbar-nav-link-padding-x)}.navbar-expand .navbar-nav-scroll{overflow:visible}.navbar-expand .navbar-collapse{display:flex!important;flex-basis:auto}.navbar-expand .navbar-toggler{display:none}.navbar-expand .offcanvas{position:static;z-index:auto;flex-grow:1;width:auto!important;height:auto!important;visibility:visible!important;background-color:transparent!important;border:0!important;transform:none!important;transition:none}.navbar-expand .offcanvas .offcanvas-header{display:none}.navbar-expand .offcanvas .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible}.navbar-dark{--bs-navbar-color: rgba(255, 255, 255, .55);--bs-navbar-hover-color: rgba(255, 255, 255, .75);--bs-navbar-disabled-color: rgba(255, 255, 255, .25);--bs-navbar-active-color: #fff;--bs-navbar-brand-color: #fff;--bs-navbar-brand-hover-color: #fff;--bs-navbar-toggler-border-color: rgba(255, 255, 255, .1);--bs-navbar-toggler-icon-bg: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 30 30'%3e%3cpath stroke='rgba%28255, 255, 255, 0.55%29' stroke-linecap='round' stroke-miterlimit='10' stroke-width='2' d='M4 7h22M4 15h22M4 23h22'/%3e%3c/svg%3e")}.card{--bs-card-spacer-y: 1rem;--bs-card-spacer-x: 1rem;--bs-card-title-spacer-y: .5rem;--bs-card-border-width: 1px;--bs-card-border-color: var(--bs-border-color-translucent);--bs-card-border-radius: .375rem;--bs-card-box-shadow: ;--bs-card-inner-border-radius:calc(.375rem - 1px);--bs-card-cap-padding-y: .5rem;--bs-card-cap-padding-x: 1rem;--bs-card-cap-bg: rgba(0, 0, 0, .03);--bs-card-cap-color: ;--bs-card-height: ;--bs-card-color: ;--bs-card-bg: #fff;--bs-card-img-overlay-padding: 1rem;--bs-card-group-margin: .75rem;position:relative;display:flex;flex-direction:column;min-width:0;height:var(--bs-card-height);word-wrap:break-word;background-color:var(--bs-card-bg);background-clip:border-box;border:var(--bs-card-border-width) solid var(--bs-card-border-color);border-radius:var(--bs-card-border-radius)}.card>hr{margin-right:0;margin-left:0}.card>.list-group{border-top:inherit;border-bottom:inherit}.card>.list-group:first-child{border-top-width:0;border-top-left-radius:var(--bs-card-inner-border-radius);border-top-right-radius:var(--bs-card-inner-border-radius)}.card>.list-group:last-child{border-bottom-width:0;border-bottom-right-radius:var(--bs-card-inner-border-radius);border-bottom-left-radius:var(--bs-card-inner-border-radius)}.card>.card-header+.list-group,.card>.list-group+.card-footer{border-top:0}.card-body{flex:1 1 auto;padding:var(--bs-card-spacer-y) var(--bs-card-spacer-x);color:var(--bs-card-color)}.card-title{margin-bottom:var(--bs-card-title-spacer-y)}.card-subtitle{margin-top:calc(-.5 * var(--bs-card-title-spacer-y));margin-bottom:0}.card-text:last-child{margin-bottom:0}.card-link+.card-link{margin-left:var(--bs-card-spacer-x)}.card-header{padding:var(--bs-card-cap-padding-y) var(--bs-card-cap-padding-x);margin-bottom:0;color:var(--bs-card-cap-color);background-color:var(--bs-card-cap-bg);border-bottom:var(--bs-card-border-width) solid var(--bs-card-border-color)}.card-header:first-child{border-radius:var(--bs-card-inner-border-radius) var(--bs-card-inner-border-radius) 0 0}.card-footer{padding:var(--bs-card-cap-padding-y) var(--bs-card-cap-padding-x);color:var(--bs-card-cap-color);background-color:var(--bs-card-cap-bg);border-top:var(--bs-card-border-width) solid var(--bs-card-border-color)}.card-footer:last-child{border-radius:0 0 var(--bs-card-inner-border-radius) var(--bs-card-inner-border-radius)}.card-header-tabs{margin-right:calc(-.5 * var(--bs-card-cap-padding-x));margin-bottom:calc(-1 * var(--bs-card-cap-padding-y));margin-left:calc(-.5 * var(--bs-card-cap-padding-x));border-bottom:0}.card-header-tabs .nav-link.active{background-color:var(--bs-card-bg);border-bottom-color:var(--bs-card-bg)}.card-header-pills{margin-right:calc(-.5 * var(--bs-card-cap-padding-x));margin-left:calc(-.5 * var(--bs-card-cap-padding-x))}.card-img-overlay{position:absolute;inset:0;padding:var(--bs-card-img-overlay-padding);border-radius:var(--bs-card-inner-border-radius)}.card-img,.card-img-top,.card-img-bottom{width:100%}.card-img,.card-img-top{border-top-left-radius:var(--bs-card-inner-border-radius);border-top-right-radius:var(--bs-card-inner-border-radius)}.card-img,.card-img-bottom{border-bottom-right-radius:var(--bs-card-inner-border-radius);border-bottom-left-radius:var(--bs-card-inner-border-radius)}.card-group>.card{margin-bottom:var(--bs-card-group-margin)}@media (min-width: 576px){.card-group{display:flex;flex-flow:row wrap}.card-group>.card{flex:1 0 0%;margin-bottom:0}.card-group>.card+.card{margin-left:0;border-left:0}.card-group>.card:not(:last-child){border-top-right-radius:0;border-bottom-right-radius:0}.card-group>.card:not(:last-child) .card-img-top,.card-group>.card:not(:last-child) .card-header{border-top-right-radius:0}.card-group>.card:not(:last-child) .card-img-bottom,.card-group>.card:not(:last-child) .card-footer{border-bottom-right-radius:0}.card-group>.card:not(:first-child){border-top-left-radius:0;border-bottom-left-radius:0}.card-group>.card:not(:first-child) .card-img-top,.card-group>.card:not(:first-child) .card-header{border-top-left-radius:0}.card-group>.card:not(:first-child) .card-img-bottom,.card-group>.card:not(:first-child) .card-footer{border-bottom-left-radius:0}}.accordion{--bs-accordion-color: #212529;--bs-accordion-bg: #fff;--bs-accordion-transition: color .15s ease-in-out, background-color .15s ease-in-out, border-color .15s ease-in-out, box-shadow .15s ease-in-out, border-radius .15s ease;--bs-accordion-border-color: var(--bs-border-color);--bs-accordion-border-width: 1px;--bs-accordion-border-radius: .375rem;--bs-accordion-inner-border-radius:calc(.375rem - 1px);--bs-accordion-btn-padding-x: 1.25rem;--bs-accordion-btn-padding-y: 1rem;--bs-accordion-btn-color: #212529;--bs-accordion-btn-bg: var(--bs-accordion-bg);--bs-accordion-btn-icon: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23212529'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");--bs-accordion-btn-icon-width: 1.25rem;--bs-accordion-btn-icon-transform: rotate(-180deg);--bs-accordion-btn-icon-transition: transform .2s ease-in-out;--bs-accordion-btn-active-icon: url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%230c63e4'%3e%3cpath fill-rule='evenodd' d='M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e");--bs-accordion-btn-focus-border-color: #86b7fe;--bs-accordion-btn-focus-box-shadow: 0 0 0 .25rem rgba(13, 110, 253, .25);--bs-accordion-body-padding-x: 1.25rem;--bs-accordion-body-padding-y: 1rem;--bs-accordion-active-color: #0c63e4;--bs-accordion-active-bg: #e7f1ff}.accordion-button{position:relative;display:flex;align-items:center;width:100%;padding:var(--bs-accordion-btn-padding-y) var(--bs-accordion-btn-padding-x);font-size:1rem;color:var(--bs-accordion-btn-color);text-align:left;background-color:var(--bs-accordion-btn-bg);border:0;border-radius:0;overflow-anchor:none;transition:var(--bs-accordion-transition)}@media (prefers-reduced-motion: reduce){.accordion-button{transition:none}}.accordion-button:not(.collapsed){color:var(--bs-accordion-active-color);background-color:var(--bs-accordion-active-bg);box-shadow:inset 0 calc(-1 * var(--bs-accordion-border-width)) 0 var(--bs-accordion-border-color)}.accordion-button:not(.collapsed):after{background-image:var(--bs-accordion-btn-active-icon);transform:var(--bs-accordion-btn-icon-transform)}.accordion-button:after{flex-shrink:0;width:var(--bs-accordion-btn-icon-width);height:var(--bs-accordion-btn-icon-width);margin-left:auto;content:"";background-image:var(--bs-accordion-btn-icon);background-repeat:no-repeat;background-size:var(--bs-accordion-btn-icon-width);transition:var(--bs-accordion-btn-icon-transition)}@media (prefers-reduced-motion: reduce){.accordion-button:after{transition:none}}.accordion-button:hover{z-index:2}.accordion-button:focus{z-index:3;border-color:var(--bs-accordion-btn-focus-border-color);outline:0;box-shadow:var(--bs-accordion-btn-focus-box-shadow)}.accordion-header{margin-bottom:0}.accordion-item{color:var(--bs-accordion-color);background-color:var(--bs-accordion-bg);border:var(--bs-accordion-border-width) solid var(--bs-accordion-border-color)}.accordion-item:first-of-type{border-top-left-radius:var(--bs-accordion-border-radius);border-top-right-radius:var(--bs-accordion-border-radius)}.accordion-item:first-of-type .accordion-button{border-top-left-radius:var(--bs-accordion-inner-border-radius);border-top-right-radius:var(--bs-accordion-inner-border-radius)}.accordion-item:not(:first-of-type){border-top:0}.accordion-item:last-of-type{border-bottom-right-radius:var(--bs-accordion-border-radius);border-bottom-left-radius:var(--bs-accordion-border-radius)}.accordion-item:last-of-type .accordion-button.collapsed{border-bottom-right-radius:var(--bs-accordion-inner-border-radius);border-bottom-left-radius:var(--bs-accordion-inner-border-radius)}.accordion-item:last-of-type .accordion-collapse{border-bottom-right-radius:var(--bs-accordion-border-radius);border-bottom-left-radius:var(--bs-accordion-border-radius)}.accordion-body{padding:var(--bs-accordion-body-padding-y) var(--bs-accordion-body-padding-x)}.accordion-flush .accordion-collapse{border-width:0}.accordion-flush .accordion-item{border-right:0;border-left:0;border-radius:0}.accordion-flush .accordion-item:first-child{border-top:0}.accordion-flush .accordion-item:last-child{border-bottom:0}.accordion-flush .accordion-item .accordion-button,.accordion-flush .accordion-item .accordion-button.collapsed{border-radius:0}.breadcrumb{--bs-breadcrumb-padding-x: 0;--bs-breadcrumb-padding-y: 0;--bs-breadcrumb-margin-bottom: 1rem;--bs-breadcrumb-bg: ;--bs-breadcrumb-border-radius: ;--bs-breadcrumb-divider-color: #6c757d;--bs-breadcrumb-item-padding-x: .5rem;--bs-breadcrumb-item-active-color: #6c757d;display:flex;flex-wrap:wrap;padding:var(--bs-breadcrumb-padding-y) var(--bs-breadcrumb-padding-x);margin-bottom:var(--bs-breadcrumb-margin-bottom);font-size:var(--bs-breadcrumb-font-size);list-style:none;background-color:var(--bs-breadcrumb-bg);border-radius:var(--bs-breadcrumb-border-radius)}.breadcrumb-item+.breadcrumb-item{padding-left:var(--bs-breadcrumb-item-padding-x)}.breadcrumb-item+.breadcrumb-item:before{float:left;padding-right:var(--bs-breadcrumb-item-padding-x);color:var(--bs-breadcrumb-divider-color);content:var(--bs-breadcrumb-divider, "/")}.breadcrumb-item.active{color:var(--bs-breadcrumb-item-active-color)}.pagination{--bs-pagination-padding-x: .75rem;--bs-pagination-padding-y: .375rem;--bs-pagination-font-size: 1rem;--bs-pagination-color: var(--bs-link-color);--bs-pagination-bg: #fff;--bs-pagination-border-width: 1px;--bs-pagination-border-color: #dee2e6;--bs-pagination-border-radius: .375rem;--bs-pagination-hover-color: var(--bs-link-hover-color);--bs-pagination-hover-bg: #e9ecef;--bs-pagination-hover-border-color: #dee2e6;--bs-pagination-focus-color: var(--bs-link-hover-color);--bs-pagination-focus-bg: #e9ecef;--bs-pagination-focus-box-shadow: 0 0 0 .25rem rgba(13, 110, 253, .25);--bs-pagination-active-color: #fff;--bs-pagination-active-bg: #0d6efd;--bs-pagination-active-border-color: #0d6efd;--bs-pagination-disabled-color: #6c757d;--bs-pagination-disabled-bg: #fff;--bs-pagination-disabled-border-color: #dee2e6;display:flex;padding-left:0;list-style:none}.page-link{position:relative;display:block;padding:var(--bs-pagination-padding-y) var(--bs-pagination-padding-x);font-size:var(--bs-pagination-font-size);color:var(--bs-pagination-color);text-decoration:none;background-color:var(--bs-pagination-bg);border:var(--bs-pagination-border-width) solid var(--bs-pagination-border-color);transition:color .15s ease-in-out,background-color .15s ease-in-out,border-color .15s ease-in-out,box-shadow .15s ease-in-out}@media (prefers-reduced-motion: reduce){.page-link{transition:none}}.page-link:hover{z-index:2;color:var(--bs-pagination-hover-color);background-color:var(--bs-pagination-hover-bg);border-color:var(--bs-pagination-hover-border-color)}.page-link:focus{z-index:3;color:var(--bs-pagination-focus-color);background-color:var(--bs-pagination-focus-bg);outline:0;box-shadow:var(--bs-pagination-focus-box-shadow)}.page-link.active,.active>.page-link{z-index:3;color:var(--bs-pagination-active-color);background-color:var(--bs-pagination-active-bg);border-color:var(--bs-pagination-active-border-color)}.page-link.disabled,.disabled>.page-link{color:var(--bs-pagination-disabled-color);pointer-events:none;background-color:var(--bs-pagination-disabled-bg);border-color:var(--bs-pagination-disabled-border-color)}.page-item:not(:first-child) .page-link{margin-left:-1px}.page-item:first-child .page-link{border-top-left-radius:var(--bs-pagination-border-radius);border-bottom-left-radius:var(--bs-pagination-border-radius)}.page-item:last-child .page-link{border-top-right-radius:var(--bs-pagination-border-radius);border-bottom-right-radius:var(--bs-pagination-border-radius)}.pagination-lg{--bs-pagination-padding-x: 1.5rem;--bs-pagination-padding-y: .75rem;--bs-pagination-font-size: 1.25rem;--bs-pagination-border-radius: .5rem}.pagination-sm{--bs-pagination-padding-x: .5rem;--bs-pagination-padding-y: .25rem;--bs-pagination-font-size: .875rem;--bs-pagination-border-radius: .25rem}.badge{--bs-badge-padding-x: .65em;--bs-badge-padding-y: .35em;--bs-badge-font-size: .75em;--bs-badge-font-weight: 700;--bs-badge-color: #fff;--bs-badge-border-radius: .375rem;display:inline-block;padding:var(--bs-badge-padding-y) var(--bs-badge-padding-x);font-size:var(--bs-badge-font-size);font-weight:var(--bs-badge-font-weight);line-height:1;color:var(--bs-badge-color);text-align:center;white-space:nowrap;vertical-align:baseline;border-radius:var(--bs-badge-border-radius)}.badge:empty{display:none}.btn .badge{position:relative;top:-1px}.alert{--bs-alert-bg: transparent;--bs-alert-padding-x: 1rem;--bs-alert-padding-y: 1rem;--bs-alert-margin-bottom: 1rem;--bs-alert-color: inherit;--bs-alert-border-color: transparent;--bs-alert-border: 1px solid var(--bs-alert-border-color);--bs-alert-border-radius: .375rem;position:relative;padding:var(--bs-alert-padding-y) var(--bs-alert-padding-x);margin-bottom:var(--bs-alert-margin-bottom);color:var(--bs-alert-color);background-color:var(--bs-alert-bg);border:var(--bs-alert-border);border-radius:var(--bs-alert-border-radius)}.alert-heading{color:inherit}.alert-link{font-weight:700}.alert-dismissible{padding-right:3rem}.alert-dismissible .btn-close{position:absolute;top:0;right:0;z-index:2;padding:1.25rem 1rem}.alert-primary{--bs-alert-color: #084298;--bs-alert-bg: #cfe2ff;--bs-alert-border-color: #b6d4fe}.alert-primary .alert-link{color:#06357a}.alert-secondary{--bs-alert-color: #41464b;--bs-alert-bg: #e2e3e5;--bs-alert-border-color: #d3d6d8}.alert-secondary .alert-link{color:#34383c}.alert-success{--bs-alert-color: #0f5132;--bs-alert-bg: #d1e7dd;--bs-alert-border-color: #badbcc}.alert-success .alert-link{color:#0c4128}.alert-info{--bs-alert-color: #055160;--bs-alert-bg: #cff4fc;--bs-alert-border-color: #b6effb}.alert-info .alert-link{color:#04414d}.alert-warning{--bs-alert-color: #664d03;--bs-alert-bg: #fff3cd;--bs-alert-border-color: #ffecb5}.alert-warning .alert-link{color:#523e02}.alert-danger{--bs-alert-color: #842029;--bs-alert-bg: #f8d7da;--bs-alert-border-color: #f5c2c7}.alert-danger .alert-link{color:#6a1a21}.alert-light{--bs-alert-color: #636464;--bs-alert-bg: #fefefe;--bs-alert-border-color: #fdfdfe}.alert-light .alert-link{color:#4f5050}.alert-dark{--bs-alert-color: #141619;--bs-alert-bg: #d3d3d4;--bs-alert-border-color: #bcbebf}.alert-dark .alert-link{color:#101214}@keyframes progress-bar-stripes{0%{background-position-x:1rem}}.progress{--bs-progress-height: 1rem;--bs-progress-font-size: .75rem;--bs-progress-bg: #e9ecef;--bs-progress-border-radius: .375rem;--bs-progress-box-shadow: inset 0 1px 2px rgba(0, 0, 0, .075);--bs-progress-bar-color: #fff;--bs-progress-bar-bg: #0d6efd;--bs-progress-bar-transition: width .6s ease;display:flex;height:var(--bs-progress-height);overflow:hidden;font-size:var(--bs-progress-font-size);background-color:var(--bs-progress-bg);border-radius:var(--bs-progress-border-radius)}.progress-bar{display:flex;flex-direction:column;justify-content:center;overflow:hidden;color:var(--bs-progress-bar-color);text-align:center;white-space:nowrap;background-color:var(--bs-progress-bar-bg);transition:var(--bs-progress-bar-transition)}@media (prefers-reduced-motion: reduce){.progress-bar{transition:none}}.progress-bar-striped{background-image:linear-gradient(45deg,rgba(255,255,255,.15) 25%,transparent 25%,transparent 50%,rgba(255,255,255,.15) 50%,rgba(255,255,255,.15) 75%,transparent 75%,transparent);background-size:var(--bs-progress-height) var(--bs-progress-height)}.progress-bar-animated{animation:1s linear infinite progress-bar-stripes}@media (prefers-reduced-motion: reduce){.progress-bar-animated{animation:none}}.list-group{--bs-list-group-color: #212529;--bs-list-group-bg: #fff;--bs-list-group-border-color: rgba(0, 0, 0, .125);--bs-list-group-border-width: 1px;--bs-list-group-border-radius: .375rem;--bs-list-group-item-padding-x: 1rem;--bs-list-group-item-padding-y: .5rem;--bs-list-group-action-color: #495057;--bs-list-group-action-hover-color: #495057;--bs-list-group-action-hover-bg: #f8f9fa;--bs-list-group-action-active-color: #212529;--bs-list-group-action-active-bg: #e9ecef;--bs-list-group-disabled-color: #6c757d;--bs-list-group-disabled-bg: #fff;--bs-list-group-active-color: #fff;--bs-list-group-active-bg: #0d6efd;--bs-list-group-active-border-color: #0d6efd;display:flex;flex-direction:column;padding-left:0;margin-bottom:0;border-radius:var(--bs-list-group-border-radius)}.list-group-numbered{list-style-type:none;counter-reset:section}.list-group-numbered>.list-group-item:before{content:counters(section,".") ". ";counter-increment:section}.list-group-item-action{width:100%;color:var(--bs-list-group-action-color);text-align:inherit}.list-group-item-action:hover,.list-group-item-action:focus{z-index:1;color:var(--bs-list-group-action-hover-color);text-decoration:none;background-color:var(--bs-list-group-action-hover-bg)}.list-group-item-action:active{color:var(--bs-list-group-action-active-color);background-color:var(--bs-list-group-action-active-bg)}.list-group-item{position:relative;display:block;padding:var(--bs-list-group-item-padding-y) var(--bs-list-group-item-padding-x);color:var(--bs-list-group-color);text-decoration:none;background-color:var(--bs-list-group-bg);border:var(--bs-list-group-border-width) solid var(--bs-list-group-border-color)}.list-group-item:first-child{border-top-left-radius:inherit;border-top-right-radius:inherit}.list-group-item:last-child{border-bottom-right-radius:inherit;border-bottom-left-radius:inherit}.list-group-item.disabled,.list-group-item:disabled{color:var(--bs-list-group-disabled-color);pointer-events:none;background-color:var(--bs-list-group-disabled-bg)}.list-group-item.active{z-index:2;color:var(--bs-list-group-active-color);background-color:var(--bs-list-group-active-bg);border-color:var(--bs-list-group-active-border-color)}.list-group-item+.list-group-item{border-top-width:0}.list-group-item+.list-group-item.active{margin-top:calc(-1 * var(--bs-list-group-border-width));border-top-width:var(--bs-list-group-border-width)}.list-group-horizontal{flex-direction:row}.list-group-horizontal>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal>.list-group-item.active{margin-top:0}.list-group-horizontal>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}@media (min-width: 576px){.list-group-horizontal-sm{flex-direction:row}.list-group-horizontal-sm>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-sm>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-sm>.list-group-item.active{margin-top:0}.list-group-horizontal-sm>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-sm>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 768px){.list-group-horizontal-md{flex-direction:row}.list-group-horizontal-md>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-md>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-md>.list-group-item.active{margin-top:0}.list-group-horizontal-md>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-md>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 992px){.list-group-horizontal-lg{flex-direction:row}.list-group-horizontal-lg>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-lg>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-lg>.list-group-item.active{margin-top:0}.list-group-horizontal-lg>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-lg>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 1200px){.list-group-horizontal-xl{flex-direction:row}.list-group-horizontal-xl>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-xl>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-xl>.list-group-item.active{margin-top:0}.list-group-horizontal-xl>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-xl>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}@media (min-width: 1400px){.list-group-horizontal-xxl{flex-direction:row}.list-group-horizontal-xxl>.list-group-item:first-child:not(:last-child){border-bottom-left-radius:var(--bs-list-group-border-radius);border-top-right-radius:0}.list-group-horizontal-xxl>.list-group-item:last-child:not(:first-child){border-top-right-radius:var(--bs-list-group-border-radius);border-bottom-left-radius:0}.list-group-horizontal-xxl>.list-group-item.active{margin-top:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item{border-top-width:var(--bs-list-group-border-width);border-left-width:0}.list-group-horizontal-xxl>.list-group-item+.list-group-item.active{margin-left:calc(-1 * var(--bs-list-group-border-width));border-left-width:var(--bs-list-group-border-width)}}.list-group-flush{border-radius:0}.list-group-flush>.list-group-item{border-width:0 0 var(--bs-list-group-border-width)}.list-group-flush>.list-group-item:last-child{border-bottom-width:0}.list-group-item-primary{color:#084298;background-color:#cfe2ff}.list-group-item-primary.list-group-item-action:hover,.list-group-item-primary.list-group-item-action:focus{color:#084298;background-color:#bacbe6}.list-group-item-primary.list-group-item-action.active{color:#fff;background-color:#084298;border-color:#084298}.list-group-item-secondary{color:#41464b;background-color:#e2e3e5}.list-group-item-secondary.list-group-item-action:hover,.list-group-item-secondary.list-group-item-action:focus{color:#41464b;background-color:#cbccce}.list-group-item-secondary.list-group-item-action.active{color:#fff;background-color:#41464b;border-color:#41464b}.list-group-item-success{color:#0f5132;background-color:#d1e7dd}.list-group-item-success.list-group-item-action:hover,.list-group-item-success.list-group-item-action:focus{color:#0f5132;background-color:#bcd0c7}.list-group-item-success.list-group-item-action.active{color:#fff;background-color:#0f5132;border-color:#0f5132}.list-group-item-info{color:#055160;background-color:#cff4fc}.list-group-item-info.list-group-item-action:hover,.list-group-item-info.list-group-item-action:focus{color:#055160;background-color:#badce3}.list-group-item-info.list-group-item-action.active{color:#fff;background-color:#055160;border-color:#055160}.list-group-item-warning{color:#664d03;background-color:#fff3cd}.list-group-item-warning.list-group-item-action:hover,.list-group-item-warning.list-group-item-action:focus{color:#664d03;background-color:#e6dbb9}.list-group-item-warning.list-group-item-action.active{color:#fff;background-color:#664d03;border-color:#664d03}.list-group-item-danger{color:#842029;background-color:#f8d7da}.list-group-item-danger.list-group-item-action:hover,.list-group-item-danger.list-group-item-action:focus{color:#842029;background-color:#dfc2c4}.list-group-item-danger.list-group-item-action.active{color:#fff;background-color:#842029;border-color:#842029}.list-group-item-light{color:#636464;background-color:#fefefe}.list-group-item-light.list-group-item-action:hover,.list-group-item-light.list-group-item-action:focus{color:#636464;background-color:#e5e5e5}.list-group-item-light.list-group-item-action.active{color:#fff;background-color:#636464;border-color:#636464}.list-group-item-dark{color:#141619;background-color:#d3d3d4}.list-group-item-dark.list-group-item-action:hover,.list-group-item-dark.list-group-item-action:focus{color:#141619;background-color:#bebebf}.list-group-item-dark.list-group-item-action.active{color:#fff;background-color:#141619;border-color:#141619}.btn-close{box-sizing:content-box;width:1em;height:1em;padding:.25em;color:#000;background:transparent url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23000'%3e%3cpath d='M.293.293a1 1 0 0 1 1.414 0L8 6.586 14.293.293a1 1 0 1 1 1.414 1.414L9.414 8l6.293 6.293a1 1 0 0 1-1.414 1.414L8 9.414l-6.293 6.293a1 1 0 0 1-1.414-1.414L6.586 8 .293 1.707a1 1 0 0 1 0-1.414z'/%3e%3c/svg%3e") center/1em auto no-repeat;border:0;border-radius:.375rem;opacity:.5}.btn-close:hover{color:#000;text-decoration:none;opacity:.75}.btn-close:focus{outline:0;box-shadow:0 0 0 .25rem #0d6efd40;opacity:1}.btn-close:disabled,.btn-close.disabled{pointer-events:none;-webkit-user-select:none;-moz-user-select:none;user-select:none;opacity:.25}.btn-close-white{filter:invert(1) grayscale(100%) brightness(200%)}.toast{--bs-toast-zindex: 1090;--bs-toast-padding-x: .75rem;--bs-toast-padding-y: .5rem;--bs-toast-spacing: 1.5rem;--bs-toast-max-width: 350px;--bs-toast-font-size: .875rem;--bs-toast-color: ;--bs-toast-bg: rgba(255, 255, 255, .85);--bs-toast-border-width: 1px;--bs-toast-border-color: var(--bs-border-color-translucent);--bs-toast-border-radius: .375rem;--bs-toast-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15);--bs-toast-header-color: #6c757d;--bs-toast-header-bg: rgba(255, 255, 255, .85);--bs-toast-header-border-color: rgba(0, 0, 0, .05);width:var(--bs-toast-max-width);max-width:100%;font-size:var(--bs-toast-font-size);color:var(--bs-toast-color);pointer-events:auto;background-color:var(--bs-toast-bg);background-clip:padding-box;border:var(--bs-toast-border-width) solid var(--bs-toast-border-color);box-shadow:var(--bs-toast-box-shadow);border-radius:var(--bs-toast-border-radius)}.toast.showing{opacity:0}.toast:not(.show){display:none}.toast-container{--bs-toast-zindex: 1090;position:absolute;z-index:var(--bs-toast-zindex);width:-webkit-max-content;width:-moz-max-content;width:max-content;max-width:100%;pointer-events:none}.toast-container>:not(:last-child){margin-bottom:var(--bs-toast-spacing)}.toast-header{display:flex;align-items:center;padding:var(--bs-toast-padding-y) var(--bs-toast-padding-x);color:var(--bs-toast-header-color);background-color:var(--bs-toast-header-bg);background-clip:padding-box;border-bottom:var(--bs-toast-border-width) solid var(--bs-toast-header-border-color);border-top-left-radius:calc(var(--bs-toast-border-radius) - var(--bs-toast-border-width));border-top-right-radius:calc(var(--bs-toast-border-radius) - var(--bs-toast-border-width))}.toast-header .btn-close{margin-right:calc(-.5 * var(--bs-toast-padding-x));margin-left:var(--bs-toast-padding-x)}.toast-body{padding:var(--bs-toast-padding-x);word-wrap:break-word}.modal{--bs-modal-zindex: 1055;--bs-modal-width: 500px;--bs-modal-padding: 1rem;--bs-modal-margin: .5rem;--bs-modal-color: ;--bs-modal-bg: #fff;--bs-modal-border-color: var(--bs-border-color-translucent);--bs-modal-border-width: 1px;--bs-modal-border-radius: .5rem;--bs-modal-box-shadow: 0 .125rem .25rem rgba(0, 0, 0, .075);--bs-modal-inner-border-radius:calc(.5rem - 1px);--bs-modal-header-padding-x: 1rem;--bs-modal-header-padding-y: 1rem;--bs-modal-header-padding: 1rem 1rem;--bs-modal-header-border-color: var(--bs-border-color);--bs-modal-header-border-width: 1px;--bs-modal-title-line-height: 1.5;--bs-modal-footer-gap: .5rem;--bs-modal-footer-bg: ;--bs-modal-footer-border-color: var(--bs-border-color);--bs-modal-footer-border-width: 1px;position:fixed;top:0;left:0;z-index:var(--bs-modal-zindex);display:none;width:100%;height:100%;overflow-x:hidden;overflow-y:auto;outline:0}.modal-dialog{position:relative;width:auto;margin:var(--bs-modal-margin);pointer-events:none}.modal.fade .modal-dialog{transition:transform .3s ease-out;transform:translateY(-50px)}@media (prefers-reduced-motion: reduce){.modal.fade .modal-dialog{transition:none}}.modal.show .modal-dialog{transform:none}.modal.modal-static .modal-dialog{transform:scale(1.02)}.modal-dialog-scrollable{height:calc(100% - var(--bs-modal-margin) * 2)}.modal-dialog-scrollable .modal-content{max-height:100%;overflow:hidden}.modal-dialog-scrollable .modal-body{overflow-y:auto}.modal-dialog-centered{display:flex;align-items:center;min-height:calc(100% - var(--bs-modal-margin) * 2)}.modal-content{position:relative;display:flex;flex-direction:column;width:100%;color:var(--bs-modal-color);pointer-events:auto;background-color:var(--bs-modal-bg);background-clip:padding-box;border:var(--bs-modal-border-width) solid var(--bs-modal-border-color);border-radius:var(--bs-modal-border-radius);outline:0}.modal-backdrop{--bs-backdrop-zindex: 1050;--bs-backdrop-bg: #000;--bs-backdrop-opacity: .5;position:fixed;top:0;left:0;z-index:var(--bs-backdrop-zindex);width:100vw;height:100vh;background-color:var(--bs-backdrop-bg)}.modal-backdrop.fade{opacity:0}.modal-backdrop.show{opacity:var(--bs-backdrop-opacity)}.modal-header{display:flex;flex-shrink:0;align-items:center;justify-content:space-between;padding:var(--bs-modal-header-padding);border-bottom:var(--bs-modal-header-border-width) solid var(--bs-modal-header-border-color);border-top-left-radius:var(--bs-modal-inner-border-radius);border-top-right-radius:var(--bs-modal-inner-border-radius)}.modal-header .btn-close{padding:calc(var(--bs-modal-header-padding-y) * .5) calc(var(--bs-modal-header-padding-x) * .5);margin:calc(-.5 * var(--bs-modal-header-padding-y)) calc(-.5 * var(--bs-modal-header-padding-x)) calc(-.5 * var(--bs-modal-header-padding-y)) auto}.modal-title{margin-bottom:0;line-height:var(--bs-modal-title-line-height)}.modal-body{position:relative;flex:1 1 auto;padding:var(--bs-modal-padding)}.modal-footer{display:flex;flex-shrink:0;flex-wrap:wrap;align-items:center;justify-content:flex-end;padding:calc(var(--bs-modal-padding) - var(--bs-modal-footer-gap) * .5);background-color:var(--bs-modal-footer-bg);border-top:var(--bs-modal-footer-border-width) solid var(--bs-modal-footer-border-color);border-bottom-right-radius:var(--bs-modal-inner-border-radius);border-bottom-left-radius:var(--bs-modal-inner-border-radius)}.modal-footer>*{margin:calc(var(--bs-modal-footer-gap) * .5)}@media (min-width: 576px){.modal{--bs-modal-margin: 1.75rem;--bs-modal-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15)}.modal-dialog{max-width:var(--bs-modal-width);margin-right:auto;margin-left:auto}.modal-sm{--bs-modal-width: 300px}}@media (min-width: 992px){.modal-lg,.modal-xl{--bs-modal-width: 800px}}@media (min-width: 1200px){.modal-xl{--bs-modal-width: 1140px}}.modal-fullscreen{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen .modal-header,.modal-fullscreen .modal-footer{border-radius:0}.modal-fullscreen .modal-body{overflow-y:auto}@media (max-width: 575.98px){.modal-fullscreen-sm-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-sm-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-sm-down .modal-header,.modal-fullscreen-sm-down .modal-footer{border-radius:0}.modal-fullscreen-sm-down .modal-body{overflow-y:auto}}@media (max-width: 767.98px){.modal-fullscreen-md-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-md-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-md-down .modal-header,.modal-fullscreen-md-down .modal-footer{border-radius:0}.modal-fullscreen-md-down .modal-body{overflow-y:auto}}@media (max-width: 991.98px){.modal-fullscreen-lg-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-lg-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-lg-down .modal-header,.modal-fullscreen-lg-down .modal-footer{border-radius:0}.modal-fullscreen-lg-down .modal-body{overflow-y:auto}}@media (max-width: 1199.98px){.modal-fullscreen-xl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xl-down .modal-header,.modal-fullscreen-xl-down .modal-footer{border-radius:0}.modal-fullscreen-xl-down .modal-body{overflow-y:auto}}@media (max-width: 1399.98px){.modal-fullscreen-xxl-down{width:100vw;max-width:none;height:100%;margin:0}.modal-fullscreen-xxl-down .modal-content{height:100%;border:0;border-radius:0}.modal-fullscreen-xxl-down .modal-header,.modal-fullscreen-xxl-down .modal-footer{border-radius:0}.modal-fullscreen-xxl-down .modal-body{overflow-y:auto}}.tooltip{--bs-tooltip-zindex: 1080;--bs-tooltip-max-width: 200px;--bs-tooltip-padding-x: .5rem;--bs-tooltip-padding-y: .25rem;--bs-tooltip-margin: ;--bs-tooltip-font-size: .875rem;--bs-tooltip-color: #fff;--bs-tooltip-bg: #000;--bs-tooltip-border-radius: .375rem;--bs-tooltip-opacity: .9;--bs-tooltip-arrow-width: .8rem;--bs-tooltip-arrow-height: .4rem;z-index:var(--bs-tooltip-zindex);display:block;padding:var(--bs-tooltip-arrow-height);margin:var(--bs-tooltip-margin);font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;white-space:normal;word-spacing:normal;line-break:auto;font-size:var(--bs-tooltip-font-size);word-wrap:break-word;opacity:0}.tooltip.show{opacity:var(--bs-tooltip-opacity)}.tooltip .tooltip-arrow{display:block;width:var(--bs-tooltip-arrow-width);height:var(--bs-tooltip-arrow-height)}.tooltip .tooltip-arrow:before{position:absolute;content:"";border-color:transparent;border-style:solid}.bs-tooltip-top .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow{bottom:0}.bs-tooltip-top .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=top] .tooltip-arrow:before{top:-1px;border-width:var(--bs-tooltip-arrow-height) calc(var(--bs-tooltip-arrow-width) * .5) 0;border-top-color:var(--bs-tooltip-bg)}.bs-tooltip-end .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow{left:0;width:var(--bs-tooltip-arrow-height);height:var(--bs-tooltip-arrow-width)}.bs-tooltip-end .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=right] .tooltip-arrow:before{right:-1px;border-width:calc(var(--bs-tooltip-arrow-width) * .5) var(--bs-tooltip-arrow-height) calc(var(--bs-tooltip-arrow-width) * .5) 0;border-right-color:var(--bs-tooltip-bg)}.bs-tooltip-bottom .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow{top:0}.bs-tooltip-bottom .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=bottom] .tooltip-arrow:before{bottom:-1px;border-width:0 calc(var(--bs-tooltip-arrow-width) * .5) var(--bs-tooltip-arrow-height);border-bottom-color:var(--bs-tooltip-bg)}.bs-tooltip-start .tooltip-arrow,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow{right:0;width:var(--bs-tooltip-arrow-height);height:var(--bs-tooltip-arrow-width)}.bs-tooltip-start .tooltip-arrow:before,.bs-tooltip-auto[data-popper-placement^=left] .tooltip-arrow:before{left:-1px;border-width:calc(var(--bs-tooltip-arrow-width) * .5) 0 calc(var(--bs-tooltip-arrow-width) * .5) var(--bs-tooltip-arrow-height);border-left-color:var(--bs-tooltip-bg)}.tooltip-inner{max-width:var(--bs-tooltip-max-width);padding:var(--bs-tooltip-padding-y) var(--bs-tooltip-padding-x);color:var(--bs-tooltip-color);text-align:center;background-color:var(--bs-tooltip-bg);border-radius:var(--bs-tooltip-border-radius)}.popover{--bs-popover-zindex: 1070;--bs-popover-max-width: 276px;--bs-popover-font-size: .875rem;--bs-popover-bg: #fff;--bs-popover-border-width: 1px;--bs-popover-border-color: var(--bs-border-color-translucent);--bs-popover-border-radius: .5rem;--bs-popover-inner-border-radius:calc(.5rem - 1px);--bs-popover-box-shadow: 0 .5rem 1rem rgba(0, 0, 0, .15);--bs-popover-header-padding-x: 1rem;--bs-popover-header-padding-y: .5rem;--bs-popover-header-font-size: 1rem;--bs-popover-header-color: ;--bs-popover-header-bg: #f0f0f0;--bs-popover-body-padding-x: 1rem;--bs-popover-body-padding-y: 1rem;--bs-popover-body-color: #212529;--bs-popover-arrow-width: 1rem;--bs-popover-arrow-height: .5rem;--bs-popover-arrow-border: var(--bs-popover-border-color);z-index:var(--bs-popover-zindex);display:block;max-width:var(--bs-popover-max-width);font-family:var(--bs-font-sans-serif);font-style:normal;font-weight:400;line-height:1.5;text-align:left;text-align:start;text-decoration:none;text-shadow:none;text-transform:none;letter-spacing:normal;word-break:normal;white-space:normal;word-spacing:normal;line-break:auto;font-size:var(--bs-popover-font-size);word-wrap:break-word;background-color:var(--bs-popover-bg);background-clip:padding-box;border:var(--bs-popover-border-width) solid var(--bs-popover-border-color);border-radius:var(--bs-popover-border-radius)}.popover .popover-arrow{display:block;width:var(--bs-popover-arrow-width);height:var(--bs-popover-arrow-height)}.popover .popover-arrow:before,.popover .popover-arrow:after{position:absolute;display:block;content:"";border-color:transparent;border-style:solid;border-width:0}.bs-popover-top>.popover-arrow,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow{bottom:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width))}.bs-popover-top>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:before,.bs-popover-top>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:after{border-width:var(--bs-popover-arrow-height) calc(var(--bs-popover-arrow-width) * .5) 0}.bs-popover-top>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:before{bottom:0;border-top-color:var(--bs-popover-arrow-border)}.bs-popover-top>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=top]>.popover-arrow:after{bottom:var(--bs-popover-border-width);border-top-color:var(--bs-popover-bg)}.bs-popover-end>.popover-arrow,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow{left:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width));width:var(--bs-popover-arrow-height);height:var(--bs-popover-arrow-width)}.bs-popover-end>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:before,.bs-popover-end>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:after{border-width:calc(var(--bs-popover-arrow-width) * .5) var(--bs-popover-arrow-height) calc(var(--bs-popover-arrow-width) * .5) 0}.bs-popover-end>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:before{left:0;border-right-color:var(--bs-popover-arrow-border)}.bs-popover-end>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=right]>.popover-arrow:after{left:var(--bs-popover-border-width);border-right-color:var(--bs-popover-bg)}.bs-popover-bottom>.popover-arrow,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow{top:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width))}.bs-popover-bottom>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:before,.bs-popover-bottom>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:after{border-width:0 calc(var(--bs-popover-arrow-width) * .5) var(--bs-popover-arrow-height)}.bs-popover-bottom>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:before{top:0;border-bottom-color:var(--bs-popover-arrow-border)}.bs-popover-bottom>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=bottom]>.popover-arrow:after{top:var(--bs-popover-border-width);border-bottom-color:var(--bs-popover-bg)}.bs-popover-bottom .popover-header:before,.bs-popover-auto[data-popper-placement^=bottom] .popover-header:before{position:absolute;top:0;left:50%;display:block;width:var(--bs-popover-arrow-width);margin-left:calc(-.5 * var(--bs-popover-arrow-width));content:"";border-bottom:var(--bs-popover-border-width) solid var(--bs-popover-header-bg)}.bs-popover-start>.popover-arrow,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow{right:calc(-1 * (var(--bs-popover-arrow-height)) - var(--bs-popover-border-width));width:var(--bs-popover-arrow-height);height:var(--bs-popover-arrow-width)}.bs-popover-start>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:before,.bs-popover-start>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:after{border-width:calc(var(--bs-popover-arrow-width) * .5) 0 calc(var(--bs-popover-arrow-width) * .5) var(--bs-popover-arrow-height)}.bs-popover-start>.popover-arrow:before,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:before{right:0;border-left-color:var(--bs-popover-arrow-border)}.bs-popover-start>.popover-arrow:after,.bs-popover-auto[data-popper-placement^=left]>.popover-arrow:after{right:var(--bs-popover-border-width);border-left-color:var(--bs-popover-bg)}.popover-header{padding:var(--bs-popover-header-padding-y) var(--bs-popover-header-padding-x);margin-bottom:0;font-size:var(--bs-popover-header-font-size);color:var(--bs-popover-header-color);background-color:var(--bs-popover-header-bg);border-bottom:var(--bs-popover-border-width) solid var(--bs-popover-border-color);border-top-left-radius:var(--bs-popover-inner-border-radius);border-top-right-radius:var(--bs-popover-inner-border-radius)}.popover-header:empty{display:none}.popover-body{padding:var(--bs-popover-body-padding-y) var(--bs-popover-body-padding-x);color:var(--bs-popover-body-color)}.carousel{position:relative}.carousel.pointer-event{touch-action:pan-y}.carousel-inner{position:relative;width:100%;overflow:hidden}.carousel-inner:after{display:block;clear:both;content:""}.carousel-item{position:relative;display:none;float:left;width:100%;margin-right:-100%;-webkit-backface-visibility:hidden;backface-visibility:hidden;transition:transform .6s ease-in-out}@media (prefers-reduced-motion: reduce){.carousel-item{transition:none}}.carousel-item.active,.carousel-item-next,.carousel-item-prev{display:block}.carousel-item-next:not(.carousel-item-start),.active.carousel-item-end{transform:translate(100%)}.carousel-item-prev:not(.carousel-item-end),.active.carousel-item-start{transform:translate(-100%)}.carousel-fade .carousel-item{opacity:0;transition-property:opacity;transform:none}.carousel-fade .carousel-item.active,.carousel-fade .carousel-item-next.carousel-item-start,.carousel-fade .carousel-item-prev.carousel-item-end{z-index:1;opacity:1}.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{z-index:0;opacity:0;transition:opacity 0s .6s}@media (prefers-reduced-motion: reduce){.carousel-fade .active.carousel-item-start,.carousel-fade .active.carousel-item-end{transition:none}}.carousel-control-prev,.carousel-control-next{position:absolute;top:0;bottom:0;z-index:1;display:flex;align-items:center;justify-content:center;width:15%;padding:0;color:#fff;text-align:center;background:none;border:0;opacity:.5;transition:opacity .15s ease}@media (prefers-reduced-motion: reduce){.carousel-control-prev,.carousel-control-next{transition:none}}.carousel-control-prev:hover,.carousel-control-prev:focus,.carousel-control-next:hover,.carousel-control-next:focus{color:#fff;text-decoration:none;outline:0;opacity:.9}.carousel-control-prev{left:0}.carousel-control-next{right:0}.carousel-control-prev-icon,.carousel-control-next-icon{display:inline-block;width:2rem;height:2rem;background-repeat:no-repeat;background-position:50%;background-size:100% 100%}.carousel-control-prev-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M11.354 1.646a.5.5 0 0 1 0 .708L5.707 8l5.647 5.646a.5.5 0 0 1-.708.708l-6-6a.5.5 0 0 1 0-.708l6-6a.5.5 0 0 1 .708 0z'/%3e%3c/svg%3e")}.carousel-control-next-icon{background-image:url("data:image/svg+xml,%3csvg xmlns='http://www.w3.org/2000/svg' viewBox='0 0 16 16' fill='%23fff'%3e%3cpath d='M4.646 1.646a.5.5 0 0 1 .708 0l6 6a.5.5 0 0 1 0 .708l-6 6a.5.5 0 0 1-.708-.708L10.293 8 4.646 2.354a.5.5 0 0 1 0-.708z'/%3e%3c/svg%3e")}.carousel-indicators{position:absolute;right:0;bottom:0;left:0;z-index:2;display:flex;justify-content:center;padding:0;margin-right:15%;margin-bottom:1rem;margin-left:15%;list-style:none}.carousel-indicators [data-bs-target]{box-sizing:content-box;flex:0 1 auto;width:30px;height:3px;padding:0;margin-right:3px;margin-left:3px;text-indent:-999px;cursor:pointer;background-color:#fff;background-clip:padding-box;border:0;border-top:10px solid transparent;border-bottom:10px solid transparent;opacity:.5;transition:opacity .6s ease}@media (prefers-reduced-motion: reduce){.carousel-indicators [data-bs-target]{transition:none}}.carousel-indicators .active{opacity:1}.carousel-caption{position:absolute;right:15%;bottom:1.25rem;left:15%;padding-top:1.25rem;padding-bottom:1.25rem;color:#fff;text-align:center}.carousel-dark .carousel-control-prev-icon,.carousel-dark .carousel-control-next-icon{filter:invert(1) grayscale(100)}.carousel-dark .carousel-indicators [data-bs-target]{background-color:#000}.carousel-dark .carousel-caption{color:#000}.spinner-grow,.spinner-border{display:inline-block;width:var(--bs-spinner-width);height:var(--bs-spinner-height);vertical-align:var(--bs-spinner-vertical-align);border-radius:50%;animation:var(--bs-spinner-animation-speed) linear infinite var(--bs-spinner-animation-name)}@keyframes spinner-border{to{transform:rotate(360deg)}}.spinner-border{--bs-spinner-width: 2rem;--bs-spinner-height: 2rem;--bs-spinner-vertical-align: -.125em;--bs-spinner-border-width: .25em;--bs-spinner-animation-speed: .75s;--bs-spinner-animation-name: spinner-border;border:var(--bs-spinner-border-width) solid currentcolor;border-right-color:transparent}.spinner-border-sm{--bs-spinner-width: 1rem;--bs-spinner-height: 1rem;--bs-spinner-border-width: .2em}@keyframes spinner-grow{0%{transform:scale(0)}50%{opacity:1;transform:none}}.spinner-grow{--bs-spinner-width: 2rem;--bs-spinner-height: 2rem;--bs-spinner-vertical-align: -.125em;--bs-spinner-animation-speed: .75s;--bs-spinner-animation-name: spinner-grow;background-color:currentcolor;opacity:0}.spinner-grow-sm{--bs-spinner-width: 1rem;--bs-spinner-height: 1rem}@media (prefers-reduced-motion: reduce){.spinner-border,.spinner-grow{--bs-spinner-animation-speed: 1.5s}}.offcanvas,.offcanvas-xxl,.offcanvas-xl,.offcanvas-lg,.offcanvas-md,.offcanvas-sm{--bs-offcanvas-zindex: 1045;--bs-offcanvas-width: 400px;--bs-offcanvas-height: 30vh;--bs-offcanvas-padding-x: 1rem;--bs-offcanvas-padding-y: 1rem;--bs-offcanvas-color: ;--bs-offcanvas-bg: #fff;--bs-offcanvas-border-width: 1px;--bs-offcanvas-border-color: var(--bs-border-color-translucent);--bs-offcanvas-box-shadow: 0 .125rem .25rem rgba(0, 0, 0, .075)}@media (max-width: 575.98px){.offcanvas-sm{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 575.98px) and (prefers-reduced-motion: reduce){.offcanvas-sm{transition:none}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 575.98px){.offcanvas-sm.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 575.98px){.offcanvas-sm.showing,.offcanvas-sm.show:not(.hiding){transform:none}}@media (max-width: 575.98px){.offcanvas-sm.showing,.offcanvas-sm.hiding,.offcanvas-sm.show{visibility:visible}}@media (min-width: 576px){.offcanvas-sm{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-sm .offcanvas-header{display:none}.offcanvas-sm .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 767.98px){.offcanvas-md{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 767.98px) and (prefers-reduced-motion: reduce){.offcanvas-md{transition:none}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 767.98px){.offcanvas-md.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 767.98px){.offcanvas-md.showing,.offcanvas-md.show:not(.hiding){transform:none}}@media (max-width: 767.98px){.offcanvas-md.showing,.offcanvas-md.hiding,.offcanvas-md.show{visibility:visible}}@media (min-width: 768px){.offcanvas-md{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-md .offcanvas-header{display:none}.offcanvas-md .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 991.98px){.offcanvas-lg{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 991.98px) and (prefers-reduced-motion: reduce){.offcanvas-lg{transition:none}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 991.98px){.offcanvas-lg.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 991.98px){.offcanvas-lg.showing,.offcanvas-lg.show:not(.hiding){transform:none}}@media (max-width: 991.98px){.offcanvas-lg.showing,.offcanvas-lg.hiding,.offcanvas-lg.show{visibility:visible}}@media (min-width: 992px){.offcanvas-lg{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-lg .offcanvas-header{display:none}.offcanvas-lg .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 1199.98px){.offcanvas-xl{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 1199.98px) and (prefers-reduced-motion: reduce){.offcanvas-xl{transition:none}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 1199.98px){.offcanvas-xl.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 1199.98px){.offcanvas-xl.showing,.offcanvas-xl.show:not(.hiding){transform:none}}@media (max-width: 1199.98px){.offcanvas-xl.showing,.offcanvas-xl.hiding,.offcanvas-xl.show{visibility:visible}}@media (min-width: 1200px){.offcanvas-xl{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-xl .offcanvas-header{display:none}.offcanvas-xl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}@media (max-width: 1399.98px){.offcanvas-xxl{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}}@media (max-width: 1399.98px) and (prefers-reduced-motion: reduce){.offcanvas-xxl{transition:none}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}}@media (max-width: 1399.98px){.offcanvas-xxl.showing,.offcanvas-xxl.show:not(.hiding){transform:none}}@media (max-width: 1399.98px){.offcanvas-xxl.showing,.offcanvas-xxl.hiding,.offcanvas-xxl.show{visibility:visible}}@media (min-width: 1400px){.offcanvas-xxl{--bs-offcanvas-height: auto;--bs-offcanvas-border-width: 0;background-color:transparent!important}.offcanvas-xxl .offcanvas-header{display:none}.offcanvas-xxl .offcanvas-body{display:flex;flex-grow:0;padding:0;overflow-y:visible;background-color:transparent!important}}.offcanvas{position:fixed;bottom:0;z-index:var(--bs-offcanvas-zindex);display:flex;flex-direction:column;max-width:100%;color:var(--bs-offcanvas-color);visibility:hidden;background-color:var(--bs-offcanvas-bg);background-clip:padding-box;outline:0;transition:transform .3s ease-in-out}@media (prefers-reduced-motion: reduce){.offcanvas{transition:none}}.offcanvas.offcanvas-start{top:0;left:0;width:var(--bs-offcanvas-width);border-right:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(-100%)}.offcanvas.offcanvas-end{top:0;right:0;width:var(--bs-offcanvas-width);border-left:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translate(100%)}.offcanvas.offcanvas-top{top:0;right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-bottom:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(-100%)}.offcanvas.offcanvas-bottom{right:0;left:0;height:var(--bs-offcanvas-height);max-height:100%;border-top:var(--bs-offcanvas-border-width) solid var(--bs-offcanvas-border-color);transform:translateY(100%)}.offcanvas.showing,.offcanvas.show:not(.hiding){transform:none}.offcanvas.showing,.offcanvas.hiding,.offcanvas.show{visibility:visible}.offcanvas-backdrop{position:fixed;top:0;left:0;z-index:1040;width:100vw;height:100vh;background-color:#000}.offcanvas-backdrop.fade{opacity:0}.offcanvas-backdrop.show{opacity:.5}.offcanvas-header{display:flex;align-items:center;justify-content:space-between;padding:var(--bs-offcanvas-padding-y) var(--bs-offcanvas-padding-x)}.offcanvas-header .btn-close{padding:calc(var(--bs-offcanvas-padding-y) * .5) calc(var(--bs-offcanvas-padding-x) * .5);margin-top:calc(-.5 * var(--bs-offcanvas-padding-y));margin-right:calc(-.5 * var(--bs-offcanvas-padding-x));margin-bottom:calc(-.5 * var(--bs-offcanvas-padding-y))}.offcanvas-title{margin-bottom:0;line-height:1.5}.offcanvas-body{flex-grow:1;padding:var(--bs-offcanvas-padding-y) var(--bs-offcanvas-padding-x);overflow-y:auto}.placeholder{display:inline-block;min-height:1em;vertical-align:middle;cursor:wait;background-color:currentcolor;opacity:.5}.placeholder.btn:before{display:inline-block;content:""}.placeholder-xs{min-height:.6em}.placeholder-sm{min-height:.8em}.placeholder-lg{min-height:1.2em}.placeholder-glow .placeholder{animation:placeholder-glow 2s ease-in-out infinite}@keyframes placeholder-glow{50%{opacity:.2}}.placeholder-wave{-webkit-mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);mask-image:linear-gradient(130deg,#000 55%,rgba(0,0,0,.8) 75%,#000 95%);-webkit-mask-size:200% 100%;mask-size:200% 100%;animation:placeholder-wave 2s linear infinite}@keyframes placeholder-wave{to{-webkit-mask-position:-200% 0%;mask-position:-200% 0%}}.clearfix:after{display:block;clear:both;content:""}.text-bg-primary{color:#fff!important;background-color:RGBA(13,110,253,var(--bs-bg-opacity, 1))!important}.text-bg-secondary{color:#fff!important;background-color:RGBA(108,117,125,var(--bs-bg-opacity, 1))!important}.text-bg-success{color:#fff!important;background-color:RGBA(25,135,84,var(--bs-bg-opacity, 1))!important}.text-bg-info{color:#000!important;background-color:RGBA(13,202,240,var(--bs-bg-opacity, 1))!important}.text-bg-warning{color:#000!important;background-color:RGBA(255,193,7,var(--bs-bg-opacity, 1))!important}.text-bg-danger{color:#fff!important;background-color:RGBA(220,53,69,var(--bs-bg-opacity, 1))!important}.text-bg-light{color:#000!important;background-color:RGBA(248,249,250,var(--bs-bg-opacity, 1))!important}.text-bg-dark{color:#fff!important;background-color:RGBA(33,37,41,var(--bs-bg-opacity, 1))!important}.link-primary{color:#0d6efd!important}.link-primary:hover,.link-primary:focus{color:#0a58ca!important}.link-secondary{color:#6c757d!important}.link-secondary:hover,.link-secondary:focus{color:#565e64!important}.link-success{color:#198754!important}.link-success:hover,.link-success:focus{color:#146c43!important}.link-info{color:#0dcaf0!important}.link-info:hover,.link-info:focus{color:#3dd5f3!important}.link-warning{color:#ffc107!important}.link-warning:hover,.link-warning:focus{color:#ffcd39!important}.link-danger{color:#dc3545!important}.link-danger:hover,.link-danger:focus{color:#b02a37!important}.link-light{color:#f8f9fa!important}.link-light:hover,.link-light:focus{color:#f9fafb!important}.link-dark{color:#212529!important}.link-dark:hover,.link-dark:focus{color:#1a1e21!important}.ratio{position:relative;width:100%}.ratio:before{display:block;padding-top:var(--bs-aspect-ratio);content:""}.ratio>*{position:absolute;top:0;left:0;width:100%;height:100%}.ratio-1x1{--bs-aspect-ratio: 100%}.ratio-4x3{--bs-aspect-ratio: 75%}.ratio-16x9{--bs-aspect-ratio: 56.25%}.ratio-21x9{--bs-aspect-ratio: 42.8571428571%}.fixed-top{position:fixed;top:0;right:0;left:0;z-index:1030}.fixed-bottom{position:fixed;right:0;bottom:0;left:0;z-index:1030}.sticky-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}@media (min-width: 576px){.sticky-sm-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-sm-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 768px){.sticky-md-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-md-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 992px){.sticky-lg-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-lg-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 1200px){.sticky-xl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-xl-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}@media (min-width: 1400px){.sticky-xxl-top{position:-webkit-sticky;position:sticky;top:0;z-index:1020}.sticky-xxl-bottom{position:-webkit-sticky;position:sticky;bottom:0;z-index:1020}}.hstack{display:flex;flex-direction:row;align-items:center;align-self:stretch}.vstack{display:flex;flex:1 1 auto;flex-direction:column;align-self:stretch}.visually-hidden,.visually-hidden-focusable:not(:focus):not(:focus-within){position:absolute!important;width:1px!important;height:1px!important;padding:0!important;margin:-1px!important;overflow:hidden!important;clip:rect(0,0,0,0)!important;white-space:nowrap!important;border:0!important}.stretched-link:after{position:absolute;inset:0;z-index:1;content:""}.text-truncate{overflow:hidden;text-overflow:ellipsis;white-space:nowrap}.vr{display:inline-block;align-self:stretch;width:1px;min-height:1em;background-color:currentcolor;opacity:.25}.align-baseline{vertical-align:baseline!important}.align-top{vertical-align:top!important}.align-middle{vertical-align:middle!important}.align-bottom{vertical-align:bottom!important}.align-text-bottom{vertical-align:text-bottom!important}.align-text-top{vertical-align:text-top!important}.float-start{float:left!important}.float-end{float:right!important}.float-none{float:none!important}.opacity-0{opacity:0!important}.opacity-25{opacity:.25!important}.opacity-50{opacity:.5!important}.opacity-75{opacity:.75!important}.opacity-100{opacity:1!important}.overflow-auto{overflow:auto!important}.overflow-hidden{overflow:hidden!important}.overflow-visible{overflow:visible!important}.overflow-scroll{overflow:scroll!important}.d-inline{display:inline!important}.d-inline-block{display:inline-block!important}.d-block{display:block!important}.d-grid{display:grid!important}.d-table{display:table!important}.d-table-row{display:table-row!important}.d-table-cell{display:table-cell!important}.d-flex{display:flex!important}.d-inline-flex{display:inline-flex!important}.d-none{display:none!important}.shadow{box-shadow:0 .5rem 1rem #00000026!important}.shadow-sm{box-shadow:0 .125rem .25rem #00000013!important}.shadow-lg{box-shadow:0 1rem 3rem #0000002d!important}.shadow-none{box-shadow:none!important}.position-static{position:static!important}.position-relative{position:relative!important}.position-absolute{position:absolute!important}.position-fixed{position:fixed!important}.position-sticky{position:-webkit-sticky!important;position:sticky!important}.top-0{top:0!important}.top-50{top:50%!important}.top-100{top:100%!important}.bottom-0{bottom:0!important}.bottom-50{bottom:50%!important}.bottom-100{bottom:100%!important}.start-0{left:0!important}.start-50{left:50%!important}.start-100{left:100%!important}.end-0{right:0!important}.end-50{right:50%!important}.end-100{right:100%!important}.translate-middle{transform:translate(-50%,-50%)!important}.translate-middle-x{transform:translate(-50%)!important}.translate-middle-y{transform:translateY(-50%)!important}.border{border:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-0{border:0!important}.border-top{border-top:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-top-0{border-top:0!important}.border-end{border-right:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-end-0{border-right:0!important}.border-bottom{border-bottom:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-bottom-0{border-bottom:0!important}.border-start{border-left:var(--bs-border-width) var(--bs-border-style) var(--bs-border-color)!important}.border-start-0{border-left:0!important}.border-primary{--bs-border-opacity: 1;border-color:rgba(var(--bs-primary-rgb),var(--bs-border-opacity))!important}.border-secondary{--bs-border-opacity: 1;border-color:rgba(var(--bs-secondary-rgb),var(--bs-border-opacity))!important}.border-success{--bs-border-opacity: 1;border-color:rgba(var(--bs-success-rgb),var(--bs-border-opacity))!important}.border-info{--bs-border-opacity: 1;border-color:rgba(var(--bs-info-rgb),var(--bs-border-opacity))!important}.border-warning{--bs-border-opacity: 1;border-color:rgba(var(--bs-warning-rgb),var(--bs-border-opacity))!important}.border-danger{--bs-border-opacity: 1;border-color:rgba(var(--bs-danger-rgb),var(--bs-border-opacity))!important}.border-light{--bs-border-opacity: 1;border-color:rgba(var(--bs-light-rgb),var(--bs-border-opacity))!important}.border-dark{--bs-border-opacity: 1;border-color:rgba(var(--bs-dark-rgb),var(--bs-border-opacity))!important}.border-white{--bs-border-opacity: 1;border-color:rgba(var(--bs-white-rgb),var(--bs-border-opacity))!important}.border-1{--bs-border-width: 1px}.border-2{--bs-border-width: 2px}.border-3{--bs-border-width: 3px}.border-4{--bs-border-width: 4px}.border-5{--bs-border-width: 5px}.border-opacity-10{--bs-border-opacity: .1}.border-opacity-25{--bs-border-opacity: .25}.border-opacity-50{--bs-border-opacity: .5}.border-opacity-75{--bs-border-opacity: .75}.border-opacity-100{--bs-border-opacity: 1}.w-25{width:25%!important}.w-50{width:50%!important}.w-75{width:75%!important}.w-100{width:100%!important}.w-auto{width:auto!important}.mw-100{max-width:100%!important}.vw-100{width:100vw!important}.min-vw-100{min-width:100vw!important}.h-25{height:25%!important}.h-50{height:50%!important}.h-75{height:75%!important}.h-100{height:100%!important}.h-auto{height:auto!important}.mh-100{max-height:100%!important}.vh-100{height:100vh!important}.min-vh-100{min-height:100vh!important}.flex-fill{flex:1 1 auto!important}.flex-row{flex-direction:row!important}.flex-column{flex-direction:column!important}.flex-row-reverse{flex-direction:row-reverse!important}.flex-column-reverse{flex-direction:column-reverse!important}.flex-grow-0{flex-grow:0!important}.flex-grow-1{flex-grow:1!important}.flex-shrink-0{flex-shrink:0!important}.flex-shrink-1{flex-shrink:1!important}.flex-wrap{flex-wrap:wrap!important}.flex-nowrap{flex-wrap:nowrap!important}.flex-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-start{justify-content:flex-start!important}.justify-content-end{justify-content:flex-end!important}.justify-content-center{justify-content:center!important}.justify-content-between{justify-content:space-between!important}.justify-content-around{justify-content:space-around!important}.justify-content-evenly{justify-content:space-evenly!important}.align-items-start{align-items:flex-start!important}.align-items-end{align-items:flex-end!important}.align-items-center{align-items:center!important}.align-items-baseline{align-items:baseline!important}.align-items-stretch{align-items:stretch!important}.align-content-start{align-content:flex-start!important}.align-content-end{align-content:flex-end!important}.align-content-center{align-content:center!important}.align-content-between{align-content:space-between!important}.align-content-around{align-content:space-around!important}.align-content-stretch{align-content:stretch!important}.align-self-auto{align-self:auto!important}.align-self-start{align-self:flex-start!important}.align-self-end{align-self:flex-end!important}.align-self-center{align-self:center!important}.align-self-baseline{align-self:baseline!important}.align-self-stretch{align-self:stretch!important}.order-first{order:-1!important}.order-0{order:0!important}.order-1{order:1!important}.order-2{order:2!important}.order-3{order:3!important}.order-4{order:4!important}.order-5{order:5!important}.order-last{order:6!important}.m-0{margin:0!important}.m-1{margin:.25rem!important}.m-2{margin:.5rem!important}.m-3{margin:1rem!important}.m-4{margin:1.5rem!important}.m-5{margin:3rem!important}.m-auto{margin:auto!important}.mx-0{margin-right:0!important;margin-left:0!important}.mx-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-3{margin-right:1rem!important;margin-left:1rem!important}.mx-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-5{margin-right:3rem!important;margin-left:3rem!important}.mx-auto{margin-right:auto!important;margin-left:auto!important}.my-0{margin-top:0!important;margin-bottom:0!important}.my-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-0{margin-top:0!important}.mt-1{margin-top:.25rem!important}.mt-2{margin-top:.5rem!important}.mt-3{margin-top:1rem!important}.mt-4{margin-top:1.5rem!important}.mt-5{margin-top:3rem!important}.mt-auto{margin-top:auto!important}.me-0{margin-right:0!important}.me-1{margin-right:.25rem!important}.me-2{margin-right:.5rem!important}.me-3{margin-right:1rem!important}.me-4{margin-right:1.5rem!important}.me-5{margin-right:3rem!important}.me-auto{margin-right:auto!important}.mb-0{margin-bottom:0!important}.mb-1{margin-bottom:.25rem!important}.mb-2{margin-bottom:.5rem!important}.mb-3{margin-bottom:1rem!important}.mb-4{margin-bottom:1.5rem!important}.mb-5{margin-bottom:3rem!important}.mb-auto{margin-bottom:auto!important}.ms-0{margin-left:0!important}.ms-1{margin-left:.25rem!important}.ms-2{margin-left:.5rem!important}.ms-3{margin-left:1rem!important}.ms-4{margin-left:1.5rem!important}.ms-5{margin-left:3rem!important}.ms-auto{margin-left:auto!important}.p-0{padding:0!important}.p-1{padding:.25rem!important}.p-2{padding:.5rem!important}.p-3{padding:1rem!important}.p-4{padding:1.5rem!important}.p-5{padding:3rem!important}.px-0{padding-right:0!important;padding-left:0!important}.px-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-3{padding-right:1rem!important;padding-left:1rem!important}.px-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-5{padding-right:3rem!important;padding-left:3rem!important}.py-0{padding-top:0!important;padding-bottom:0!important}.py-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-0{padding-top:0!important}.pt-1{padding-top:.25rem!important}.pt-2{padding-top:.5rem!important}.pt-3{padding-top:1rem!important}.pt-4{padding-top:1.5rem!important}.pt-5{padding-top:3rem!important}.pe-0{padding-right:0!important}.pe-1{padding-right:.25rem!important}.pe-2{padding-right:.5rem!important}.pe-3{padding-right:1rem!important}.pe-4{padding-right:1.5rem!important}.pe-5{padding-right:3rem!important}.pb-0{padding-bottom:0!important}.pb-1{padding-bottom:.25rem!important}.pb-2{padding-bottom:.5rem!important}.pb-3{padding-bottom:1rem!important}.pb-4{padding-bottom:1.5rem!important}.pb-5{padding-bottom:3rem!important}.ps-0{padding-left:0!important}.ps-1{padding-left:.25rem!important}.ps-2{padding-left:.5rem!important}.ps-3{padding-left:1rem!important}.ps-4{padding-left:1.5rem!important}.ps-5{padding-left:3rem!important}.gap-0{gap:0!important}.gap-1{gap:.25rem!important}.gap-2{gap:.5rem!important}.gap-3{gap:1rem!important}.gap-4{gap:1.5rem!important}.gap-5{gap:3rem!important}.font-monospace{font-family:var(--bs-font-monospace)!important}.fs-1{font-size:calc(1.375rem + 1.5vw)!important}.fs-2{font-size:calc(1.325rem + .9vw)!important}.fs-3{font-size:calc(1.3rem + .6vw)!important}.fs-4{font-size:calc(1.275rem + .3vw)!important}.fs-5{font-size:1.25rem!important}.fs-6{font-size:1rem!important}.fst-italic{font-style:italic!important}.fst-normal{font-style:normal!important}.fw-light{font-weight:300!important}.fw-lighter{font-weight:lighter!important}.fw-normal{font-weight:400!important}.fw-bold{font-weight:700!important}.fw-semibold{font-weight:600!important}.fw-bolder{font-weight:bolder!important}.lh-1{line-height:1!important}.lh-sm{line-height:1.25!important}.lh-base{line-height:1.5!important}.lh-lg{line-height:2!important}.text-start{text-align:left!important}.text-end{text-align:right!important}.text-center{text-align:center!important}.text-decoration-none{text-decoration:none!important}.text-decoration-underline{text-decoration:underline!important}.text-decoration-line-through{text-decoration:line-through!important}.text-lowercase{text-transform:lowercase!important}.text-uppercase{text-transform:uppercase!important}.text-capitalize{text-transform:capitalize!important}.text-wrap{white-space:normal!important}.text-nowrap{white-space:nowrap!important}.text-break{word-wrap:break-word!important;word-break:break-word!important}.text-primary{--bs-text-opacity: 1;color:rgba(var(--bs-primary-rgb),var(--bs-text-opacity))!important}.text-secondary{--bs-text-opacity: 1;color:rgba(var(--bs-secondary-rgb),var(--bs-text-opacity))!important}.text-success{--bs-text-opacity: 1;color:rgba(var(--bs-success-rgb),var(--bs-text-opacity))!important}.text-info{--bs-text-opacity: 1;color:rgba(var(--bs-info-rgb),var(--bs-text-opacity))!important}.text-warning{--bs-text-opacity: 1;color:rgba(var(--bs-warning-rgb),var(--bs-text-opacity))!important}.text-danger{--bs-text-opacity: 1;color:rgba(var(--bs-danger-rgb),var(--bs-text-opacity))!important}.text-light{--bs-text-opacity: 1;color:rgba(var(--bs-light-rgb),var(--bs-text-opacity))!important}.text-dark{--bs-text-opacity: 1;color:rgba(var(--bs-dark-rgb),var(--bs-text-opacity))!important}.text-black{--bs-text-opacity: 1;color:rgba(var(--bs-black-rgb),var(--bs-text-opacity))!important}.text-white{--bs-text-opacity: 1;color:rgba(var(--bs-white-rgb),var(--bs-text-opacity))!important}.text-body{--bs-text-opacity: 1;color:rgba(var(--bs-body-color-rgb),var(--bs-text-opacity))!important}.text-muted{--bs-text-opacity: 1;color:#6c757d!important}.text-black-50{--bs-text-opacity: 1;color:#00000080!important}.text-white-50{--bs-text-opacity: 1;color:#ffffff80!important}.text-reset{--bs-text-opacity: 1;color:inherit!important}.text-opacity-25{--bs-text-opacity: .25}.text-opacity-50{--bs-text-opacity: .5}.text-opacity-75{--bs-text-opacity: .75}.text-opacity-100{--bs-text-opacity: 1}.bg-primary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-primary-rgb),var(--bs-bg-opacity))!important}.bg-secondary{--bs-bg-opacity: 1;background-color:rgba(var(--bs-secondary-rgb),var(--bs-bg-opacity))!important}.bg-success{--bs-bg-opacity: 1;background-color:rgba(var(--bs-success-rgb),var(--bs-bg-opacity))!important}.bg-info{--bs-bg-opacity: 1;background-color:rgba(var(--bs-info-rgb),var(--bs-bg-opacity))!important}.bg-warning{--bs-bg-opacity: 1;background-color:rgba(var(--bs-warning-rgb),var(--bs-bg-opacity))!important}.bg-danger{--bs-bg-opacity: 1;background-color:rgba(var(--bs-danger-rgb),var(--bs-bg-opacity))!important}.bg-light{--bs-bg-opacity: 1;background-color:rgba(var(--bs-light-rgb),var(--bs-bg-opacity))!important}.bg-dark{--bs-bg-opacity: 1;background-color:rgba(var(--bs-dark-rgb),var(--bs-bg-opacity))!important}.bg-black{--bs-bg-opacity: 1;background-color:rgba(var(--bs-black-rgb),var(--bs-bg-opacity))!important}.bg-white{--bs-bg-opacity: 1;background-color:rgba(var(--bs-white-rgb),var(--bs-bg-opacity))!important}.bg-body{--bs-bg-opacity: 1;background-color:rgba(var(--bs-body-bg-rgb),var(--bs-bg-opacity))!important}.bg-transparent{--bs-bg-opacity: 1;background-color:transparent!important}.bg-opacity-10{--bs-bg-opacity: .1}.bg-opacity-25{--bs-bg-opacity: .25}.bg-opacity-50{--bs-bg-opacity: .5}.bg-opacity-75{--bs-bg-opacity: .75}.bg-opacity-100{--bs-bg-opacity: 1}.bg-gradient{background-image:var(--bs-gradient)!important}.user-select-all{-webkit-user-select:all!important;-moz-user-select:all!important;user-select:all!important}.user-select-auto{-webkit-user-select:auto!important;-moz-user-select:auto!important;user-select:auto!important}.user-select-none{-webkit-user-select:none!important;-moz-user-select:none!important;user-select:none!important}.pe-none{pointer-events:none!important}.pe-auto{pointer-events:auto!important}.rounded{border-radius:var(--bs-border-radius)!important}.rounded-0{border-radius:0!important}.rounded-1{border-radius:var(--bs-border-radius-sm)!important}.rounded-2{border-radius:var(--bs-border-radius)!important}.rounded-3{border-radius:var(--bs-border-radius-lg)!important}.rounded-4{border-radius:var(--bs-border-radius-xl)!important}.rounded-5{border-radius:var(--bs-border-radius-2xl)!important}.rounded-circle{border-radius:50%!important}.rounded-pill{border-radius:var(--bs-border-radius-pill)!important}.rounded-top{border-top-left-radius:var(--bs-border-radius)!important;border-top-right-radius:var(--bs-border-radius)!important}.rounded-end{border-top-right-radius:var(--bs-border-radius)!important;border-bottom-right-radius:var(--bs-border-radius)!important}.rounded-bottom{border-bottom-right-radius:var(--bs-border-radius)!important;border-bottom-left-radius:var(--bs-border-radius)!important}.rounded-start{border-bottom-left-radius:var(--bs-border-radius)!important;border-top-left-radius:var(--bs-border-radius)!important}.visible{visibility:visible!important}.invisible{visibility:hidden!important}@media (min-width: 576px){.float-sm-start{float:left!important}.float-sm-end{float:right!important}.float-sm-none{float:none!important}.d-sm-inline{display:inline!important}.d-sm-inline-block{display:inline-block!important}.d-sm-block{display:block!important}.d-sm-grid{display:grid!important}.d-sm-table{display:table!important}.d-sm-table-row{display:table-row!important}.d-sm-table-cell{display:table-cell!important}.d-sm-flex{display:flex!important}.d-sm-inline-flex{display:inline-flex!important}.d-sm-none{display:none!important}.flex-sm-fill{flex:1 1 auto!important}.flex-sm-row{flex-direction:row!important}.flex-sm-column{flex-direction:column!important}.flex-sm-row-reverse{flex-direction:row-reverse!important}.flex-sm-column-reverse{flex-direction:column-reverse!important}.flex-sm-grow-0{flex-grow:0!important}.flex-sm-grow-1{flex-grow:1!important}.flex-sm-shrink-0{flex-shrink:0!important}.flex-sm-shrink-1{flex-shrink:1!important}.flex-sm-wrap{flex-wrap:wrap!important}.flex-sm-nowrap{flex-wrap:nowrap!important}.flex-sm-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-sm-start{justify-content:flex-start!important}.justify-content-sm-end{justify-content:flex-end!important}.justify-content-sm-center{justify-content:center!important}.justify-content-sm-between{justify-content:space-between!important}.justify-content-sm-around{justify-content:space-around!important}.justify-content-sm-evenly{justify-content:space-evenly!important}.align-items-sm-start{align-items:flex-start!important}.align-items-sm-end{align-items:flex-end!important}.align-items-sm-center{align-items:center!important}.align-items-sm-baseline{align-items:baseline!important}.align-items-sm-stretch{align-items:stretch!important}.align-content-sm-start{align-content:flex-start!important}.align-content-sm-end{align-content:flex-end!important}.align-content-sm-center{align-content:center!important}.align-content-sm-between{align-content:space-between!important}.align-content-sm-around{align-content:space-around!important}.align-content-sm-stretch{align-content:stretch!important}.align-self-sm-auto{align-self:auto!important}.align-self-sm-start{align-self:flex-start!important}.align-self-sm-end{align-self:flex-end!important}.align-self-sm-center{align-self:center!important}.align-self-sm-baseline{align-self:baseline!important}.align-self-sm-stretch{align-self:stretch!important}.order-sm-first{order:-1!important}.order-sm-0{order:0!important}.order-sm-1{order:1!important}.order-sm-2{order:2!important}.order-sm-3{order:3!important}.order-sm-4{order:4!important}.order-sm-5{order:5!important}.order-sm-last{order:6!important}.m-sm-0{margin:0!important}.m-sm-1{margin:.25rem!important}.m-sm-2{margin:.5rem!important}.m-sm-3{margin:1rem!important}.m-sm-4{margin:1.5rem!important}.m-sm-5{margin:3rem!important}.m-sm-auto{margin:auto!important}.mx-sm-0{margin-right:0!important;margin-left:0!important}.mx-sm-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-sm-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-sm-3{margin-right:1rem!important;margin-left:1rem!important}.mx-sm-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-sm-5{margin-right:3rem!important;margin-left:3rem!important}.mx-sm-auto{margin-right:auto!important;margin-left:auto!important}.my-sm-0{margin-top:0!important;margin-bottom:0!important}.my-sm-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-sm-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-sm-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-sm-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-sm-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-sm-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-sm-0{margin-top:0!important}.mt-sm-1{margin-top:.25rem!important}.mt-sm-2{margin-top:.5rem!important}.mt-sm-3{margin-top:1rem!important}.mt-sm-4{margin-top:1.5rem!important}.mt-sm-5{margin-top:3rem!important}.mt-sm-auto{margin-top:auto!important}.me-sm-0{margin-right:0!important}.me-sm-1{margin-right:.25rem!important}.me-sm-2{margin-right:.5rem!important}.me-sm-3{margin-right:1rem!important}.me-sm-4{margin-right:1.5rem!important}.me-sm-5{margin-right:3rem!important}.me-sm-auto{margin-right:auto!important}.mb-sm-0{margin-bottom:0!important}.mb-sm-1{margin-bottom:.25rem!important}.mb-sm-2{margin-bottom:.5rem!important}.mb-sm-3{margin-bottom:1rem!important}.mb-sm-4{margin-bottom:1.5rem!important}.mb-sm-5{margin-bottom:3rem!important}.mb-sm-auto{margin-bottom:auto!important}.ms-sm-0{margin-left:0!important}.ms-sm-1{margin-left:.25rem!important}.ms-sm-2{margin-left:.5rem!important}.ms-sm-3{margin-left:1rem!important}.ms-sm-4{margin-left:1.5rem!important}.ms-sm-5{margin-left:3rem!important}.ms-sm-auto{margin-left:auto!important}.p-sm-0{padding:0!important}.p-sm-1{padding:.25rem!important}.p-sm-2{padding:.5rem!important}.p-sm-3{padding:1rem!important}.p-sm-4{padding:1.5rem!important}.p-sm-5{padding:3rem!important}.px-sm-0{padding-right:0!important;padding-left:0!important}.px-sm-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-sm-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-sm-3{padding-right:1rem!important;padding-left:1rem!important}.px-sm-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-sm-5{padding-right:3rem!important;padding-left:3rem!important}.py-sm-0{padding-top:0!important;padding-bottom:0!important}.py-sm-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-sm-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-sm-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-sm-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-sm-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-sm-0{padding-top:0!important}.pt-sm-1{padding-top:.25rem!important}.pt-sm-2{padding-top:.5rem!important}.pt-sm-3{padding-top:1rem!important}.pt-sm-4{padding-top:1.5rem!important}.pt-sm-5{padding-top:3rem!important}.pe-sm-0{padding-right:0!important}.pe-sm-1{padding-right:.25rem!important}.pe-sm-2{padding-right:.5rem!important}.pe-sm-3{padding-right:1rem!important}.pe-sm-4{padding-right:1.5rem!important}.pe-sm-5{padding-right:3rem!important}.pb-sm-0{padding-bottom:0!important}.pb-sm-1{padding-bottom:.25rem!important}.pb-sm-2{padding-bottom:.5rem!important}.pb-sm-3{padding-bottom:1rem!important}.pb-sm-4{padding-bottom:1.5rem!important}.pb-sm-5{padding-bottom:3rem!important}.ps-sm-0{padding-left:0!important}.ps-sm-1{padding-left:.25rem!important}.ps-sm-2{padding-left:.5rem!important}.ps-sm-3{padding-left:1rem!important}.ps-sm-4{padding-left:1.5rem!important}.ps-sm-5{padding-left:3rem!important}.gap-sm-0{gap:0!important}.gap-sm-1{gap:.25rem!important}.gap-sm-2{gap:.5rem!important}.gap-sm-3{gap:1rem!important}.gap-sm-4{gap:1.5rem!important}.gap-sm-5{gap:3rem!important}.text-sm-start{text-align:left!important}.text-sm-end{text-align:right!important}.text-sm-center{text-align:center!important}}@media (min-width: 768px){.float-md-start{float:left!important}.float-md-end{float:right!important}.float-md-none{float:none!important}.d-md-inline{display:inline!important}.d-md-inline-block{display:inline-block!important}.d-md-block{display:block!important}.d-md-grid{display:grid!important}.d-md-table{display:table!important}.d-md-table-row{display:table-row!important}.d-md-table-cell{display:table-cell!important}.d-md-flex{display:flex!important}.d-md-inline-flex{display:inline-flex!important}.d-md-none{display:none!important}.flex-md-fill{flex:1 1 auto!important}.flex-md-row{flex-direction:row!important}.flex-md-column{flex-direction:column!important}.flex-md-row-reverse{flex-direction:row-reverse!important}.flex-md-column-reverse{flex-direction:column-reverse!important}.flex-md-grow-0{flex-grow:0!important}.flex-md-grow-1{flex-grow:1!important}.flex-md-shrink-0{flex-shrink:0!important}.flex-md-shrink-1{flex-shrink:1!important}.flex-md-wrap{flex-wrap:wrap!important}.flex-md-nowrap{flex-wrap:nowrap!important}.flex-md-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-md-start{justify-content:flex-start!important}.justify-content-md-end{justify-content:flex-end!important}.justify-content-md-center{justify-content:center!important}.justify-content-md-between{justify-content:space-between!important}.justify-content-md-around{justify-content:space-around!important}.justify-content-md-evenly{justify-content:space-evenly!important}.align-items-md-start{align-items:flex-start!important}.align-items-md-end{align-items:flex-end!important}.align-items-md-center{align-items:center!important}.align-items-md-baseline{align-items:baseline!important}.align-items-md-stretch{align-items:stretch!important}.align-content-md-start{align-content:flex-start!important}.align-content-md-end{align-content:flex-end!important}.align-content-md-center{align-content:center!important}.align-content-md-between{align-content:space-between!important}.align-content-md-around{align-content:space-around!important}.align-content-md-stretch{align-content:stretch!important}.align-self-md-auto{align-self:auto!important}.align-self-md-start{align-self:flex-start!important}.align-self-md-end{align-self:flex-end!important}.align-self-md-center{align-self:center!important}.align-self-md-baseline{align-self:baseline!important}.align-self-md-stretch{align-self:stretch!important}.order-md-first{order:-1!important}.order-md-0{order:0!important}.order-md-1{order:1!important}.order-md-2{order:2!important}.order-md-3{order:3!important}.order-md-4{order:4!important}.order-md-5{order:5!important}.order-md-last{order:6!important}.m-md-0{margin:0!important}.m-md-1{margin:.25rem!important}.m-md-2{margin:.5rem!important}.m-md-3{margin:1rem!important}.m-md-4{margin:1.5rem!important}.m-md-5{margin:3rem!important}.m-md-auto{margin:auto!important}.mx-md-0{margin-right:0!important;margin-left:0!important}.mx-md-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-md-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-md-3{margin-right:1rem!important;margin-left:1rem!important}.mx-md-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-md-5{margin-right:3rem!important;margin-left:3rem!important}.mx-md-auto{margin-right:auto!important;margin-left:auto!important}.my-md-0{margin-top:0!important;margin-bottom:0!important}.my-md-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-md-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-md-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-md-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-md-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-md-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-md-0{margin-top:0!important}.mt-md-1{margin-top:.25rem!important}.mt-md-2{margin-top:.5rem!important}.mt-md-3{margin-top:1rem!important}.mt-md-4{margin-top:1.5rem!important}.mt-md-5{margin-top:3rem!important}.mt-md-auto{margin-top:auto!important}.me-md-0{margin-right:0!important}.me-md-1{margin-right:.25rem!important}.me-md-2{margin-right:.5rem!important}.me-md-3{margin-right:1rem!important}.me-md-4{margin-right:1.5rem!important}.me-md-5{margin-right:3rem!important}.me-md-auto{margin-right:auto!important}.mb-md-0{margin-bottom:0!important}.mb-md-1{margin-bottom:.25rem!important}.mb-md-2{margin-bottom:.5rem!important}.mb-md-3{margin-bottom:1rem!important}.mb-md-4{margin-bottom:1.5rem!important}.mb-md-5{margin-bottom:3rem!important}.mb-md-auto{margin-bottom:auto!important}.ms-md-0{margin-left:0!important}.ms-md-1{margin-left:.25rem!important}.ms-md-2{margin-left:.5rem!important}.ms-md-3{margin-left:1rem!important}.ms-md-4{margin-left:1.5rem!important}.ms-md-5{margin-left:3rem!important}.ms-md-auto{margin-left:auto!important}.p-md-0{padding:0!important}.p-md-1{padding:.25rem!important}.p-md-2{padding:.5rem!important}.p-md-3{padding:1rem!important}.p-md-4{padding:1.5rem!important}.p-md-5{padding:3rem!important}.px-md-0{padding-right:0!important;padding-left:0!important}.px-md-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-md-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-md-3{padding-right:1rem!important;padding-left:1rem!important}.px-md-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-md-5{padding-right:3rem!important;padding-left:3rem!important}.py-md-0{padding-top:0!important;padding-bottom:0!important}.py-md-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-md-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-md-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-md-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-md-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-md-0{padding-top:0!important}.pt-md-1{padding-top:.25rem!important}.pt-md-2{padding-top:.5rem!important}.pt-md-3{padding-top:1rem!important}.pt-md-4{padding-top:1.5rem!important}.pt-md-5{padding-top:3rem!important}.pe-md-0{padding-right:0!important}.pe-md-1{padding-right:.25rem!important}.pe-md-2{padding-right:.5rem!important}.pe-md-3{padding-right:1rem!important}.pe-md-4{padding-right:1.5rem!important}.pe-md-5{padding-right:3rem!important}.pb-md-0{padding-bottom:0!important}.pb-md-1{padding-bottom:.25rem!important}.pb-md-2{padding-bottom:.5rem!important}.pb-md-3{padding-bottom:1rem!important}.pb-md-4{padding-bottom:1.5rem!important}.pb-md-5{padding-bottom:3rem!important}.ps-md-0{padding-left:0!important}.ps-md-1{padding-left:.25rem!important}.ps-md-2{padding-left:.5rem!important}.ps-md-3{padding-left:1rem!important}.ps-md-4{padding-left:1.5rem!important}.ps-md-5{padding-left:3rem!important}.gap-md-0{gap:0!important}.gap-md-1{gap:.25rem!important}.gap-md-2{gap:.5rem!important}.gap-md-3{gap:1rem!important}.gap-md-4{gap:1.5rem!important}.gap-md-5{gap:3rem!important}.text-md-start{text-align:left!important}.text-md-end{text-align:right!important}.text-md-center{text-align:center!important}}@media (min-width: 992px){.float-lg-start{float:left!important}.float-lg-end{float:right!important}.float-lg-none{float:none!important}.d-lg-inline{display:inline!important}.d-lg-inline-block{display:inline-block!important}.d-lg-block{display:block!important}.d-lg-grid{display:grid!important}.d-lg-table{display:table!important}.d-lg-table-row{display:table-row!important}.d-lg-table-cell{display:table-cell!important}.d-lg-flex{display:flex!important}.d-lg-inline-flex{display:inline-flex!important}.d-lg-none{display:none!important}.flex-lg-fill{flex:1 1 auto!important}.flex-lg-row{flex-direction:row!important}.flex-lg-column{flex-direction:column!important}.flex-lg-row-reverse{flex-direction:row-reverse!important}.flex-lg-column-reverse{flex-direction:column-reverse!important}.flex-lg-grow-0{flex-grow:0!important}.flex-lg-grow-1{flex-grow:1!important}.flex-lg-shrink-0{flex-shrink:0!important}.flex-lg-shrink-1{flex-shrink:1!important}.flex-lg-wrap{flex-wrap:wrap!important}.flex-lg-nowrap{flex-wrap:nowrap!important}.flex-lg-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-lg-start{justify-content:flex-start!important}.justify-content-lg-end{justify-content:flex-end!important}.justify-content-lg-center{justify-content:center!important}.justify-content-lg-between{justify-content:space-between!important}.justify-content-lg-around{justify-content:space-around!important}.justify-content-lg-evenly{justify-content:space-evenly!important}.align-items-lg-start{align-items:flex-start!important}.align-items-lg-end{align-items:flex-end!important}.align-items-lg-center{align-items:center!important}.align-items-lg-baseline{align-items:baseline!important}.align-items-lg-stretch{align-items:stretch!important}.align-content-lg-start{align-content:flex-start!important}.align-content-lg-end{align-content:flex-end!important}.align-content-lg-center{align-content:center!important}.align-content-lg-between{align-content:space-between!important}.align-content-lg-around{align-content:space-around!important}.align-content-lg-stretch{align-content:stretch!important}.align-self-lg-auto{align-self:auto!important}.align-self-lg-start{align-self:flex-start!important}.align-self-lg-end{align-self:flex-end!important}.align-self-lg-center{align-self:center!important}.align-self-lg-baseline{align-self:baseline!important}.align-self-lg-stretch{align-self:stretch!important}.order-lg-first{order:-1!important}.order-lg-0{order:0!important}.order-lg-1{order:1!important}.order-lg-2{order:2!important}.order-lg-3{order:3!important}.order-lg-4{order:4!important}.order-lg-5{order:5!important}.order-lg-last{order:6!important}.m-lg-0{margin:0!important}.m-lg-1{margin:.25rem!important}.m-lg-2{margin:.5rem!important}.m-lg-3{margin:1rem!important}.m-lg-4{margin:1.5rem!important}.m-lg-5{margin:3rem!important}.m-lg-auto{margin:auto!important}.mx-lg-0{margin-right:0!important;margin-left:0!important}.mx-lg-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-lg-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-lg-3{margin-right:1rem!important;margin-left:1rem!important}.mx-lg-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-lg-5{margin-right:3rem!important;margin-left:3rem!important}.mx-lg-auto{margin-right:auto!important;margin-left:auto!important}.my-lg-0{margin-top:0!important;margin-bottom:0!important}.my-lg-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-lg-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-lg-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-lg-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-lg-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-lg-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-lg-0{margin-top:0!important}.mt-lg-1{margin-top:.25rem!important}.mt-lg-2{margin-top:.5rem!important}.mt-lg-3{margin-top:1rem!important}.mt-lg-4{margin-top:1.5rem!important}.mt-lg-5{margin-top:3rem!important}.mt-lg-auto{margin-top:auto!important}.me-lg-0{margin-right:0!important}.me-lg-1{margin-right:.25rem!important}.me-lg-2{margin-right:.5rem!important}.me-lg-3{margin-right:1rem!important}.me-lg-4{margin-right:1.5rem!important}.me-lg-5{margin-right:3rem!important}.me-lg-auto{margin-right:auto!important}.mb-lg-0{margin-bottom:0!important}.mb-lg-1{margin-bottom:.25rem!important}.mb-lg-2{margin-bottom:.5rem!important}.mb-lg-3{margin-bottom:1rem!important}.mb-lg-4{margin-bottom:1.5rem!important}.mb-lg-5{margin-bottom:3rem!important}.mb-lg-auto{margin-bottom:auto!important}.ms-lg-0{margin-left:0!important}.ms-lg-1{margin-left:.25rem!important}.ms-lg-2{margin-left:.5rem!important}.ms-lg-3{margin-left:1rem!important}.ms-lg-4{margin-left:1.5rem!important}.ms-lg-5{margin-left:3rem!important}.ms-lg-auto{margin-left:auto!important}.p-lg-0{padding:0!important}.p-lg-1{padding:.25rem!important}.p-lg-2{padding:.5rem!important}.p-lg-3{padding:1rem!important}.p-lg-4{padding:1.5rem!important}.p-lg-5{padding:3rem!important}.px-lg-0{padding-right:0!important;padding-left:0!important}.px-lg-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-lg-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-lg-3{padding-right:1rem!important;padding-left:1rem!important}.px-lg-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-lg-5{padding-right:3rem!important;padding-left:3rem!important}.py-lg-0{padding-top:0!important;padding-bottom:0!important}.py-lg-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-lg-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-lg-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-lg-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-lg-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-lg-0{padding-top:0!important}.pt-lg-1{padding-top:.25rem!important}.pt-lg-2{padding-top:.5rem!important}.pt-lg-3{padding-top:1rem!important}.pt-lg-4{padding-top:1.5rem!important}.pt-lg-5{padding-top:3rem!important}.pe-lg-0{padding-right:0!important}.pe-lg-1{padding-right:.25rem!important}.pe-lg-2{padding-right:.5rem!important}.pe-lg-3{padding-right:1rem!important}.pe-lg-4{padding-right:1.5rem!important}.pe-lg-5{padding-right:3rem!important}.pb-lg-0{padding-bottom:0!important}.pb-lg-1{padding-bottom:.25rem!important}.pb-lg-2{padding-bottom:.5rem!important}.pb-lg-3{padding-bottom:1rem!important}.pb-lg-4{padding-bottom:1.5rem!important}.pb-lg-5{padding-bottom:3rem!important}.ps-lg-0{padding-left:0!important}.ps-lg-1{padding-left:.25rem!important}.ps-lg-2{padding-left:.5rem!important}.ps-lg-3{padding-left:1rem!important}.ps-lg-4{padding-left:1.5rem!important}.ps-lg-5{padding-left:3rem!important}.gap-lg-0{gap:0!important}.gap-lg-1{gap:.25rem!important}.gap-lg-2{gap:.5rem!important}.gap-lg-3{gap:1rem!important}.gap-lg-4{gap:1.5rem!important}.gap-lg-5{gap:3rem!important}.text-lg-start{text-align:left!important}.text-lg-end{text-align:right!important}.text-lg-center{text-align:center!important}}@media (min-width: 1200px){.float-xl-start{float:left!important}.float-xl-end{float:right!important}.float-xl-none{float:none!important}.d-xl-inline{display:inline!important}.d-xl-inline-block{display:inline-block!important}.d-xl-block{display:block!important}.d-xl-grid{display:grid!important}.d-xl-table{display:table!important}.d-xl-table-row{display:table-row!important}.d-xl-table-cell{display:table-cell!important}.d-xl-flex{display:flex!important}.d-xl-inline-flex{display:inline-flex!important}.d-xl-none{display:none!important}.flex-xl-fill{flex:1 1 auto!important}.flex-xl-row{flex-direction:row!important}.flex-xl-column{flex-direction:column!important}.flex-xl-row-reverse{flex-direction:row-reverse!important}.flex-xl-column-reverse{flex-direction:column-reverse!important}.flex-xl-grow-0{flex-grow:0!important}.flex-xl-grow-1{flex-grow:1!important}.flex-xl-shrink-0{flex-shrink:0!important}.flex-xl-shrink-1{flex-shrink:1!important}.flex-xl-wrap{flex-wrap:wrap!important}.flex-xl-nowrap{flex-wrap:nowrap!important}.flex-xl-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-xl-start{justify-content:flex-start!important}.justify-content-xl-end{justify-content:flex-end!important}.justify-content-xl-center{justify-content:center!important}.justify-content-xl-between{justify-content:space-between!important}.justify-content-xl-around{justify-content:space-around!important}.justify-content-xl-evenly{justify-content:space-evenly!important}.align-items-xl-start{align-items:flex-start!important}.align-items-xl-end{align-items:flex-end!important}.align-items-xl-center{align-items:center!important}.align-items-xl-baseline{align-items:baseline!important}.align-items-xl-stretch{align-items:stretch!important}.align-content-xl-start{align-content:flex-start!important}.align-content-xl-end{align-content:flex-end!important}.align-content-xl-center{align-content:center!important}.align-content-xl-between{align-content:space-between!important}.align-content-xl-around{align-content:space-around!important}.align-content-xl-stretch{align-content:stretch!important}.align-self-xl-auto{align-self:auto!important}.align-self-xl-start{align-self:flex-start!important}.align-self-xl-end{align-self:flex-end!important}.align-self-xl-center{align-self:center!important}.align-self-xl-baseline{align-self:baseline!important}.align-self-xl-stretch{align-self:stretch!important}.order-xl-first{order:-1!important}.order-xl-0{order:0!important}.order-xl-1{order:1!important}.order-xl-2{order:2!important}.order-xl-3{order:3!important}.order-xl-4{order:4!important}.order-xl-5{order:5!important}.order-xl-last{order:6!important}.m-xl-0{margin:0!important}.m-xl-1{margin:.25rem!important}.m-xl-2{margin:.5rem!important}.m-xl-3{margin:1rem!important}.m-xl-4{margin:1.5rem!important}.m-xl-5{margin:3rem!important}.m-xl-auto{margin:auto!important}.mx-xl-0{margin-right:0!important;margin-left:0!important}.mx-xl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xl-auto{margin-right:auto!important;margin-left:auto!important}.my-xl-0{margin-top:0!important;margin-bottom:0!important}.my-xl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xl-0{margin-top:0!important}.mt-xl-1{margin-top:.25rem!important}.mt-xl-2{margin-top:.5rem!important}.mt-xl-3{margin-top:1rem!important}.mt-xl-4{margin-top:1.5rem!important}.mt-xl-5{margin-top:3rem!important}.mt-xl-auto{margin-top:auto!important}.me-xl-0{margin-right:0!important}.me-xl-1{margin-right:.25rem!important}.me-xl-2{margin-right:.5rem!important}.me-xl-3{margin-right:1rem!important}.me-xl-4{margin-right:1.5rem!important}.me-xl-5{margin-right:3rem!important}.me-xl-auto{margin-right:auto!important}.mb-xl-0{margin-bottom:0!important}.mb-xl-1{margin-bottom:.25rem!important}.mb-xl-2{margin-bottom:.5rem!important}.mb-xl-3{margin-bottom:1rem!important}.mb-xl-4{margin-bottom:1.5rem!important}.mb-xl-5{margin-bottom:3rem!important}.mb-xl-auto{margin-bottom:auto!important}.ms-xl-0{margin-left:0!important}.ms-xl-1{margin-left:.25rem!important}.ms-xl-2{margin-left:.5rem!important}.ms-xl-3{margin-left:1rem!important}.ms-xl-4{margin-left:1.5rem!important}.ms-xl-5{margin-left:3rem!important}.ms-xl-auto{margin-left:auto!important}.p-xl-0{padding:0!important}.p-xl-1{padding:.25rem!important}.p-xl-2{padding:.5rem!important}.p-xl-3{padding:1rem!important}.p-xl-4{padding:1.5rem!important}.p-xl-5{padding:3rem!important}.px-xl-0{padding-right:0!important;padding-left:0!important}.px-xl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xl-0{padding-top:0!important;padding-bottom:0!important}.py-xl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xl-0{padding-top:0!important}.pt-xl-1{padding-top:.25rem!important}.pt-xl-2{padding-top:.5rem!important}.pt-xl-3{padding-top:1rem!important}.pt-xl-4{padding-top:1.5rem!important}.pt-xl-5{padding-top:3rem!important}.pe-xl-0{padding-right:0!important}.pe-xl-1{padding-right:.25rem!important}.pe-xl-2{padding-right:.5rem!important}.pe-xl-3{padding-right:1rem!important}.pe-xl-4{padding-right:1.5rem!important}.pe-xl-5{padding-right:3rem!important}.pb-xl-0{padding-bottom:0!important}.pb-xl-1{padding-bottom:.25rem!important}.pb-xl-2{padding-bottom:.5rem!important}.pb-xl-3{padding-bottom:1rem!important}.pb-xl-4{padding-bottom:1.5rem!important}.pb-xl-5{padding-bottom:3rem!important}.ps-xl-0{padding-left:0!important}.ps-xl-1{padding-left:.25rem!important}.ps-xl-2{padding-left:.5rem!important}.ps-xl-3{padding-left:1rem!important}.ps-xl-4{padding-left:1.5rem!important}.ps-xl-5{padding-left:3rem!important}.gap-xl-0{gap:0!important}.gap-xl-1{gap:.25rem!important}.gap-xl-2{gap:.5rem!important}.gap-xl-3{gap:1rem!important}.gap-xl-4{gap:1.5rem!important}.gap-xl-5{gap:3rem!important}.text-xl-start{text-align:left!important}.text-xl-end{text-align:right!important}.text-xl-center{text-align:center!important}}@media (min-width: 1400px){.float-xxl-start{float:left!important}.float-xxl-end{float:right!important}.float-xxl-none{float:none!important}.d-xxl-inline{display:inline!important}.d-xxl-inline-block{display:inline-block!important}.d-xxl-block{display:block!important}.d-xxl-grid{display:grid!important}.d-xxl-table{display:table!important}.d-xxl-table-row{display:table-row!important}.d-xxl-table-cell{display:table-cell!important}.d-xxl-flex{display:flex!important}.d-xxl-inline-flex{display:inline-flex!important}.d-xxl-none{display:none!important}.flex-xxl-fill{flex:1 1 auto!important}.flex-xxl-row{flex-direction:row!important}.flex-xxl-column{flex-direction:column!important}.flex-xxl-row-reverse{flex-direction:row-reverse!important}.flex-xxl-column-reverse{flex-direction:column-reverse!important}.flex-xxl-grow-0{flex-grow:0!important}.flex-xxl-grow-1{flex-grow:1!important}.flex-xxl-shrink-0{flex-shrink:0!important}.flex-xxl-shrink-1{flex-shrink:1!important}.flex-xxl-wrap{flex-wrap:wrap!important}.flex-xxl-nowrap{flex-wrap:nowrap!important}.flex-xxl-wrap-reverse{flex-wrap:wrap-reverse!important}.justify-content-xxl-start{justify-content:flex-start!important}.justify-content-xxl-end{justify-content:flex-end!important}.justify-content-xxl-center{justify-content:center!important}.justify-content-xxl-between{justify-content:space-between!important}.justify-content-xxl-around{justify-content:space-around!important}.justify-content-xxl-evenly{justify-content:space-evenly!important}.align-items-xxl-start{align-items:flex-start!important}.align-items-xxl-end{align-items:flex-end!important}.align-items-xxl-center{align-items:center!important}.align-items-xxl-baseline{align-items:baseline!important}.align-items-xxl-stretch{align-items:stretch!important}.align-content-xxl-start{align-content:flex-start!important}.align-content-xxl-end{align-content:flex-end!important}.align-content-xxl-center{align-content:center!important}.align-content-xxl-between{align-content:space-between!important}.align-content-xxl-around{align-content:space-around!important}.align-content-xxl-stretch{align-content:stretch!important}.align-self-xxl-auto{align-self:auto!important}.align-self-xxl-start{align-self:flex-start!important}.align-self-xxl-end{align-self:flex-end!important}.align-self-xxl-center{align-self:center!important}.align-self-xxl-baseline{align-self:baseline!important}.align-self-xxl-stretch{align-self:stretch!important}.order-xxl-first{order:-1!important}.order-xxl-0{order:0!important}.order-xxl-1{order:1!important}.order-xxl-2{order:2!important}.order-xxl-3{order:3!important}.order-xxl-4{order:4!important}.order-xxl-5{order:5!important}.order-xxl-last{order:6!important}.m-xxl-0{margin:0!important}.m-xxl-1{margin:.25rem!important}.m-xxl-2{margin:.5rem!important}.m-xxl-3{margin:1rem!important}.m-xxl-4{margin:1.5rem!important}.m-xxl-5{margin:3rem!important}.m-xxl-auto{margin:auto!important}.mx-xxl-0{margin-right:0!important;margin-left:0!important}.mx-xxl-1{margin-right:.25rem!important;margin-left:.25rem!important}.mx-xxl-2{margin-right:.5rem!important;margin-left:.5rem!important}.mx-xxl-3{margin-right:1rem!important;margin-left:1rem!important}.mx-xxl-4{margin-right:1.5rem!important;margin-left:1.5rem!important}.mx-xxl-5{margin-right:3rem!important;margin-left:3rem!important}.mx-xxl-auto{margin-right:auto!important;margin-left:auto!important}.my-xxl-0{margin-top:0!important;margin-bottom:0!important}.my-xxl-1{margin-top:.25rem!important;margin-bottom:.25rem!important}.my-xxl-2{margin-top:.5rem!important;margin-bottom:.5rem!important}.my-xxl-3{margin-top:1rem!important;margin-bottom:1rem!important}.my-xxl-4{margin-top:1.5rem!important;margin-bottom:1.5rem!important}.my-xxl-5{margin-top:3rem!important;margin-bottom:3rem!important}.my-xxl-auto{margin-top:auto!important;margin-bottom:auto!important}.mt-xxl-0{margin-top:0!important}.mt-xxl-1{margin-top:.25rem!important}.mt-xxl-2{margin-top:.5rem!important}.mt-xxl-3{margin-top:1rem!important}.mt-xxl-4{margin-top:1.5rem!important}.mt-xxl-5{margin-top:3rem!important}.mt-xxl-auto{margin-top:auto!important}.me-xxl-0{margin-right:0!important}.me-xxl-1{margin-right:.25rem!important}.me-xxl-2{margin-right:.5rem!important}.me-xxl-3{margin-right:1rem!important}.me-xxl-4{margin-right:1.5rem!important}.me-xxl-5{margin-right:3rem!important}.me-xxl-auto{margin-right:auto!important}.mb-xxl-0{margin-bottom:0!important}.mb-xxl-1{margin-bottom:.25rem!important}.mb-xxl-2{margin-bottom:.5rem!important}.mb-xxl-3{margin-bottom:1rem!important}.mb-xxl-4{margin-bottom:1.5rem!important}.mb-xxl-5{margin-bottom:3rem!important}.mb-xxl-auto{margin-bottom:auto!important}.ms-xxl-0{margin-left:0!important}.ms-xxl-1{margin-left:.25rem!important}.ms-xxl-2{margin-left:.5rem!important}.ms-xxl-3{margin-left:1rem!important}.ms-xxl-4{margin-left:1.5rem!important}.ms-xxl-5{margin-left:3rem!important}.ms-xxl-auto{margin-left:auto!important}.p-xxl-0{padding:0!important}.p-xxl-1{padding:.25rem!important}.p-xxl-2{padding:.5rem!important}.p-xxl-3{padding:1rem!important}.p-xxl-4{padding:1.5rem!important}.p-xxl-5{padding:3rem!important}.px-xxl-0{padding-right:0!important;padding-left:0!important}.px-xxl-1{padding-right:.25rem!important;padding-left:.25rem!important}.px-xxl-2{padding-right:.5rem!important;padding-left:.5rem!important}.px-xxl-3{padding-right:1rem!important;padding-left:1rem!important}.px-xxl-4{padding-right:1.5rem!important;padding-left:1.5rem!important}.px-xxl-5{padding-right:3rem!important;padding-left:3rem!important}.py-xxl-0{padding-top:0!important;padding-bottom:0!important}.py-xxl-1{padding-top:.25rem!important;padding-bottom:.25rem!important}.py-xxl-2{padding-top:.5rem!important;padding-bottom:.5rem!important}.py-xxl-3{padding-top:1rem!important;padding-bottom:1rem!important}.py-xxl-4{padding-top:1.5rem!important;padding-bottom:1.5rem!important}.py-xxl-5{padding-top:3rem!important;padding-bottom:3rem!important}.pt-xxl-0{padding-top:0!important}.pt-xxl-1{padding-top:.25rem!important}.pt-xxl-2{padding-top:.5rem!important}.pt-xxl-3{padding-top:1rem!important}.pt-xxl-4{padding-top:1.5rem!important}.pt-xxl-5{padding-top:3rem!important}.pe-xxl-0{padding-right:0!important}.pe-xxl-1{padding-right:.25rem!important}.pe-xxl-2{padding-right:.5rem!important}.pe-xxl-3{padding-right:1rem!important}.pe-xxl-4{padding-right:1.5rem!important}.pe-xxl-5{padding-right:3rem!important}.pb-xxl-0{padding-bottom:0!important}.pb-xxl-1{padding-bottom:.25rem!important}.pb-xxl-2{padding-bottom:.5rem!important}.pb-xxl-3{padding-bottom:1rem!important}.pb-xxl-4{padding-bottom:1.5rem!important}.pb-xxl-5{padding-bottom:3rem!important}.ps-xxl-0{padding-left:0!important}.ps-xxl-1{padding-left:.25rem!important}.ps-xxl-2{padding-left:.5rem!important}.ps-xxl-3{padding-left:1rem!important}.ps-xxl-4{padding-left:1.5rem!important}.ps-xxl-5{padding-left:3rem!important}.gap-xxl-0{gap:0!important}.gap-xxl-1{gap:.25rem!important}.gap-xxl-2{gap:.5rem!important}.gap-xxl-3{gap:1rem!important}.gap-xxl-4{gap:1.5rem!important}.gap-xxl-5{gap:3rem!important}.text-xxl-start{text-align:left!important}.text-xxl-end{text-align:right!important}.text-xxl-center{text-align:center!important}}@media (min-width: 1200px){.fs-1{font-size:2.5rem!important}.fs-2{font-size:2rem!important}.fs-3{font-size:1.75rem!important}.fs-4{font-size:1.5rem!important}}@media print{.d-print-inline{display:inline!important}.d-print-inline-block{display:inline-block!important}.d-print-block{display:block!important}.d-print-grid{display:grid!important}.d-print-table{display:table!important}.d-print-table-row{display:table-row!important}.d-print-table-cell{display:table-cell!important}.d-print-flex{display:flex!important}.d-print-inline-flex{display:inline-flex!important}.d-print-none{display:none!important}}:root{--bg-color: #edf2f7;--rstudio-blue-h: 209;--rstudio-blue-s: 59%;--rstudio-blue-l: 66%;--rstudio-blue-hsl: var(--rstudio-blue-h) var(--rstudio-blue-s) var(--rstudio-blue-l);--rstudio-blue: hsl(var(--rstudio-blue-hsl));--rstudio-blue-transparent: hsl(var(--rstudio-blue-hsl) / .5);--rstudio-grey-h: 0;--rstudio-grey-s: 0%;--rstudio-grey-l: 25%;--rstudio-grey-hsl: var(--rstudio-grey-h) var(--rstudio-grey-s) var(--rstudio-grey-l);--rstudio-grey: hsl(var(--rstudio-grey-hsl));--rstudio-grey-transparent: hsl(var(--rstudio-grey-hsl) / .5);--rstudio-white-h: 0;--rstudio-white-s: 0%;--rstudio-white-l: 100%;--rstudio-white-hsl: var(--rstudio-white-h) var(--rstudio-white-s) var(--rstudio-white-l);--rstudio-white: hsl(var(--rstudio-white-hsl));--rstudio-white-transparent: hsl(var(--rstudio-white-hsl) / .9);--grey: hsl(211 19% 70%);--light-grey: #e9edf3;--dark-grey: hsl(211 19% 50%);--divider-color: #a5b3c2;--icon-color: #76838f;--background-grey: var(--light-grey);--header-grey: var(--grey);--red: rgb(250, 83, 22);--font-color: hsl(214 9% 15%);--font-color-disabled: hsl(214 9% 15% / .5);--font-size: 13px;--selected-outline-color: var(--rstudio-blue);--selected-outline-width: 3px;--selected-outline: var(--selected-outline-width) solid var(--selected-outline-color);--outline-color: var(--grey);--disabled-color: hsl(var(--rstudio-grey-hsl) / .5);--disabled-outline: 1px solid hsl(var(--rstudio-grey-hsl) / .15);--corner-radius: 8px;--vertical-spacing: 10px;--horizontal-spacing: 15px;--animation-speed: .2s;--animation-curve: ease-in-out;--outline: 1px solid var(--outline-color);--input-height: 23px;--input-vertical-padding: 1px;--input-horizontal-padding: 5px;--fonts: "Lucida Sans", "DejaVu Sans", "Lucida Grande", "Segoe UI", -apple-system, BlinkMacSystemFont, Verdana, Helvetica, sans-serif;--mono-fonts: Consolas, "Lucida Console", Monaco, monospace;--shadow-color: 0deg 0% 13%;--shadow-elevation-medium: .3px .5px .7px hsl(var(--shadow-color) / .36), .8px 1.6px 2px -.8px hsl(var(--shadow-color) / .36), 2.1px 4.1px 5.2px -1.7px hsl(var(--shadow-color) / .36), 5px 10px 12.6px -2.5px hsl(var(--shadow-color) / .36);--size-xs: 4px;--size-sm: 8px;--size-md: 12px;--size-lg: 20px;--size-xl: 28px}*{box-sizing:border-box}html{height:100%}body{overflow:hidden}body,input{font-family:var(--fonts);line-height:1.5;color:var(--font-color);margin:0;font-size:var(--font-size)}input{height:var(--input-height)}h1,h2,h3{margin:0;color:var(--rstudio-grey)}.disable-text-selection *{user-select:none}button{border:none;background:none;cursor:pointer}h1,h2,h3{font-weight:unset;line-height:unset}code{color:unset;font-family:unset;font-size:unset}dialog::backdrop{backdrop-filter:blur(2px)}[data-is-selected-node=true]{position:relative}[data-is-selected-node=true]:before{content:"";position:absolute;inset:0;outline:var(--selected-outline);pointer-events:none;border-radius:inherit}.can-accept-drop{--start-opacity: .1;--end-opacity: .5;position:relative;background-color:var(--red);opacity:.2;animation-duration:3s;animation-name:pulse;animation-timing-function:ease-in-out;animation-iteration-count:infinite}.can-accept-drop:after{content:"";position:absolute;inset:0;text-align:center;display:grid;place-content:center;overflow:hidden;color:var(--rstudio-white)}@keyframes pulse{0%{opacity:var(--start-opacity)}50%{opacity:var(--end-opacity)}to{opacity:var(--start-opacity)}}div.can-accept-drop.hovering-over{--start-opacity: 1;--end-opacity: 1;z-index:10}div.can-accept-drop.hovering-over:after{content:"release to add"}.dtDTOutput{position:relative;height:100%;width:100%;padding:14px}.dtDTOutput .faux-table{border-radius:var(--corner-radius);outline:1px solid var(--rstudio-grey);overflow:hidden;height:var(--table-h, 100%);width:var(--table-w, 100%);position:relative}.dtDTOutput .faux-table .faux-header{background-color:#d3dbe9;padding:5px}.dtDTOutput .faux-table .faux-table-body{overflow:hidden;display:flex;flex-direction:column;height:100%}.dtDTOutput .faux-table .faux-table-body .faux-row{flex-basis:18px;flex-grow:1;flex-shrink:0;display:flex;flex-direction:row;--spacing: 2px;gap:var(--spacing);margin-block-start:var(--spacing)}.dtDTOutput .faux-table .faux-table-body .faux-row .faux-cell{flex:1;background-color:var(--cell-color, pink);outline:1px solid white;color:transparent}.dtDTOutput .faux-table .faux-table-body .faux-row:nth-child(even){--cell-color: #d3dbe9}.dtDTOutput .faux-table .faux-table-body .faux-row:nth-child(odd){--cell-color: hsl(218deg, 33%, 97%)}.NumberInput{--increment-btn-w: 20px;height:var(--input-height);width:100%;position:relative}.NumberInput input{width:100%;-moz-appearance:textfield;padding-inline-end:var(--increment-btn-w)}.NumberInput input::-webkit-inner-spin-button,.NumberInput input::-webkit-outer-spin-button{-webkit-appearance:none}.NumberInput .incrementer-buttons{position:absolute;inset-block:0;inset-inline-end:0;display:inline-grid;grid-template-areas:"up " "down";grid-template-rows:50% 50%}.NumberInput .incrementer-buttons .up-button,.NumberInput .incrementer-buttons .down-button{position:relative;--shift-to-center: 2px;width:var(--increment-btn-w);font-size:10px}.NumberInput .incrementer-buttons .up-button svg,.NumberInput .incrementer-buttons .down-button svg{display:block;position:absolute;inset-inline-end:6px;inset-block:0px}.NumberInput .incrementer-buttons .up-button{grid-area:up;translate:0px var(--shift-to-center)}.NumberInput .incrementer-buttons .down-button{translate:0px calc(-1 * var(--shift-to-center));grid-area:down}.NumberInput[aria-disabled=true]{cursor:default}.NumberInput[aria-disabled=true] .incrementer-buttons{display:none}.NumberInput[aria-disabled=true] input[type=number]{color:transparent;cursor:inherit}:root{--balloon-border-radius: 2px;--balloon-color: rgba(16,16,16,.95);--balloon-text-color: #fff;--balloon-font-size: 12px;--balloon-move: 4px}button[aria-label][data-balloon-pos]{overflow:visible}[aria-label][data-balloon-pos]{position:relative;cursor:pointer}[aria-label][data-balloon-pos]:after{opacity:0;pointer-events:none;transition:all .18s ease-out .18s;text-indent:0;font-family:-apple-system,BlinkMacSystemFont,Segoe UI,Roboto,Oxygen,Ubuntu,Cantarell,Open Sans,Helvetica Neue,sans-serif;font-weight:400;font-style:normal;text-shadow:none;font-size:var(--balloon-font-size);background:var(--balloon-color);border-radius:2px;color:var(--balloon-text-color);border-radius:var(--balloon-border-radius);content:attr(aria-label);padding:.5em 1em;position:absolute;white-space:nowrap;z-index:10}[aria-label][data-balloon-pos]:before{width:0;height:0;border:5px solid transparent;border-top-color:var(--balloon-color);opacity:0;pointer-events:none;transition:all .18s ease-out .18s;content:"";position:absolute;z-index:10}[aria-label][data-balloon-pos]:hover:before,[aria-label][data-balloon-pos]:hover:after,[aria-label][data-balloon-pos][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-visible]:after,[aria-label][data-balloon-pos]:not([data-balloon-nofocus]):focus:before,[aria-label][data-balloon-pos]:not([data-balloon-nofocus]):focus:after{opacity:1;pointer-events:none}[aria-label][data-balloon-pos].font-awesome:after{font-family:FontAwesome,-apple-system,BlinkMacSystemFont,Segoe UI,Roboto,Oxygen,Ubuntu,Cantarell,Open Sans,Helvetica Neue,sans-serif}[aria-label][data-balloon-pos][data-balloon-break]:after{white-space:pre}[aria-label][data-balloon-pos][data-balloon-break][data-balloon-length]:after{white-space:pre-line;word-break:break-word}[aria-label][data-balloon-pos][data-balloon-blunt]:before,[aria-label][data-balloon-pos][data-balloon-blunt]:after{transition:none}[aria-label][data-balloon-pos][data-balloon-pos=up]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=up][data-balloon-visible]:after,[aria-label][data-balloon-pos][data-balloon-pos=down]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=down][data-balloon-visible]:after{transform:translate(-50%)}[aria-label][data-balloon-pos][data-balloon-pos=up]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=up][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-pos=down]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=down][data-balloon-visible]:before{transform:translate(-50%)}[aria-label][data-balloon-pos][data-balloon-pos*=-left]:after{left:0}[aria-label][data-balloon-pos][data-balloon-pos*=-left]:before{left:5px}[aria-label][data-balloon-pos][data-balloon-pos*=-right]:after{right:0}[aria-label][data-balloon-pos][data-balloon-pos*=-right]:before{right:5px}[aria-label][data-balloon-pos][data-balloon-po*=-left]:hover:after,[aria-label][data-balloon-pos][data-balloon-po*=-left][data-balloon-visible]:after,[aria-label][data-balloon-pos][data-balloon-pos*=-right]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos*=-right][data-balloon-visible]:after{transform:translate(0)}[aria-label][data-balloon-pos][data-balloon-po*=-left]:hover:before,[aria-label][data-balloon-pos][data-balloon-po*=-left][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-pos*=-right]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos*=-right][data-balloon-visible]:before{transform:translate(0)}[aria-label][data-balloon-pos][data-balloon-pos^=up]:before,[aria-label][data-balloon-pos][data-balloon-pos^=up]:after{bottom:100%;transform-origin:top;transform:translateY(var(--balloon-move))}[aria-label][data-balloon-pos][data-balloon-pos^=up]:after{margin-bottom:10px}[aria-label][data-balloon-pos][data-balloon-pos=up]:before,[aria-label][data-balloon-pos][data-balloon-pos=up]:after{left:50%;transform:translate(-50%,var(--balloon-move))}[aria-label][data-balloon-pos][data-balloon-pos^=down]:before,[aria-label][data-balloon-pos][data-balloon-pos^=down]:after{top:100%;transform:translateY(calc(var(--balloon-move) * -1))}[aria-label][data-balloon-pos][data-balloon-pos^=down]:after{margin-top:10px}[aria-label][data-balloon-pos][data-balloon-pos^=down]:before{width:0;height:0;border:5px solid transparent;border-bottom-color:var(--balloon-color)}[aria-label][data-balloon-pos][data-balloon-pos=down]:after,[aria-label][data-balloon-pos][data-balloon-pos=down]:before{left:50%;transform:translate(-50%,calc(var(--balloon-move) * -1))}[aria-label][data-balloon-pos][data-balloon-pos=left]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=left][data-balloon-visible]:after,[aria-label][data-balloon-pos][data-balloon-pos=right]:hover:after,[aria-label][data-balloon-pos][data-balloon-pos=right][data-balloon-visible]:after{transform:translateY(-50%)}[aria-label][data-balloon-pos][data-balloon-pos=left]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=left][data-balloon-visible]:before,[aria-label][data-balloon-pos][data-balloon-pos=right]:hover:before,[aria-label][data-balloon-pos][data-balloon-pos=right][data-balloon-visible]:before{transform:translateY(-50%)}[aria-label][data-balloon-pos][data-balloon-pos=left]:after,[aria-label][data-balloon-pos][data-balloon-pos=left]:before{right:100%;top:50%;transform:translate(var(--balloon-move),-50%)}[aria-label][data-balloon-pos][data-balloon-pos=left]:after{margin-right:10px}[aria-label][data-balloon-pos][data-balloon-pos=left]:before{width:0;height:0;border:5px solid transparent;border-left-color:var(--balloon-color)}[aria-label][data-balloon-pos][data-balloon-pos=right]:after,[aria-label][data-balloon-pos][data-balloon-pos=right]:before{left:100%;top:50%;transform:translate(calc(var(--balloon-move) * -1),-50%)}[aria-label][data-balloon-pos][data-balloon-pos=right]:after{margin-left:10px}[aria-label][data-balloon-pos][data-balloon-pos=right]:before{width:0;height:0;border:5px solid transparent;border-right-color:var(--balloon-color)}[aria-label][data-balloon-pos][data-balloon-length]:after{white-space:normal}[aria-label][data-balloon-pos][data-balloon-length=small]:after{width:80px}[aria-label][data-balloon-pos][data-balloon-length=medium]:after{width:150px}[aria-label][data-balloon-pos][data-balloon-length=large]:after{width:260px}[aria-label][data-balloon-pos][data-balloon-length=xlarge]:after{width:380px}@media screen and (max-width: 768px){[aria-label][data-balloon-pos][data-balloon-length=xlarge]:after{width:90vw}}[aria-label][data-balloon-pos][data-balloon-length=fit]:after{width:100%}.EditorSkeleton{--header-height: 31px;--padding: var(--horizontal-spacing);width:100%;display:grid;grid-template-columns:auto 1fr auto;grid-template-rows:1fr auto;grid-template-areas:"elements editor properties" "elements editor preview"}.EditorSkeleton .app-view{grid-area:editor;z-index:2;background-color:var(--rstudio-white);padding:32px;height:100%;width:100%;position:relative}.EditorSkeleton .elements-panel{grid-area:elements;z-index:3}.EditorSkeleton .properties-panel{grid-area:properties;z-index:4}.EditorSkeleton .app-preview{grid-area:preview;z-index:5}.EditorSkeleton .properties-panel,.EditorSkeleton .app-preview{max-width:var(--properties-panel-width);width:var(--properties-panel-width)}.EditorSkeleton .properties-panel:empty,.EditorSkeleton .app-preview:empty{display:none}.EditorSkeleton>div{outline:1px solid var(--header-grey);min-width:0;min-height:0;isolation:isolate}.EditorSkeleton .panel{display:grid;grid-template-rows:var(--header-height) 1fr;background-color:var(--background-grey);isolation:isolate}.EditorSkeleton .panel>*{min-width:0}.EditorSkeleton .panel .panel-title{text-align:center;line-height:var(--header-height);background-color:var(--header-grey);font-size:1.05rem;font-weight:lighter;color:var(--rstudio-white)}.SUE-SettingsInput{display:block;margin-block:var(--vertical-spacing-top) var(--vertical-spacing-bottom);width:100%;max-width:100%;padding-inline:2px}.SUE-SettingsInput .info{display:flex;gap:5px;margin-bottom:4px;height:20px}.SUE-SettingsInput .info input[type=checkbox]{translate:0px -1px}.SUE-SettingsInput [data-unset=true]{color:var(--disabled-color)}.SUE-SettingsInput input,.SUE-SettingsInput .unset-input{display:block}.SUE-SettingsInput .missing-required-argument-message{color:var(--red, orangered)}.SUE-SettingsInput .mismatched-argument-types{color:var(--dark-grey, pink)}.SUE-SettingsInput .unset-argument{color:var(--dark-grey, pink);text-align:center;background-color:var(--rstudio-white);opacity:.7}.SUE-SettingsInput .SUE-Input{width:100%}.SUE-SettingsInput label:after{content:":"}.OptionsDropdown{border-radius:var(--corner-radius);padding:2px 5px;width:100%}.container{position:relative;height:100%;width:100%}.PlotPlaceholder{container-type:size;height:100%}.PlotPlaceholder .plot{padding:5px;--x-axis-padding: 4px;--y-axis-padding: 7px;--axis-color: var(--grey);--axis-border: 2px solid var(--axis-color);--x-axis-border: var(--axis-border);--y-axis-border: var(--axis-border);--main-color: var(--rstudio-blue);--hover-color: hsl( var(--rstudio-blue-h) var(--rstudio-blue-s) calc(var(--rstudio-blue-l) * .8) );--bar-spacing: 5px;--bar-roundness: 5px;display:flex;flex-direction:column;height:100%}.PlotPlaceholder .plot .title{padding-block:5px;padding-inline:10px;display:grid;align-items:center}.PlotPlaceholder .plot .title:empty{display:none}.PlotPlaceholder .plot .plot-body{flex:1;display:flex;overflow:hidden;gap:var(--bar-spacing);align-items:flex-end;padding-inline-start:var(--y-axis-padding);padding-block-end:var(--x-axis-padding);border-left:var(--y-axis-border);border-bottom:var(--x-axis-border)}.PlotPlaceholder .plot .bar{flex:1;background-color:var(--main-color);height:var(--value, "50%");border-radius:var(--bar-roundness)}.PlotPlaceholder .plot .bar:nth-child(n+8){display:none}.PlotPlaceholder .plot .bar:hover{background-color:var(--hover-color)}@container (max-width: 180px){.PlotPlaceholder .plot .bar:nth-child(n+6){display:none}}@container (min-width: 350px){.PlotPlaceholder .plot .bar:nth-child(n){display:block}}@container (max-height: 175px){.PlotPlaceholder .plot .plot-body{--y-axis-border: none;--y-axis-padding: 0}}.plotlyPlotlyOutput{position:relative;height:100%;width:100%}.plotlyPlotlyOutput .title-bar{display:flex;flex-wrap:wrap;justify-content:space-between}.plotlyPlotlyOutput .plotly-name{color:var(--rstudio-blue)}.unknown-ui-function-display{--gap: 10px;width:calc(100% - var(--gap));margin:auto;height:min(100% - var(--gap),75px);padding:4px;background-color:var(--light-grey);border-radius:var(--corner-radius);position:relative;display:grid;place-content:center}.unknown-ui-function-settings .info-msg svg{color:var(--rstudio-blue);margin-right:4px;margin-bottom:-2px}.unknown-ui-function-settings .code-holder{overflow:auto;font-family:var(--mono-fonts);border:1px solid var(--rstudio-grey);background-color:var(--rstudio-white);padding:5px}.AppTemplatePreview{overflow:hidden;isolation:isolate}.AppTemplatePreview .template-container{position:relative;width:var(--full-w, 100px);height:var(--full-h, 100px);transform:scale(var(--shrink-ratio, .5));transform-origin:top left}.AppTemplatePreview .template-container:after{content:"";position:absolute;inset:0;pointer-events:all}.AppTemplateCard{--outline-color: #caced3;--outline-thickness: 1px;--footer-color: #e9edf3;--padding: var(--card-pad, 5px);cursor:pointer;outline:var(--outline-thickness) solid var(--outline-color);width:--moz-fit-content;width:fit-content;border-radius:var(--corner-radius)}.AppTemplateCard>*{padding:var(--padding)}.AppTemplateCard footer{background-color:var(--footer-color);height:calc(40px - 2 * var(--padding));display:flex;align-items:center;justify-content:space-between;border-radius:0 0 var(--corner-radius) var(--corner-radius)}.AppTemplateCard footer .layout-icon{display:block;width:42px;translate:6px 2px}.AppTemplateCard footer .layout-icon[data-type=navbarPage]{width:42px;translate:6px 1px}.AppTemplateCard[data-selected=true]{--outline-thickness: 4px;--outline-color: var(--rstudio-blue)}.TemplatePreviewGrid{display:grid;gap:53px 44px;grid-template-columns:repeat(auto-fit,var(--card-w));justify-content:center}.TemplatePreviewGrid.empty-results{height:100%;place-content:center;color:var(--red);grid-template-columns:unset;font-size:1.1rem}.TemplateChooserSidebar{width:218px;padding-block:18px;padding-inline:15px;display:flex;flex-direction:column;gap:32px}.TemplateChooserSidebar button{--inset: 5px;margin-top:auto;width:calc(100% - 2 * var(--inset));background-color:var(--rstudio-blue);color:var(--rstudio-white)}.TemplateChooserSidebar button:disabled{background-color:var(--grey);border-color:var(--grey)}.TemplateChooserSidebar legend{font-size:var(--font-size, 1rem);margin:0}.TemplateFiltersForm .layout-options{display:flex;justify-content:space-around}.labeled-form-option{display:flex;align-items:center;gap:3px}.FormBuilder{--vertical-spacing-top: 12px;--vertical-spacing-bottom: 14px}.FormBuilder .grouped-inputs{display:grid;grid-template-columns:repeat(2,1fr);row-gap:var(--vertical-spacing-bottom);padding-block:var(--vertical-spacing-top) var(--vertical-spacing-bottom)}.FormBuilder .grouped-inputs *{margin-block:0}input{padding:var(--input-vertical-padding) var(--input-horizontal-padding);border:1px solid var(--light-grey);border-radius:var(--corner-radius)}.unknown-arguments-list .unknown-form-fields{padding-inline:3px 0;padding-block:5px 0;font-family:var(--mono-fonts)}.unknown-arguments-list .unknown-form-fields button{color:var(--red, orangered)}.unknown-arguments-list .unknown-form-fields .unknown-argument{margin-block:2px;display:flex;align-items:center;width:100%}.unknown-arguments-list .unknown-form-fields .unknown-argument button{background:transparent}.LabeledInputCategory{margin-block-end:18px}.divider-line{display:block;position:relative;isolation:isolate;display:flex}.divider-line>*{background-color:var(--light-grey)}.divider-line:before{content:"";position:absolute;top:50%;left:0;width:100%;height:1px;background-color:var(--divider-color);z-index:-1;opacity:.5}.EditorContainer{--header-height: 31px;--padding: var(--horizontal-spacing);background-color:var(--background-grey, #edf2f7);height:100%;width:100%}.EditorContainer header{height:var(--header-height);gap:var(--padding);display:flex;justify-content:flex-start;align-items:center}.EditorContainer header button{padding:0}.EditorContainer header .right{margin-left:auto;display:flex;align-items:center;justify-content:end}.EditorContainer header .right .react-joyride{display:none}.EditorContainer header .right .undo-redo-buttons{transform:translate(-1px,-1px)}.EditorContainer header .right .spacer{height:20px}.EditorContainer header .right .spacer.last{width:58px}.EditorContainer header .right .divider{margin-inline-end:12px;margin-inline-start:14px}.EditorContainer header .shiny-logo{display:inline-block;height:100%;border-radius:0 15px 15px 0;padding-block:3px;padding-inline:5px;background-color:var(--rstudio-blue)}.EditorContainer header .app-title{font-size:1.15rem;color:var(--rstudio-blue)}.EditorContainer header .divider{height:20px;background-color:var(--divider-color);width:2px}.EditorContainer header .OpenSideBySideWindowButton{background-color:transparent;font-size:18px;color:var(--icon-color);margin-inline:7px}.EditorContainer header .OpenSideBySideWindowButton+.divider{margin-inline-end:3px;margin-inline-start:6px}.EditorContainer .EditorSkeleton{height:calc(100% - var(--header-height))}.EditorContainer .message-mode{background-color:#fff;border-radius:var(--corner-radius);border:var(--outline);width:min(95%,600px);padding:25px;margin-inline:auto}.EditorContainer .message-mode>h2{font-size:24px;margin-block-end:18px}.EditorContainer .message-mode>p{margin:0;padding:0}.EditorContainer .message-mode .error-msg{color:var(--red);font-family:var(--mono-fonts)} /*! * Bootstrap v5.2.3 (https://getbootstrap.com/) * Copyright 2011-2022 The Bootstrap Authors diff --git a/inst/editor/build/build/bundle.css.br b/inst/editor/build/build/bundle.css.br index cf68efd5a..399909f54 100644 Binary files a/inst/editor/build/build/bundle.css.br and b/inst/editor/build/build/bundle.css.br differ diff --git a/inst/editor/build/build/bundle.css.gz b/inst/editor/build/build/bundle.css.gz index 744892ea8..6a5fafc7e 100644 Binary files a/inst/editor/build/build/bundle.css.gz and b/inst/editor/build/build/bundle.css.gz differ diff --git a/inst/editor/build/build/bundle.js b/inst/editor/build/build/bundle.js index db93f053d..edbaa6d63 100644 --- a/inst/editor/build/build/bundle.js +++ b/inst/editor/build/build/bundle.js @@ -1,17 +1,27 @@ -"use strict";(()=>{var $A=Object.create;var Ga=Object.defineProperty;var KA=Object.getOwnPropertyDescriptor;var QA=Object.getOwnPropertyNames;var YA=Object.getPrototypeOf,JA=Object.prototype.hasOwnProperty;var tS=(t,a,r)=>a in t?Ga(t,a,{enumerable:!0,configurable:!0,writable:!0,value:r}):t[a]=r;var V1=(t,a)=>()=>(a||t((a={exports:{}}).exports,a),a.exports),is=(t,a)=>{for(var r in a)Ga(t,r,{get:a[r],enumerable:!0})},aS=(t,a,r,e)=>{if(a&&typeof a=="object"||typeof a=="function")for(let c of QA(a))!JA.call(t,c)&&c!==r&&Ga(t,c,{get:()=>a[c],enumerable:!(e=KA(a,c))||e.enumerable});return t};var V=(t,a,r)=>(r=t!=null?$A(YA(t)):{},aS(a||!t||!t.__esModule?Ga(r,"default",{value:t,enumerable:!0}):r,t));var hs=(t,a,r)=>(tS(t,typeof a!="symbol"?a+"":a,r),r);var Cs=V1(C1=>{"use strict";var p7=Symbol.for("react.element"),iS=Symbol.for("react.portal"),hS=Symbol.for("react.fragment"),vS=Symbol.for("react.strict_mode"),dS=Symbol.for("react.profiler"),uS=Symbol.for("react.provider"),sS=Symbol.for("react.context"),gS=Symbol.for("react.forward_ref"),pS=Symbol.for("react.suspense"),zS=Symbol.for("react.memo"),fS=Symbol.for("react.lazy"),gs=Symbol.iterator;function MS(t){return t===null||typeof t!="object"?null:(t=gs&&t[gs]||t["@@iterator"],typeof t=="function"?t:null)}var fs={isMounted:function(){return!1},enqueueForceUpdate:function(){},enqueueReplaceState:function(){},enqueueSetState:function(){}},Ms=Object.assign,ms={};function b8(t,a,r){this.props=t,this.context=a,this.refs=ms,this.updater=r||fs}b8.prototype.isReactComponent={};b8.prototype.setState=function(t,a){if(typeof t!="object"&&typeof t!="function"&&t!=null)throw Error("setState(...): takes an object of state variables to update or a function which returns an object of state variables.");this.updater.enqueueSetState(this,t,a,"setState")};b8.prototype.forceUpdate=function(t){this.updater.enqueueForceUpdate(this,t,"forceUpdate")};function xs(){}xs.prototype=b8.prototype;function Al(t,a,r){this.props=t,this.context=a,this.refs=ms,this.updater=r||fs}var Sl=Al.prototype=new xs;Sl.constructor=Al;Ms(Sl,b8.prototype);Sl.isPureReactComponent=!0;var ps=Array.isArray,Hs=Object.prototype.hasOwnProperty,bl={current:null},Vs={key:!0,ref:!0,__self:!0,__source:!0};function Ls(t,a,r){var e,c={},n=null,l=null;if(a!=null)for(e in a.ref!==void 0&&(l=a.ref),a.key!==void 0&&(n=""+a.key),a)Hs.call(a,e)&&!Vs.hasOwnProperty(e)&&(c[e]=a[e]);var o=arguments.length-2;if(o===1)c.children=r;else if(1{"use strict";ws.exports=Cs()});var Is=V1(a2=>{"use strict";function Il(t,a){var r=t.length;t.push(a);t:for(;0>>1,c=t[e];if(0>>1;eqa(o,r))iqa(h,o)?(t[e]=h,t[i]=r,e=i):(t[e]=o,t[l]=r,e=l);else if(iqa(h,r))t[e]=h,t[i]=r,e=i;else break t}}return a}function qa(t,a){var r=t.sortIndex-a.sortIndex;return r!==0?r:t.id-a.id}typeof performance=="object"&&typeof performance.now=="function"?(Bs=performance,a2.unstable_now=function(){return Bs.now()}):(Ol=Date,ys=Ol.now(),a2.unstable_now=function(){return Ol.now()-ys});var Bs,Ol,ys,g5=[],V3=[],LS=1,f4=null,o0=3,Ka=!1,y6=!1,f7=!1,bs=typeof setTimeout=="function"?setTimeout:null,Fs=typeof clearTimeout=="function"?clearTimeout:null,As=typeof setImmediate<"u"?setImmediate:null;typeof navigator<"u"&&navigator.scheduling!==void 0&&navigator.scheduling.isInputPending!==void 0&&navigator.scheduling.isInputPending.bind(navigator.scheduling);function El(t){for(var a=U4(V3);a!==null;){if(a.callback===null)$a(V3);else if(a.startTime<=t)$a(V3),a.sortIndex=a.expirationTime,Il(g5,a);else break;a=U4(V3)}}function Pl(t){if(f7=!1,El(t),!y6)if(U4(g5)!==null)y6=!0,_l(Tl);else{var a=U4(V3);a!==null&&Dl(Pl,a.startTime-t)}}function Tl(t,a){y6=!1,f7&&(f7=!1,Fs(M7),M7=-1),Ka=!0;var r=o0;try{for(El(a),f4=U4(g5);f4!==null&&(!(f4.expirationTime>a)||t&&!Rs());){var e=f4.callback;if(typeof e=="function"){f4.callback=null,o0=f4.priorityLevel;var c=e(f4.expirationTime<=a);a=a2.unstable_now(),typeof c=="function"?f4.callback=c:f4===U4(g5)&&$a(g5),El(a)}else $a(g5);f4=U4(g5)}if(f4!==null)var n=!0;else{var l=U4(V3);l!==null&&Dl(Pl,l.startTime-a),n=!1}return n}finally{f4=null,o0=r,Ka=!1}}var Qa=!1,Xa=null,M7=-1,Os=5,ks=-1;function Rs(){return!(a2.unstable_now()-kst||125e?(t.sortIndex=r,Il(V3,t),U4(g5)===null&&t===U4(V3)&&(f7?(Fs(M7),M7=-1):f7=!0,Dl(Pl,r-e))):(t.sortIndex=c,Il(g5,t),y6||Ka||(y6=!0,_l(Tl))),t};a2.unstable_shouldYield=Rs;a2.unstable_wrapCallback=function(t){var a=o0;return function(){var r=o0;o0=a;try{return t.apply(this,arguments)}finally{o0=r}}}});var Ps=V1((qG,Es)=>{"use strict";Es.exports=Is()});var Gz=V1(l4=>{"use strict";var Ug=X(),c4=Ps();function Z(t){for(var a="https://reactjs.org/docs/error-decoder.html?invariant="+t,r=1;r"u"||typeof window.document>"u"||typeof window.document.createElement>"u"),ho=Object.prototype.hasOwnProperty,CS=/^[:A-Z_a-z\u00C0-\u00D6\u00D8-\u00F6\u00F8-\u02FF\u0370-\u037D\u037F-\u1FFF\u200C-\u200D\u2070-\u218F\u2C00-\u2FEF\u3001-\uD7FF\uF900-\uFDCF\uFDF0-\uFFFD][:A-Z_a-z\u00C0-\u00D6\u00D8-\u00F6\u00F8-\u02FF\u0370-\u037D\u037F-\u1FFF\u200C-\u200D\u2070-\u218F\u2C00-\u2FEF\u3001-\uD7FF\uF900-\uFDCF\uFDF0-\uFFFD\-.0-9\u00B7\u0300-\u036F\u203F-\u2040]*$/,Ts={},_s={};function wS(t){return ho.call(_s,t)?!0:ho.call(Ts,t)?!1:CS.test(t)?_s[t]=!0:(Ts[t]=!0,!1)}function BS(t,a,r,e){if(r!==null&&r.type===0)return!1;switch(typeof a){case"function":case"symbol":return!0;case"boolean":return e?!1:r!==null?!r.acceptsBooleans:(t=t.toLowerCase().slice(0,5),t!=="data-"&&t!=="aria-");default:return!1}}function yS(t,a,r,e){if(a===null||typeof a>"u"||BS(t,a,r,e))return!0;if(e)return!1;if(r!==null)switch(r.type){case 3:return!a;case 4:return a===!1;case 5:return isNaN(a);case 6:return isNaN(a)||1>a}return!1}function L0(t,a,r,e,c,n,l){this.acceptsBooleans=a===2||a===3||a===4,this.attributeName=e,this.attributeNamespace=c,this.mustUseProperty=r,this.propertyName=t,this.type=a,this.sanitizeURL=n,this.removeEmptyString=l}var t0={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(t){t0[t]=new L0(t,0,!1,t,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(t){var a=t[0];t0[a]=new L0(a,1,!1,t[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(t){t0[t]=new L0(t,2,!1,t.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(t){t0[t]=new L0(t,2,!1,t,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(t){t0[t]=new L0(t,3,!1,t.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(t){t0[t]=new L0(t,3,!0,t,null,!1,!1)});["capture","download"].forEach(function(t){t0[t]=new L0(t,4,!1,t,null,!1,!1)});["cols","rows","size","span"].forEach(function(t){t0[t]=new L0(t,6,!1,t,null,!1,!1)});["rowSpan","start"].forEach(function(t){t0[t]=new L0(t,5,!1,t.toLowerCase(),null,!1,!1)});var ri=/[\-:]([a-z])/g;function ei(t){return t[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(t){var a=t.replace(ri,ei);t0[a]=new L0(a,1,!1,t,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(t){var a=t.replace(ri,ei);t0[a]=new L0(a,1,!1,t,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(t){var a=t.replace(ri,ei);t0[a]=new L0(a,1,!1,t,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(t){t0[t]=new L0(t,1,!1,t.toLowerCase(),null,!1,!1)});t0.xlinkHref=new L0("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(t){t0[t]=new L0(t,1,!1,t.toLowerCase(),null,!0,!0)});function ci(t,a,r,e){var c=t0.hasOwnProperty(a)?t0[a]:null;(c!==null?c.type!==0:e||!(2{var TS=Object.create;var Ja=Object.defineProperty;var NS=Object.getOwnPropertyDescriptor;var DS=Object.getOwnPropertyNames;var ZS=Object.getPrototypeOf,GS=Object.prototype.hasOwnProperty;var US=(t,a,r)=>a in t?Ja(t,a,{enumerable:!0,configurable:!0,writable:!0,value:r}):t[a]=r;var V1=(t,a)=>()=>(a||t((a={exports:{}}).exports,a),a.exports),ks=(t,a)=>{for(var r in a)Ja(t,r,{get:a[r],enumerable:!0})},WS=(t,a,r,e)=>{if(a&&typeof a=="object"||typeof a=="function")for(let c of DS(a))!GS.call(t,c)&&c!==r&&Ja(t,c,{get:()=>a[c],enumerable:!(e=NS(a,c))||e.enumerable});return t};var V=(t,a,r)=>(r=t!=null?TS(ZS(t)):{},WS(a||!t||!t.__esModule?Ja(r,"default",{value:t,enumerable:!0}):r,t));var _s=(t,a,r)=>(US(t,typeof a!="symbol"?a+"":a,r),r);var Xs=V1(C1=>{"use strict";var C7=Symbol.for("react.element"),JS=Symbol.for("react.portal"),tb=Symbol.for("react.fragment"),ab=Symbol.for("react.strict_mode"),rb=Symbol.for("react.profiler"),eb=Symbol.for("react.provider"),cb=Symbol.for("react.context"),nb=Symbol.for("react.forward_ref"),lb=Symbol.for("react.suspense"),ob=Symbol.for("react.memo"),ib=Symbol.for("react.lazy"),Ts=Symbol.iterator;function hb(t){return t===null||typeof t!="object"?null:(t=Ts&&t[Ts]||t["@@iterator"],typeof t=="function"?t:null)}var Zs={isMounted:function(){return!1},enqueueForceUpdate:function(){},enqueueReplaceState:function(){},enqueueSetState:function(){}},Gs=Object.assign,Us={};function E8(t,a,r){this.props=t,this.context=a,this.refs=Us,this.updater=r||Zs}E8.prototype.isReactComponent={};E8.prototype.setState=function(t,a){if(typeof t!="object"&&typeof t!="function"&&t!=null)throw Error("setState(...): takes an object of state variables to update or a function which returns an object of state variables.");this.updater.enqueueSetState(this,t,a,"setState")};E8.prototype.forceUpdate=function(t){this.updater.enqueueForceUpdate(this,t,"forceUpdate")};function Ws(){}Ws.prototype=E8.prototype;function Ul(t,a,r){this.props=t,this.context=a,this.refs=Us,this.updater=r||Zs}var Wl=Ul.prototype=new Ws;Wl.constructor=Ul;Gs(Wl,E8.prototype);Wl.isPureReactComponent=!0;var Ns=Array.isArray,js=Object.prototype.hasOwnProperty,jl={current:null},qs={key:!0,ref:!0,__self:!0,__source:!0};function $s(t,a,r){var e,c={},n=null,l=null;if(a!=null)for(e in a.ref!==void 0&&(l=a.ref),a.key!==void 0&&(n=""+a.key),a)js.call(a,e)&&!qs.hasOwnProperty(e)&&(c[e]=a[e]);var o=arguments.length-2;if(o===1)c.children=r;else if(1{"use strict";Ks.exports=Xs()});var lg=V1(r2=>{"use strict";function Ql(t,a){var r=t.length;t.push(a);t:for(;0>>1,c=t[e];if(0>>1;eer(o,r))ier(h,o)?(t[e]=h,t[i]=r,e=i):(t[e]=o,t[l]=r,e=l);else if(ier(h,r))t[e]=h,t[i]=r,e=i;else break t}}return a}function er(t,a){var r=t.sortIndex-a.sortIndex;return r!==0?r:t.id-a.id}typeof performance=="object"&&typeof performance.now=="function"?(Qs=performance,r2.unstable_now=function(){return Qs.now()}):($l=Date,Ys=$l.now(),r2.unstable_now=function(){return $l.now()-Ys});var Qs,$l,Ys,H5=[],A3=[],gb=1,V4=null,h0=3,lr=!1,O6=!1,B7=!1,ag=typeof setTimeout=="function"?setTimeout:null,rg=typeof clearTimeout=="function"?clearTimeout:null,Js=typeof setImmediate<"u"?setImmediate:null;typeof navigator<"u"&&navigator.scheduling!==void 0&&navigator.scheduling.isInputPending!==void 0&&navigator.scheduling.isInputPending.bind(navigator.scheduling);function Yl(t){for(var a=K4(A3);a!==null;){if(a.callback===null)nr(A3);else if(a.startTime<=t)nr(A3),a.sortIndex=a.expirationTime,Ql(H5,a);else break;a=K4(A3)}}function Jl(t){if(B7=!1,Yl(t),!O6)if(K4(H5)!==null)O6=!0,ao(to);else{var a=K4(A3);a!==null&&ro(Jl,a.startTime-t)}}function to(t,a){O6=!1,B7&&(B7=!1,rg(y7),y7=-1),lr=!0;var r=h0;try{for(Yl(a),V4=K4(H5);V4!==null&&(!(V4.expirationTime>a)||t&&!ng());){var e=V4.callback;if(typeof e=="function"){V4.callback=null,h0=V4.priorityLevel;var c=e(V4.expirationTime<=a);a=r2.unstable_now(),typeof c=="function"?V4.callback=c:V4===K4(H5)&&nr(H5),Yl(a)}else nr(H5);V4=K4(H5)}if(V4!==null)var n=!0;else{var l=K4(A3);l!==null&&ro(Jl,l.startTime-a),n=!1}return n}finally{V4=null,h0=r,lr=!1}}var or=!1,cr=null,y7=-1,eg=5,cg=-1;function ng(){return!(r2.unstable_now()-cgt||125e?(t.sortIndex=r,Ql(A3,t),K4(H5)===null&&t===K4(A3)&&(B7?(rg(y7),y7=-1):B7=!0,ro(Jl,r-e))):(t.sortIndex=c,Ql(H5,t),O6||lr||(O6=!0,ao(to))),t};r2.unstable_shouldYield=ng;r2.unstable_wrapCallback=function(t){var a=h0;return function(){var r=h0;h0=a;try{return t.apply(this,arguments)}finally{h0=r}}}});var ig=V1((lW,og)=>{"use strict";og.exports=lg()});var pf=V1(v4=>{"use strict";var pp=$(),i4=ig();function Z(t){for(var a="https://reactjs.org/docs/error-decoder.html?invariant="+t,r=1;r"u"||typeof window.document>"u"||typeof window.document.createElement>"u"),Bo=Object.prototype.hasOwnProperty,pb=/^[:A-Z_a-z\u00C0-\u00D6\u00D8-\u00F6\u00F8-\u02FF\u0370-\u037D\u037F-\u1FFF\u200C-\u200D\u2070-\u218F\u2C00-\u2FEF\u3001-\uD7FF\uF900-\uFDCF\uFDF0-\uFFFD][:A-Z_a-z\u00C0-\u00D6\u00D8-\u00F6\u00F8-\u02FF\u0370-\u037D\u037F-\u1FFF\u200C-\u200D\u2070-\u218F\u2C00-\u2FEF\u3001-\uD7FF\uF900-\uFDCF\uFDF0-\uFFFD\-.0-9\u00B7\u0300-\u036F\u203F-\u2040]*$/,hg={},vg={};function zb(t){return Bo.call(vg,t)?!0:Bo.call(hg,t)?!1:pb.test(t)?vg[t]=!0:(hg[t]=!0,!1)}function fb(t,a,r,e){if(r!==null&&r.type===0)return!1;switch(typeof a){case"function":case"symbol":return!0;case"boolean":return e?!1:r!==null?!r.acceptsBooleans:(t=t.toLowerCase().slice(0,5),t!=="data-"&&t!=="aria-");default:return!1}}function Mb(t,a,r,e){if(a===null||typeof a>"u"||fb(t,a,r,e))return!0;if(e)return!1;if(r!==null)switch(r.type){case 3:return!a;case 4:return a===!1;case 5:return isNaN(a);case 6:return isNaN(a)||1>a}return!1}function w0(t,a,r,e,c,n,l){this.acceptsBooleans=a===2||a===3||a===4,this.attributeName=e,this.attributeNamespace=c,this.mustUseProperty=r,this.propertyName=t,this.type=a,this.sanitizeURL=n,this.removeEmptyString=l}var r0={};"children dangerouslySetInnerHTML defaultValue defaultChecked innerHTML suppressContentEditableWarning suppressHydrationWarning style".split(" ").forEach(function(t){r0[t]=new w0(t,0,!1,t,null,!1,!1)});[["acceptCharset","accept-charset"],["className","class"],["htmlFor","for"],["httpEquiv","http-equiv"]].forEach(function(t){var a=t[0];r0[a]=new w0(a,1,!1,t[1],null,!1,!1)});["contentEditable","draggable","spellCheck","value"].forEach(function(t){r0[t]=new w0(t,2,!1,t.toLowerCase(),null,!1,!1)});["autoReverse","externalResourcesRequired","focusable","preserveAlpha"].forEach(function(t){r0[t]=new w0(t,2,!1,t,null,!1,!1)});"allowFullScreen async autoFocus autoPlay controls default defer disabled disablePictureInPicture disableRemotePlayback formNoValidate hidden loop noModule noValidate open playsInline readOnly required reversed scoped seamless itemScope".split(" ").forEach(function(t){r0[t]=new w0(t,3,!1,t.toLowerCase(),null,!1,!1)});["checked","multiple","muted","selected"].forEach(function(t){r0[t]=new w0(t,3,!0,t,null,!1,!1)});["capture","download"].forEach(function(t){r0[t]=new w0(t,4,!1,t,null,!1,!1)});["cols","rows","size","span"].forEach(function(t){r0[t]=new w0(t,6,!1,t,null,!1,!1)});["rowSpan","start"].forEach(function(t){r0[t]=new w0(t,5,!1,t.toLowerCase(),null,!1,!1)});var Mi=/[\-:]([a-z])/g;function mi(t){return t[1].toUpperCase()}"accent-height alignment-baseline arabic-form baseline-shift cap-height clip-path clip-rule color-interpolation color-interpolation-filters color-profile color-rendering dominant-baseline enable-background fill-opacity fill-rule flood-color flood-opacity font-family font-size font-size-adjust font-stretch font-style font-variant font-weight glyph-name glyph-orientation-horizontal glyph-orientation-vertical horiz-adv-x horiz-origin-x image-rendering letter-spacing lighting-color marker-end marker-mid marker-start overline-position overline-thickness paint-order panose-1 pointer-events rendering-intent shape-rendering stop-color stop-opacity strikethrough-position strikethrough-thickness stroke-dasharray stroke-dashoffset stroke-linecap stroke-linejoin stroke-miterlimit stroke-opacity stroke-width text-anchor text-decoration text-rendering underline-position underline-thickness unicode-bidi unicode-range units-per-em v-alphabetic v-hanging v-ideographic v-mathematical vector-effect vert-adv-y vert-origin-x vert-origin-y word-spacing writing-mode xmlns:xlink x-height".split(" ").forEach(function(t){var a=t.replace(Mi,mi);r0[a]=new w0(a,1,!1,t,null,!1,!1)});"xlink:actuate xlink:arcrole xlink:role xlink:show xlink:title xlink:type".split(" ").forEach(function(t){var a=t.replace(Mi,mi);r0[a]=new w0(a,1,!1,t,"http://www.w3.org/1999/xlink",!1,!1)});["xml:base","xml:lang","xml:space"].forEach(function(t){var a=t.replace(Mi,mi);r0[a]=new w0(a,1,!1,t,"http://www.w3.org/XML/1998/namespace",!1,!1)});["tabIndex","crossOrigin"].forEach(function(t){r0[t]=new w0(t,1,!1,t.toLowerCase(),null,!1,!1)});r0.xlinkHref=new w0("xlinkHref",1,!1,"xlink:href","http://www.w3.org/1999/xlink",!0,!1);["src","href","action","formAction"].forEach(function(t){r0[t]=new w0(t,1,!1,t.toLowerCase(),null,!0,!0)});function xi(t,a,r,e){var c=r0.hasOwnProperty(a)?r0[a]:null;(c!==null?c.type!==0:e||!(2o||c[l]!==n[o]){var i=` -`+c[l].replace(" at new "," at ");return t.displayName&&i.includes("")&&(i=i.replace("",t.displayName)),i}while(1<=l&&0<=o);break}}}finally{Zl=!1,Error.prepareStackTrace=r}return(t=t?t.displayName||t.name:"")?y7(t):""}function AS(t){switch(t.tag){case 5:return y7(t.type);case 16:return y7("Lazy");case 13:return y7("Suspense");case 19:return y7("SuspenseList");case 0:case 2:case 15:return t=Gl(t.type,!1),t;case 11:return t=Gl(t.type.render,!1),t;case 1:return t=Gl(t.type,!0),t;default:return""}}function go(t){if(t==null)return null;if(typeof t=="function")return t.displayName||t.name||null;if(typeof t=="string")return t;switch(t){case R8:return"Fragment";case k8:return"Portal";case vo:return"Profiler";case ni:return"StrictMode";case uo:return"Suspense";case so:return"SuspenseList"}if(typeof t=="object")switch(t.$$typeof){case qg:return(t.displayName||"Context")+".Consumer";case jg:return(t._context.displayName||"Context")+".Provider";case li:var a=t.render;return t=t.displayName,t||(t=a.displayName||a.name||"",t=t!==""?"ForwardRef("+t+")":"ForwardRef"),t;case oi:return a=t.displayName||null,a!==null?a:go(t.type)||"Memo";case C3:a=t._payload,t=t._init;try{return go(t(a))}catch{}}return null}function SS(t){var a=t.type;switch(t.tag){case 24:return"Cache";case 9:return(a.displayName||"Context")+".Consumer";case 10:return(a._context.displayName||"Context")+".Provider";case 18:return"DehydratedFragment";case 11:return t=a.render,t=t.displayName||t.name||"",a.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case 7:return"Fragment";case 5:return a;case 4:return"Portal";case 3:return"Root";case 6:return"Text";case 16:return go(a);case 8:return a===ni?"StrictMode":"Mode";case 22:return"Offscreen";case 12:return"Profiler";case 21:return"Scope";case 13:return"Suspense";case 19:return"SuspenseList";case 25:return"TracingMarker";case 1:case 0:case 17:case 2:case 14:case 15:if(typeof a=="function")return a.displayName||a.name||null;if(typeof a=="string")return a}return null}function T3(t){switch(typeof t){case"boolean":case"number":case"string":case"undefined":return t;case"object":return t;default:return""}}function $g(t){var a=t.type;return(t=t.nodeName)&&t.toLowerCase()==="input"&&(a==="checkbox"||a==="radio")}function bS(t){var a=$g(t)?"checked":"value",r=Object.getOwnPropertyDescriptor(t.constructor.prototype,a),e=""+t[a];if(!t.hasOwnProperty(a)&&typeof r<"u"&&typeof r.get=="function"&&typeof r.set=="function"){var c=r.get,n=r.set;return Object.defineProperty(t,a,{configurable:!0,get:function(){return c.call(this)},set:function(l){e=""+l,n.call(this,l)}}),Object.defineProperty(t,a,{enumerable:r.enumerable}),{getValue:function(){return e},setValue:function(l){e=""+l},stopTracking:function(){t._valueTracker=null,delete t[a]}}}}function Ja(t){t._valueTracker||(t._valueTracker=bS(t))}function Kg(t){if(!t)return!1;var a=t._valueTracker;if(!a)return!0;var r=a.getValue(),e="";return t&&(e=$g(t)?t.checked?"true":"false":t.value),t=e,t!==r?(a.setValue(t),!0):!1}function yr(t){if(t=t||(typeof document<"u"?document:void 0),typeof t>"u")return null;try{return t.activeElement||t.body}catch{return t.body}}function po(t,a){var r=a.checked;return g2({},a,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:r??t._wrapperState.initialChecked})}function Ns(t,a){var r=a.defaultValue==null?"":a.defaultValue,e=a.checked!=null?a.checked:a.defaultChecked;r=T3(a.value!=null?a.value:r),t._wrapperState={initialChecked:e,initialValue:r,controlled:a.type==="checkbox"||a.type==="radio"?a.checked!=null:a.value!=null}}function Qg(t,a){a=a.checked,a!=null&&ci(t,"checked",a,!1)}function zo(t,a){Qg(t,a);var r=T3(a.value),e=a.type;if(r!=null)e==="number"?(r===0&&t.value===""||t.value!=r)&&(t.value=""+r):t.value!==""+r&&(t.value=""+r);else if(e==="submit"||e==="reset"){t.removeAttribute("value");return}a.hasOwnProperty("value")?fo(t,a.type,r):a.hasOwnProperty("defaultValue")&&fo(t,a.type,T3(a.defaultValue)),a.checked==null&&a.defaultChecked!=null&&(t.defaultChecked=!!a.defaultChecked)}function Zs(t,a,r){if(a.hasOwnProperty("value")||a.hasOwnProperty("defaultValue")){var e=a.type;if(!(e!=="submit"&&e!=="reset"||a.value!==void 0&&a.value!==null))return;a=""+t._wrapperState.initialValue,r||a===t.value||(t.value=a),t.defaultValue=a}r=t.name,r!==""&&(t.name=""),t.defaultChecked=!!t._wrapperState.initialChecked,r!==""&&(t.name=r)}function fo(t,a,r){(a!=="number"||yr(t.ownerDocument)!==t)&&(r==null?t.defaultValue=""+t._wrapperState.initialValue:t.defaultValue!==""+r&&(t.defaultValue=""+r))}var A7=Array.isArray;function W8(t,a,r,e){if(t=t.options,a){a={};for(var c=0;c"+a.valueOf().toString()+"",a=tr.firstChild;t.firstChild;)t.removeChild(t.firstChild);for(;a.firstChild;)t.appendChild(a.firstChild)}});function N7(t,a){if(a){var r=t.firstChild;if(r&&r===t.lastChild&&r.nodeType===3){r.nodeValue=a;return}}t.textContent=a}var F7={animationIterationCount:!0,aspectRatio:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},FS=["Webkit","ms","Moz","O"];Object.keys(F7).forEach(function(t){FS.forEach(function(a){a=a+t.charAt(0).toUpperCase()+t.substring(1),F7[a]=F7[t]})});function ap(t,a,r){return a==null||typeof a=="boolean"||a===""?"":r||typeof a!="number"||a===0||F7.hasOwnProperty(t)&&F7[t]?(""+a).trim():a+"px"}function rp(t,a){t=t.style;for(var r in a)if(a.hasOwnProperty(r)){var e=r.indexOf("--")===0,c=ap(r,a[r],e);r==="float"&&(r="cssFloat"),e?t.setProperty(r,c):t[r]=c}}var OS=g2({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function xo(t,a){if(a){if(OS[t]&&(a.children!=null||a.dangerouslySetInnerHTML!=null))throw Error(Z(137,t));if(a.dangerouslySetInnerHTML!=null){if(a.children!=null)throw Error(Z(60));if(typeof a.dangerouslySetInnerHTML!="object"||!("__html"in a.dangerouslySetInnerHTML))throw Error(Z(61))}if(a.style!=null&&typeof a.style!="object")throw Error(Z(62))}}function Ho(t,a){if(t.indexOf("-")===-1)return typeof a.is=="string";switch(t){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}var Vo=null;function ii(t){return t=t.target||t.srcElement||window,t.correspondingUseElement&&(t=t.correspondingUseElement),t.nodeType===3?t.parentNode:t}var Lo=null,j8=null,q8=null;function Ws(t){if(t=n9(t)){if(typeof Lo!="function")throw Error(Z(280));var a=t.stateNode;a&&(a=ae(a),Lo(t.stateNode,t.type,a))}}function ep(t){j8?q8?q8.push(t):q8=[t]:j8=t}function cp(){if(j8){var t=j8,a=q8;if(q8=j8=null,Ws(t),a)for(t=0;t>>=0,t===0?32:31-(GS(t)/US|0)|0}var ar=64,rr=4194304;function S7(t){switch(t&-t){case 1:return 1;case 2:return 2;case 4:return 4;case 8:return 8;case 16:return 16;case 32:return 32;case 64:case 128:case 256:case 512:case 1024:case 2048:case 4096:case 8192:case 16384:case 32768:case 65536:case 131072:case 262144:case 524288:case 1048576:case 2097152:return t&4194240;case 4194304:case 8388608:case 16777216:case 33554432:case 67108864:return t&130023424;case 134217728:return 134217728;case 268435456:return 268435456;case 536870912:return 536870912;case 1073741824:return 1073741824;default:return t}}function Fr(t,a){var r=t.pendingLanes;if(r===0)return 0;var e=0,c=t.suspendedLanes,n=t.pingedLanes,l=r&268435455;if(l!==0){var o=l&~c;o!==0?e=S7(o):(n&=l,n!==0&&(e=S7(n)))}else l=r&~c,l!==0?e=S7(l):n!==0&&(e=S7(n));if(e===0)return 0;if(a!==0&&a!==e&&(a&c)===0&&(c=e&-e,n=a&-a,c>=n||c===16&&(n&4194240)!==0))return a;if((e&4)!==0&&(e|=r&16),a=t.entangledLanes,a!==0)for(t=t.entanglements,a&=e;0r;r++)a.push(t);return a}function e9(t,a,r){t.pendingLanes|=a,a!==536870912&&(t.suspendedLanes=0,t.pingedLanes=0),t=t.eventTimes,a=31-$4(a),t[a]=r}function XS(t,a){var r=t.pendingLanes&~a;t.pendingLanes=a,t.suspendedLanes=0,t.pingedLanes=0,t.expiredLanes&=a,t.mutableReadLanes&=a,t.entangledLanes&=a,a=t.entanglements;var e=t.eventTimes;for(t=t.expirationTimes;0=k7),tg=String.fromCharCode(32),ag=!1;function Cp(t,a){switch(t){case"keyup":return Vb.indexOf(a.keyCode)!==-1;case"keydown":return a.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function wp(t){return t=t.detail,typeof t=="object"&&"data"in t?t.data:null}var I8=!1;function Cb(t,a){switch(t){case"compositionend":return wp(a);case"keypress":return a.which!==32?null:(ag=!0,tg);case"textInput":return t=a.data,t===tg&&ag?null:t;default:return null}}function wb(t,a){if(I8)return t==="compositionend"||!zi&&Cp(t,a)?(t=Vp(),Mr=si=A3=null,I8=!1,t):null;switch(t){case"paste":return null;case"keypress":if(!(a.ctrlKey||a.altKey||a.metaKey)||a.ctrlKey&&a.altKey){if(a.char&&1=a)return{node:r,offset:a-t};t=e}t:{for(;r;){if(r.nextSibling){r=r.nextSibling;break t}r=r.parentNode}r=void 0}r=cg(r)}}function Sp(t,a){return t&&a?t===a?!0:t&&t.nodeType===3?!1:a&&a.nodeType===3?Sp(t,a.parentNode):"contains"in t?t.contains(a):t.compareDocumentPosition?!!(t.compareDocumentPosition(a)&16):!1:!1}function bp(){for(var t=window,a=yr();a instanceof t.HTMLIFrameElement;){try{var r=typeof a.contentWindow.location.href=="string"}catch{r=!1}if(r)t=a.contentWindow;else break;a=yr(t.document)}return a}function fi(t){var a=t&&t.nodeName&&t.nodeName.toLowerCase();return a&&(a==="input"&&(t.type==="text"||t.type==="search"||t.type==="tel"||t.type==="url"||t.type==="password")||a==="textarea"||t.contentEditable==="true")}function Rb(t){var a=bp(),r=t.focusedElem,e=t.selectionRange;if(a!==r&&r&&r.ownerDocument&&Sp(r.ownerDocument.documentElement,r)){if(e!==null&&fi(r)){if(a=e.start,t=e.end,t===void 0&&(t=a),"selectionStart"in r)r.selectionStart=a,r.selectionEnd=Math.min(t,r.value.length);else if(t=(a=r.ownerDocument||document)&&a.defaultView||window,t.getSelection){t=t.getSelection();var c=r.textContent.length,n=Math.min(e.start,c);e=e.end===void 0?n:Math.min(e.end,c),!t.extend&&n>e&&(c=e,e=n,n=c),c=ng(r,n);var l=ng(r,e);c&&l&&(t.rangeCount!==1||t.anchorNode!==c.node||t.anchorOffset!==c.offset||t.focusNode!==l.node||t.focusOffset!==l.offset)&&(a=a.createRange(),a.setStart(c.node,c.offset),t.removeAllRanges(),n>e?(t.addRange(a),t.extend(l.node,l.offset)):(a.setEnd(l.node,l.offset),t.addRange(a)))}}for(a=[],t=r;t=t.parentNode;)t.nodeType===1&&a.push({element:t,left:t.scrollLeft,top:t.scrollTop});for(typeof r.focus=="function"&&r.focus(),r=0;r=document.documentMode,E8=null,So=null,I7=null,bo=!1;function lg(t,a,r){var e=r.window===r?r.document:r.nodeType===9?r:r.ownerDocument;bo||E8==null||E8!==yr(e)||(e=E8,"selectionStart"in e&&fi(e)?e={start:e.selectionStart,end:e.selectionEnd}:(e=(e.ownerDocument&&e.ownerDocument.defaultView||window).getSelection(),e={anchorNode:e.anchorNode,anchorOffset:e.anchorOffset,focusNode:e.focusNode,focusOffset:e.focusOffset}),I7&&q7(I7,e)||(I7=e,e=Rr(So,"onSelect"),0_8||(t.current=Eo[_8],Eo[_8]=null,_8--)}function r2(t,a){_8++,Eo[_8]=t.current,t.current=a}var _3={},d0=N3(_3),I0=N3(!1),I6=_3;function Y8(t,a){var r=t.type.contextTypes;if(!r)return _3;var e=t.stateNode;if(e&&e.__reactInternalMemoizedUnmaskedChildContext===a)return e.__reactInternalMemoizedMaskedChildContext;var c={},n;for(n in r)c[n]=a[n];return e&&(t=t.stateNode,t.__reactInternalMemoizedUnmaskedChildContext=a,t.__reactInternalMemoizedMaskedChildContext=c),c}function E0(t){return t=t.childContextTypes,t!=null}function Er(){c2(I0),c2(d0)}function pg(t,a,r){if(d0.current!==_3)throw Error(Z(168));r2(d0,a),r2(I0,r)}function _p(t,a,r){var e=t.stateNode;if(a=a.childContextTypes,typeof e.getChildContext!="function")return r;e=e.getChildContext();for(var c in e)if(!(c in a))throw Error(Z(108,SS(t)||"Unknown",c));return g2({},r,e)}function Pr(t){return t=(t=t.stateNode)&&t.__reactInternalMemoizedMergedChildContext||_3,I6=d0.current,r2(d0,t),r2(I0,I0.current),!0}function zg(t,a,r){var e=t.stateNode;if(!e)throw Error(Z(169));r?(t=_p(t,a,I6),e.__reactInternalMemoizedMergedChildContext=t,c2(I0),c2(d0),r2(d0,t)):c2(I0),r2(I0,r)}var P5=null,re=!1,to=!1;function Dp(t){P5===null?P5=[t]:P5.push(t)}function Ub(t){re=!0,Dp(t)}function Z3(){if(!to&&P5!==null){to=!0;var t=0,a=_1;try{var r=P5;for(_1=1;t>=l,c-=l,T5=1<<32-$4(a)+c|r<E?(_=k,k=null):_=k.sibling;var U=u(f,k,H[E],w);if(U===null){k===null&&(k=_);break}t&&k&&U.alternate===null&&a(f,k),m=n(U,m,E),C===null?A=U:C.sibling=U,C=U,k=_}if(E===H.length)return r(f,k),l2&&A6(f,E),A;if(k===null){for(;EE?(_=k,k=null):_=k.sibling;var j=u(f,k,U.value,w);if(j===null){k===null&&(k=_);break}t&&k&&j.alternate===null&&a(f,k),m=n(j,m,E),C===null?A=j:C.sibling=j,C=j,k=_}if(U.done)return r(f,k),l2&&A6(f,E),A;if(k===null){for(;!U.done;E++,U=H.next())U=d(f,U.value,w),U!==null&&(m=n(U,m,E),C===null?A=U:C.sibling=U,C=U);return l2&&A6(f,E),A}for(k=e(f,k);!U.done;E++,U=H.next())U=s(k,f,E,U.value,w),U!==null&&(t&&U.alternate!==null&&k.delete(U.key===null?E:U.key),m=n(U,m,E),C===null?A=U:C.sibling=U,C=U);return t&&k.forEach(function(Q){return a(f,Q)}),l2&&A6(f,E),A}function L(f,m,H,w){if(typeof H=="object"&&H!==null&&H.type===R8&&H.key===null&&(H=H.props.children),typeof H=="object"&&H!==null){switch(H.$$typeof){case Ya:t:{for(var A=H.key,C=m;C!==null;){if(C.key===A){if(A=H.type,A===R8){if(C.tag===7){r(f,C.sibling),m=c(C,H.props.children),m.return=f,f=m;break t}}else if(C.elementType===A||typeof A=="object"&&A!==null&&A.$$typeof===C3&&Lg(A)===C.type){r(f,C.sibling),m=c(C,H.props),m.ref=L7(f,C,H),m.return=f,f=m;break t}r(f,C);break}else a(f,C);C=C.sibling}H.type===R8?(m=R6(H.props.children,f.mode,w,H.key),m.return=f,f=m):(w=Br(H.type,H.key,H.props,null,f.mode,w),w.ref=L7(f,m,H),w.return=f,f=w)}return l(f);case k8:t:{for(C=H.key;m!==null;){if(m.key===C)if(m.tag===4&&m.stateNode.containerInfo===H.containerInfo&&m.stateNode.implementation===H.implementation){r(f,m.sibling),m=c(m,H.children||[]),m.return=f,f=m;break t}else{r(f,m);break}else a(f,m);m=m.sibling}m=io(H,f.mode,w),m.return=f,f=m}return l(f);case C3:return C=H._init,L(f,m,C(H._payload),w)}if(A7(H))return g(f,m,H,w);if(m7(H))return p(f,m,H,w);sr(f,H)}return typeof H=="string"&&H!==""||typeof H=="number"?(H=""+H,m!==null&&m.tag===6?(r(f,m.sibling),m=c(m,H),m.return=f,f=m):(r(f,m),m=oo(H,f.mode,w),m.return=f,f=m),l(f)):r(f,m)}return L}var tt=Xp(!0),$p=Xp(!1),l9={},m5=N3(l9),Q7=N3(l9),Y7=N3(l9);function O6(t){if(t===l9)throw Error(Z(174));return t}function Bi(t,a){switch(r2(Y7,a),r2(Q7,t),r2(m5,l9),t=a.nodeType,t){case 9:case 11:a=(a=a.documentElement)?a.namespaceURI:mo(null,"");break;default:t=t===8?a.parentNode:a,a=t.namespaceURI||null,t=t.tagName,a=mo(a,t)}c2(m5),r2(m5,a)}function at(){c2(m5),c2(Q7),c2(Y7)}function Kp(t){O6(Y7.current);var a=O6(m5.current),r=mo(a,t.type);a!==r&&(r2(Q7,t),r2(m5,r))}function yi(t){Q7.current===t&&(c2(m5),c2(Q7))}var u2=N3(0);function Gr(t){for(var a=t;a!==null;){if(a.tag===13){var r=a.memoizedState;if(r!==null&&(r=r.dehydrated,r===null||r.data==="$?"||r.data==="$!"))return a}else if(a.tag===19&&a.memoizedProps.revealOrder!==void 0){if((a.flags&128)!==0)return a}else if(a.child!==null){a.child.return=a,a=a.child;continue}if(a===t)break;for(;a.sibling===null;){if(a.return===null||a.return===t)return null;a=a.return}a.sibling.return=a.return,a=a.sibling}return null}var ao=[];function Ai(){for(var t=0;tr?r:4,t(!0);var e=ro.transition;ro.transition={};try{t(!1),a()}finally{_1=r,ro.transition=e}}function uz(){return L4().memoizedState}function Xb(t,a,r){var e=E3(t);if(r={lane:e,action:r,hasEagerState:!1,eagerState:null,next:null},sz(t))gz(a,r);else if(r=Up(t,a,r,e),r!==null){var c=V0();K4(r,t,e,c),pz(r,a,e)}}function $b(t,a,r){var e=E3(t),c={lane:e,action:r,hasEagerState:!1,eagerState:null,next:null};if(sz(t))gz(a,c);else{var n=t.alternate;if(t.lanes===0&&(n===null||n.lanes===0)&&(n=a.lastRenderedReducer,n!==null))try{var l=a.lastRenderedState,o=n(l,r);if(c.hasEagerState=!0,c.eagerState=o,Q4(o,l)){var i=a.interleaved;i===null?(c.next=c,Ci(a)):(c.next=i.next,i.next=c),a.interleaved=c;return}}catch{}finally{}r=Up(t,a,c,e),r!==null&&(c=V0(),K4(r,t,e,c),pz(r,a,e))}}function sz(t){var a=t.alternate;return t===s2||a!==null&&a===s2}function gz(t,a){E7=Ur=!0;var r=t.pending;r===null?a.next=a:(a.next=r.next,r.next=a),t.pending=a}function pz(t,a,r){if((r&4194240)!==0){var e=a.lanes;e&=t.pendingLanes,r|=e,a.lanes=r,vi(t,r)}}var Wr={readContext:V4,useCallback:i0,useContext:i0,useEffect:i0,useImperativeHandle:i0,useInsertionEffect:i0,useLayoutEffect:i0,useMemo:i0,useReducer:i0,useRef:i0,useState:i0,useDebugValue:i0,useDeferredValue:i0,useTransition:i0,useMutableSource:i0,useSyncExternalStore:i0,useId:i0,unstable_isNewReconciler:!1},Kb={readContext:V4,useCallback:function(t,a){return z5().memoizedState=[t,a===void 0?null:a],t},useContext:V4,useEffect:wg,useImperativeHandle:function(t,a,r){return r=r!=null?r.concat([t]):null,Vr(4194308,4,oz.bind(null,a,t),r)},useLayoutEffect:function(t,a){return Vr(4194308,4,t,a)},useInsertionEffect:function(t,a){return Vr(4,2,t,a)},useMemo:function(t,a){var r=z5();return a=a===void 0?null:a,t=t(),r.memoizedState=[t,a],t},useReducer:function(t,a,r){var e=z5();return a=r!==void 0?r(a):a,e.memoizedState=e.baseState=a,t={pending:null,interleaved:null,lanes:0,dispatch:null,lastRenderedReducer:t,lastRenderedState:a},e.queue=t,t=t.dispatch=Xb.bind(null,s2,t),[e.memoizedState,t]},useRef:function(t){var a=z5();return t={current:t},a.memoizedState=t},useState:Cg,useDebugValue:ki,useDeferredValue:function(t){return z5().memoizedState=t},useTransition:function(){var t=Cg(!1),a=t[0];return t=qb.bind(null,t[1]),z5().memoizedState=t,[a,t]},useMutableSource:function(){},useSyncExternalStore:function(t,a,r){var e=s2,c=z5();if(l2){if(r===void 0)throw Error(Z(407));r=r()}else{if(r=a(),j2===null)throw Error(Z(349));(P6&30)!==0||Jp(e,a,r)}c.memoizedState=r;var n={value:r,getSnapshot:a};return c.queue=n,wg(az.bind(null,e,n,t),[t]),e.flags|=2048,a9(9,tz.bind(null,e,n,r,a),void 0,null),r},useId:function(){var t=z5(),a=j2.identifierPrefix;if(l2){var r=_5,e=T5;r=(e&~(1<<32-$4(e)-1)).toString(32)+r,a=":"+a+"R"+r,r=J7++,0")&&(i=i.replace("",t.displayName)),i}while(1<=l&&0<=o);break}}}finally{co=!1,Error.prepareStackTrace=r}return(t=t?t.displayName||t.name:"")?I7(t):""}function mb(t){switch(t.tag){case 5:return I7(t.type);case 16:return I7("Lazy");case 13:return I7("Suspense");case 19:return I7("SuspenseList");case 0:case 2:case 15:return t=no(t.type,!1),t;case 11:return t=no(t.type.render,!1),t;case 1:return t=no(t.type,!0),t;default:return""}}function bo(t){if(t==null)return null;if(typeof t=="function")return t.displayName||t.name||null;if(typeof t=="string")return t;switch(t){case D8:return"Fragment";case N8:return"Portal";case yo:return"Profiler";case Hi:return"StrictMode";case Ao:return"Suspense";case So:return"SuspenseList"}if(typeof t=="object")switch(t.$$typeof){case Mp:return(t.displayName||"Context")+".Consumer";case fp:return(t._context.displayName||"Context")+".Provider";case Vi:var a=t.render;return t=t.displayName,t||(t=a.displayName||a.name||"",t=t!==""?"ForwardRef("+t+")":"ForwardRef"),t;case Li:return a=t.displayName||null,a!==null?a:bo(t.type)||"Memo";case b3:a=t._payload,t=t._init;try{return bo(t(a))}catch{}}return null}function xb(t){var a=t.type;switch(t.tag){case 24:return"Cache";case 9:return(a.displayName||"Context")+".Consumer";case 10:return(a._context.displayName||"Context")+".Provider";case 18:return"DehydratedFragment";case 11:return t=a.render,t=t.displayName||t.name||"",a.displayName||(t!==""?"ForwardRef("+t+")":"ForwardRef");case 7:return"Fragment";case 5:return a;case 4:return"Portal";case 3:return"Root";case 6:return"Text";case 16:return bo(a);case 8:return a===Hi?"StrictMode":"Mode";case 22:return"Offscreen";case 12:return"Profiler";case 21:return"Scope";case 13:return"Suspense";case 19:return"SuspenseList";case 25:return"TracingMarker";case 1:case 0:case 17:case 2:case 14:case 15:if(typeof a=="function")return a.displayName||a.name||null;if(typeof a=="string")return a}return null}function U3(t){switch(typeof t){case"boolean":case"number":case"string":case"undefined":return t;case"object":return t;default:return""}}function xp(t){var a=t.type;return(t=t.nodeName)&&t.toLowerCase()==="input"&&(a==="checkbox"||a==="radio")}function Hb(t){var a=xp(t)?"checked":"value",r=Object.getOwnPropertyDescriptor(t.constructor.prototype,a),e=""+t[a];if(!t.hasOwnProperty(a)&&typeof r<"u"&&typeof r.get=="function"&&typeof r.set=="function"){var c=r.get,n=r.set;return Object.defineProperty(t,a,{configurable:!0,get:function(){return c.call(this)},set:function(l){e=""+l,n.call(this,l)}}),Object.defineProperty(t,a,{enumerable:r.enumerable}),{getValue:function(){return e},setValue:function(l){e=""+l},stopTracking:function(){t._valueTracker=null,delete t[a]}}}}function hr(t){t._valueTracker||(t._valueTracker=Hb(t))}function Hp(t){if(!t)return!1;var a=t._valueTracker;if(!a)return!0;var r=a.getValue(),e="";return t&&(e=xp(t)?t.checked?"true":"false":t.value),t=e,t!==r?(a.setValue(t),!0):!1}function Er(t){if(t=t||(typeof document<"u"?document:void 0),typeof t>"u")return null;try{return t.activeElement||t.body}catch{return t.body}}function Fo(t,a){var r=a.checked;return p2({},a,{defaultChecked:void 0,defaultValue:void 0,value:void 0,checked:r??t._wrapperState.initialChecked})}function ug(t,a){var r=a.defaultValue==null?"":a.defaultValue,e=a.checked!=null?a.checked:a.defaultChecked;r=U3(a.value!=null?a.value:r),t._wrapperState={initialChecked:e,initialValue:r,controlled:a.type==="checkbox"||a.type==="radio"?a.checked!=null:a.value!=null}}function Vp(t,a){a=a.checked,a!=null&&xi(t,"checked",a,!1)}function Oo(t,a){Vp(t,a);var r=U3(a.value),e=a.type;if(r!=null)e==="number"?(r===0&&t.value===""||t.value!=r)&&(t.value=""+r):t.value!==""+r&&(t.value=""+r);else if(e==="submit"||e==="reset"){t.removeAttribute("value");return}a.hasOwnProperty("value")?ko(t,a.type,r):a.hasOwnProperty("defaultValue")&&ko(t,a.type,U3(a.defaultValue)),a.checked==null&&a.defaultChecked!=null&&(t.defaultChecked=!!a.defaultChecked)}function sg(t,a,r){if(a.hasOwnProperty("value")||a.hasOwnProperty("defaultValue")){var e=a.type;if(!(e!=="submit"&&e!=="reset"||a.value!==void 0&&a.value!==null))return;a=""+t._wrapperState.initialValue,r||a===t.value||(t.value=a),t.defaultValue=a}r=t.name,r!==""&&(t.name=""),t.defaultChecked=!!t._wrapperState.initialChecked,r!==""&&(t.name=r)}function ko(t,a,r){(a!=="number"||Er(t.ownerDocument)!==t)&&(r==null?t.defaultValue=""+t._wrapperState.initialValue:t.defaultValue!==""+r&&(t.defaultValue=""+r))}var E7=Array.isArray;function Y8(t,a,r,e){if(t=t.options,a){a={};for(var c=0;c"+a.valueOf().toString()+"",a=vr.firstChild;t.firstChild;)t.removeChild(t.firstChild);for(;a.firstChild;)t.appendChild(a.firstChild)}});function K7(t,a){if(a){var r=t.firstChild;if(r&&r===t.lastChild&&r.nodeType===3){r.nodeValue=a;return}}t.textContent=a}var N7={animationIterationCount:!0,aspectRatio:!0,borderImageOutset:!0,borderImageSlice:!0,borderImageWidth:!0,boxFlex:!0,boxFlexGroup:!0,boxOrdinalGroup:!0,columnCount:!0,columns:!0,flex:!0,flexGrow:!0,flexPositive:!0,flexShrink:!0,flexNegative:!0,flexOrder:!0,gridArea:!0,gridRow:!0,gridRowEnd:!0,gridRowSpan:!0,gridRowStart:!0,gridColumn:!0,gridColumnEnd:!0,gridColumnSpan:!0,gridColumnStart:!0,fontWeight:!0,lineClamp:!0,lineHeight:!0,opacity:!0,order:!0,orphans:!0,tabSize:!0,widows:!0,zIndex:!0,zoom:!0,fillOpacity:!0,floodOpacity:!0,stopOpacity:!0,strokeDasharray:!0,strokeDashoffset:!0,strokeMiterlimit:!0,strokeOpacity:!0,strokeWidth:!0},Vb=["Webkit","ms","Moz","O"];Object.keys(N7).forEach(function(t){Vb.forEach(function(a){a=a+t.charAt(0).toUpperCase()+t.substring(1),N7[a]=N7[t]})});function Bp(t,a,r){return a==null||typeof a=="boolean"||a===""?"":r||typeof a!="number"||a===0||N7.hasOwnProperty(t)&&N7[t]?(""+a).trim():a+"px"}function yp(t,a){t=t.style;for(var r in a)if(a.hasOwnProperty(r)){var e=r.indexOf("--")===0,c=Bp(r,a[r],e);r==="float"&&(r="cssFloat"),e?t.setProperty(r,c):t[r]=c}}var Lb=p2({menuitem:!0},{area:!0,base:!0,br:!0,col:!0,embed:!0,hr:!0,img:!0,input:!0,keygen:!0,link:!0,meta:!0,param:!0,source:!0,track:!0,wbr:!0});function Io(t,a){if(a){if(Lb[t]&&(a.children!=null||a.dangerouslySetInnerHTML!=null))throw Error(Z(137,t));if(a.dangerouslySetInnerHTML!=null){if(a.children!=null)throw Error(Z(60));if(typeof a.dangerouslySetInnerHTML!="object"||!("__html"in a.dangerouslySetInnerHTML))throw Error(Z(61))}if(a.style!=null&&typeof a.style!="object")throw Error(Z(62))}}function Eo(t,a){if(t.indexOf("-")===-1)return typeof a.is=="string";switch(t){case"annotation-xml":case"color-profile":case"font-face":case"font-face-src":case"font-face-uri":case"font-face-format":case"font-face-name":case"missing-glyph":return!1;default:return!0}}var Po=null;function Ci(t){return t=t.target||t.srcElement||window,t.correspondingUseElement&&(t=t.correspondingUseElement),t.nodeType===3?t.parentNode:t}var To=null,J8=null,tt=null;function zg(t){if(t=g9(t)){if(typeof To!="function")throw Error(Z(280));var a=t.stateNode;a&&(a=de(a),To(t.stateNode,t.type,a))}}function Ap(t){J8?tt?tt.push(t):tt=[t]:J8=t}function Sp(){if(J8){var t=J8,a=tt;if(tt=J8=null,zg(t),a)for(t=0;t>>=0,t===0?32:31-(_b(t)/Rb|0)|0}var dr=64,ur=4194304;function P7(t){switch(t&-t){case 1:return 1;case 2:return 2;case 4:return 4;case 8:return 8;case 16:return 16;case 32:return 32;case 64:case 128:case 256:case 512:case 1024:case 2048:case 4096:case 8192:case 16384:case 32768:case 65536:case 131072:case 262144:case 524288:case 1048576:case 2097152:return t&4194240;case 4194304:case 8388608:case 16777216:case 33554432:case 67108864:return t&130023424;case 134217728:return 134217728;case 268435456:return 268435456;case 536870912:return 536870912;case 1073741824:return 1073741824;default:return t}}function Dr(t,a){var r=t.pendingLanes;if(r===0)return 0;var e=0,c=t.suspendedLanes,n=t.pingedLanes,l=r&268435455;if(l!==0){var o=l&~c;o!==0?e=P7(o):(n&=l,n!==0&&(e=P7(n)))}else l=r&~c,l!==0?e=P7(l):n!==0&&(e=P7(n));if(e===0)return 0;if(a!==0&&a!==e&&(a&c)===0&&(c=e&-e,n=a&-a,c>=n||c===16&&(n&4194240)!==0))return a;if((e&4)!==0&&(e|=r&16),a=t.entangledLanes,a!==0)for(t=t.entanglements,a&=e;0r;r++)a.push(t);return a}function u9(t,a,r){t.pendingLanes|=a,a!==536870912&&(t.suspendedLanes=0,t.pingedLanes=0),t=t.eventTimes,a=31-a5(a),t[a]=r}function Tb(t,a){var r=t.pendingLanes&~a;t.pendingLanes=a,t.suspendedLanes=0,t.pingedLanes=0,t.expiredLanes&=a,t.mutableReadLanes&=a,t.entangledLanes&=a,a=t.entanglements;var e=t.eventTimes;for(t=t.expirationTimes;0=Z7),wg=String.fromCharCode(32),Bg=!1;function Xp(t,a){switch(t){case"keyup":return sF.indexOf(a.keyCode)!==-1;case"keydown":return a.keyCode!==229;case"keypress":case"mousedown":case"focusout":return!0;default:return!1}}function Kp(t){return t=t.detail,typeof t=="object"&&"data"in t?t.data:null}var Z8=!1;function pF(t,a){switch(t){case"compositionend":return Kp(a);case"keypress":return a.which!==32?null:(Bg=!0,wg);case"textInput":return t=a.data,t===wg&&Bg?null:t;default:return null}}function zF(t,a){if(Z8)return t==="compositionend"||!Oi&&Xp(t,a)?(t=qp(),Ar=Si=_3=null,Z8=!1,t):null;switch(t){case"paste":return null;case"keypress":if(!(a.ctrlKey||a.altKey||a.metaKey)||a.ctrlKey&&a.altKey){if(a.char&&1=a)return{node:r,offset:a-t};t=e}t:{for(;r;){if(r.nextSibling){r=r.nextSibling;break t}r=r.parentNode}r=void 0}r=Sg(r)}}function tz(t,a){return t&&a?t===a?!0:t&&t.nodeType===3?!1:a&&a.nodeType===3?tz(t,a.parentNode):"contains"in t?t.contains(a):t.compareDocumentPosition?!!(t.compareDocumentPosition(a)&16):!1:!1}function az(){for(var t=window,a=Er();a instanceof t.HTMLIFrameElement;){try{var r=typeof a.contentWindow.location.href=="string"}catch{r=!1}if(r)t=a.contentWindow;else break;a=Er(t.document)}return a}function ki(t){var a=t&&t.nodeName&&t.nodeName.toLowerCase();return a&&(a==="input"&&(t.type==="text"||t.type==="search"||t.type==="tel"||t.type==="url"||t.type==="password")||a==="textarea"||t.contentEditable==="true")}function wF(t){var a=az(),r=t.focusedElem,e=t.selectionRange;if(a!==r&&r&&r.ownerDocument&&tz(r.ownerDocument.documentElement,r)){if(e!==null&&ki(r)){if(a=e.start,t=e.end,t===void 0&&(t=a),"selectionStart"in r)r.selectionStart=a,r.selectionEnd=Math.min(t,r.value.length);else if(t=(a=r.ownerDocument||document)&&a.defaultView||window,t.getSelection){t=t.getSelection();var c=r.textContent.length,n=Math.min(e.start,c);e=e.end===void 0?n:Math.min(e.end,c),!t.extend&&n>e&&(c=e,e=n,n=c),c=bg(r,n);var l=bg(r,e);c&&l&&(t.rangeCount!==1||t.anchorNode!==c.node||t.anchorOffset!==c.offset||t.focusNode!==l.node||t.focusOffset!==l.offset)&&(a=a.createRange(),a.setStart(c.node,c.offset),t.removeAllRanges(),n>e?(t.addRange(a),t.extend(l.node,l.offset)):(a.setEnd(l.node,l.offset),t.addRange(a)))}}for(a=[],t=r;t=t.parentNode;)t.nodeType===1&&a.push({element:t,left:t.scrollLeft,top:t.scrollTop});for(typeof r.focus=="function"&&r.focus(),r=0;r=document.documentMode,G8=null,Wo=null,U7=null,jo=!1;function Fg(t,a,r){var e=r.window===r?r.document:r.nodeType===9?r:r.ownerDocument;jo||G8==null||G8!==Er(e)||(e=G8,"selectionStart"in e&&ki(e)?e={start:e.selectionStart,end:e.selectionEnd}:(e=(e.ownerDocument&&e.ownerDocument.defaultView||window).getSelection(),e={anchorNode:e.anchorNode,anchorOffset:e.anchorOffset,focusNode:e.focusNode,focusOffset:e.focusOffset}),U7&&r9(U7,e)||(U7=e,e=Ur(Wo,"onSelect"),0j8||(t.current=Yo[j8],Yo[j8]=null,j8--)}function e2(t,a){j8++,Yo[j8]=t.current,t.current=a}var W3={},s0=q3(W3),P0=q3(!1),N6=W3;function nt(t,a){var r=t.type.contextTypes;if(!r)return W3;var e=t.stateNode;if(e&&e.__reactInternalMemoizedUnmaskedChildContext===a)return e.__reactInternalMemoizedMaskedChildContext;var c={},n;for(n in r)c[n]=a[n];return e&&(t=t.stateNode,t.__reactInternalMemoizedUnmaskedChildContext=a,t.__reactInternalMemoizedMaskedChildContext=c),c}function T0(t){return t=t.childContextTypes,t!=null}function jr(){n2(P0),n2(s0)}function Ng(t,a,r){if(s0.current!==W3)throw Error(Z(168));e2(s0,a),e2(P0,r)}function vz(t,a,r){var e=t.stateNode;if(a=a.childContextTypes,typeof e.getChildContext!="function")return r;e=e.getChildContext();for(var c in e)if(!(c in a))throw Error(Z(108,xb(t)||"Unknown",c));return p2({},r,e)}function qr(t){return t=(t=t.stateNode)&&t.__reactInternalMemoizedMergedChildContext||W3,N6=s0.current,e2(s0,t),e2(P0,P0.current),!0}function Dg(t,a,r){var e=t.stateNode;if(!e)throw Error(Z(169));r?(t=vz(t,a,N6),e.__reactInternalMemoizedMergedChildContext=t,n2(P0),n2(s0),e2(s0,t)):n2(P0),e2(P0,r)}var U5=null,ue=!1,fo=!1;function dz(t){U5===null?U5=[t]:U5.push(t)}function RF(t){ue=!0,dz(t)}function $3(){if(!fo&&U5!==null){fo=!0;var t=0,a=N1;try{var r=U5;for(N1=1;t>=l,c-=l,W5=1<<32-a5(a)+c|r<I?(T=k,k=null):T=k.sibling;var U=u(f,k,H[I],w);if(U===null){k===null&&(k=T);break}t&&k&&U.alternate===null&&a(f,k),m=n(U,m,I),C===null?A=U:C.sibling=U,C=U,k=T}if(I===H.length)return r(f,k),o2&&k6(f,I),A;if(k===null){for(;II?(T=k,k=null):T=k.sibling;var j=u(f,k,U.value,w);if(j===null){k===null&&(k=T);break}t&&k&&j.alternate===null&&a(f,k),m=n(j,m,I),C===null?A=j:C.sibling=j,C=j,k=T}if(U.done)return r(f,k),o2&&k6(f,I),A;if(k===null){for(;!U.done;I++,U=H.next())U=d(f,U.value,w),U!==null&&(m=n(U,m,I),C===null?A=U:C.sibling=U,C=U);return o2&&k6(f,I),A}for(k=e(f,k);!U.done;I++,U=H.next())U=s(k,f,I,U.value,w),U!==null&&(t&&U.alternate!==null&&k.delete(U.key===null?I:U.key),m=n(U,m,I),C===null?A=U:C.sibling=U,C=U);return t&&k.forEach(function(Q){return a(f,Q)}),o2&&k6(f,I),A}function L(f,m,H,w){if(typeof H=="object"&&H!==null&&H.type===D8&&H.key===null&&(H=H.props.children),typeof H=="object"&&H!==null){switch(H.$$typeof){case ir:t:{for(var A=H.key,C=m;C!==null;){if(C.key===A){if(A=H.type,A===D8){if(C.tag===7){r(f,C.sibling),m=c(C,H.props.children),m.return=f,f=m;break t}}else if(C.elementType===A||typeof A=="object"&&A!==null&&A.$$typeof===b3&&$g(A)===C.type){r(f,C.sibling),m=c(C,H.props),m.ref=O7(f,C,H),m.return=f,f=m;break t}r(f,C);break}else a(f,C);C=C.sibling}H.type===D8?(m=T6(H.props.children,f.mode,w,H.key),m.return=f,f=m):(w=Ir(H.type,H.key,H.props,null,f.mode,w),w.ref=O7(f,m,H),w.return=f,f=w)}return l(f);case N8:t:{for(C=H.key;m!==null;){if(m.key===C)if(m.tag===4&&m.stateNode.containerInfo===H.containerInfo&&m.stateNode.implementation===H.implementation){r(f,m.sibling),m=c(m,H.children||[]),m.return=f,f=m;break t}else{r(f,m);break}else a(f,m);m=m.sibling}m=wo(H,f.mode,w),m.return=f,f=m}return l(f);case b3:return C=H._init,L(f,m,C(H._payload),w)}if(E7(H))return g(f,m,H,w);if(A7(H))return p(f,m,H,w);Lr(f,H)}return typeof H=="string"&&H!==""||typeof H=="number"?(H=""+H,m!==null&&m.tag===6?(r(f,m.sibling),m=c(m,H),m.return=f,f=m):(r(f,m),m=Co(H,f.mode,w),m.return=f,f=m),l(f)):r(f,m)}return L}var ot=mz(!0),xz=mz(!1),p9={},B5=q3(p9),l9=q3(p9),o9=q3(p9);function E6(t){if(t===p9)throw Error(Z(174));return t}function Zi(t,a){switch(e2(o9,a),e2(l9,t),e2(B5,p9),t=a.nodeType,t){case 9:case 11:a=(a=a.documentElement)?a.namespaceURI:Ro(null,"");break;default:t=t===8?a.parentNode:a,a=t.namespaceURI||null,t=t.tagName,a=Ro(a,t)}n2(B5),e2(B5,a)}function it(){n2(B5),n2(l9),n2(o9)}function Hz(t){E6(o9.current);var a=E6(B5.current),r=Ro(a,t.type);a!==r&&(e2(l9,t),e2(B5,r))}function Gi(t){l9.current===t&&(n2(B5),n2(l9))}var s2=q3(0);function Jr(t){for(var a=t;a!==null;){if(a.tag===13){var r=a.memoizedState;if(r!==null&&(r=r.dehydrated,r===null||r.data==="$?"||r.data==="$!"))return a}else if(a.tag===19&&a.memoizedProps.revealOrder!==void 0){if((a.flags&128)!==0)return a}else if(a.child!==null){a.child.return=a,a=a.child;continue}if(a===t)break;for(;a.sibling===null;){if(a.return===null||a.return===t)return null;a=a.return}a.sibling.return=a.return,a=a.sibling}return null}var Mo=[];function Ui(){for(var t=0;tr?r:4,t(!0);var e=mo.transition;mo.transition={};try{t(!1),a()}finally{N1=r,mo.transition=e}}function Ez(){return A4().memoizedState}function TF(t,a,r){var e=Z3(t);if(r={lane:e,action:r,hasEagerState:!1,eagerState:null,next:null},Pz(t))Tz(a,r);else if(r=pz(t,a,r,e),r!==null){var c=C0();r5(r,t,e,c),Nz(r,a,e)}}function NF(t,a,r){var e=Z3(t),c={lane:e,action:r,hasEagerState:!1,eagerState:null,next:null};if(Pz(t))Tz(a,c);else{var n=t.alternate;if(t.lanes===0&&(n===null||n.lanes===0)&&(n=a.lastRenderedReducer,n!==null))try{var l=a.lastRenderedState,o=n(l,r);if(c.hasEagerState=!0,c.eagerState=o,e5(o,l)){var i=a.interleaved;i===null?(c.next=c,Ni(a)):(c.next=i.next,i.next=c),a.interleaved=c;return}}catch{}finally{}r=pz(t,a,c,e),r!==null&&(c=C0(),r5(r,t,e,c),Nz(r,a,e))}}function Pz(t){var a=t.alternate;return t===g2||a!==null&&a===g2}function Tz(t,a){W7=te=!0;var r=t.pending;r===null?a.next=a:(a.next=r.next,r.next=a),t.pending=a}function Nz(t,a,r){if((r&4194240)!==0){var e=a.lanes;e&=t.pendingLanes,r|=e,a.lanes=r,Bi(t,r)}}var ae={readContext:y4,useCallback:v0,useContext:v0,useEffect:v0,useImperativeHandle:v0,useInsertionEffect:v0,useLayoutEffect:v0,useMemo:v0,useReducer:v0,useRef:v0,useState:v0,useDebugValue:v0,useDeferredValue:v0,useTransition:v0,useMutableSource:v0,useSyncExternalStore:v0,useId:v0,unstable_isNewReconciler:!1},DF={readContext:y4,useCallback:function(t,a){return L5().memoizedState=[t,a===void 0?null:a],t},useContext:y4,useEffect:Kg,useImperativeHandle:function(t,a,r){return r=r!=null?r.concat([t]):null,Or(4194308,4,Oz.bind(null,a,t),r)},useLayoutEffect:function(t,a){return Or(4194308,4,t,a)},useInsertionEffect:function(t,a){return Or(4,2,t,a)},useMemo:function(t,a){var r=L5();return a=a===void 0?null:a,t=t(),r.memoizedState=[t,a],t},useReducer:function(t,a,r){var e=L5();return a=r!==void 0?r(a):a,e.memoizedState=e.baseState=a,t={pending:null,interleaved:null,lanes:0,dispatch:null,lastRenderedReducer:t,lastRenderedState:a},e.queue=t,t=t.dispatch=TF.bind(null,g2,t),[e.memoizedState,t]},useRef:function(t){var a=L5();return t={current:t},a.memoizedState=t},useState:Xg,useDebugValue:Xi,useDeferredValue:function(t){return L5().memoizedState=t},useTransition:function(){var t=Xg(!1),a=t[0];return t=PF.bind(null,t[1]),L5().memoizedState=t,[a,t]},useMutableSource:function(){},useSyncExternalStore:function(t,a,r){var e=g2,c=L5();if(o2){if(r===void 0)throw Error(Z(407));r=r()}else{if(r=a(),$2===null)throw Error(Z(349));(Z6&30)!==0||Cz(e,a,r)}c.memoizedState=r;var n={value:r,getSnapshot:a};return c.queue=n,Kg(Bz.bind(null,e,n,t),[t]),e.flags|=2048,v9(9,wz.bind(null,e,n,r,a),void 0,null),r},useId:function(){var t=L5(),a=$2.identifierPrefix;if(o2){var r=j5,e=W5;r=(e&~(1<<32-a5(e)-1)).toString(32)+r,a=":"+a+"R"+r,r=i9++,0<\/script>",t=t.removeChild(t.firstChild)):typeof e.is=="string"?t=l.createElement(r,{is:e.is}):(t=l.createElement(r),r==="select"&&(l=t,e.multiple?l.multiple=!0:e.size&&(l.size=e.size))):t=l.createElementNS(t,r),t[f5]=a,t[K7]=e,Cz(t,a,!1,!1),a.stateNode=t;t:{switch(l=Ho(r,e),r){case"dialog":e2("cancel",t),e2("close",t),c=e;break;case"iframe":case"object":case"embed":e2("load",t),c=e;break;case"video":case"audio":for(c=0;cet&&(a.flags|=128,e=!0,C7(n,!1),a.lanes=4194304)}else{if(!e)if(t=Gr(l),t!==null){if(a.flags|=128,e=!0,r=t.updateQueue,r!==null&&(a.updateQueue=r,a.flags|=4),C7(n,!0),n.tail===null&&n.tailMode==="hidden"&&!l.alternate&&!l2)return h0(a),null}else 2*y2()-n.renderingStartTime>et&&r!==1073741824&&(a.flags|=128,e=!0,C7(n,!1),a.lanes=4194304);n.isBackwards?(l.sibling=a.child,a.child=l):(r=n.last,r!==null?r.sibling=l:a.child=l,n.last=l)}return n.tail!==null?(a=n.tail,n.rendering=a,n.tail=a.sibling,n.renderingStartTime=y2(),a.sibling=null,r=u2.current,r2(u2,e?r&1|2:r&1),a):(h0(a),null);case 22:case 23:return _i(),e=a.memoizedState!==null,t!==null&&t.memoizedState!==null!==e&&(a.flags|=8192),e&&(a.mode&1)!==0?(a4&1073741824)!==0&&(h0(a),a.subtreeFlags&6&&(a.flags|=8192)):h0(a),null;case 24:return null;case 25:return null}throw Error(Z(156,a.tag))}function cF(t,a){switch(mi(a),a.tag){case 1:return E0(a.type)&&Er(),t=a.flags,t&65536?(a.flags=t&-65537|128,a):null;case 3:return at(),c2(I0),c2(d0),Ai(),t=a.flags,(t&65536)!==0&&(t&128)===0?(a.flags=t&-65537|128,a):null;case 5:return yi(a),null;case 13:if(c2(u2),t=a.memoizedState,t!==null&&t.dehydrated!==null){if(a.alternate===null)throw Error(Z(340));J8()}return t=a.flags,t&65536?(a.flags=t&-65537|128,a):null;case 19:return c2(u2),null;case 4:return at(),null;case 10:return Li(a.type._context),null;case 22:case 23:return _i(),null;case 24:return null;default:return null}}var pr=!1,v0=!1,nF=typeof WeakSet=="function"?WeakSet:Set,t1=null;function G8(t,a){var r=t.ref;if(r!==null)if(typeof r=="function")try{r(null)}catch(e){H2(t,a,e)}else r.current=null}function Xo(t,a,r){try{r()}catch(e){H2(t,a,e)}}var Rg=!1;function lF(t,a){if(Fo=Or,t=bp(),fi(t)){if("selectionStart"in t)var r={start:t.selectionStart,end:t.selectionEnd};else t:{r=(r=t.ownerDocument)&&r.defaultView||window;var e=r.getSelection&&r.getSelection();if(e&&e.rangeCount!==0){r=e.anchorNode;var c=e.anchorOffset,n=e.focusNode;e=e.focusOffset;try{r.nodeType,n.nodeType}catch{r=null;break t}var l=0,o=-1,i=-1,h=0,v=0,d=t,u=null;a:for(;;){for(var s;d!==r||c!==0&&d.nodeType!==3||(o=l+c),d!==n||e!==0&&d.nodeType!==3||(i=l+e),d.nodeType===3&&(l+=d.nodeValue.length),(s=d.firstChild)!==null;)u=d,d=s;for(;;){if(d===t)break a;if(u===r&&++h===c&&(o=l),u===n&&++v===e&&(i=l),(s=d.nextSibling)!==null)break;d=u,u=d.parentNode}d=s}r=o===-1||i===-1?null:{start:o,end:i}}else r=null}r=r||{start:0,end:0}}else r=null;for(Oo={focusedElem:t,selectionRange:r},Or=!1,t1=a;t1!==null;)if(a=t1,t=a.child,(a.subtreeFlags&1028)!==0&&t!==null)t.return=a,t1=t;else for(;t1!==null;){a=t1;try{var g=a.alternate;if((a.flags&1024)!==0)switch(a.tag){case 0:case 11:case 15:break;case 1:if(g!==null){var p=g.memoizedProps,L=g.memoizedState,f=a.stateNode,m=f.getSnapshotBeforeUpdate(a.elementType===a.type?p:j4(a.type,p),L);f.__reactInternalSnapshotBeforeUpdate=m}break;case 3:var H=a.stateNode.containerInfo;H.nodeType===1?H.textContent="":H.nodeType===9&&H.documentElement&&H.removeChild(H.documentElement);break;case 5:case 6:case 4:case 17:break;default:throw Error(Z(163))}}catch(w){H2(a,a.return,w)}if(t=a.sibling,t!==null){t.return=a.return,t1=t;break}t1=a.return}return g=Rg,Rg=!1,g}function P7(t,a,r){var e=a.updateQueue;if(e=e!==null?e.lastEffect:null,e!==null){var c=e=e.next;do{if((c.tag&t)===t){var n=c.destroy;c.destroy=void 0,n!==void 0&&Xo(a,r,n)}c=c.next}while(c!==e)}}function ne(t,a){if(a=a.updateQueue,a=a!==null?a.lastEffect:null,a!==null){var r=a=a.next;do{if((r.tag&t)===t){var e=r.create;r.destroy=e()}r=r.next}while(r!==a)}}function $o(t){var a=t.ref;if(a!==null){var r=t.stateNode;switch(t.tag){case 5:t=r;break;default:t=r}typeof a=="function"?a(t):a.current=t}}function yz(t){var a=t.alternate;a!==null&&(t.alternate=null,yz(a)),t.child=null,t.deletions=null,t.sibling=null,t.tag===5&&(a=t.stateNode,a!==null&&(delete a[f5],delete a[K7],delete a[Io],delete a[Zb],delete a[Gb])),t.stateNode=null,t.return=null,t.dependencies=null,t.memoizedProps=null,t.memoizedState=null,t.pendingProps=null,t.stateNode=null,t.updateQueue=null}function Az(t){return t.tag===5||t.tag===3||t.tag===4}function Ig(t){t:for(;;){for(;t.sibling===null;){if(t.return===null||Az(t.return))return null;t=t.return}for(t.sibling.return=t.return,t=t.sibling;t.tag!==5&&t.tag!==6&&t.tag!==18;){if(t.flags&2||t.child===null||t.tag===4)continue t;t.child.return=t,t=t.child}if(!(t.flags&2))return t.stateNode}}function Ko(t,a,r){var e=t.tag;if(e===5||e===6)t=t.stateNode,a?r.nodeType===8?r.parentNode.insertBefore(t,a):r.insertBefore(t,a):(r.nodeType===8?(a=r.parentNode,a.insertBefore(t,r)):(a=r,a.appendChild(t)),r=r._reactRootContainer,r!=null||a.onclick!==null||(a.onclick=Ir));else if(e!==4&&(t=t.child,t!==null))for(Ko(t,a,r),t=t.sibling;t!==null;)Ko(t,a,r),t=t.sibling}function Qo(t,a,r){var e=t.tag;if(e===5||e===6)t=t.stateNode,a?r.insertBefore(t,a):r.appendChild(t);else if(e!==4&&(t=t.child,t!==null))for(Qo(t,a,r),t=t.sibling;t!==null;)Qo(t,a,r),t=t.sibling}var Y2=null,q4=!1;function L3(t,a,r){for(r=r.child;r!==null;)Sz(t,a,r),r=r.sibling}function Sz(t,a,r){if(M5&&typeof M5.onCommitFiberUnmount=="function")try{M5.onCommitFiberUnmount(Qr,r)}catch{}switch(r.tag){case 5:v0||G8(r,a);case 6:var e=Y2,c=q4;Y2=null,L3(t,a,r),Y2=e,q4=c,Y2!==null&&(q4?(t=Y2,r=r.stateNode,t.nodeType===8?t.parentNode.removeChild(r):t.removeChild(r)):Y2.removeChild(r.stateNode));break;case 18:Y2!==null&&(q4?(t=Y2,r=r.stateNode,t.nodeType===8?Jl(t.parentNode,r):t.nodeType===1&&Jl(t,r),W7(t)):Jl(Y2,r.stateNode));break;case 4:e=Y2,c=q4,Y2=r.stateNode.containerInfo,q4=!0,L3(t,a,r),Y2=e,q4=c;break;case 0:case 11:case 14:case 15:if(!v0&&(e=r.updateQueue,e!==null&&(e=e.lastEffect,e!==null))){c=e=e.next;do{var n=c,l=n.destroy;n=n.tag,l!==void 0&&((n&2)!==0||(n&4)!==0)&&Xo(r,a,l),c=c.next}while(c!==e)}L3(t,a,r);break;case 1:if(!v0&&(G8(r,a),e=r.stateNode,typeof e.componentWillUnmount=="function"))try{e.props=r.memoizedProps,e.state=r.memoizedState,e.componentWillUnmount()}catch(o){H2(r,a,o)}L3(t,a,r);break;case 21:L3(t,a,r);break;case 22:r.mode&1?(v0=(e=v0)||r.memoizedState!==null,L3(t,a,r),v0=e):L3(t,a,r);break;default:L3(t,a,r)}}function Eg(t){var a=t.updateQueue;if(a!==null){t.updateQueue=null;var r=t.stateNode;r===null&&(r=t.stateNode=new nF),a.forEach(function(e){var c=pF.bind(null,t,e);r.has(e)||(r.add(e),e.then(c,c))})}}function W4(t,a){var r=a.deletions;if(r!==null)for(var e=0;ec&&(c=l),e&=~n}if(e=c,e=y2()-e,e=(120>e?120:480>e?480:1080>e?1080:1920>e?1920:3e3>e?3e3:4320>e?4320:1960*iF(e/1960))-e,10t?16:t,S3===null)var e=!1;else{if(t=S3,S3=null,Xr=0,(b1&6)!==0)throw Error(Z(331));var c=b1;for(b1|=4,t1=t.current;t1!==null;){var n=t1,l=n.child;if((t1.flags&16)!==0){var o=n.deletions;if(o!==null){for(var i=0;iy2()-Pi?k6(t,0):Ei|=r),P0(t,a)}function Pz(t,a){a===0&&((t.mode&1)===0?a=1:(a=rr,rr<<=1,(rr&130023424)===0&&(rr=4194304)));var r=V0();t=G5(t,a),t!==null&&(e9(t,a,r),P0(t,r))}function gF(t){var a=t.memoizedState,r=0;a!==null&&(r=a.retryLane),Pz(t,r)}function pF(t,a){var r=0;switch(t.tag){case 13:var e=t.stateNode,c=t.memoizedState;c!==null&&(r=c.retryLane);break;case 19:e=t.stateNode;break;default:throw Error(Z(314))}e!==null&&e.delete(a),Pz(t,r)}var Tz;Tz=function(t,a,r){if(t!==null)if(t.memoizedProps!==a.pendingProps||I0.current)R0=!0;else{if((t.lanes&r)===0&&(a.flags&128)===0)return R0=!1,rF(t,a,r);R0=(t.flags&131072)!==0}else R0=!1,l2&&(a.flags&1048576)!==0&&Np(a,_r,a.index);switch(a.lanes=0,a.tag){case 2:var e=a.type;Lr(t,a),t=a.pendingProps;var c=Y8(a,d0.current);$8(a,r),c=bi(null,a,e,t,c,r);var n=Fi();return a.flags|=1,typeof c=="object"&&c!==null&&typeof c.render=="function"&&c.$$typeof===void 0?(a.tag=1,a.memoizedState=null,a.updateQueue=null,E0(e)?(n=!0,Pr(a)):n=!1,a.memoizedState=c.state!==null&&c.state!==void 0?c.state:null,wi(a),c.updater=ee,a.stateNode=c,c._reactInternals=a,No(a,e,t,r),a=Uo(null,a,e,!0,n,r)):(a.tag=0,l2&&n&&Mi(a),H0(null,a,c,r),a=a.child),a;case 16:e=a.elementType;t:{switch(Lr(t,a),t=a.pendingProps,c=e._init,e=c(e._payload),a.type=e,c=a.tag=fF(e),t=j4(e,t),c){case 0:a=Go(null,a,e,t,r);break t;case 1:a=Fg(null,a,e,t,r);break t;case 11:a=Sg(null,a,e,t,r);break t;case 14:a=bg(null,a,e,j4(e.type,t),r);break t}throw Error(Z(306,e,""))}return a;case 0:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:j4(e,c),Go(t,a,e,c,r);case 1:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:j4(e,c),Fg(t,a,e,c,r);case 3:t:{if(Hz(a),t===null)throw Error(Z(387));e=a.pendingProps,n=a.memoizedState,c=n.element,Wp(t,a),Zr(a,e,null,r);var l=a.memoizedState;if(e=l.element,n.isDehydrated)if(n={element:e,isDehydrated:!1,cache:l.cache,pendingSuspenseBoundaries:l.pendingSuspenseBoundaries,transitions:l.transitions},a.updateQueue.baseState=n,a.memoizedState=n,a.flags&256){c=rt(Error(Z(423)),a),a=Og(t,a,e,r,c);break t}else if(e!==c){c=rt(Error(Z(424)),a),a=Og(t,a,e,r,c);break t}else for(r4=k3(a.stateNode.containerInfo.firstChild),e4=a,l2=!0,X4=null,r=$p(a,null,e,r),a.child=r;r;)r.flags=r.flags&-3|4096,r=r.sibling;else{if(J8(),e===c){a=U5(t,a,r);break t}H0(t,a,e,r)}a=a.child}return a;case 5:return Kp(a),t===null&&To(a),e=a.type,c=a.pendingProps,n=t!==null?t.memoizedProps:null,l=c.children,ko(e,c)?l=null:n!==null&&ko(e,n)&&(a.flags|=32),xz(t,a),H0(t,a,l,r),a.child;case 6:return t===null&&To(a),null;case 13:return Vz(t,a,r);case 4:return Bi(a,a.stateNode.containerInfo),e=a.pendingProps,t===null?a.child=tt(a,null,e,r):H0(t,a,e,r),a.child;case 11:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:j4(e,c),Sg(t,a,e,c,r);case 7:return H0(t,a,a.pendingProps,r),a.child;case 8:return H0(t,a,a.pendingProps.children,r),a.child;case 12:return H0(t,a,a.pendingProps.children,r),a.child;case 10:t:{if(e=a.type._context,c=a.pendingProps,n=a.memoizedProps,l=c.value,r2(Dr,e._currentValue),e._currentValue=l,n!==null)if(Q4(n.value,l)){if(n.children===c.children&&!I0.current){a=U5(t,a,r);break t}}else for(n=a.child,n!==null&&(n.return=a);n!==null;){var o=n.dependencies;if(o!==null){l=n.child;for(var i=o.firstContext;i!==null;){if(i.context===e){if(n.tag===1){i=D5(-1,r&-r),i.tag=2;var h=n.updateQueue;if(h!==null){h=h.shared;var v=h.pending;v===null?i.next=i:(i.next=v.next,v.next=i),h.pending=i}}n.lanes|=r,i=n.alternate,i!==null&&(i.lanes|=r),_o(n.return,r,a),o.lanes|=r;break}i=i.next}}else if(n.tag===10)l=n.type===a.type?null:n.child;else if(n.tag===18){if(l=n.return,l===null)throw Error(Z(341));l.lanes|=r,o=l.alternate,o!==null&&(o.lanes|=r),_o(l,r,a),l=n.sibling}else l=n.child;if(l!==null)l.return=n;else for(l=n;l!==null;){if(l===a){l=null;break}if(n=l.sibling,n!==null){n.return=l.return,l=n;break}l=l.return}n=l}H0(t,a,c.children,r),a=a.child}return a;case 9:return c=a.type,e=a.pendingProps.children,$8(a,r),c=V4(c),e=e(c),a.flags|=1,H0(t,a,e,r),a.child;case 14:return e=a.type,c=j4(e,a.pendingProps),c=j4(e.type,c),bg(t,a,e,c,r);case 15:return Mz(t,a,a.type,a.pendingProps,r);case 17:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:j4(e,c),Lr(t,a),a.tag=1,E0(e)?(t=!0,Pr(a)):t=!1,$8(a,r),qp(a,e,c),No(a,e,c,r),Uo(null,a,e,!0,t,r);case 19:return Lz(t,a,r);case 22:return mz(t,a,r)}throw Error(Z(156,a.tag))};function _z(t,a){return dp(t,a)}function zF(t,a,r,e){this.tag=t,this.key=r,this.sibling=this.child=this.return=this.stateNode=this.type=this.elementType=null,this.index=0,this.ref=null,this.pendingProps=a,this.dependencies=this.memoizedState=this.updateQueue=this.memoizedProps=null,this.mode=e,this.subtreeFlags=this.flags=0,this.deletions=null,this.childLanes=this.lanes=0,this.alternate=null}function x4(t,a,r,e){return new zF(t,a,r,e)}function Ni(t){return t=t.prototype,!(!t||!t.isReactComponent)}function fF(t){if(typeof t=="function")return Ni(t)?1:0;if(t!=null){if(t=t.$$typeof,t===li)return 11;if(t===oi)return 14}return 2}function P3(t,a){var r=t.alternate;return r===null?(r=x4(t.tag,a,t.key,t.mode),r.elementType=t.elementType,r.type=t.type,r.stateNode=t.stateNode,r.alternate=t,t.alternate=r):(r.pendingProps=a,r.type=t.type,r.flags=0,r.subtreeFlags=0,r.deletions=null),r.flags=t.flags&14680064,r.childLanes=t.childLanes,r.lanes=t.lanes,r.child=t.child,r.memoizedProps=t.memoizedProps,r.memoizedState=t.memoizedState,r.updateQueue=t.updateQueue,a=t.dependencies,r.dependencies=a===null?null:{lanes:a.lanes,firstContext:a.firstContext},r.sibling=t.sibling,r.index=t.index,r.ref=t.ref,r}function Br(t,a,r,e,c,n){var l=2;if(e=t,typeof t=="function")Ni(t)&&(l=1);else if(typeof t=="string")l=5;else t:switch(t){case R8:return R6(r.children,c,n,a);case ni:l=8,c|=8;break;case vo:return t=x4(12,r,a,c|2),t.elementType=vo,t.lanes=n,t;case uo:return t=x4(13,r,a,c),t.elementType=uo,t.lanes=n,t;case so:return t=x4(19,r,a,c),t.elementType=so,t.lanes=n,t;case Xg:return oe(r,c,n,a);default:if(typeof t=="object"&&t!==null)switch(t.$$typeof){case jg:l=10;break t;case qg:l=9;break t;case li:l=11;break t;case oi:l=14;break t;case C3:l=16,e=null;break t}throw Error(Z(130,t==null?t:typeof t,""))}return a=x4(l,r,a,c),a.elementType=t,a.type=e,a.lanes=n,a}function R6(t,a,r,e){return t=x4(7,t,e,a),t.lanes=r,t}function oe(t,a,r,e){return t=x4(22,t,e,a),t.elementType=Xg,t.lanes=r,t.stateNode={isHidden:!1},t}function oo(t,a,r){return t=x4(6,t,null,a),t.lanes=r,t}function io(t,a,r){return a=x4(4,t.children!==null?t.children:[],t.key,a),a.lanes=r,a.stateNode={containerInfo:t.containerInfo,pendingChildren:null,implementation:t.implementation},a}function MF(t,a,r,e,c){this.tag=a,this.containerInfo=t,this.finishedWork=this.pingCache=this.current=this.pendingChildren=null,this.timeoutHandle=-1,this.callbackNode=this.pendingContext=this.context=null,this.callbackPriority=0,this.eventTimes=Wl(0),this.expirationTimes=Wl(-1),this.entangledLanes=this.finishedLanes=this.mutableReadLanes=this.expiredLanes=this.pingedLanes=this.suspendedLanes=this.pendingLanes=0,this.entanglements=Wl(0),this.identifierPrefix=e,this.onRecoverableError=c,this.mutableSourceEagerHydrationData=null}function Zi(t,a,r,e,c,n,l,o,i){return t=new MF(t,a,r,o,i),a===1?(a=1,n===!0&&(a|=8)):a=0,n=x4(3,null,null,a),t.current=n,n.stateNode=t,n.memoizedState={element:e,isDehydrated:r,cache:null,transitions:null,pendingSuspenseBoundaries:null},wi(n),t}function mF(t,a,r){var e=3{"use strict";function Uz(){if(!(typeof __REACT_DEVTOOLS_GLOBAL_HOOK__>"u"||typeof __REACT_DEVTOOLS_GLOBAL_HOOK__.checkDCE!="function"))try{__REACT_DEVTOOLS_GLOBAL_HOOK__.checkDCE(Uz)}catch(t){console.error(t)}}Uz(),Wz.exports=Gz()});var qz=V1(ji=>{"use strict";var jz=Z6();ji.createRoot=jz.createRoot,ji.hydrateRoot=jz.hydrateRoot;var KG});var $z=V1(ue=>{"use strict";var CF=X(),wF=Symbol.for("react.element"),BF=Symbol.for("react.fragment"),yF=Object.prototype.hasOwnProperty,AF=CF.__SECRET_INTERNALS_DO_NOT_USE_OR_YOU_WILL_BE_FIRED.ReactCurrentOwner,SF={key:!0,ref:!0,__self:!0,__source:!0};function Xz(t,a,r){var e,c={},n=null,l=null;r!==void 0&&(n=""+r),a.key!==void 0&&(n=""+a.key),a.ref!==void 0&&(l=a.ref);for(e in a)yF.call(a,e)&&!SF.hasOwnProperty(e)&&(c[e]=a[e]);if(t&&t.defaultProps)for(e in a=t.defaultProps,a)c[e]===void 0&&(c[e]=a[e]);return{$$typeof:wF,type:t,key:n,ref:l,props:c,_owner:AF.current}}ue.Fragment=BF;ue.jsx=Xz;ue.jsxs=Xz});var b=V1((eU,Kz)=>{"use strict";Kz.exports=$z()});var af=V1((nU,tf)=>{"use strict";var FF="SECRET_DO_NOT_PASS_THIS_OR_YOU_WILL_BE_FIRED";tf.exports=FF});var nf=V1((lU,cf)=>{"use strict";var OF=af();function rf(){}function ef(){}ef.resetWarningCache=rf;cf.exports=function(){function t(e,c,n,l,o,i){if(i!==OF){var h=new Error("Calling PropTypes validators directly is not supported by the `prop-types` package. Use PropTypes.checkPropTypes() to call them. Read more at http://fb.me/use-check-prop-types");throw h.name="Invariant Violation",h}}t.isRequired=t;function a(){return t}var r={array:t,bigint:t,bool:t,func:t,number:t,object:t,string:t,symbol:t,any:t,arrayOf:a,element:t,elementType:t,instanceOf:a,node:t,objectOf:a,oneOf:a,oneOfType:a,shape:a,exact:a,checkPropTypes:ef,resetWarningCache:rf};return r.PropTypes=r,r}});var $i=V1((hU,lf)=>{lf.exports=nf()();var oU,iU});var eh=V1((CU,pe)=>{(function(){"use strict";var t=!!(typeof window<"u"&&window.document&&window.document.createElement),a={canUseDOM:t,canUseWorkers:typeof Worker<"u",canUseEventListeners:t&&!!(window.addEventListener||window.attachEvent),canUseViewport:t&&!!window.screen};typeof define=="function"&&typeof define.amd=="object"&&define.amd?define(function(){return a}):typeof pe<"u"&&pe.exports?pe.exports=a:window.ExecutionEnvironment=a})()});var pf=V1((wU,gf)=>{var JF=new Error("Element already at target scroll position"),tO=new Error("Scroll cancelled"),aO=Math.min,uf=Date.now;gf.exports={left:sf("scrollLeft"),top:sf("scrollTop")};function sf(t){return function(r,e,c,n){c=c||{},typeof c=="function"&&(n=c,c={}),typeof n!="function"&&(n=eO);var l=uf(),o=r[t],i=c.ease||rO,h=isNaN(c.duration)?350:+c.duration,v=!1;return o===e?n(JF,r[t]):requestAnimationFrame(u),d;function d(){v=!0}function u(s){if(v)return n(tO,r[t]);var g=uf(),p=aO(1,(g-l)/h),L=i(p);r[t]=L*(e-o)+o,p<1?requestAnimationFrame(u):requestAnimationFrame(function(){n(null,r[t])})}}}function rO(t){return .5*(1-Math.cos(Math.PI*t))}function eO(){}});var ff=V1((zf,ze)=>{(function(t,a){typeof define=="function"&&define.amd?define([],a):typeof ze=="object"&&ze.exports?ze.exports=a():t.Scrollparent=a()})(zf,function(){var t=/(auto|scroll)/,a=function(l,o){return l.parentNode===null?o:a(l.parentNode,o.concat([l]))},r=function(l,o){return getComputedStyle(l,null).getPropertyValue(o)},e=function(l){return r(l,"overflow")+r(l,"overflow-y")+r(l,"overflow-x")},c=function(l){return t.test(e(l))},n=function(l){if(l instanceof HTMLElement||l instanceof SVGElement){for(var o=a(l.parentNode,[]),i=0;i{"use strict";var q2=typeof Symbol=="function"&&Symbol.for,ch=q2?Symbol.for("react.element"):60103,nh=q2?Symbol.for("react.portal"):60106,fe=q2?Symbol.for("react.fragment"):60107,Me=q2?Symbol.for("react.strict_mode"):60108,me=q2?Symbol.for("react.profiler"):60114,xe=q2?Symbol.for("react.provider"):60109,He=q2?Symbol.for("react.context"):60110,lh=q2?Symbol.for("react.async_mode"):60111,Ve=q2?Symbol.for("react.concurrent_mode"):60111,Le=q2?Symbol.for("react.forward_ref"):60112,Ce=q2?Symbol.for("react.suspense"):60113,cO=q2?Symbol.for("react.suspense_list"):60120,we=q2?Symbol.for("react.memo"):60115,Be=q2?Symbol.for("react.lazy"):60116,nO=q2?Symbol.for("react.block"):60121,lO=q2?Symbol.for("react.fundamental"):60117,oO=q2?Symbol.for("react.responder"):60118,iO=q2?Symbol.for("react.scope"):60119;function o4(t){if(typeof t=="object"&&t!==null){var a=t.$$typeof;switch(a){case ch:switch(t=t.type,t){case lh:case Ve:case fe:case me:case Me:case Ce:return t;default:switch(t=t&&t.$$typeof,t){case He:case Le:case Be:case we:case xe:return t;default:return a}}case nh:return a}}}function Mf(t){return o4(t)===Ve}D1.AsyncMode=lh;D1.ConcurrentMode=Ve;D1.ContextConsumer=He;D1.ContextProvider=xe;D1.Element=ch;D1.ForwardRef=Le;D1.Fragment=fe;D1.Lazy=Be;D1.Memo=we;D1.Portal=nh;D1.Profiler=me;D1.StrictMode=Me;D1.Suspense=Ce;D1.isAsyncMode=function(t){return Mf(t)||o4(t)===lh};D1.isConcurrentMode=Mf;D1.isContextConsumer=function(t){return o4(t)===He};D1.isContextProvider=function(t){return o4(t)===xe};D1.isElement=function(t){return typeof t=="object"&&t!==null&&t.$$typeof===ch};D1.isForwardRef=function(t){return o4(t)===Le};D1.isFragment=function(t){return o4(t)===fe};D1.isLazy=function(t){return o4(t)===Be};D1.isMemo=function(t){return o4(t)===we};D1.isPortal=function(t){return o4(t)===nh};D1.isProfiler=function(t){return o4(t)===me};D1.isStrictMode=function(t){return o4(t)===Me};D1.isSuspense=function(t){return o4(t)===Ce};D1.isValidElementType=function(t){return typeof t=="string"||typeof t=="function"||t===fe||t===Ve||t===me||t===Me||t===Ce||t===cO||typeof t=="object"&&t!==null&&(t.$$typeof===Be||t.$$typeof===we||t.$$typeof===xe||t.$$typeof===He||t.$$typeof===Le||t.$$typeof===lO||t.$$typeof===oO||t.$$typeof===iO||t.$$typeof===nO)};D1.typeOf=o4});var oh=V1((yU,xf)=>{"use strict";xf.exports=mf()});var ih=V1((AU,Lf)=>{"use strict";var hO=function(a){return vO(a)&&!dO(a)};function vO(t){return!!t&&typeof t=="object"}function dO(t){var a=Object.prototype.toString.call(t);return a==="[object RegExp]"||a==="[object Date]"||gO(t)}var uO=typeof Symbol=="function"&&Symbol.for,sO=uO?Symbol.for("react.element"):60103;function gO(t){return t.$$typeof===sO}function pO(t){return Array.isArray(t)?[]:{}}function o9(t,a){return a.clone!==!1&&a.isMergeableObject(t)?ht(pO(t),t,a):t}function zO(t,a,r){return t.concat(a).map(function(e){return o9(e,r)})}function fO(t,a){if(!a.customMerge)return ht;var r=a.customMerge(t);return typeof r=="function"?r:ht}function MO(t){return Object.getOwnPropertySymbols?Object.getOwnPropertySymbols(t).filter(function(a){return t.propertyIsEnumerable(a)}):[]}function Hf(t){return Object.keys(t).concat(MO(t))}function Vf(t,a){try{return a in t}catch{return!1}}function mO(t,a){return Vf(t,a)&&!(Object.hasOwnProperty.call(t,a)&&Object.propertyIsEnumerable.call(t,a))}function xO(t,a,r){var e={};return r.isMergeableObject(t)&&Hf(t).forEach(function(c){e[c]=o9(t[c],r)}),Hf(a).forEach(function(c){mO(t,c)||(Vf(t,c)&&r.isMergeableObject(a[c])?e[c]=fO(c,r)(t[c],a[c],r):e[c]=o9(a[c],r))}),e}function ht(t,a,r){r=r||{},r.arrayMerge=r.arrayMerge||zO,r.isMergeableObject=r.isMergeableObject||hO,r.cloneUnlessOtherwiseSpecified=o9;var e=Array.isArray(a),c=Array.isArray(t),n=e===c;return n?e?r.arrayMerge(t,a,r):xO(t,a,r):o9(a,r)}ht.all=function(a,r){if(!Array.isArray(a))throw new Error("first argument should be an array");return a.reduce(function(e,c){return ht(e,c,r)},{})};var HO=ht;Lf.exports=HO});var Cf=V1(hh=>{"use strict";Object.defineProperty(hh,"__esModule",{value:!0});var VO="The typeValidator argument must be a function with the signature function(props, propName, componentName).",LO="The error message is optional, but must be a string if provided.",CO=function(a,r,e,c){return typeof a=="boolean"?a:typeof a=="function"?a(r,e,c):!!a&&!!a},wO=function(a,r){return Object.hasOwnProperty.call(a,r)},BO=function(a,r,e,c){return c?new Error(c):new Error("Required "+a[r]+" `"+r+"`"+(" was not specified in `"+e+"`."))},yO=function(a,r){if(typeof a!="function")throw new TypeError(VO);if(!!r&&typeof r!="string")throw new TypeError(LO)},AO=function(a,r,e){return yO(a,e),function(c,n,l){for(var o=arguments.length,i=Array(3{"use strict";var xt=X();function IR(t,a){return t===a&&(t!==0||1/t===1/a)||t!==t&&a!==a}var ER=typeof Object.is=="function"?Object.is:IR,PR=xt.useState,TR=xt.useEffect,_R=xt.useLayoutEffect,DR=xt.useDebugValue;function NR(t,a){var r=a(),e=PR({inst:{value:r,getSnapshot:a}}),c=e[0].inst,n=e[1];return _R(function(){c.value=r,c.getSnapshot=a,Gh(c)&&n({inst:c})},[t,r,a]),TR(function(){return Gh(c)&&n({inst:c}),t(function(){Gh(c)&&n({inst:c})})},[t]),DR(r),r}function Gh(t){var a=t.getSnapshot;t=t.value;try{var r=a();return!ER(t,r)}catch{return!0}}function ZR(t,a){return a()}var GR=typeof window>"u"||typeof window.document>"u"||typeof window.document.createElement>"u"?ZR:NR;IM.useSyncExternalStore=xt.useSyncExternalStore!==void 0?xt.useSyncExternalStore:GR});var Uh=V1((kj,PM)=>{"use strict";PM.exports=EM()});var _M=V1(TM=>{"use strict";var De=X(),UR=Uh();function WR(t,a){return t===a&&(t!==0||1/t===1/a)||t!==t&&a!==a}var jR=typeof Object.is=="function"?Object.is:WR,qR=UR.useSyncExternalStore,XR=De.useRef,$R=De.useEffect,KR=De.useMemo,QR=De.useDebugValue;TM.useSyncExternalStoreWithSelector=function(t,a,r,e,c){var n=XR(null);if(n.current===null){var l={hasValue:!1,value:null};n.current=l}else l=n.current;n=KR(function(){function i(s){if(!h){if(h=!0,v=s,s=e(s),c!==void 0&&l.hasValue){var g=l.value;if(c(g,s))return d=g}return d=s}if(g=d,jR(v,s))return g;var p=e(s);return c!==void 0&&c(g,p)?g:(v=s,d=p)}var h=!1,v,d,u=r===void 0?null:r;return[function(){return i(a())},u===null?void 0:function(){return i(u())}]},[a,r,e,c]);var o=qR(t,n[0],n[1]);return $R(function(){l.hasValue=!0,l.value=o},[o]),QR(o),o}});var NM=V1((Ij,DM)=>{"use strict";DM.exports=_M()});var rm=V1((Xj,am)=>{"use strict";var jh=oh(),tI={childContextTypes:!0,contextType:!0,contextTypes:!0,defaultProps:!0,displayName:!0,getDefaultProps:!0,getDerivedStateFromError:!0,getDerivedStateFromProps:!0,mixins:!0,propTypes:!0,type:!0},aI={name:!0,length:!0,prototype:!0,caller:!0,callee:!0,arguments:!0,arity:!0},rI={$$typeof:!0,render:!0,defaultProps:!0,displayName:!0,propTypes:!0},JM={$$typeof:!0,compare:!0,defaultProps:!0,displayName:!0,propTypes:!0,type:!0},qh={};qh[jh.ForwardRef]=rI;qh[jh.Memo]=JM;function KM(t){return jh.isMemo(t)?JM:qh[t.$$typeof]||tI}var eI=Object.defineProperty,cI=Object.getOwnPropertyNames,QM=Object.getOwnPropertySymbols,nI=Object.getOwnPropertyDescriptor,lI=Object.getPrototypeOf,YM=Object.prototype;function tm(t,a,r){if(typeof a!="string"){if(YM){var e=lI(a);e&&e!==YM&&tm(t,e,r)}var c=cI(a);QM&&(c=c.concat(QM(a)));for(var n=KM(t),l=KM(a),o=0;o{"use strict";var Xh=Symbol.for("react.element"),$h=Symbol.for("react.portal"),Ue=Symbol.for("react.fragment"),We=Symbol.for("react.strict_mode"),je=Symbol.for("react.profiler"),qe=Symbol.for("react.provider"),Xe=Symbol.for("react.context"),oI=Symbol.for("react.server_context"),$e=Symbol.for("react.forward_ref"),Ke=Symbol.for("react.suspense"),Qe=Symbol.for("react.suspense_list"),Ye=Symbol.for("react.memo"),Je=Symbol.for("react.lazy"),iI=Symbol.for("react.offscreen"),em;em=Symbol.for("react.module.reference");function B4(t){if(typeof t=="object"&&t!==null){var a=t.$$typeof;switch(a){case Xh:switch(t=t.type,t){case Ue:case je:case We:case Ke:case Qe:return t;default:switch(t=t&&t.$$typeof,t){case oI:case Xe:case $e:case Je:case Ye:case qe:return t;default:return a}}case $h:return a}}}Z1.ContextConsumer=Xe;Z1.ContextProvider=qe;Z1.Element=Xh;Z1.ForwardRef=$e;Z1.Fragment=Ue;Z1.Lazy=Je;Z1.Memo=Ye;Z1.Portal=$h;Z1.Profiler=je;Z1.StrictMode=We;Z1.Suspense=Ke;Z1.SuspenseList=Qe;Z1.isAsyncMode=function(){return!1};Z1.isConcurrentMode=function(){return!1};Z1.isContextConsumer=function(t){return B4(t)===Xe};Z1.isContextProvider=function(t){return B4(t)===qe};Z1.isElement=function(t){return typeof t=="object"&&t!==null&&t.$$typeof===Xh};Z1.isForwardRef=function(t){return B4(t)===$e};Z1.isFragment=function(t){return B4(t)===Ue};Z1.isLazy=function(t){return B4(t)===Je};Z1.isMemo=function(t){return B4(t)===Ye};Z1.isPortal=function(t){return B4(t)===$h};Z1.isProfiler=function(t){return B4(t)===je};Z1.isStrictMode=function(t){return B4(t)===We};Z1.isSuspense=function(t){return B4(t)===Ke};Z1.isSuspenseList=function(t){return B4(t)===Qe};Z1.isValidElementType=function(t){return typeof t=="string"||typeof t=="function"||t===Ue||t===je||t===We||t===Ke||t===Qe||t===iI||typeof t=="object"&&t!==null&&(t.$$typeof===Je||t.$$typeof===Ye||t.$$typeof===qe||t.$$typeof===Xe||t.$$typeof===$e||t.$$typeof===em||t.getModuleId!==void 0)};Z1.typeOf=B4});var lm=V1((Kj,nm)=>{"use strict";nm.exports=cm()});var Bc=V1((jY,HH)=>{HH.exports=function(a){return a!=null&&a.constructor!=null&&typeof a.constructor.isBuffer=="function"&&a.constructor.isBuffer(a)}});var EH=V1((vJ,IH)=>{"use strict";var yc=Object.prototype.hasOwnProperty,RH=Object.prototype.toString,AH=Object.defineProperty,SH=Object.getOwnPropertyDescriptor,bH=function(a){return typeof Array.isArray=="function"?Array.isArray(a):RH.call(a)==="[object Array]"},FH=function(a){if(!a||RH.call(a)!=="[object Object]")return!1;var r=yc.call(a,"constructor"),e=a.constructor&&a.constructor.prototype&&yc.call(a.constructor.prototype,"isPrototypeOf");if(a.constructor&&!r&&!e)return!1;var c;for(c in a);return typeof c>"u"||yc.call(a,c)},OH=function(a,r){AH&&r.name==="__proto__"?AH(a,r.name,{enumerable:!0,configurable:!0,value:r.newValue,writable:!0}):a[r.name]=r.newValue},kH=function(a,r){if(r==="__proto__")if(yc.call(a,r)){if(SH)return SH(a,r).value}else return;return a[r]};IH.exports=function t(){var a,r,e,c,n,l,o=arguments[0],i=1,h=arguments.length,v=!1;for(typeof o=="boolean"&&(v=o,o=arguments[1]||{},i=2),(o==null||typeof o!="object"&&typeof o!="function")&&(o={});i{"use strict";var _d=Symbol.for("react.element"),Dd=Symbol.for("react.portal"),Qc=Symbol.for("react.fragment"),Yc=Symbol.for("react.strict_mode"),Jc=Symbol.for("react.profiler"),tn=Symbol.for("react.provider"),an=Symbol.for("react.context"),C_=Symbol.for("react.server_context"),rn=Symbol.for("react.forward_ref"),en=Symbol.for("react.suspense"),cn=Symbol.for("react.suspense_list"),nn=Symbol.for("react.memo"),ln=Symbol.for("react.lazy"),w_=Symbol.for("react.offscreen"),uL;uL=Symbol.for("react.module.reference");function O4(t){if(typeof t=="object"&&t!==null){var a=t.$$typeof;switch(a){case _d:switch(t=t.type,t){case Qc:case Jc:case Yc:case en:case cn:return t;default:switch(t=t&&t.$$typeof,t){case C_:case an:case rn:case ln:case nn:case tn:return t;default:return a}}case Dd:return a}}}U1.ContextConsumer=an;U1.ContextProvider=tn;U1.Element=_d;U1.ForwardRef=rn;U1.Fragment=Qc;U1.Lazy=ln;U1.Memo=nn;U1.Portal=Dd;U1.Profiler=Jc;U1.StrictMode=Yc;U1.Suspense=en;U1.SuspenseList=cn;U1.isAsyncMode=function(){return!1};U1.isConcurrentMode=function(){return!1};U1.isContextConsumer=function(t){return O4(t)===an};U1.isContextProvider=function(t){return O4(t)===tn};U1.isElement=function(t){return typeof t=="object"&&t!==null&&t.$$typeof===_d};U1.isForwardRef=function(t){return O4(t)===rn};U1.isFragment=function(t){return O4(t)===Qc};U1.isLazy=function(t){return O4(t)===ln};U1.isMemo=function(t){return O4(t)===nn};U1.isPortal=function(t){return O4(t)===Dd};U1.isProfiler=function(t){return O4(t)===Jc};U1.isStrictMode=function(t){return O4(t)===Yc};U1.isSuspense=function(t){return O4(t)===en};U1.isSuspenseList=function(t){return O4(t)===cn};U1.isValidElementType=function(t){return typeof t=="string"||typeof t=="function"||t===Qc||t===Jc||t===Yc||t===en||t===cn||t===w_||typeof t=="object"&&t!==null&&(t.$$typeof===ln||t.$$typeof===nn||t.$$typeof===tn||t.$$typeof===an||t.$$typeof===rn||t.$$typeof===uL||t.getModuleId!==void 0)};U1.typeOf=O4});var pL=V1((c61,gL)=>{"use strict";gL.exports=sL()});var CL=V1((i61,LL)=>{var mL=/\/\*[^*]*\*+([^/*][^*]*\*+)*\//g,B_=/\n/g,y_=/^\s*/,A_=/^(\*?[-#/*\\\w]+(\[[0-9a-z_-]+\])?)\s*/,S_=/^:\s*/,b_=/^((?:'(?:\\'|.)*?'|"(?:\\"|.)*?"|\([^)]*?\)|[^};])+)/,F_=/^[;\s]*/,O_=/^\s+|\s+$/g,k_=` -`,xL="/",HL="*",n8="",R_="comment",I_="declaration";LL.exports=function(t,a){if(typeof t!="string")throw new TypeError("First argument must be a string");if(!t)return[];a=a||{};var r=1,e=1;function c(p){var L=p.match(B_);L&&(r+=L.length);var f=p.lastIndexOf(k_);e=~f?p.length-f:e+p.length}function n(){var p={line:r,column:e};return function(L){return L.position=new l(p),v(),L}}function l(p){this.start=p,this.end={line:r,column:e},this.source=a.source}l.prototype.content=t;var o=[];function i(p){var L=new Error(a.source+":"+r+":"+e+": "+p);if(L.reason=p,L.filename=a.source,L.line=r,L.column=e,L.source=t,a.silent)o.push(L);else throw L}function h(p){var L=p.exec(t);if(!!L){var f=L[0];return c(f),t=t.slice(f.length),L}}function v(){h(y_)}function d(p){var L;for(p=p||[];L=u();)L!==!1&&p.push(L);return p}function u(){var p=n();if(!(xL!=t.charAt(0)||HL!=t.charAt(1))){for(var L=2;n8!=t.charAt(L)&&(HL!=t.charAt(L)||xL!=t.charAt(L+1));)++L;if(L+=2,n8===t.charAt(L-1))return i("End of comment missing");var f=t.slice(2,L-2);return e+=2,c(f),t=t.slice(L),e+=2,p({type:R_,comment:f})}}function s(){var p=n(),L=h(A_);if(!!L){if(u(),!h(S_))return i("property missing ':'");var f=h(b_),m=p({type:I_,property:VL(L[0].replace(mL,n8)),value:f?VL(f[0].replace(mL,n8)):n8});return h(F_),m}}function g(){var p=[];d(p);for(var L;L=s();)L!==!1&&(p.push(L),d(p));return p}return v(),g()};function VL(t){return t?t.replace(O_,n8):n8}});var BL=V1((h61,wL)=>{var E_=CL();function P_(t,a){var r=null;if(!t||typeof t!="string")return r;for(var e,c=E_(t),n=typeof a=="function",l,o,i=0,h=c.length;i{var wD=typeof Element<"u",BD=typeof Map=="function",yD=typeof Set=="function",AD=typeof ArrayBuffer=="function"&&!!ArrayBuffer.isView;function Mn(t,a){if(t===a)return!0;if(t&&a&&typeof t=="object"&&typeof a=="object"){if(t.constructor!==a.constructor)return!1;var r,e,c;if(Array.isArray(t)){if(r=t.length,r!=a.length)return!1;for(e=r;e--!==0;)if(!Mn(t[e],a[e]))return!1;return!0}var n;if(BD&&t instanceof Map&&a instanceof Map){if(t.size!==a.size)return!1;for(n=t.entries();!(e=n.next()).done;)if(!a.has(e.value[0]))return!1;for(n=t.entries();!(e=n.next()).done;)if(!Mn(e.value[1],a.get(e.value[0])))return!1;return!0}if(yD&&t instanceof Set&&a instanceof Set){if(t.size!==a.size)return!1;for(n=t.entries();!(e=n.next()).done;)if(!a.has(e.value[0]))return!1;return!0}if(AD&&ArrayBuffer.isView(t)&&ArrayBuffer.isView(a)){if(r=t.length,r!=a.length)return!1;for(e=r;e--!==0;)if(t[e]!==a[e])return!1;return!0}if(t.constructor===RegExp)return t.source===a.source&&t.flags===a.flags;if(t.valueOf!==Object.prototype.valueOf)return t.valueOf()===a.valueOf();if(t.toString!==Object.prototype.toString)return t.toString()===a.toString();if(c=Object.keys(t),r=c.length,r!==Object.keys(a).length)return!1;for(e=r;e--!==0;)if(!Object.prototype.hasOwnProperty.call(a,c[e]))return!1;if(wD&&t instanceof Element)return!1;for(e=r;e--!==0;)if(!((c[e]==="_owner"||c[e]==="__v"||c[e]==="__o")&&t.$$typeof)&&!Mn(t[c[e]],a[c[e]]))return!1;return!0}return t!==t&&a!==a}QL.exports=function(a,r){try{return Mn(a,r)}catch(e){if((e.message||"").match(/stack|recursion/i))return console.warn("react-fast-compare cannot handle circular refs"),!1;throw e}}});var qC=V1((Mu,mu)=>{(function(t,a){typeof Mu=="object"&&typeof mu<"u"?mu.exports=a():typeof define=="function"&&define.amd?define(a):(t=t||self).Sortable=a()})(Mu,function(){"use strict";function t(z,M){var x,y=Object.keys(z);return Object.getOwnPropertySymbols&&(x=Object.getOwnPropertySymbols(z),M&&(x=x.filter(function(B){return Object.getOwnPropertyDescriptor(z,B).enumerable})),y.push.apply(y,x)),y}function a(z){for(var M=1;Mz.length)&&(M=z.length);for(var x=0,y=new Array(M);x"&&(M=M.substring(1)),z))try{if(z.matches)return z.matches(M);if(z.msMatchesSelector)return z.msMatchesSelector(M);if(z.webkitMatchesSelector)return z.webkitMatchesSelector(M)}catch{return}}function f(z,M,x,y){if(z){x=x||document;do if(M!=null&&(M[0]!==">"||z.parentNode===x)&&L(z,M)||y&&z===x)return z;while(z!==x&&(z=(B=z).host&&B!==document&&B.host.nodeType?B.host:B.parentNode))}var B;return null}var m,H=/\s+/g;function w(z,M,x){var y;z&&M&&(z.classList?z.classList[x?"add":"remove"](M):(y=(" "+z.className+" ").replace(H," ").replace(" "+M+" "," "),z.className=(y+(x?" "+M:"")).replace(H," ")))}function A(z,M,x){var y=z&&z.style;if(y){if(x===void 0)return document.defaultView&&document.defaultView.getComputedStyle?x=document.defaultView.getComputedStyle(z,""):z.currentStyle&&(x=z.currentStyle),M===void 0?x:x[M];y[M=M in y||M.indexOf("webkit")!==-1?M:"-webkit-"+M]=x+(typeof x=="string"?"":"px")}}function C(z,M){var x="";if(typeof z=="string")x=z;else do var y=A(z,"transform");while(y&&y!=="none"&&(x=y+" "+x),!M&&(z=z.parentNode));var B=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return B&&new B(x)}function k(z,M,x){if(z){var y=z.getElementsByTagName(M),B=0,O=y.length;if(x)for(;B=$.left-D&&B<=$.right+D,D=O>=$.top-D&&O<=$.bottom+D;return e1&&D?R=I:void 0}}),R);if(M){var x,y={};for(x in z)z.hasOwnProperty(x)&&(y[x]=z[x]);y.target=y.rootEl=M,y.preventDefault=void 0,y.stopPropagation=void 0,M[S]._onDragOver(y)}}var B,O,R}function WA(z){G&&G.parentNode[S]._isOutsideThisEl(z.target)}function n1(z,M){if(!z||!z.nodeType||z.nodeType!==1)throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(z));this.el=z,this.options=M=e({},M),z[S]=this;var x,y,B={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(z.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return as(z,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(O,R){O.setData("Text",R.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:n1.supportPointer!==!1&&"PointerEvent"in window&&!d,emptyInsertThreshold:5};for(x in Q2.initializePlugins(this,z,B),B)x in M||(M[x]=B[x]);for(y in rs(M),this)y.charAt(0)==="_"&&typeof this[y]=="function"&&(this[y]=this[y].bind(this));this.nativeDraggable=!M.forceFallback&&UA,this.nativeDraggable&&(this.options.touchStartThreshold=1),M.supportPointer?g(z,"pointerdown",this._onTapStart):(g(z,"mousedown",this._onTapStart),g(z,"touchstart",this._onTapStart)),this.nativeDraggable&&(g(z,"dragover",this),g(z,"dragenter",this)),J1.push(this.el),M.store&&M.store.get&&this.sort(M.store.get(this)||[]),e(this,g4())}function Ea(z,M,x,y,B,O,R,I){var D,$,e1=z[S],z1=e1.options.onMove;return!window.CustomEvent||i||h?(D=document.createEvent("Event")).initEvent("move",!0,!0):D=new CustomEvent("move",{bubbles:!0,cancelable:!0}),D.to=M,D.from=z,D.dragged=x,D.draggedRect=y,D.related=B||M,D.relatedRect=O||_(M),D.willInsertAfter=I,D.originalEvent=R,z.dispatchEvent(D),$=z1?z1.call(e1,D,R):$}function pl(z){z.draggable=!1}function jA(){gl=!1}function Pa(z){return setTimeout(z,0)}function zl(z){return clearTimeout(z)}n1.prototype={constructor:n1,_isOutsideThisEl:function(z){this.el.contains(z)||z===this.el||(P2=null)},_getDirection:function(z,M){return typeof this.options.direction=="function"?this.options.direction.call(this,z,M,G):this.options.direction},_onTapStart:function(z){if(z.cancelable){var M=this,x=this.el,y=this.options,B=y.preventOnFilter,O=z.type,R=z.touches&&z.touches[0]||z.pointerType&&z.pointerType==="touch"&&z,I=(R||z).target,D=z.target.shadowRoot&&(z.path&&z.path[0]||z.composedPath&&z.composedPath()[0])||I,$=y.filter;if(function(e1){ka.length=0;for(var z1=e1.getElementsByTagName("input"),T1=z1.length;T1--;){var s1=z1[T1];s1.checked&&ka.push(s1)}}(x),!G&&!(/mousedown|pointerdown/.test(O)&&z.button!==0||y.disabled)&&!D.isContentEditable&&(this.nativeDraggable||!d||!I||I.tagName.toUpperCase()!=="SELECT")&&!((I=f(I,y.draggable,x,!1))&&I.animated||A5===I)){if(D4=T(I),$0=T(I,y.draggable),typeof $=="function"){if($.call(this,z,I,this))return Q1({sortable:M,rootEl:D,name:"filter",targetEl:I,toEl:x,fromEl:x}),p1("filter",M,{evt:z}),void(B&&z.cancelable&&z.preventDefault())}else if($=$&&$.split(",").some(function(e1){if(e1=f(D,e1.trim(),x,!1))return Q1({sortable:M,rootEl:e1,name:"filter",targetEl:I,fromEl:x,toEl:x}),p1("filter",M,{evt:z}),!0}))return void(B&&z.cancelable&&z.preventDefault());y.handle&&!f(D,y.handle,x,!1)||this._prepareDragStart(z,R,I)}}},_prepareDragStart:function(z,M,x){var y,B=this,O=B.el,R=B.options,I=O.ownerDocument;x&&!G&&x.parentNode===O&&(y=_(x),j1=O,O1=(G=x).parentNode,_4=G.nextSibling,A5=x,S5=R.group,p4={target:n1.dragged=G,clientX:(M||z).clientX,clientY:(M||z).clientY},q=p4.clientX-y.left,i1=p4.clientY-y.top,this._lastX=(M||z).clientX,this._lastY=(M||z).clientY,G.style["will-change"]="all",y=function(){p1("delayEnded",B,{evt:z}),n1.eventCanceled?B._onDrop():(B._disableDelayedDragEvents(),!v&&B.nativeDraggable&&(G.draggable=!0),B._triggerDragStart(z,M),Q1({sortable:B,name:"choose",originalEvent:z}),w(G,R.chosenClass,!0))},R.ignore.split(",").forEach(function(D){k(G,D.trim(),pl)}),g(I,"dragover",w6),g(I,"mousemove",w6),g(I,"touchmove",w6),g(I,"mouseup",B._onDrop),g(I,"touchend",B._onDrop),g(I,"touchcancel",B._onDrop),v&&this.nativeDraggable&&(this.options.touchStartThreshold=4,G.draggable=!0),p1("delayStart",this,{evt:z}),!R.delay||R.delayOnTouchOnly&&!M||this.nativeDraggable&&(h||i)?y():n1.eventCanceled?this._onDrop():(g(I,"mouseup",B._disableDelayedDrag),g(I,"touchend",B._disableDelayedDrag),g(I,"touchcancel",B._disableDelayedDrag),g(I,"mousemove",B._delayedDragTouchMoveHandler),g(I,"touchmove",B._delayedDragTouchMoveHandler),R.supportPointer&&g(I,"pointermove",B._delayedDragTouchMoveHandler),B._dragStartTimer=setTimeout(y,R.delay)))},_delayedDragTouchMoveHandler:function(z){z=z.touches?z.touches[0]:z,Math.max(Math.abs(z.clientX-this._lastX),Math.abs(z.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){G&&pl(G),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var z=this.el.ownerDocument;p(z,"mouseup",this._disableDelayedDrag),p(z,"touchend",this._disableDelayedDrag),p(z,"touchcancel",this._disableDelayedDrag),p(z,"mousemove",this._delayedDragTouchMoveHandler),p(z,"touchmove",this._delayedDragTouchMoveHandler),p(z,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(z,M){M=M||z.pointerType=="touch"&&z,!this.nativeDraggable||M?this.options.supportPointer?g(document,"pointermove",this._onTouchMove):g(document,M?"touchmove":"mousemove",this._onTouchMove):(g(G,"dragend",this),g(j1,"dragstart",this._onDragStart));try{document.selection?Pa(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch{}},_dragStarted:function(z,M){var x;K0=!1,j1&&G?(p1("dragStarted",this,{evt:M}),this.nativeDraggable&&g(document,"dragover",WA),x=this.options,z||w(G,x.dragClass,!1),w(G,x.ghostClass,!0),n1.active=this,z&&this._appendGhost(),Q1({sortable:this,name:"start",originalEvent:M})):this._nulling()},_emulateDragOver:function(){if(l0){this._lastX=l0.clientX,this._lastY=l0.clientY,es();for(var z=document.elementFromPoint(l0.clientX,l0.clientY),M=z;z&&z.shadowRoot&&(z=z.shadowRoot.elementFromPoint(l0.clientX,l0.clientY))!==M;)M=z;if(G.parentNode[S]._isOutsideThisEl(z),M)do if(M[S]&&M[S]._onDragOver({clientX:l0.clientX,clientY:l0.clientY,target:z,rootEl:M})&&!this.options.dragoverBubble)break;while(M=(z=M).parentNode);cs()}},_onTouchMove:function(z){if(p4){var O=this.options,M=O.fallbackTolerance,x=O.fallbackOffset,y=z.touches?z.touches[0]:z,B=o1&&C(o1,!0),R=o1&&B&&B.a,I=o1&&B&&B.d,O=Ia&&A1&&c1(A1),R=(y.clientX-p4.clientX+x.x)/(R||1)+(O?O[0]-sl[0]:0)/(R||1),I=(y.clientY-p4.clientY+x.y)/(I||1)+(O?O[1]-sl[1]:0)/(I||1);if(!n1.active&&!K0){if(M&&Math.max(Math.abs(y.clientX-this._lastX),Math.abs(y.clientY-this._lastY))n2.right+10||B2.clientX<=n2.right&&B2.clientY>n2.bottom&&B2.clientX>=n2.left:B2.clientX>n2.right&&B2.clientY>n2.top||B2.clientX<=n2.right&&B2.clientY>n2.bottom+10}(z,y,this)&&!f1.animated){if(f1===G)return t4(!1);if((R=f1&&O===z.target?f1:R)&&(J0=_(R)),Ea(j1,O,G,M,R,J0,z,!!R)!==!1)return k5(),f1&&f1.nextSibling?O.insertBefore(G,f1.nextSibling):O.appendChild(G),O1=O,B6(),t4(!0)}else if(f1&&function(B2,s7,n2){return n2=_(j(n2.el,0,n2.options,!0)),s7?B2.clientX{(function(){"use strict";var t={}.hasOwnProperty;function a(){for(var r=[],e=0;e{"use strict";var vN=!0,xu="Invariant failed";function dN(t,a){if(!t){if(vN)throw new Error(xu);var r=typeof a=="function"?a():a,e=r?xu+": "+r:xu;throw new Error(e)}}$C.exports=dN});var ew=V1((Cr1,Z0)=>{var uN=qC(),sN=XC(),xa=X(),QC=KC();function bn(t){return t&&t.__esModule?t.default:t}function E4(t,a,r,e){Object.defineProperty(t,a,{get:r,set:e,enumerable:!0,configurable:!0})}function gN(t,a){return Object.keys(a).forEach(function(r){r==="default"||r==="__esModule"||t.hasOwnProperty(r)||Object.defineProperty(t,r,{enumerable:!0,get:function(){return a[r]}})}),t}E4(Z0.exports,"Sortable",()=>$882b6d93070905b3$re_export$Sortable);E4(Z0.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction);E4(Z0.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect);E4(Z0.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions);E4(Z0.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent);E4(Z0.exports,"Options",()=>$882b6d93070905b3$re_export$Options);E4(Z0.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult);E4(Z0.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult);E4(Z0.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent);E4(Z0.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions);E4(Z0.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils);E4(Z0.exports,"ReactSortable",()=>Fn);function JC(t){t.parentElement!==null&&t.parentElement.removeChild(t)}function pN(t,a,r){let e=t.children[r]||null;t.insertBefore(a,e)}function Hu(t){t.forEach(a=>JC(a.element))}function YC(t){t.forEach(a=>{pN(a.parentElement,a.element,a.oldIndex)})}function Vu(t,a){let r=rw(t),e={parentElement:t.from},c=[];switch(r){case"normal":c=[{element:t.item,newIndex:t.newIndex,oldIndex:t.oldIndex,parentElement:t.from}];break;case"swap":let o={element:t.item,oldIndex:t.oldIndex,newIndex:t.newIndex,...e},i={element:t.swapItem,oldIndex:t.newIndex,newIndex:t.oldIndex,...e};c=[o,i];break;case"multidrag":c=t.oldIndicies.map((h,v)=>({element:h.multiDragElement,oldIndex:h.index,newIndex:t.newIndicies[v].index,...e}));break}return fN(c,a)}function zN(t,a){let r=tw(t,a);return aw(t,r)}function tw(t,a){let r=[...a];return t.concat().reverse().forEach(e=>r.splice(e.oldIndex,1)),r}function aw(t,a,r,e){let c=[...a];return t.forEach(n=>{let l=e&&r&&e(n.item,r);c.splice(n.newIndex,0,l||n.item)}),c}function rw(t){return t.oldIndicies&&t.oldIndicies.length>0?"multidrag":t.swapItem?"swap":"normal"}function fN(t,a){return t.map(e=>({...e,item:a[e.oldIndex]})).sort((e,c)=>e.oldIndex-c.oldIndex)}function MN(t){let{list:a,setList:r,children:e,tag:c,style:n,className:l,clone:o,onAdd:i,onChange:h,onChoose:v,onClone:d,onEnd:u,onFilter:s,onRemove:g,onSort:p,onStart:L,onUnchoose:f,onUpdate:m,onMove:H,onSpill:w,onSelect:A,onDeselect:C,...k}=t;return k}var d4={dragging:null},Fn=class extends xa.Component{constructor(a){super(a),this.ref=(0,xa.createRef)();let r=[...a.list].map(e=>Object.assign(e,{chosen:!1,selected:!1}));a.setList(r,this.sortable,d4),bn(QC)(!a.plugins,` +`+n.stack}return{value:t,source:a,stack:c,digest:null}}function Vo(t,a,r){return{value:t,source:null,stack:r??null,digest:a??null}}function ci(t,a){try{console.error(a.value)}catch(r){setTimeout(function(){throw r})}}var UF=typeof WeakMap=="function"?WeakMap:Map;function Dz(t,a,r){r=q5(-1,r),r.tag=3,r.payload={element:null};var e=a.value;return r.callback=function(){ee||(ee=!0,gi=e),ci(t,a)},r}function Zz(t,a,r){r=q5(-1,r),r.tag=3;var e=t.type.getDerivedStateFromError;if(typeof e=="function"){var c=a.value;r.payload=function(){return e(c)},r.callback=function(){ci(t,a)}}var n=t.stateNode;return n!==null&&typeof n.componentDidCatch=="function"&&(r.callback=function(){ci(t,a),typeof e!="function"&&(D3===null?D3=new Set([this]):D3.add(this));var l=a.stack;this.componentDidCatch(a.value,{componentStack:l!==null?l:""})}),r}function Qg(t,a,r){var e=t.pingCache;if(e===null){e=t.pingCache=new UF;var c=new Set;e.set(a,c)}else c=e.get(a),c===void 0&&(c=new Set,e.set(a,c));c.has(r)||(c.add(r),t=cO.bind(null,t,a,r),a.then(t,t))}function Yg(t){do{var a;if((a=t.tag===13)&&(a=t.memoizedState,a=a!==null?a.dehydrated!==null:!0),a)return t;t=t.return}while(t!==null);return null}function Jg(t,a,r,e,c){return(t.mode&1)===0?(t===a?t.flags|=65536:(t.flags|=128,r.flags|=131072,r.flags&=-52805,r.tag===1&&(r.alternate===null?r.tag=17:(a=q5(-1,1),a.tag=2,N3(r,a,1))),r.lanes|=1),t):(t.flags|=65536,t.lanes=c,t)}var WF=Y5.ReactCurrentOwner,E0=!1;function L0(t,a,r,e){a.child=t===null?xz(a,null,r,e):ot(a,t.child,r,e)}function tp(t,a,r,e,c){r=r.render;var n=a.ref;return rt(a,c),e=ji(t,a,r,e,n,c),r=qi(),t!==null&&!E0?(a.updateQueue=t.updateQueue,a.flags&=-2053,t.lanes&=~c,Q5(t,a,c)):(o2&&r&&_i(a),a.flags|=1,L0(t,a,e,c),a.child)}function ap(t,a,r,e,c){if(t===null){var n=r.type;return typeof n=="function"&&!eh(n)&&n.defaultProps===void 0&&r.compare===null&&r.defaultProps===void 0?(a.tag=15,a.type=n,Gz(t,a,n,e,c)):(t=Ir(r.type,null,e,a,a.mode,c),t.ref=a.ref,t.return=a,a.child=t)}if(n=t.child,(t.lanes&c)===0){var l=n.memoizedProps;if(r=r.compare,r=r!==null?r:r9,r(l,e)&&t.ref===a.ref)return Q5(t,a,c)}return a.flags|=1,t=G3(n,e),t.ref=a.ref,t.return=a,a.child=t}function Gz(t,a,r,e,c){if(t!==null){var n=t.memoizedProps;if(r9(n,e)&&t.ref===a.ref)if(E0=!1,a.pendingProps=e=n,(t.lanes&c)!==0)(t.flags&131072)!==0&&(E0=!0);else return a.lanes=t.lanes,Q5(t,a,c)}return ni(t,a,r,e,c)}function Uz(t,a,r){var e=a.pendingProps,c=e.children,n=t!==null?t.memoizedState:null;if(e.mode==="hidden")if((a.mode&1)===0)a.memoizedState={baseLanes:0,cachePool:null,transitions:null},e2(Q8,n4),n4|=r;else{if((r&1073741824)===0)return t=n!==null?n.baseLanes|r:r,a.lanes=a.childLanes=1073741824,a.memoizedState={baseLanes:t,cachePool:null,transitions:null},a.updateQueue=null,e2(Q8,n4),n4|=t,null;a.memoizedState={baseLanes:0,cachePool:null,transitions:null},e=n!==null?n.baseLanes:r,e2(Q8,n4),n4|=e}else n!==null?(e=n.baseLanes|r,a.memoizedState=null):e=r,e2(Q8,n4),n4|=e;return L0(t,a,c,r),a.child}function Wz(t,a){var r=a.ref;(t===null&&r!==null||t!==null&&t.ref!==r)&&(a.flags|=512,a.flags|=2097152)}function ni(t,a,r,e,c){var n=T0(r)?N6:s0.current;return n=nt(a,n),rt(a,c),r=ji(t,a,r,e,n,c),e=qi(),t!==null&&!E0?(a.updateQueue=t.updateQueue,a.flags&=-2053,t.lanes&=~c,Q5(t,a,c)):(o2&&e&&_i(a),a.flags|=1,L0(t,a,r,c),a.child)}function rp(t,a,r,e,c){if(T0(r)){var n=!0;qr(a)}else n=!1;if(rt(a,c),a.stateNode===null)kr(t,a),Mz(a,r,e),ei(a,r,e,c),e=!0;else if(t===null){var l=a.stateNode,o=a.memoizedProps;l.props=o;var i=l.context,h=r.contextType;typeof h=="object"&&h!==null?h=y4(h):(h=T0(r)?N6:s0.current,h=nt(a,h));var v=r.getDerivedStateFromProps,d=typeof v=="function"||typeof l.getSnapshotBeforeUpdate=="function";d||typeof l.UNSAFE_componentWillReceiveProps!="function"&&typeof l.componentWillReceiveProps!="function"||(o!==e||i!==h)&&qg(a,l,e,h),F3=!1;var u=a.memoizedState;l.state=u,Yr(a,e,l,c),i=a.memoizedState,o!==e||u!==i||P0.current||F3?(typeof v=="function"&&(ri(a,r,v,e),i=a.memoizedState),(o=F3||jg(a,r,o,e,u,i,h))?(d||typeof l.UNSAFE_componentWillMount!="function"&&typeof l.componentWillMount!="function"||(typeof l.componentWillMount=="function"&&l.componentWillMount(),typeof l.UNSAFE_componentWillMount=="function"&&l.UNSAFE_componentWillMount()),typeof l.componentDidMount=="function"&&(a.flags|=4194308)):(typeof l.componentDidMount=="function"&&(a.flags|=4194308),a.memoizedProps=e,a.memoizedState=i),l.props=e,l.state=i,l.context=h,e=o):(typeof l.componentDidMount=="function"&&(a.flags|=4194308),e=!1)}else{l=a.stateNode,zz(t,a),o=a.memoizedProps,h=a.type===a.elementType?o:Y4(a.type,o),l.props=h,d=a.pendingProps,u=l.context,i=r.contextType,typeof i=="object"&&i!==null?i=y4(i):(i=T0(r)?N6:s0.current,i=nt(a,i));var s=r.getDerivedStateFromProps;(v=typeof s=="function"||typeof l.getSnapshotBeforeUpdate=="function")||typeof l.UNSAFE_componentWillReceiveProps!="function"&&typeof l.componentWillReceiveProps!="function"||(o!==d||u!==i)&&qg(a,l,e,i),F3=!1,u=a.memoizedState,l.state=u,Yr(a,e,l,c);var g=a.memoizedState;o!==d||u!==g||P0.current||F3?(typeof s=="function"&&(ri(a,r,s,e),g=a.memoizedState),(h=F3||jg(a,r,h,e,u,g,i)||!1)?(v||typeof l.UNSAFE_componentWillUpdate!="function"&&typeof l.componentWillUpdate!="function"||(typeof l.componentWillUpdate=="function"&&l.componentWillUpdate(e,g,i),typeof l.UNSAFE_componentWillUpdate=="function"&&l.UNSAFE_componentWillUpdate(e,g,i)),typeof l.componentDidUpdate=="function"&&(a.flags|=4),typeof l.getSnapshotBeforeUpdate=="function"&&(a.flags|=1024)):(typeof l.componentDidUpdate!="function"||o===t.memoizedProps&&u===t.memoizedState||(a.flags|=4),typeof l.getSnapshotBeforeUpdate!="function"||o===t.memoizedProps&&u===t.memoizedState||(a.flags|=1024),a.memoizedProps=e,a.memoizedState=g),l.props=e,l.state=g,l.context=i,e=h):(typeof l.componentDidUpdate!="function"||o===t.memoizedProps&&u===t.memoizedState||(a.flags|=4),typeof l.getSnapshotBeforeUpdate!="function"||o===t.memoizedProps&&u===t.memoizedState||(a.flags|=1024),e=!1)}return li(t,a,r,e,n,c)}function li(t,a,r,e,c,n){Wz(t,a);var l=(a.flags&128)!==0;if(!e&&!l)return c&&Dg(a,r,!1),Q5(t,a,n);e=a.stateNode,WF.current=a;var o=l&&typeof r.getDerivedStateFromError!="function"?null:e.render();return a.flags|=1,t!==null&&l?(a.child=ot(a,t.child,null,n),a.child=ot(a,null,o,n)):L0(t,a,o,n),a.memoizedState=e.state,c&&Dg(a,r,!0),a.child}function jz(t){var a=t.stateNode;a.pendingContext?Ng(t,a.pendingContext,a.pendingContext!==a.context):a.context&&Ng(t,a.context,!1),Zi(t,a.containerInfo)}function ep(t,a,r,e,c){return lt(),Ii(c),a.flags|=256,L0(t,a,r,e),a.child}var oi={dehydrated:null,treeContext:null,retryLane:0};function ii(t){return{baseLanes:t,cachePool:null,transitions:null}}function qz(t,a,r){var e=a.pendingProps,c=s2.current,n=!1,l=(a.flags&128)!==0,o;if((o=l)||(o=t!==null&&t.memoizedState===null?!1:(c&2)!==0),o?(n=!0,a.flags&=-129):(t===null||t.memoizedState!==null)&&(c|=1),e2(s2,c&1),t===null)return ti(a),t=a.memoizedState,t!==null&&(t=t.dehydrated,t!==null)?((a.mode&1)===0?a.lanes=1:t.data==="$!"?a.lanes=8:a.lanes=1073741824,null):(l=e.children,t=e.fallback,n?(e=a.mode,n=a.child,l={mode:"hidden",children:l},(e&1)===0&&n!==null?(n.childLanes=0,n.pendingProps=l):n=fe(l,e,0,null),t=T6(t,e,r,null),n.return=a,t.return=a,n.sibling=t,a.child=n,a.child.memoizedState=ii(r),a.memoizedState=oi,t):Ki(a,l));if(c=t.memoizedState,c!==null&&(o=c.dehydrated,o!==null))return jF(t,a,l,e,o,c,r);if(n){n=e.fallback,l=a.mode,c=t.child,o=c.sibling;var i={mode:"hidden",children:e.children};return(l&1)===0&&a.child!==c?(e=a.child,e.childLanes=0,e.pendingProps=i,a.deletions=null):(e=G3(c,i),e.subtreeFlags=c.subtreeFlags&14680064),o!==null?n=G3(o,n):(n=T6(n,l,r,null),n.flags|=2),n.return=a,e.return=a,e.sibling=n,a.child=e,e=n,n=a.child,l=t.child.memoizedState,l=l===null?ii(r):{baseLanes:l.baseLanes|r,cachePool:null,transitions:l.transitions},n.memoizedState=l,n.childLanes=t.childLanes&~r,a.memoizedState=oi,e}return n=t.child,t=n.sibling,e=G3(n,{mode:"visible",children:e.children}),(a.mode&1)===0&&(e.lanes=r),e.return=a,e.sibling=null,t!==null&&(r=a.deletions,r===null?(a.deletions=[t],a.flags|=16):r.push(t)),a.child=e,a.memoizedState=null,e}function Ki(t,a){return a=fe({mode:"visible",children:a},t.mode,0,null),a.return=t,t.child=a}function Cr(t,a,r,e){return e!==null&&Ii(e),ot(a,t.child,null,r),t=Ki(a,a.pendingProps.children),t.flags|=2,a.memoizedState=null,t}function jF(t,a,r,e,c,n,l){if(r)return a.flags&256?(a.flags&=-257,e=Vo(Error(Z(422))),Cr(t,a,l,e)):a.memoizedState!==null?(a.child=t.child,a.flags|=128,null):(n=e.fallback,c=a.mode,e=fe({mode:"visible",children:e.children},c,0,null),n=T6(n,c,l,null),n.flags|=2,e.return=a,n.return=a,e.sibling=n,a.child=e,(a.mode&1)!==0&&ot(a,t.child,null,l),a.child.memoizedState=ii(l),a.memoizedState=oi,n);if((a.mode&1)===0)return Cr(t,a,l,null);if(c.data==="$!"){if(e=c.nextSibling&&c.nextSibling.dataset,e)var o=e.dgst;return e=o,n=Error(Z(419)),e=Vo(n,e,void 0),Cr(t,a,l,e)}if(o=(l&t.childLanes)!==0,E0||o){if(e=$2,e!==null){switch(l&-l){case 4:c=2;break;case 16:c=8;break;case 64:case 128:case 256:case 512:case 1024:case 2048:case 4096:case 8192:case 16384:case 32768:case 65536:case 131072:case 262144:case 524288:case 1048576:case 2097152:case 4194304:case 8388608:case 16777216:case 33554432:case 67108864:c=32;break;case 536870912:c=268435456;break;default:c=0}c=(c&(e.suspendedLanes|l))!==0?0:c,c!==0&&c!==n.retryLane&&(n.retryLane=c,K5(t,c),r5(e,t,c,-1))}return rh(),e=Vo(Error(Z(421))),Cr(t,a,l,e)}return c.data==="$?"?(a.flags|=128,a.child=t.child,a=nO.bind(null,t),c._reactRetry=a,null):(t=n.treeContext,l4=T3(c.nextSibling),o4=a,o2=!0,t5=null,t!==null&&(L4[C4++]=W5,L4[C4++]=j5,L4[C4++]=D6,W5=t.id,j5=t.overflow,D6=a),a=Ki(a,e.children),a.flags|=4096,a)}function cp(t,a,r){t.lanes|=a;var e=t.alternate;e!==null&&(e.lanes|=a),ai(t.return,a,r)}function Lo(t,a,r,e,c){var n=t.memoizedState;n===null?t.memoizedState={isBackwards:a,rendering:null,renderingStartTime:0,last:e,tail:r,tailMode:c}:(n.isBackwards=a,n.rendering=null,n.renderingStartTime=0,n.last=e,n.tail=r,n.tailMode=c)}function $z(t,a,r){var e=a.pendingProps,c=e.revealOrder,n=e.tail;if(L0(t,a,e.children,r),e=s2.current,(e&2)!==0)e=e&1|2,a.flags|=128;else{if(t!==null&&(t.flags&128)!==0)t:for(t=a.child;t!==null;){if(t.tag===13)t.memoizedState!==null&&cp(t,r,a);else if(t.tag===19)cp(t,r,a);else if(t.child!==null){t.child.return=t,t=t.child;continue}if(t===a)break t;for(;t.sibling===null;){if(t.return===null||t.return===a)break t;t=t.return}t.sibling.return=t.return,t=t.sibling}e&=1}if(e2(s2,e),(a.mode&1)===0)a.memoizedState=null;else switch(c){case"forwards":for(r=a.child,c=null;r!==null;)t=r.alternate,t!==null&&Jr(t)===null&&(c=r),r=r.sibling;r=c,r===null?(c=a.child,a.child=null):(c=r.sibling,r.sibling=null),Lo(a,!1,c,r,n);break;case"backwards":for(r=null,c=a.child,a.child=null;c!==null;){if(t=c.alternate,t!==null&&Jr(t)===null){a.child=c;break}t=c.sibling,c.sibling=r,r=c,c=t}Lo(a,!0,r,null,n);break;case"together":Lo(a,!1,null,null,void 0);break;default:a.memoizedState=null}return a.child}function kr(t,a){(a.mode&1)===0&&t!==null&&(t.alternate=null,a.alternate=null,a.flags|=2)}function Q5(t,a,r){if(t!==null&&(a.dependencies=t.dependencies),G6|=a.lanes,(r&a.childLanes)===0)return null;if(t!==null&&a.child!==t.child)throw Error(Z(153));if(a.child!==null){for(t=a.child,r=G3(t,t.pendingProps),a.child=r,r.return=a;t.sibling!==null;)t=t.sibling,r=r.sibling=G3(t,t.pendingProps),r.return=a;r.sibling=null}return a.child}function qF(t,a,r){switch(a.tag){case 3:jz(a),lt();break;case 5:Hz(a);break;case 1:T0(a.type)&&qr(a);break;case 4:Zi(a,a.stateNode.containerInfo);break;case 10:var e=a.type._context,c=a.memoizedProps.value;e2(Kr,e._currentValue),e._currentValue=c;break;case 13:if(e=a.memoizedState,e!==null)return e.dehydrated!==null?(e2(s2,s2.current&1),a.flags|=128,null):(r&a.child.childLanes)!==0?qz(t,a,r):(e2(s2,s2.current&1),t=Q5(t,a,r),t!==null?t.sibling:null);e2(s2,s2.current&1);break;case 19:if(e=(r&a.childLanes)!==0,(t.flags&128)!==0){if(e)return $z(t,a,r);a.flags|=128}if(c=a.memoizedState,c!==null&&(c.rendering=null,c.tail=null,c.lastEffect=null),e2(s2,s2.current),e)break;return null;case 22:case 23:return a.lanes=0,Uz(t,a,r)}return Q5(t,a,r)}var Xz,hi,Kz,Qz;Xz=function(t,a){for(var r=a.child;r!==null;){if(r.tag===5||r.tag===6)t.appendChild(r.stateNode);else if(r.tag!==4&&r.child!==null){r.child.return=r,r=r.child;continue}if(r===a)break;for(;r.sibling===null;){if(r.return===null||r.return===a)return;r=r.return}r.sibling.return=r.return,r=r.sibling}};hi=function(){};Kz=function(t,a,r,e){var c=t.memoizedProps;if(c!==e){t=a.stateNode,E6(B5.current);var n=null;switch(r){case"input":c=Fo(t,c),e=Fo(t,e),n=[];break;case"select":c=p2({},c,{value:void 0}),e=p2({},e,{value:void 0}),n=[];break;case"textarea":c=_o(t,c),e=_o(t,e),n=[];break;default:typeof c.onClick!="function"&&typeof e.onClick=="function"&&(t.onclick=Wr)}Io(r,e);var l;r=null;for(h in c)if(!e.hasOwnProperty(h)&&c.hasOwnProperty(h)&&c[h]!=null)if(h==="style"){var o=c[h];for(l in o)o.hasOwnProperty(l)&&(r||(r={}),r[l]="")}else h!=="dangerouslySetInnerHTML"&&h!=="children"&&h!=="suppressContentEditableWarning"&&h!=="suppressHydrationWarning"&&h!=="autoFocus"&&(X7.hasOwnProperty(h)?n||(n=[]):(n=n||[]).push(h,null));for(h in e){var i=e[h];if(o=c?.[h],e.hasOwnProperty(h)&&i!==o&&(i!=null||o!=null))if(h==="style")if(o){for(l in o)!o.hasOwnProperty(l)||i&&i.hasOwnProperty(l)||(r||(r={}),r[l]="");for(l in i)i.hasOwnProperty(l)&&o[l]!==i[l]&&(r||(r={}),r[l]=i[l])}else r||(n||(n=[]),n.push(h,r)),r=i;else h==="dangerouslySetInnerHTML"?(i=i?i.__html:void 0,o=o?o.__html:void 0,i!=null&&o!==i&&(n=n||[]).push(h,i)):h==="children"?typeof i!="string"&&typeof i!="number"||(n=n||[]).push(h,""+i):h!=="suppressContentEditableWarning"&&h!=="suppressHydrationWarning"&&(X7.hasOwnProperty(h)?(i!=null&&h==="onScroll"&&c2("scroll",t),n||o===i||(n=[])):(n=n||[]).push(h,i))}r&&(n=n||[]).push("style",r);var h=n;(a.updateQueue=h)&&(a.flags|=4)}};Qz=function(t,a,r,e){r!==e&&(a.flags|=4)};function k7(t,a){if(!o2)switch(t.tailMode){case"hidden":a=t.tail;for(var r=null;a!==null;)a.alternate!==null&&(r=a),a=a.sibling;r===null?t.tail=null:r.sibling=null;break;case"collapsed":r=t.tail;for(var e=null;r!==null;)r.alternate!==null&&(e=r),r=r.sibling;e===null?a||t.tail===null?t.tail=null:t.tail.sibling=null:e.sibling=null}}function d0(t){var a=t.alternate!==null&&t.alternate.child===t.child,r=0,e=0;if(a)for(var c=t.child;c!==null;)r|=c.lanes|c.childLanes,e|=c.subtreeFlags&14680064,e|=c.flags&14680064,c.return=t,c=c.sibling;else for(c=t.child;c!==null;)r|=c.lanes|c.childLanes,e|=c.subtreeFlags,e|=c.flags,c.return=t,c=c.sibling;return t.subtreeFlags|=e,t.childLanes=r,a}function $F(t,a,r){var e=a.pendingProps;switch(Ri(a),a.tag){case 2:case 16:case 15:case 0:case 11:case 7:case 8:case 12:case 9:case 14:return d0(a),null;case 1:return T0(a.type)&&jr(),d0(a),null;case 3:return e=a.stateNode,it(),n2(P0),n2(s0),Ui(),e.pendingContext&&(e.context=e.pendingContext,e.pendingContext=null),(t===null||t.child===null)&&(Vr(a)?a.flags|=4:t===null||t.memoizedState.isDehydrated&&(a.flags&256)===0||(a.flags|=1024,t5!==null&&(fi(t5),t5=null))),hi(t,a),d0(a),null;case 5:Gi(a);var c=E6(o9.current);if(r=a.type,t!==null&&a.stateNode!=null)Kz(t,a,r,e,c),t.ref!==a.ref&&(a.flags|=512,a.flags|=2097152);else{if(!e){if(a.stateNode===null)throw Error(Z(166));return d0(a),null}if(t=E6(B5.current),Vr(a)){e=a.stateNode,r=a.type;var n=a.memoizedProps;switch(e[C5]=a,e[n9]=n,t=(a.mode&1)!==0,r){case"dialog":c2("cancel",e),c2("close",e);break;case"iframe":case"object":case"embed":c2("load",e);break;case"video":case"audio":for(c=0;c<\/script>",t=t.removeChild(t.firstChild)):typeof e.is=="string"?t=l.createElement(r,{is:e.is}):(t=l.createElement(r),r==="select"&&(l=t,e.multiple?l.multiple=!0:e.size&&(l.size=e.size))):t=l.createElementNS(t,r),t[C5]=a,t[n9]=e,Xz(t,a,!1,!1),a.stateNode=t;t:{switch(l=Eo(r,e),r){case"dialog":c2("cancel",t),c2("close",t),c=e;break;case"iframe":case"object":case"embed":c2("load",t),c=e;break;case"video":case"audio":for(c=0;cvt&&(a.flags|=128,e=!0,k7(n,!1),a.lanes=4194304)}else{if(!e)if(t=Jr(l),t!==null){if(a.flags|=128,e=!0,r=t.updateQueue,r!==null&&(a.updateQueue=r,a.flags|=4),k7(n,!0),n.tail===null&&n.tailMode==="hidden"&&!l.alternate&&!o2)return d0(a),null}else 2*S2()-n.renderingStartTime>vt&&r!==1073741824&&(a.flags|=128,e=!0,k7(n,!1),a.lanes=4194304);n.isBackwards?(l.sibling=a.child,a.child=l):(r=n.last,r!==null?r.sibling=l:a.child=l,n.last=l)}return n.tail!==null?(a=n.tail,n.rendering=a,n.tail=a.sibling,n.renderingStartTime=S2(),a.sibling=null,r=s2.current,e2(s2,e?r&1|2:r&1),a):(d0(a),null);case 22:case 23:return ah(),e=a.memoizedState!==null,t!==null&&t.memoizedState!==null!==e&&(a.flags|=8192),e&&(a.mode&1)!==0?(n4&1073741824)!==0&&(d0(a),a.subtreeFlags&6&&(a.flags|=8192)):d0(a),null;case 24:return null;case 25:return null}throw Error(Z(156,a.tag))}function XF(t,a){switch(Ri(a),a.tag){case 1:return T0(a.type)&&jr(),t=a.flags,t&65536?(a.flags=t&-65537|128,a):null;case 3:return it(),n2(P0),n2(s0),Ui(),t=a.flags,(t&65536)!==0&&(t&128)===0?(a.flags=t&-65537|128,a):null;case 5:return Gi(a),null;case 13:if(n2(s2),t=a.memoizedState,t!==null&&t.dehydrated!==null){if(a.alternate===null)throw Error(Z(340));lt()}return t=a.flags,t&65536?(a.flags=t&-65537|128,a):null;case 19:return n2(s2),null;case 4:return it(),null;case 10:return Ti(a.type._context),null;case 22:case 23:return ah(),null;case 24:return null;default:return null}}var wr=!1,u0=!1,KF=typeof WeakSet=="function"?WeakSet:Set,t1=null;function K8(t,a){var r=t.ref;if(r!==null)if(typeof r=="function")try{r(null)}catch(e){V2(t,a,e)}else r.current=null}function vi(t,a,r){try{r()}catch(e){V2(t,a,e)}}var np=!1;function QF(t,a){if(qo=Zr,t=az(),ki(t)){if("selectionStart"in t)var r={start:t.selectionStart,end:t.selectionEnd};else t:{r=(r=t.ownerDocument)&&r.defaultView||window;var e=r.getSelection&&r.getSelection();if(e&&e.rangeCount!==0){r=e.anchorNode;var c=e.anchorOffset,n=e.focusNode;e=e.focusOffset;try{r.nodeType,n.nodeType}catch{r=null;break t}var l=0,o=-1,i=-1,h=0,v=0,d=t,u=null;a:for(;;){for(var s;d!==r||c!==0&&d.nodeType!==3||(o=l+c),d!==n||e!==0&&d.nodeType!==3||(i=l+e),d.nodeType===3&&(l+=d.nodeValue.length),(s=d.firstChild)!==null;)u=d,d=s;for(;;){if(d===t)break a;if(u===r&&++h===c&&(o=l),u===n&&++v===e&&(i=l),(s=d.nextSibling)!==null)break;d=u,u=d.parentNode}d=s}r=o===-1||i===-1?null:{start:o,end:i}}else r=null}r=r||{start:0,end:0}}else r=null;for($o={focusedElem:t,selectionRange:r},Zr=!1,t1=a;t1!==null;)if(a=t1,t=a.child,(a.subtreeFlags&1028)!==0&&t!==null)t.return=a,t1=t;else for(;t1!==null;){a=t1;try{var g=a.alternate;if((a.flags&1024)!==0)switch(a.tag){case 0:case 11:case 15:break;case 1:if(g!==null){var p=g.memoizedProps,L=g.memoizedState,f=a.stateNode,m=f.getSnapshotBeforeUpdate(a.elementType===a.type?p:Y4(a.type,p),L);f.__reactInternalSnapshotBeforeUpdate=m}break;case 3:var H=a.stateNode.containerInfo;H.nodeType===1?H.textContent="":H.nodeType===9&&H.documentElement&&H.removeChild(H.documentElement);break;case 5:case 6:case 4:case 17:break;default:throw Error(Z(163))}}catch(w){V2(a,a.return,w)}if(t=a.sibling,t!==null){t.return=a.return,t1=t;break}t1=a.return}return g=np,np=!1,g}function j7(t,a,r){var e=a.updateQueue;if(e=e!==null?e.lastEffect:null,e!==null){var c=e=e.next;do{if((c.tag&t)===t){var n=c.destroy;c.destroy=void 0,n!==void 0&&vi(a,r,n)}c=c.next}while(c!==e)}}function pe(t,a){if(a=a.updateQueue,a=a!==null?a.lastEffect:null,a!==null){var r=a=a.next;do{if((r.tag&t)===t){var e=r.create;r.destroy=e()}r=r.next}while(r!==a)}}function di(t){var a=t.ref;if(a!==null){var r=t.stateNode;switch(t.tag){case 5:t=r;break;default:t=r}typeof a=="function"?a(t):a.current=t}}function Yz(t){var a=t.alternate;a!==null&&(t.alternate=null,Yz(a)),t.child=null,t.deletions=null,t.sibling=null,t.tag===5&&(a=t.stateNode,a!==null&&(delete a[C5],delete a[n9],delete a[Qo],delete a[kF],delete a[_F])),t.stateNode=null,t.return=null,t.dependencies=null,t.memoizedProps=null,t.memoizedState=null,t.pendingProps=null,t.stateNode=null,t.updateQueue=null}function Jz(t){return t.tag===5||t.tag===3||t.tag===4}function lp(t){t:for(;;){for(;t.sibling===null;){if(t.return===null||Jz(t.return))return null;t=t.return}for(t.sibling.return=t.return,t=t.sibling;t.tag!==5&&t.tag!==6&&t.tag!==18;){if(t.flags&2||t.child===null||t.tag===4)continue t;t.child.return=t,t=t.child}if(!(t.flags&2))return t.stateNode}}function ui(t,a,r){var e=t.tag;if(e===5||e===6)t=t.stateNode,a?r.nodeType===8?r.parentNode.insertBefore(t,a):r.insertBefore(t,a):(r.nodeType===8?(a=r.parentNode,a.insertBefore(t,r)):(a=r,a.appendChild(t)),r=r._reactRootContainer,r!=null||a.onclick!==null||(a.onclick=Wr));else if(e!==4&&(t=t.child,t!==null))for(ui(t,a,r),t=t.sibling;t!==null;)ui(t,a,r),t=t.sibling}function si(t,a,r){var e=t.tag;if(e===5||e===6)t=t.stateNode,a?r.insertBefore(t,a):r.appendChild(t);else if(e!==4&&(t=t.child,t!==null))for(si(t,a,r),t=t.sibling;t!==null;)si(t,a,r),t=t.sibling}var t0=null,J4=!1;function S3(t,a,r){for(r=r.child;r!==null;)tf(t,a,r),r=r.sibling}function tf(t,a,r){if(w5&&typeof w5.onCommitFiberUnmount=="function")try{w5.onCommitFiberUnmount(oe,r)}catch{}switch(r.tag){case 5:u0||K8(r,a);case 6:var e=t0,c=J4;t0=null,S3(t,a,r),t0=e,J4=c,t0!==null&&(J4?(t=t0,r=r.stateNode,t.nodeType===8?t.parentNode.removeChild(r):t.removeChild(r)):t0.removeChild(r.stateNode));break;case 18:t0!==null&&(J4?(t=t0,r=r.stateNode,t.nodeType===8?zo(t.parentNode,r):t.nodeType===1&&zo(t,r),t9(t)):zo(t0,r.stateNode));break;case 4:e=t0,c=J4,t0=r.stateNode.containerInfo,J4=!0,S3(t,a,r),t0=e,J4=c;break;case 0:case 11:case 14:case 15:if(!u0&&(e=r.updateQueue,e!==null&&(e=e.lastEffect,e!==null))){c=e=e.next;do{var n=c,l=n.destroy;n=n.tag,l!==void 0&&((n&2)!==0||(n&4)!==0)&&vi(r,a,l),c=c.next}while(c!==e)}S3(t,a,r);break;case 1:if(!u0&&(K8(r,a),e=r.stateNode,typeof e.componentWillUnmount=="function"))try{e.props=r.memoizedProps,e.state=r.memoizedState,e.componentWillUnmount()}catch(o){V2(r,a,o)}S3(t,a,r);break;case 21:S3(t,a,r);break;case 22:r.mode&1?(u0=(e=u0)||r.memoizedState!==null,S3(t,a,r),u0=e):S3(t,a,r);break;default:S3(t,a,r)}}function op(t){var a=t.updateQueue;if(a!==null){t.updateQueue=null;var r=t.stateNode;r===null&&(r=t.stateNode=new KF),a.forEach(function(e){var c=lO.bind(null,t,e);r.has(e)||(r.add(e),e.then(c,c))})}}function Q4(t,a){var r=a.deletions;if(r!==null)for(var e=0;ec&&(c=l),e&=~n}if(e=c,e=S2()-e,e=(120>e?120:480>e?480:1080>e?1080:1920>e?1920:3e3>e?3e3:4320>e?4320:1960*JF(e/1960))-e,10t?16:t,R3===null)var e=!1;else{if(t=R3,R3=null,ce=0,(b1&6)!==0)throw Error(Z(331));var c=b1;for(b1|=4,t1=t.current;t1!==null;){var n=t1,l=n.child;if((t1.flags&16)!==0){var o=n.deletions;if(o!==null){for(var i=0;iS2()-Ji?P6(t,0):Yi|=r),N0(t,a)}function hf(t,a){a===0&&((t.mode&1)===0?a=1:(a=ur,ur<<=1,(ur&130023424)===0&&(ur=4194304)));var r=C0();t=K5(t,a),t!==null&&(u9(t,a,r),N0(t,r))}function nO(t){var a=t.memoizedState,r=0;a!==null&&(r=a.retryLane),hf(t,r)}function lO(t,a){var r=0;switch(t.tag){case 13:var e=t.stateNode,c=t.memoizedState;c!==null&&(r=c.retryLane);break;case 19:e=t.stateNode;break;default:throw Error(Z(314))}e!==null&&e.delete(a),hf(t,r)}var vf;vf=function(t,a,r){if(t!==null)if(t.memoizedProps!==a.pendingProps||P0.current)E0=!0;else{if((t.lanes&r)===0&&(a.flags&128)===0)return E0=!1,qF(t,a,r);E0=(t.flags&131072)!==0}else E0=!1,o2&&(a.flags&1048576)!==0&&uz(a,Xr,a.index);switch(a.lanes=0,a.tag){case 2:var e=a.type;kr(t,a),t=a.pendingProps;var c=nt(a,s0.current);rt(a,r),c=ji(null,a,e,t,c,r);var n=qi();return a.flags|=1,typeof c=="object"&&c!==null&&typeof c.render=="function"&&c.$$typeof===void 0?(a.tag=1,a.memoizedState=null,a.updateQueue=null,T0(e)?(n=!0,qr(a)):n=!1,a.memoizedState=c.state!==null&&c.state!==void 0?c.state:null,Di(a),c.updater=se,a.stateNode=c,c._reactInternals=a,ei(a,e,t,r),a=li(null,a,e,!0,n,r)):(a.tag=0,o2&&n&&_i(a),L0(null,a,c,r),a=a.child),a;case 16:e=a.elementType;t:{switch(kr(t,a),t=a.pendingProps,c=e._init,e=c(e._payload),a.type=e,c=a.tag=iO(e),t=Y4(e,t),c){case 0:a=ni(null,a,e,t,r);break t;case 1:a=rp(null,a,e,t,r);break t;case 11:a=tp(null,a,e,t,r);break t;case 14:a=ap(null,a,e,Y4(e.type,t),r);break t}throw Error(Z(306,e,""))}return a;case 0:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:Y4(e,c),ni(t,a,e,c,r);case 1:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:Y4(e,c),rp(t,a,e,c,r);case 3:t:{if(jz(a),t===null)throw Error(Z(387));e=a.pendingProps,n=a.memoizedState,c=n.element,zz(t,a),Yr(a,e,null,r);var l=a.memoizedState;if(e=l.element,n.isDehydrated)if(n={element:e,isDehydrated:!1,cache:l.cache,pendingSuspenseBoundaries:l.pendingSuspenseBoundaries,transitions:l.transitions},a.updateQueue.baseState=n,a.memoizedState=n,a.flags&256){c=ht(Error(Z(423)),a),a=ep(t,a,e,r,c);break t}else if(e!==c){c=ht(Error(Z(424)),a),a=ep(t,a,e,r,c);break t}else for(l4=T3(a.stateNode.containerInfo.firstChild),o4=a,o2=!0,t5=null,r=xz(a,null,e,r),a.child=r;r;)r.flags=r.flags&-3|4096,r=r.sibling;else{if(lt(),e===c){a=Q5(t,a,r);break t}L0(t,a,e,r)}a=a.child}return a;case 5:return Hz(a),t===null&&ti(a),e=a.type,c=a.pendingProps,n=t!==null?t.memoizedProps:null,l=c.children,Xo(e,c)?l=null:n!==null&&Xo(e,n)&&(a.flags|=32),Wz(t,a),L0(t,a,l,r),a.child;case 6:return t===null&&ti(a),null;case 13:return qz(t,a,r);case 4:return Zi(a,a.stateNode.containerInfo),e=a.pendingProps,t===null?a.child=ot(a,null,e,r):L0(t,a,e,r),a.child;case 11:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:Y4(e,c),tp(t,a,e,c,r);case 7:return L0(t,a,a.pendingProps,r),a.child;case 8:return L0(t,a,a.pendingProps.children,r),a.child;case 12:return L0(t,a,a.pendingProps.children,r),a.child;case 10:t:{if(e=a.type._context,c=a.pendingProps,n=a.memoizedProps,l=c.value,e2(Kr,e._currentValue),e._currentValue=l,n!==null)if(e5(n.value,l)){if(n.children===c.children&&!P0.current){a=Q5(t,a,r);break t}}else for(n=a.child,n!==null&&(n.return=a);n!==null;){var o=n.dependencies;if(o!==null){l=n.child;for(var i=o.firstContext;i!==null;){if(i.context===e){if(n.tag===1){i=q5(-1,r&-r),i.tag=2;var h=n.updateQueue;if(h!==null){h=h.shared;var v=h.pending;v===null?i.next=i:(i.next=v.next,v.next=i),h.pending=i}}n.lanes|=r,i=n.alternate,i!==null&&(i.lanes|=r),ai(n.return,r,a),o.lanes|=r;break}i=i.next}}else if(n.tag===10)l=n.type===a.type?null:n.child;else if(n.tag===18){if(l=n.return,l===null)throw Error(Z(341));l.lanes|=r,o=l.alternate,o!==null&&(o.lanes|=r),ai(l,r,a),l=n.sibling}else l=n.child;if(l!==null)l.return=n;else for(l=n;l!==null;){if(l===a){l=null;break}if(n=l.sibling,n!==null){n.return=l.return,l=n;break}l=l.return}n=l}L0(t,a,c.children,r),a=a.child}return a;case 9:return c=a.type,e=a.pendingProps.children,rt(a,r),c=y4(c),e=e(c),a.flags|=1,L0(t,a,e,r),a.child;case 14:return e=a.type,c=Y4(e,a.pendingProps),c=Y4(e.type,c),ap(t,a,e,c,r);case 15:return Gz(t,a,a.type,a.pendingProps,r);case 17:return e=a.type,c=a.pendingProps,c=a.elementType===e?c:Y4(e,c),kr(t,a),a.tag=1,T0(e)?(t=!0,qr(a)):t=!1,rt(a,r),Mz(a,e,c),ei(a,e,c,r),li(null,a,e,!0,t,r);case 19:return $z(t,a,r);case 22:return Uz(t,a,r)}throw Error(Z(156,a.tag))};function df(t,a){return Ip(t,a)}function oO(t,a,r,e){this.tag=t,this.key=r,this.sibling=this.child=this.return=this.stateNode=this.type=this.elementType=null,this.index=0,this.ref=null,this.pendingProps=a,this.dependencies=this.memoizedState=this.updateQueue=this.memoizedProps=null,this.mode=e,this.subtreeFlags=this.flags=0,this.deletions=null,this.childLanes=this.lanes=0,this.alternate=null}function w4(t,a,r,e){return new oO(t,a,r,e)}function eh(t){return t=t.prototype,!(!t||!t.isReactComponent)}function iO(t){if(typeof t=="function")return eh(t)?1:0;if(t!=null){if(t=t.$$typeof,t===Vi)return 11;if(t===Li)return 14}return 2}function G3(t,a){var r=t.alternate;return r===null?(r=w4(t.tag,a,t.key,t.mode),r.elementType=t.elementType,r.type=t.type,r.stateNode=t.stateNode,r.alternate=t,t.alternate=r):(r.pendingProps=a,r.type=t.type,r.flags=0,r.subtreeFlags=0,r.deletions=null),r.flags=t.flags&14680064,r.childLanes=t.childLanes,r.lanes=t.lanes,r.child=t.child,r.memoizedProps=t.memoizedProps,r.memoizedState=t.memoizedState,r.updateQueue=t.updateQueue,a=t.dependencies,r.dependencies=a===null?null:{lanes:a.lanes,firstContext:a.firstContext},r.sibling=t.sibling,r.index=t.index,r.ref=t.ref,r}function Ir(t,a,r,e,c,n){var l=2;if(e=t,typeof t=="function")eh(t)&&(l=1);else if(typeof t=="string")l=5;else t:switch(t){case D8:return T6(r.children,c,n,a);case Hi:l=8,c|=8;break;case yo:return t=w4(12,r,a,c|2),t.elementType=yo,t.lanes=n,t;case Ao:return t=w4(13,r,a,c),t.elementType=Ao,t.lanes=n,t;case So:return t=w4(19,r,a,c),t.elementType=So,t.lanes=n,t;case mp:return fe(r,c,n,a);default:if(typeof t=="object"&&t!==null)switch(t.$$typeof){case fp:l=10;break t;case Mp:l=9;break t;case Vi:l=11;break t;case Li:l=14;break t;case b3:l=16,e=null;break t}throw Error(Z(130,t==null?t:typeof t,""))}return a=w4(l,r,a,c),a.elementType=t,a.type=e,a.lanes=n,a}function T6(t,a,r,e){return t=w4(7,t,e,a),t.lanes=r,t}function fe(t,a,r,e){return t=w4(22,t,e,a),t.elementType=mp,t.lanes=r,t.stateNode={isHidden:!1},t}function Co(t,a,r){return t=w4(6,t,null,a),t.lanes=r,t}function wo(t,a,r){return a=w4(4,t.children!==null?t.children:[],t.key,a),a.lanes=r,a.stateNode={containerInfo:t.containerInfo,pendingChildren:null,implementation:t.implementation},a}function hO(t,a,r,e,c){this.tag=a,this.containerInfo=t,this.finishedWork=this.pingCache=this.current=this.pendingChildren=null,this.timeoutHandle=-1,this.callbackNode=this.pendingContext=this.context=null,this.callbackPriority=0,this.eventTimes=oo(0),this.expirationTimes=oo(-1),this.entangledLanes=this.finishedLanes=this.mutableReadLanes=this.expiredLanes=this.pingedLanes=this.suspendedLanes=this.pendingLanes=0,this.entanglements=oo(0),this.identifierPrefix=e,this.onRecoverableError=c,this.mutableSourceEagerHydrationData=null}function ch(t,a,r,e,c,n,l,o,i){return t=new hO(t,a,r,o,i),a===1?(a=1,n===!0&&(a|=8)):a=0,n=w4(3,null,null,a),t.current=n,n.stateNode=t,n.memoizedState={element:e,isDehydrated:r,cache:null,transitions:null,pendingSuspenseBoundaries:null},Di(n),t}function vO(t,a,r){var e=3{"use strict";function zf(){if(!(typeof __REACT_DEVTOOLS_GLOBAL_HOOK__>"u"||typeof __REACT_DEVTOOLS_GLOBAL_HOOK__.checkDCE!="function"))try{__REACT_DEVTOOLS_GLOBAL_HOOK__.checkDCE(zf)}catch(t){console.error(t)}}zf(),ff.exports=pf()});var mf=V1(ih=>{"use strict";var Mf=q6();ih.createRoot=Mf.createRoot,ih.hydrateRoot=Mf.hydrateRoot;var hW});var Hf=V1(Ve=>{"use strict";var pO=$(),zO=Symbol.for("react.element"),fO=Symbol.for("react.fragment"),MO=Object.prototype.hasOwnProperty,mO=pO.__SECRET_INTERNALS_DO_NOT_USE_OR_YOU_WILL_BE_FIRED.ReactCurrentOwner,xO={key:!0,ref:!0,__self:!0,__source:!0};function xf(t,a,r){var e,c={},n=null,l=null;r!==void 0&&(n=""+r),a.key!==void 0&&(n=""+a.key),a.ref!==void 0&&(l=a.ref);for(e in a)MO.call(a,e)&&!xO.hasOwnProperty(e)&&(c[e]=a[e]);if(t&&t.defaultProps)for(e in a=t.defaultProps,a)c[e]===void 0&&(c[e]=a[e]);return{$$typeof:zO,type:t,key:n,ref:l,props:c,_owner:mO.current}}Ve.Fragment=fO;Ve.jsx=xf;Ve.jsxs=xf});var b=V1((zW,Vf)=>{"use strict";Vf.exports=Hf()});var yf=V1((MW,Bf)=>{"use strict";var VO="SECRET_DO_NOT_PASS_THIS_OR_YOU_WILL_BE_FIRED";Bf.exports=VO});var Ff=V1((mW,bf)=>{"use strict";var LO=yf();function Af(){}function Sf(){}Sf.resetWarningCache=Af;bf.exports=function(){function t(e,c,n,l,o,i){if(i!==LO){var h=new Error("Calling PropTypes validators directly is not supported by the `prop-types` package. Use PropTypes.checkPropTypes() to call them. Read more at http://fb.me/use-check-prop-types");throw h.name="Invariant Violation",h}}t.isRequired=t;function a(){return t}var r={array:t,bigint:t,bool:t,func:t,number:t,object:t,string:t,symbol:t,any:t,arrayOf:a,element:t,elementType:t,instanceOf:a,node:t,objectOf:a,oneOf:a,oneOfType:a,shape:a,exact:a,checkPropTypes:Sf,resetWarningCache:Af};return r.PropTypes=r,r}});var dh=V1((VW,Of)=>{Of.exports=Ff()();var xW,HW});var mh=V1((EW,we)=>{(function(){"use strict";var t=!!(typeof window<"u"&&window.document&&window.document.createElement),a={canUseDOM:t,canUseWorkers:typeof Worker<"u",canUseEventListeners:t&&!!(window.addEventListener||window.attachEvent),canUseViewport:t&&!!window.screen};typeof define=="function"&&typeof define.amd=="object"&&define.amd?define(function(){return a}):typeof we<"u"&&we.exports?we.exports=a:window.ExecutionEnvironment=a})()});var Nf=V1((PW,Tf)=>{var UO=new Error("Element already at target scroll position"),WO=new Error("Scroll cancelled"),jO=Math.min,Ef=Date.now;Tf.exports={left:Pf("scrollLeft"),top:Pf("scrollTop")};function Pf(t){return function(r,e,c,n){c=c||{},typeof c=="function"&&(n=c,c={}),typeof n!="function"&&(n=$O);var l=Ef(),o=r[t],i=c.ease||qO,h=isNaN(c.duration)?350:+c.duration,v=!1;return o===e?n(UO,r[t]):requestAnimationFrame(u),d;function d(){v=!0}function u(s){if(v)return n(WO,r[t]);var g=Ef(),p=jO(1,(g-l)/h),L=i(p);r[t]=L*(e-o)+o,p<1?requestAnimationFrame(u):requestAnimationFrame(function(){n(null,r[t])})}}}function qO(t){return .5*(1-Math.cos(Math.PI*t))}function $O(){}});var Zf=V1((Df,Be)=>{(function(t,a){typeof define=="function"&&define.amd?define([],a):typeof Be=="object"&&Be.exports?Be.exports=a():t.Scrollparent=a()})(Df,function(){var t=/(auto|scroll)/,a=function(l,o){return l.parentNode===null?o:a(l.parentNode,o.concat([l]))},r=function(l,o){return getComputedStyle(l,null).getPropertyValue(o)},e=function(l){return r(l,"overflow")+r(l,"overflow-y")+r(l,"overflow-x")},c=function(l){return t.test(e(l))},n=function(l){if(l instanceof HTMLElement||l instanceof SVGElement){for(var o=a(l.parentNode,[]),i=0;i{"use strict";var X2=typeof Symbol=="function"&&Symbol.for,xh=X2?Symbol.for("react.element"):60103,Hh=X2?Symbol.for("react.portal"):60106,ye=X2?Symbol.for("react.fragment"):60107,Ae=X2?Symbol.for("react.strict_mode"):60108,Se=X2?Symbol.for("react.profiler"):60114,be=X2?Symbol.for("react.provider"):60109,Fe=X2?Symbol.for("react.context"):60110,Vh=X2?Symbol.for("react.async_mode"):60111,Oe=X2?Symbol.for("react.concurrent_mode"):60111,ke=X2?Symbol.for("react.forward_ref"):60112,_e=X2?Symbol.for("react.suspense"):60113,XO=X2?Symbol.for("react.suspense_list"):60120,Re=X2?Symbol.for("react.memo"):60115,Ie=X2?Symbol.for("react.lazy"):60116,KO=X2?Symbol.for("react.block"):60121,QO=X2?Symbol.for("react.fundamental"):60117,YO=X2?Symbol.for("react.responder"):60118,JO=X2?Symbol.for("react.scope"):60119;function d4(t){if(typeof t=="object"&&t!==null){var a=t.$$typeof;switch(a){case xh:switch(t=t.type,t){case Vh:case Oe:case ye:case Se:case Ae:case _e:return t;default:switch(t=t&&t.$$typeof,t){case Fe:case ke:case Ie:case Re:case be:return t;default:return a}}case Hh:return a}}}function Gf(t){return d4(t)===Oe}D1.AsyncMode=Vh;D1.ConcurrentMode=Oe;D1.ContextConsumer=Fe;D1.ContextProvider=be;D1.Element=xh;D1.ForwardRef=ke;D1.Fragment=ye;D1.Lazy=Ie;D1.Memo=Re;D1.Portal=Hh;D1.Profiler=Se;D1.StrictMode=Ae;D1.Suspense=_e;D1.isAsyncMode=function(t){return Gf(t)||d4(t)===Vh};D1.isConcurrentMode=Gf;D1.isContextConsumer=function(t){return d4(t)===Fe};D1.isContextProvider=function(t){return d4(t)===be};D1.isElement=function(t){return typeof t=="object"&&t!==null&&t.$$typeof===xh};D1.isForwardRef=function(t){return d4(t)===ke};D1.isFragment=function(t){return d4(t)===ye};D1.isLazy=function(t){return d4(t)===Ie};D1.isMemo=function(t){return d4(t)===Re};D1.isPortal=function(t){return d4(t)===Hh};D1.isProfiler=function(t){return d4(t)===Se};D1.isStrictMode=function(t){return d4(t)===Ae};D1.isSuspense=function(t){return d4(t)===_e};D1.isValidElementType=function(t){return typeof t=="string"||typeof t=="function"||t===ye||t===Oe||t===Se||t===Ae||t===_e||t===XO||typeof t=="object"&&t!==null&&(t.$$typeof===Ie||t.$$typeof===Re||t.$$typeof===be||t.$$typeof===Fe||t.$$typeof===ke||t.$$typeof===QO||t.$$typeof===YO||t.$$typeof===JO||t.$$typeof===KO)};D1.typeOf=d4});var Lh=V1((NW,Wf)=>{"use strict";Wf.exports=Uf()});var Ch=V1((DW,$f)=>{"use strict";var tk=function(a){return ak(a)&&!rk(a)};function ak(t){return!!t&&typeof t=="object"}function rk(t){var a=Object.prototype.toString.call(t);return a==="[object RegExp]"||a==="[object Date]"||nk(t)}var ek=typeof Symbol=="function"&&Symbol.for,ck=ek?Symbol.for("react.element"):60103;function nk(t){return t.$$typeof===ck}function lk(t){return Array.isArray(t)?[]:{}}function z9(t,a){return a.clone!==!1&&a.isMergeableObject(t)?zt(lk(t),t,a):t}function ok(t,a,r){return t.concat(a).map(function(e){return z9(e,r)})}function ik(t,a){if(!a.customMerge)return zt;var r=a.customMerge(t);return typeof r=="function"?r:zt}function hk(t){return Object.getOwnPropertySymbols?Object.getOwnPropertySymbols(t).filter(function(a){return t.propertyIsEnumerable(a)}):[]}function jf(t){return Object.keys(t).concat(hk(t))}function qf(t,a){try{return a in t}catch{return!1}}function vk(t,a){return qf(t,a)&&!(Object.hasOwnProperty.call(t,a)&&Object.propertyIsEnumerable.call(t,a))}function dk(t,a,r){var e={};return r.isMergeableObject(t)&&jf(t).forEach(function(c){e[c]=z9(t[c],r)}),jf(a).forEach(function(c){vk(t,c)||(qf(t,c)&&r.isMergeableObject(a[c])?e[c]=ik(c,r)(t[c],a[c],r):e[c]=z9(a[c],r))}),e}function zt(t,a,r){r=r||{},r.arrayMerge=r.arrayMerge||ok,r.isMergeableObject=r.isMergeableObject||tk,r.cloneUnlessOtherwiseSpecified=z9;var e=Array.isArray(a),c=Array.isArray(t),n=e===c;return n?e?r.arrayMerge(t,a,r):dk(t,a,r):z9(a,r)}zt.all=function(a,r){if(!Array.isArray(a))throw new Error("first argument should be an array");return a.reduce(function(e,c){return zt(e,c,r)},{})};var uk=zt;$f.exports=uk});var Xf=V1(wh=>{"use strict";Object.defineProperty(wh,"__esModule",{value:!0});var sk="The typeValidator argument must be a function with the signature function(props, propName, componentName).",gk="The error message is optional, but must be a string if provided.",pk=function(a,r,e,c){return typeof a=="boolean"?a:typeof a=="function"?a(r,e,c):!!a&&!!a},zk=function(a,r){return Object.hasOwnProperty.call(a,r)},fk=function(a,r,e,c){return c?new Error(c):new Error("Required "+a[r]+" `"+r+"`"+(" was not specified in `"+e+"`."))},Mk=function(a,r){if(typeof a!="function")throw new TypeError(sk);if(!!r&&typeof r!="string")throw new TypeError(gk)},mk=function(a,r,e){return Mk(a,e),function(c,n,l){for(var o=arguments.length,i=Array(3{"use strict";var yt=$();function BR(t,a){return t===a&&(t!==0||1/t===1/a)||t!==t&&a!==a}var yR=typeof Object.is=="function"?Object.is:BR,AR=yt.useState,SR=yt.useEffect,bR=yt.useLayoutEffect,FR=yt.useDebugValue;function OR(t,a){var r=a(),e=AR({inst:{value:r,getSnapshot:a}}),c=e[0].inst,n=e[1];return bR(function(){c.value=r,c.getSnapshot=a,nv(c)&&n({inst:c})},[t,r,a]),SR(function(){return nv(c)&&n({inst:c}),t(function(){nv(c)&&n({inst:c})})},[t]),FR(r),r}function nv(t){var a=t.getSnapshot;t=t.value;try{var r=a();return!yR(t,r)}catch{return!0}}function kR(t,a){return a()}var _R=typeof window>"u"||typeof window.document>"u"||typeof window.document.createElement>"u"?kR:OR;lm.useSyncExternalStore=yt.useSyncExternalStore!==void 0?yt.useSyncExternalStore:_R});var lv=V1((jq,im)=>{"use strict";im.exports=om()});var vm=V1(hm=>{"use strict";var Ke=$(),RR=lv();function IR(t,a){return t===a&&(t!==0||1/t===1/a)||t!==t&&a!==a}var ER=typeof Object.is=="function"?Object.is:IR,PR=RR.useSyncExternalStore,TR=Ke.useRef,NR=Ke.useEffect,DR=Ke.useMemo,ZR=Ke.useDebugValue;hm.useSyncExternalStoreWithSelector=function(t,a,r,e,c){var n=TR(null);if(n.current===null){var l={hasValue:!1,value:null};n.current=l}else l=n.current;n=DR(function(){function i(s){if(!h){if(h=!0,v=s,s=e(s),c!==void 0&&l.hasValue){var g=l.value;if(c(g,s))return d=g}return d=s}if(g=d,ER(v,s))return g;var p=e(s);return c!==void 0&&c(g,p)?g:(v=s,d=p)}var h=!1,v,d,u=r===void 0?null:r;return[function(){return i(a())},u===null?void 0:function(){return i(u())}]},[a,r,e,c]);var o=PR(t,n[0],n[1]);return NR(function(){l.hasValue=!0,l.value=o},[o]),ZR(o),o}});var um=V1(($q,dm)=>{"use strict";dm.exports=vm()});var ym=V1((o$,Bm)=>{"use strict";var iv=Lh(),WR={childContextTypes:!0,contextType:!0,contextTypes:!0,defaultProps:!0,displayName:!0,getDefaultProps:!0,getDerivedStateFromError:!0,getDerivedStateFromProps:!0,mixins:!0,propTypes:!0,type:!0},jR={name:!0,length:!0,prototype:!0,caller:!0,callee:!0,arguments:!0,arity:!0},qR={$$typeof:!0,render:!0,defaultProps:!0,displayName:!0,propTypes:!0},Cm={$$typeof:!0,compare:!0,defaultProps:!0,displayName:!0,propTypes:!0,type:!0},hv={};hv[iv.ForwardRef]=qR;hv[iv.Memo]=Cm;function Hm(t){return iv.isMemo(t)?Cm:hv[t.$$typeof]||WR}var $R=Object.defineProperty,XR=Object.getOwnPropertyNames,Vm=Object.getOwnPropertySymbols,KR=Object.getOwnPropertyDescriptor,QR=Object.getPrototypeOf,Lm=Object.prototype;function wm(t,a,r){if(typeof a!="string"){if(Lm){var e=QR(a);e&&e!==Lm&&wm(t,e,r)}var c=XR(a);Vm&&(c=c.concat(Vm(a)));for(var n=Hm(t),l=Hm(a),o=0;o{"use strict";var vv=Symbol.for("react.element"),dv=Symbol.for("react.portal"),tc=Symbol.for("react.fragment"),ac=Symbol.for("react.strict_mode"),rc=Symbol.for("react.profiler"),ec=Symbol.for("react.provider"),cc=Symbol.for("react.context"),YR=Symbol.for("react.server_context"),nc=Symbol.for("react.forward_ref"),lc=Symbol.for("react.suspense"),oc=Symbol.for("react.suspense_list"),ic=Symbol.for("react.memo"),hc=Symbol.for("react.lazy"),JR=Symbol.for("react.offscreen"),Am;Am=Symbol.for("react.module.reference");function F4(t){if(typeof t=="object"&&t!==null){var a=t.$$typeof;switch(a){case vv:switch(t=t.type,t){case tc:case rc:case ac:case lc:case oc:return t;default:switch(t=t&&t.$$typeof,t){case YR:case cc:case nc:case hc:case ic:case ec:return t;default:return a}}case dv:return a}}}G1.ContextConsumer=cc;G1.ContextProvider=ec;G1.Element=vv;G1.ForwardRef=nc;G1.Fragment=tc;G1.Lazy=hc;G1.Memo=ic;G1.Portal=dv;G1.Profiler=rc;G1.StrictMode=ac;G1.Suspense=lc;G1.SuspenseList=oc;G1.isAsyncMode=function(){return!1};G1.isConcurrentMode=function(){return!1};G1.isContextConsumer=function(t){return F4(t)===cc};G1.isContextProvider=function(t){return F4(t)===ec};G1.isElement=function(t){return typeof t=="object"&&t!==null&&t.$$typeof===vv};G1.isForwardRef=function(t){return F4(t)===nc};G1.isFragment=function(t){return F4(t)===tc};G1.isLazy=function(t){return F4(t)===hc};G1.isMemo=function(t){return F4(t)===ic};G1.isPortal=function(t){return F4(t)===dv};G1.isProfiler=function(t){return F4(t)===rc};G1.isStrictMode=function(t){return F4(t)===ac};G1.isSuspense=function(t){return F4(t)===lc};G1.isSuspenseList=function(t){return F4(t)===oc};G1.isValidElementType=function(t){return typeof t=="string"||typeof t=="function"||t===tc||t===rc||t===ac||t===lc||t===oc||t===JR||typeof t=="object"&&t!==null&&(t.$$typeof===hc||t.$$typeof===ic||t.$$typeof===ec||t.$$typeof===cc||t.$$typeof===nc||t.$$typeof===Am||t.getModuleId!==void 0)};G1.typeOf=F4});var Fm=V1((h$,bm)=>{"use strict";bm.exports=Sm()});var Ic=V1((c11,UH)=>{UH.exports=function(a){return a!=null&&a.constructor!=null&&typeof a.constructor.isBuffer=="function"&&a.constructor.isBuffer(a)}});var nV=V1((V11,cV)=>{"use strict";var Ec=Object.prototype.hasOwnProperty,eV=Object.prototype.toString,QH=Object.defineProperty,YH=Object.getOwnPropertyDescriptor,JH=function(a){return typeof Array.isArray=="function"?Array.isArray(a):eV.call(a)==="[object Array]"},tV=function(a){if(!a||eV.call(a)!=="[object Object]")return!1;var r=Ec.call(a,"constructor"),e=a.constructor&&a.constructor.prototype&&Ec.call(a.constructor.prototype,"isPrototypeOf");if(a.constructor&&!r&&!e)return!1;var c;for(c in a);return typeof c>"u"||Ec.call(a,c)},aV=function(a,r){QH&&r.name==="__proto__"?QH(a,r.name,{enumerable:!0,configurable:!0,value:r.newValue,writable:!0}):a[r.name]=r.newValue},rV=function(a,r){if(r==="__proto__")if(Ec.call(a,r)){if(YH)return YH(a,r).value}else return;return a[r]};cV.exports=function t(){var a,r,e,c,n,l,o=arguments[0],i=1,h=arguments.length,v=!1;for(typeof o=="boolean"&&(v=o,o=arguments[1]||{},i=2),(o==null||typeof o!="object"&&typeof o!="function")&&(o={});i{"use strict";var tu=Symbol.for("react.element"),au=Symbol.for("react.portal"),on=Symbol.for("react.fragment"),hn=Symbol.for("react.strict_mode"),vn=Symbol.for("react.profiler"),dn=Symbol.for("react.provider"),un=Symbol.for("react.context"),sN=Symbol.for("react.server_context"),sn=Symbol.for("react.forward_ref"),gn=Symbol.for("react.suspense"),pn=Symbol.for("react.suspense_list"),zn=Symbol.for("react.memo"),fn=Symbol.for("react.lazy"),gN=Symbol.for("react.offscreen"),RL;RL=Symbol.for("react.module.reference");function E4(t){if(typeof t=="object"&&t!==null){var a=t.$$typeof;switch(a){case tu:switch(t=t.type,t){case on:case vn:case hn:case gn:case pn:return t;default:switch(t=t&&t.$$typeof,t){case sN:case un:case sn:case fn:case zn:case dn:return t;default:return a}}case au:return a}}}W1.ContextConsumer=un;W1.ContextProvider=dn;W1.Element=tu;W1.ForwardRef=sn;W1.Fragment=on;W1.Lazy=fn;W1.Memo=zn;W1.Portal=au;W1.Profiler=vn;W1.StrictMode=hn;W1.Suspense=gn;W1.SuspenseList=pn;W1.isAsyncMode=function(){return!1};W1.isConcurrentMode=function(){return!1};W1.isContextConsumer=function(t){return E4(t)===un};W1.isContextProvider=function(t){return E4(t)===dn};W1.isElement=function(t){return typeof t=="object"&&t!==null&&t.$$typeof===tu};W1.isForwardRef=function(t){return E4(t)===sn};W1.isFragment=function(t){return E4(t)===on};W1.isLazy=function(t){return E4(t)===fn};W1.isMemo=function(t){return E4(t)===zn};W1.isPortal=function(t){return E4(t)===au};W1.isProfiler=function(t){return E4(t)===vn};W1.isStrictMode=function(t){return E4(t)===hn};W1.isSuspense=function(t){return E4(t)===gn};W1.isSuspenseList=function(t){return E4(t)===pn};W1.isValidElementType=function(t){return typeof t=="string"||typeof t=="function"||t===on||t===vn||t===hn||t===gn||t===pn||t===gN||typeof t=="object"&&t!==null&&(t.$$typeof===fn||t.$$typeof===zn||t.$$typeof===dn||t.$$typeof===un||t.$$typeof===sn||t.$$typeof===RL||t.getModuleId!==void 0)};W1.typeOf=E4});var PL=V1((z81,EL)=>{"use strict";EL.exports=IL()});var qL=V1((x81,jL)=>{var ZL=/\/\*[^*]*\*+([^/*][^*]*\*+)*\//g,pN=/\n/g,zN=/^\s*/,fN=/^(\*?[-#/*\\\w]+(\[[0-9a-z_-]+\])?)\s*/,MN=/^:\s*/,mN=/^((?:'(?:\\'|.)*?'|"(?:\\"|.)*?"|\([^)]*?\)|[^};])+)/,xN=/^[;\s]*/,HN=/^\s+|\s+$/g,VN=` +`,GL="/",UL="*",v8="",LN="comment",CN="declaration";jL.exports=function(t,a){if(typeof t!="string")throw new TypeError("First argument must be a string");if(!t)return[];a=a||{};var r=1,e=1;function c(p){var L=p.match(pN);L&&(r+=L.length);var f=p.lastIndexOf(VN);e=~f?p.length-f:e+p.length}function n(){var p={line:r,column:e};return function(L){return L.position=new l(p),v(),L}}function l(p){this.start=p,this.end={line:r,column:e},this.source=a.source}l.prototype.content=t;var o=[];function i(p){var L=new Error(a.source+":"+r+":"+e+": "+p);if(L.reason=p,L.filename=a.source,L.line=r,L.column=e,L.source=t,a.silent)o.push(L);else throw L}function h(p){var L=p.exec(t);if(!!L){var f=L[0];return c(f),t=t.slice(f.length),L}}function v(){h(zN)}function d(p){var L;for(p=p||[];L=u();)L!==!1&&p.push(L);return p}function u(){var p=n();if(!(GL!=t.charAt(0)||UL!=t.charAt(1))){for(var L=2;v8!=t.charAt(L)&&(UL!=t.charAt(L)||GL!=t.charAt(L+1));)++L;if(L+=2,v8===t.charAt(L-1))return i("End of comment missing");var f=t.slice(2,L-2);return e+=2,c(f),t=t.slice(L),e+=2,p({type:LN,comment:f})}}function s(){var p=n(),L=h(fN);if(!!L){if(u(),!h(MN))return i("property missing ':'");var f=h(mN),m=p({type:CN,property:WL(L[0].replace(ZL,v8)),value:f?WL(f[0].replace(ZL,v8)):v8});return h(xN),m}}function g(){var p=[];d(p);for(var L;L=s();)L!==!1&&(p.push(L),d(p));return p}return v(),g()};function WL(t){return t?t.replace(HN,v8):v8}});var XL=V1((H81,$L)=>{var wN=qL();function BN(t,a){var r=null;if(!t||typeof t!="string")return r;for(var e,c=wN(t),n=typeof a=="function",l,o,i=0,h=c.length;i{var gD=typeof Element<"u",pD=typeof Map=="function",zD=typeof Set=="function",fD=typeof ArrayBuffer=="function"&&!!ArrayBuffer.isView;function An(t,a){if(t===a)return!0;if(t&&a&&typeof t=="object"&&typeof a=="object"){if(t.constructor!==a.constructor)return!1;var r,e,c;if(Array.isArray(t)){if(r=t.length,r!=a.length)return!1;for(e=r;e--!==0;)if(!An(t[e],a[e]))return!1;return!0}var n;if(pD&&t instanceof Map&&a instanceof Map){if(t.size!==a.size)return!1;for(n=t.entries();!(e=n.next()).done;)if(!a.has(e.value[0]))return!1;for(n=t.entries();!(e=n.next()).done;)if(!An(e.value[1],a.get(e.value[0])))return!1;return!0}if(zD&&t instanceof Set&&a instanceof Set){if(t.size!==a.size)return!1;for(n=t.entries();!(e=n.next()).done;)if(!a.has(e.value[0]))return!1;return!0}if(fD&&ArrayBuffer.isView(t)&&ArrayBuffer.isView(a)){if(r=t.length,r!=a.length)return!1;for(e=r;e--!==0;)if(t[e]!==a[e])return!1;return!0}if(t.constructor===RegExp)return t.source===a.source&&t.flags===a.flags;if(t.valueOf!==Object.prototype.valueOf)return t.valueOf()===a.valueOf();if(t.toString!==Object.prototype.toString)return t.toString()===a.toString();if(c=Object.keys(t),r=c.length,r!==Object.keys(a).length)return!1;for(e=r;e--!==0;)if(!Object.prototype.hasOwnProperty.call(a,c[e]))return!1;if(gD&&t instanceof Element)return!1;for(e=r;e--!==0;)if(!((c[e]==="_owner"||c[e]==="__v"||c[e]==="__o")&&t.$$typeof)&&!An(t[c[e]],a[c[e]]))return!1;return!0}return t!==t&&a!==a}xC.exports=function(a,r){try{return An(a,r)}catch(e){if((e.message||"").match(/stack|recursion/i))return console.warn("react-fast-compare cannot handle circular refs"),!1;throw e}}});var zw=V1((ku,_u)=>{(function(t,a){typeof ku=="object"&&typeof _u<"u"?_u.exports=a():typeof define=="function"&&define.amd?define(a):(t=t||self).Sortable=a()})(ku,function(){"use strict";function t(z,M){var x,y=Object.keys(z);return Object.getOwnPropertySymbols&&(x=Object.getOwnPropertySymbols(z),M&&(x=x.filter(function(B){return Object.getOwnPropertyDescriptor(z,B).enumerable})),y.push.apply(y,x)),y}function a(z){for(var M=1;Mz.length)&&(M=z.length);for(var x=0,y=new Array(M);x"&&(M=M.substring(1)),z))try{if(z.matches)return z.matches(M);if(z.msMatchesSelector)return z.msMatchesSelector(M);if(z.webkitMatchesSelector)return z.webkitMatchesSelector(M)}catch{return}}function f(z,M,x,y){if(z){x=x||document;do if(M!=null&&(M[0]!==">"||z.parentNode===x)&&L(z,M)||y&&z===x)return z;while(z!==x&&(z=(B=z).host&&B!==document&&B.host.nodeType?B.host:B.parentNode))}var B;return null}var m,H=/\s+/g;function w(z,M,x){var y;z&&M&&(z.classList?z.classList[x?"add":"remove"](M):(y=(" "+z.className+" ").replace(H," ").replace(" "+M+" "," "),z.className=(y+(x?" "+M:"")).replace(H," ")))}function A(z,M,x){var y=z&&z.style;if(y){if(x===void 0)return document.defaultView&&document.defaultView.getComputedStyle?x=document.defaultView.getComputedStyle(z,""):z.currentStyle&&(x=z.currentStyle),M===void 0?x:x[M];y[M=M in y||M.indexOf("webkit")!==-1?M:"-webkit-"+M]=x+(typeof x=="string"?"":"px")}}function C(z,M){var x="";if(typeof z=="string")x=z;else do var y=A(z,"transform");while(y&&y!=="none"&&(x=y+" "+x),!M&&(z=z.parentNode));var B=window.DOMMatrix||window.WebKitCSSMatrix||window.CSSMatrix||window.MSCSSMatrix;return B&&new B(x)}function k(z,M,x){if(z){var y=z.getElementsByTagName(M),B=0,O=y.length;if(x)for(;B=X.left-N&&B<=X.right+N,N=O>=X.top-N&&O<=X.bottom+N;return e1&&N?_=R:void 0}}),_);if(M){var x,y={};for(x in z)z.hasOwnProperty(x)&&(y[x]=z[x]);y.target=y.rootEl=M,y.preventDefault=void 0,y.stopPropagation=void 0,M[S]._onDragOver(y)}}var B,O,_}function RS(z){G&&G.parentNode[S]._isOutsideThisEl(z.target)}function n1(z,M){if(!z||!z.nodeType||z.nodeType!==1)throw"Sortable: `el` must be an HTMLElement, not ".concat({}.toString.call(z));this.el=z,this.options=M=e({},M),z[S]=this;var x,y,B={group:null,sort:!0,disabled:!1,store:null,handle:null,draggable:/^[uo]l$/i.test(z.nodeName)?">li":">*",swapThreshold:1,invertSwap:!1,invertedSwapThreshold:null,removeCloneOnHide:!0,direction:function(){return Bs(z,this.options)},ghostClass:"sortable-ghost",chosenClass:"sortable-chosen",dragClass:"sortable-drag",ignore:"a, img",filter:null,preventOnFilter:!0,animation:0,easing:null,setData:function(O,_){O.setData("Text",_.textContent)},dropBubble:!1,dragoverBubble:!1,dataIdAttr:"data-id",delay:0,delayOnTouchOnly:!1,touchStartThreshold:(Number.parseInt?Number:window).parseInt(window.devicePixelRatio,10)||1,forceFallback:!1,fallbackClass:"sortable-fallback",fallbackOnBody:!1,fallbackTolerance:0,fallbackOffset:{x:0,y:0},supportPointer:n1.supportPointer!==!1&&"PointerEvent"in window&&!d,emptyInsertThreshold:5};for(x in J2.initializePlugins(this,z,B),B)x in M||(M[x]=B[x]);for(y in ys(M),this)y.charAt(0)==="_"&&typeof this[y]=="function"&&(this[y]=this[y].bind(this));this.nativeDraggable=!M.forceFallback&&_S,this.nativeDraggable&&(this.options.touchStartThreshold=1),M.supportPointer?g(z,"pointerdown",this._onTapStart):(g(z,"mousedown",this._onTapStart),g(z,"touchstart",this._onTapStart)),this.nativeDraggable&&(g(z,"dragover",this),g(z,"dragenter",this)),t2.push(this.el),M.store&&M.store.get&&this.sort(M.store.get(this)||[]),e(this,m4())}function ja(z,M,x,y,B,O,_,R){var N,X,e1=z[S],z1=e1.options.onMove;return!window.CustomEvent||i||h?(N=document.createEvent("Event")).initEvent("move",!0,!0):N=new CustomEvent("move",{bubbles:!0,cancelable:!0}),N.to=M,N.from=z,N.dragged=x,N.draggedRect=y,N.related=B||M,N.relatedRect=O||T(M),N.willInsertAfter=R,N.originalEvent=_,z.dispatchEvent(N),X=z1?z1.call(e1,N,_):X}function Fl(z){z.draggable=!1}function IS(){bl=!1}function qa(z){return setTimeout(z,0)}function Ol(z){return clearTimeout(z)}n1.prototype={constructor:n1,_isOutsideThisEl:function(z){this.el.contains(z)||z===this.el||(T2=null)},_getDirection:function(z,M){return typeof this.options.direction=="function"?this.options.direction.call(this,z,M,G):this.options.direction},_onTapStart:function(z){if(z.cancelable){var M=this,x=this.el,y=this.options,B=y.preventOnFilter,O=z.type,_=z.touches&&z.touches[0]||z.pointerType&&z.pointerType==="touch"&&z,R=(_||z).target,N=z.target.shadowRoot&&(z.path&&z.path[0]||z.composedPath&&z.composedPath()[0])||R,X=y.filter;if(function(e1){Ga.length=0;for(var z1=e1.getElementsByTagName("input"),T1=z1.length;T1--;){var s1=z1[T1];s1.checked&&Ga.push(s1)}}(x),!G&&!(/mousedown|pointerdown/.test(O)&&z.button!==0||y.disabled)&&!N.isContentEditable&&(this.nativeDraggable||!d||!R||R.tagName.toUpperCase()!=="SELECT")&&!((R=f(R,y.draggable,x,!1))&&R.animated||R5===R)){if(j4=P(R),J0=P(R,y.draggable),typeof X=="function"){if(X.call(this,z,R,this))return Y1({sortable:M,rootEl:N,name:"filter",targetEl:R,toEl:x,fromEl:x}),p1("filter",M,{evt:z}),void(B&&z.cancelable&&z.preventDefault())}else if(X=X&&X.split(",").some(function(e1){if(e1=f(N,e1.trim(),x,!1))return Y1({sortable:M,rootEl:e1,name:"filter",targetEl:R,fromEl:x,toEl:x}),p1("filter",M,{evt:z}),!0}))return void(B&&z.cancelable&&z.preventDefault());y.handle&&!f(N,y.handle,x,!1)||this._prepareDragStart(z,_,R)}}},_prepareDragStart:function(z,M,x){var y,B=this,O=B.el,_=B.options,R=O.ownerDocument;x&&!G&&x.parentNode===O&&(y=T(x),q1=O,k1=(G=x).parentNode,W4=G.nextSibling,R5=x,I5=_.group,x4={target:n1.dragged=G,clientX:(M||z).clientX,clientY:(M||z).clientY},q=x4.clientX-y.left,i1=x4.clientY-y.top,this._lastX=(M||z).clientX,this._lastY=(M||z).clientY,G.style["will-change"]="all",y=function(){p1("delayEnded",B,{evt:z}),n1.eventCanceled?B._onDrop():(B._disableDelayedDragEvents(),!v&&B.nativeDraggable&&(G.draggable=!0),B._triggerDragStart(z,M),Y1({sortable:B,name:"choose",originalEvent:z}),w(G,_.chosenClass,!0))},_.ignore.split(",").forEach(function(N){k(G,N.trim(),Fl)}),g(R,"dragover",b6),g(R,"mousemove",b6),g(R,"touchmove",b6),g(R,"mouseup",B._onDrop),g(R,"touchend",B._onDrop),g(R,"touchcancel",B._onDrop),v&&this.nativeDraggable&&(this.options.touchStartThreshold=4,G.draggable=!0),p1("delayStart",this,{evt:z}),!_.delay||_.delayOnTouchOnly&&!M||this.nativeDraggable&&(h||i)?y():n1.eventCanceled?this._onDrop():(g(R,"mouseup",B._disableDelayedDrag),g(R,"touchend",B._disableDelayedDrag),g(R,"touchcancel",B._disableDelayedDrag),g(R,"mousemove",B._delayedDragTouchMoveHandler),g(R,"touchmove",B._delayedDragTouchMoveHandler),_.supportPointer&&g(R,"pointermove",B._delayedDragTouchMoveHandler),B._dragStartTimer=setTimeout(y,_.delay)))},_delayedDragTouchMoveHandler:function(z){z=z.touches?z.touches[0]:z,Math.max(Math.abs(z.clientX-this._lastX),Math.abs(z.clientY-this._lastY))>=Math.floor(this.options.touchStartThreshold/(this.nativeDraggable&&window.devicePixelRatio||1))&&this._disableDelayedDrag()},_disableDelayedDrag:function(){G&&Fl(G),clearTimeout(this._dragStartTimer),this._disableDelayedDragEvents()},_disableDelayedDragEvents:function(){var z=this.el.ownerDocument;p(z,"mouseup",this._disableDelayedDrag),p(z,"touchend",this._disableDelayedDrag),p(z,"touchcancel",this._disableDelayedDrag),p(z,"mousemove",this._delayedDragTouchMoveHandler),p(z,"touchmove",this._delayedDragTouchMoveHandler),p(z,"pointermove",this._delayedDragTouchMoveHandler)},_triggerDragStart:function(z,M){M=M||z.pointerType=="touch"&&z,!this.nativeDraggable||M?this.options.supportPointer?g(document,"pointermove",this._onTouchMove):g(document,M?"touchmove":"mousemove",this._onTouchMove):(g(G,"dragend",this),g(q1,"dragstart",this._onDragStart));try{document.selection?qa(function(){document.selection.empty()}):window.getSelection().removeAllRanges()}catch{}},_dragStarted:function(z,M){var x;t4=!1,q1&&G?(p1("dragStarted",this,{evt:M}),this.nativeDraggable&&g(document,"dragover",RS),x=this.options,z||w(G,x.dragClass,!1),w(G,x.ghostClass,!0),n1.active=this,z&&this._appendGhost(),Y1({sortable:this,name:"start",originalEvent:M})):this._nulling()},_emulateDragOver:function(){if(i0){this._lastX=i0.clientX,this._lastY=i0.clientY,As();for(var z=document.elementFromPoint(i0.clientX,i0.clientY),M=z;z&&z.shadowRoot&&(z=z.shadowRoot.elementFromPoint(i0.clientX,i0.clientY))!==M;)M=z;if(G.parentNode[S]._isOutsideThisEl(z),M)do if(M[S]&&M[S]._onDragOver({clientX:i0.clientX,clientY:i0.clientY,target:z,rootEl:M})&&!this.options.dragoverBubble)break;while(M=(z=M).parentNode);Ss()}},_onTouchMove:function(z){if(x4){var O=this.options,M=O.fallbackTolerance,x=O.fallbackOffset,y=z.touches?z.touches[0]:z,B=o1&&C(o1,!0),_=o1&&B&&B.a,R=o1&&B&&B.d,O=Wa&&A1&&c1(A1),_=(y.clientX-x4.clientX+x.x)/(_||1)+(O?O[0]-Sl[0]:0)/(_||1),R=(y.clientY-x4.clientY+x.y)/(R||1)+(O?O[1]-Sl[1]:0)/(R||1);if(!n1.active&&!t4){if(M&&Math.max(Math.abs(y.clientX-this._lastX),Math.abs(y.clientY-this._lastY))l2.right+10||A2.clientX<=l2.right&&A2.clientY>l2.bottom&&A2.clientX>=l2.left:A2.clientX>l2.right&&A2.clientY>l2.top||A2.clientX<=l2.right&&A2.clientY>l2.bottom+10}(z,y,this)&&!f1.animated){if(f1===G)return c4(!1);if((_=f1&&O===z.target?f1:_)&&(e4=T(_)),ja(q1,O,G,M,_,e4,z,!!_)!==!1)return N5(),f1&&f1.nextSibling?O.insertBefore(G,f1.nextSibling):O.appendChild(G),k1=O,F6(),c4(!0)}else if(f1&&function(A2,L7,l2){return l2=T(j(l2.el,0,l2.options,!0)),L7?A2.clientX{(function(){"use strict";var t={}.hasOwnProperty;function a(){for(var r=[],e=0;e{"use strict";var JD=!0,Ru="Invariant failed";function tZ(t,a){if(!t){if(JD)throw new Error(Ru);var r=typeof a=="function"?a():a,e=r?Ru+": "+r:Ru;throw new Error(e)}}Mw.exports=tZ});var Bw=V1((Ie1,j0)=>{var aZ=zw(),rZ=fw(),Sa=$(),xw=mw();function Nn(t){return t&&t.__esModule?t.default:t}function Z4(t,a,r,e){Object.defineProperty(t,a,{get:r,set:e,enumerable:!0,configurable:!0})}function eZ(t,a){return Object.keys(a).forEach(function(r){r==="default"||r==="__esModule"||t.hasOwnProperty(r)||Object.defineProperty(t,r,{enumerable:!0,get:function(){return a[r]}})}),t}Z4(j0.exports,"Sortable",()=>$882b6d93070905b3$re_export$Sortable);Z4(j0.exports,"Direction",()=>$882b6d93070905b3$re_export$Direction);Z4(j0.exports,"DOMRect",()=>$882b6d93070905b3$re_export$DOMRect);Z4(j0.exports,"GroupOptions",()=>$882b6d93070905b3$re_export$GroupOptions);Z4(j0.exports,"MoveEvent",()=>$882b6d93070905b3$re_export$MoveEvent);Z4(j0.exports,"Options",()=>$882b6d93070905b3$re_export$Options);Z4(j0.exports,"PullResult",()=>$882b6d93070905b3$re_export$PullResult);Z4(j0.exports,"PutResult",()=>$882b6d93070905b3$re_export$PutResult);Z4(j0.exports,"SortableEvent",()=>$882b6d93070905b3$re_export$SortableEvent);Z4(j0.exports,"SortableOptions",()=>$882b6d93070905b3$re_export$SortableOptions);Z4(j0.exports,"Utils",()=>$882b6d93070905b3$re_export$Utils);Z4(j0.exports,"ReactSortable",()=>Dn);function Vw(t){t.parentElement!==null&&t.parentElement.removeChild(t)}function cZ(t,a,r){let e=t.children[r]||null;t.insertBefore(a,e)}function Iu(t){t.forEach(a=>Vw(a.element))}function Hw(t){t.forEach(a=>{cZ(a.parentElement,a.element,a.oldIndex)})}function Eu(t,a){let r=ww(t),e={parentElement:t.from},c=[];switch(r){case"normal":c=[{element:t.item,newIndex:t.newIndex,oldIndex:t.oldIndex,parentElement:t.from}];break;case"swap":let o={element:t.item,oldIndex:t.oldIndex,newIndex:t.newIndex,...e},i={element:t.swapItem,oldIndex:t.newIndex,newIndex:t.oldIndex,...e};c=[o,i];break;case"multidrag":c=t.oldIndicies.map((h,v)=>({element:h.multiDragElement,oldIndex:h.index,newIndex:t.newIndicies[v].index,...e}));break}return lZ(c,a)}function nZ(t,a){let r=Lw(t,a);return Cw(t,r)}function Lw(t,a){let r=[...a];return t.concat().reverse().forEach(e=>r.splice(e.oldIndex,1)),r}function Cw(t,a,r,e){let c=[...a];return t.forEach(n=>{let l=e&&r&&e(n.item,r);c.splice(n.newIndex,0,l||n.item)}),c}function ww(t){return t.oldIndicies&&t.oldIndicies.length>0?"multidrag":t.swapItem?"swap":"normal"}function lZ(t,a){return t.map(e=>({...e,item:a[e.oldIndex]})).sort((e,c)=>e.oldIndex-c.oldIndex)}function oZ(t){let{list:a,setList:r,children:e,tag:c,style:n,className:l,clone:o,onAdd:i,onChange:h,onChoose:v,onClone:d,onEnd:u,onFilter:s,onRemove:g,onSort:p,onStart:L,onUnchoose:f,onUpdate:m,onMove:H,onSpill:w,onSelect:A,onDeselect:C,...k}=t;return k}var p4={dragging:null},Dn=class extends Sa.Component{constructor(a){super(a),this.ref=(0,Sa.createRef)();let r=[...a.list].map(e=>Object.assign(e,{chosen:!1,selected:!1}));a.setList(r,this.sortable,p4),Nn(xw)(!a.plugins,` Plugins prop is no longer supported. Instead, mount it with "Sortable.mount(new MultiDrag())" Please read the updated README.md at https://github.com/SortableJS/react-sortablejs. - `)}componentDidMount(){if(this.ref.current===null)return;let a=this.makeOptions();bn(uN).create(this.ref.current,a)}componentDidUpdate(a){a.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){let{tag:a,style:r,className:e,id:c}=this.props,n={style:r,className:e,id:c},l=!a||a===null?"div":a;return(0,xa.createElement)(l,{ref:this.ref,...n},this.getChildren())}getChildren(){let{children:a,dataIdAttr:r,selectedClass:e="sortable-selected",chosenClass:c="sortable-chosen",dragClass:n="sortable-drag",fallbackClass:l="sortable-falback",ghostClass:o="sortable-ghost",swapClass:i="sortable-swap-highlight",filter:h="sortable-filter",list:v}=this.props;if(!a||a==null)return null;let d=r||"data-id";return xa.Children.map(a,(u,s)=>{if(u===void 0)return;let g=v[s]||{},{className:p}=u.props,L=typeof h=="string"&&{[h.replace(".","")]:!!g.filtered},f=bn(sN)(p,{[e]:g.selected,[c]:g.chosen,...L});return(0,xa.cloneElement)(u,{[d]:u.key,className:f})})}get sortable(){let a=this.ref.current;if(a===null)return null;let r=Object.keys(a).find(e=>e.includes("Sortable"));return r?a[r]:null}makeOptions(){let a=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],r=["onChange","onClone","onFilter","onSort"],e=MN(this.props);return a.forEach(n=>e[n]=this.prepareOnHandlerPropAndDOM(n)),r.forEach(n=>e[n]=this.prepareOnHandlerProp(n)),{...e,onMove:(n,l)=>{let{onMove:o}=this.props,i=n.willInsertAfter||-1;if(!o)return i;let h=o(n,l,this.sortable,d4);return typeof h>"u"?!1:h}}}prepareOnHandlerPropAndDOM(a){return r=>{this.callOnHandlerProp(r,a),this[a](r)}}prepareOnHandlerProp(a){return r=>{this.callOnHandlerProp(r,a)}}callOnHandlerProp(a,r){let e=this.props[r];e&&e(a,this.sortable,d4)}onAdd(a){let{list:r,setList:e,clone:c}=this.props,n=[...d4.dragging.props.list],l=Vu(a,n);Hu(l);let o=aw(l,r,a,c).map(i=>Object.assign(i,{selected:!1}));e(o,this.sortable,d4)}onRemove(a){let{list:r,setList:e}=this.props,c=rw(a),n=Vu(a,r);YC(n);let l=[...r];if(a.pullMode!=="clone")l=tw(n,l);else{let o=n;switch(c){case"multidrag":o=n.map((i,h)=>({...i,element:a.clones[h]}));break;case"normal":o=n.map(i=>({...i,element:a.clone}));break;case"swap":default:bn(QC)(!0,`mode "${c}" cannot clone. Please remove "props.clone" from when using the "${c}" plugin`)}Hu(o),n.forEach(i=>{let h=i.oldIndex,v=this.props.clone(i.item,a);l.splice(h,1,v)})}l=l.map(o=>Object.assign(o,{selected:!1})),e(l,this.sortable,d4)}onUpdate(a){let{list:r,setList:e}=this.props,c=Vu(a,r);Hu(c),YC(c);let n=zN(c,r);return e(n,this.sortable,d4)}onStart(){d4.dragging=this}onEnd(){d4.dragging=null}onChoose(a){let{list:r,setList:e}=this.props,c=r.map((n,l)=>{let o=n;return l===a.oldIndex&&(o=Object.assign(n,{chosen:!0})),o});e(c,this.sortable,d4)}onUnchoose(a){let{list:r,setList:e}=this.props,c=r.map((n,l)=>{let o=n;return l===a.oldIndex&&(o=Object.assign(o,{chosen:!1})),o});e(c,this.sortable,d4)}onSpill(a){let{removeOnSpill:r,revertOnSpill:e}=this.props;r&&!e&&JC(a.item)}onSelect(a){let{list:r,setList:e}=this.props,c=r.map(n=>Object.assign(n,{selected:!1}));a.newIndicies.forEach(n=>{let l=n.index;if(l===-1){console.log(`"${a.type}" had indice of "${n.index}", which is probably -1 and doesn't usually happen here.`),console.log(a);return}c[l].selected=!0}),e(c,this.sortable,d4)}onDeselect(a){let{list:r,setList:e}=this.props,c=r.map(n=>Object.assign(n,{selected:!1}));a.newIndicies.forEach(n=>{let l=n.index;l!==-1&&(c[l].selected=!0)}),e(c,this.sortable,d4)}};hs(Fn,"defaultProps",{clone:a=>a});var mN={};gN(Z0.exports,mN)});function rS(){let t={};return{subscribe:(a,r)=>(t[a]===void 0&&(t[a]=new Set),t[a].add(r),{unsubscribe:()=>{t[a].delete(r)}}),dispatch:(a,r)=>{t[a]?.forEach(e=>e(r))}}}var vs=rS;var g7=!1;try{g7=!1}catch{}var eS="TEMPLATE_CHOOSER",ds=eS;async function us(){return new Promise(t=>{fetch("/testing-tree").then(a=>a.json()).then(a=>{t(a)}).catch(a=>{console.error("/testing-tree error",a),t(ds)})})}function ss({messageDispatch:t,showMessages:a}){let r=a?console.log:(...c)=>{};return{sendMsg:c=>{switch(r("Static sendMsg()",c),c.path){case"READY-FOR-STATE":{us().then(n=>{n==="TEMPLATE_CHOOSER"?t.dispatch("TEMPLATE_CHOOSER","USER-CHOICE"):t.dispatch("UPDATED-TREE",n)});return}case"TEMPLATE-SELECTION":{t.dispatch("UPDATED-TREE",c.payload.uiTree);return}case"APP-PREVIEW-REQUEST":{if(!g7)return;t.dispatch("APP-PREVIEW-STATUS","FAKE-PREVIEW");return}}},incomingMsgs:t,mode:"STATIC"}}function Bl({onClose:t,messageDispatch:a,pathToWebsocket:r=window.location.host+window.location.pathname}){let e=!1;return new Promise(c=>{try{if(!document.location.host)throw new Error("Not on a served site!");let n=new WebSocket(cS(r)),l={sendMsg:o=>{nS(n,o)},incomingMsgs:a,mode:"HTTPUV"};n.onerror=o=>{c("NO-WS-CONNECTION")},n.onopen=o=>{lS(n,i=>{let{path:h,payload:v}=i;a.dispatch(h,v)}),c(l),e=!0},n.onclose=o=>{e?t():c("NO-WS-CONNECTION")}}catch{c("NO-WS-CONNECTION")}})}function cS(t){return(window.location.protocol==="https:"?"wss:":"ws:")+"//"+t}function nS(t,a){let r=new Blob([JSON.stringify(a)],{type:"application/json"});t.send(r)}function lS(t,a){t.addEventListener("message",r=>{a(oS(r))})}function oS(t){return JSON.parse(t.data)}var DA=V(qz());var Xi=V(X()),Jz=V(b()),qi=console.log,bF={sendMsg:t=>qi("Sending message to backend",t),incomingMsgs:{subscribe:(t,a)=>(qi(`Request for subscription to ${t}:`,a),{unsubscribe:()=>qi(`Request for removing subscription to ${t}:`,a)})},mode:"HTTPUV"},Qz=Xi.default.createContext(bF);function Yz({children:t,sendMsg:a,incomingMsgs:r,mode:e}){return(0,Jz.jsx)(Qz.Provider,{value:{sendMsg:a,incomingMsgs:r,mode:e},children:t})}function G3(){return Xi.default.useContext(Qz)}var mt=V(X());var h1=V(X());function of(t){return function(a){return typeof a===t}}var kF=of("function"),RF=function(t){return t===null},Ki=function(t){return Object.prototype.toString.call(t).slice(8,-1)==="RegExp"},Qi=function(t){return!IF(t)&&!RF(t)&&(kF(t)||typeof t=="object")},IF=of("undefined");var Yi=function(t){var a=typeof Symbol=="function"&&Symbol.iterator,r=a&&t[a],e=0;if(r)return r.call(t);if(t&&typeof t.length=="number")return{next:function(){return t&&e>=t.length&&(t=void 0),{value:t&&t[e++],done:!t}}};throw new TypeError(a?"Object is not iterable.":"Symbol.iterator is not defined.")};function EF(t,a){var r=t.length;if(r!==a.length)return!1;for(var e=r;e--!==0;)if(!a0(t[e],a[e]))return!1;return!0}function PF(t,a){if(t.byteLength!==a.byteLength)return!1;for(var r=new DataView(t.buffer),e=new DataView(a.buffer),c=t.byteLength;c--;)if(r.getUint8(c)!==e.getUint8(c))return!1;return!0}function TF(t,a){var r,e,c,n;if(t.size!==a.size)return!1;try{for(var l=Yi(t.entries()),o=l.next();!o.done;o=l.next()){var i=o.value;if(!a.has(i[0]))return!1}}catch(d){r={error:d}}finally{try{o&&!o.done&&(e=l.return)&&e.call(l)}finally{if(r)throw r.error}}try{for(var h=Yi(t.entries()),v=h.next();!v.done;v=h.next()){var i=v.value;if(!a0(i[1],a.get(i[0])))return!1}}catch(d){c={error:d}}finally{try{v&&!v.done&&(n=h.return)&&n.call(h)}finally{if(c)throw c.error}}return!0}function _F(t,a){var r,e;if(t.size!==a.size)return!1;try{for(var c=Yi(t.entries()),n=c.next();!n.done;n=c.next()){var l=n.value;if(!a.has(l[0]))return!1}}catch(o){r={error:o}}finally{try{n&&!n.done&&(e=c.return)&&e.call(c)}finally{if(r)throw r.error}}return!0}function a0(t,a){if(t===a)return!0;if(t&&Qi(t)&&a&&Qi(a)){if(t.constructor!==a.constructor)return!1;if(Array.isArray(t)&&Array.isArray(a))return EF(t,a);if(t instanceof Map&&a instanceof Map)return TF(t,a);if(t instanceof Set&&a instanceof Set)return _F(t,a);if(ArrayBuffer.isView(t)&&ArrayBuffer.isView(a))return PF(t,a);if(Ki(t)&&Ki(a))return t.source===a.source&&t.flags===a.flags;if(t.valueOf!==Object.prototype.valueOf)return t.valueOf()===a.valueOf();if(t.toString!==Object.prototype.toString)return t.toString()===a.toString();var r=Object.keys(t),e=Object.keys(a);if(r.length!==e.length)return!1;for(var c=r.length;c--!==0;)if(!Object.prototype.hasOwnProperty.call(a,r[c]))return!1;for(var c=r.length;c--!==0;){var n=r[c];if(!(n==="_owner"&&t.$$typeof)&&!a0(t[n],a[n]))return!1}return!0}return Number.isNaN(t)&&Number.isNaN(a)?!0:t===a}var DF=["innerHTML","ownerDocument","style","attributes","nodeValue"],NF=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],ZF=["bigint","boolean","null","number","string","symbol","undefined"];function se(t){var a=Object.prototype.toString.call(t).slice(8,-1);if(/HTML\w+Element/.test(a))return"HTMLElement";if(GF(a))return a}function Y4(t){return function(a){return se(a)===t}}function GF(t){return NF.includes(t)}function lt(t){return function(a){return typeof a===t}}function UF(t){return ZF.includes(t)}function Y(t){if(t===null)return"null";switch(typeof t){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined";default:}if(Y.array(t))return"Array";if(Y.plainFunction(t))return"Function";var a=se(t);return a||"Object"}Y.array=Array.isArray;Y.arrayOf=function(t,a){return!Y.array(t)&&!Y.function(a)?!1:t.every(function(r){return a(r)})};Y.asyncGeneratorFunction=function(t){return se(t)==="AsyncGeneratorFunction"};Y.asyncFunction=Y4("AsyncFunction");Y.bigint=lt("bigint");Y.boolean=function(t){return t===!0||t===!1};Y.date=Y4("Date");Y.defined=function(t){return!Y.undefined(t)};Y.domElement=function(t){return Y.object(t)&&!Y.plainObject(t)&&t.nodeType===1&&Y.string(t.nodeName)&&DF.every(function(a){return a in t})};Y.empty=function(t){return Y.string(t)&&t.length===0||Y.array(t)&&t.length===0||Y.object(t)&&!Y.map(t)&&!Y.set(t)&&Object.keys(t).length===0||Y.set(t)&&t.size===0||Y.map(t)&&t.size===0};Y.error=Y4("Error");Y.function=lt("function");Y.generator=function(t){return Y.iterable(t)&&Y.function(t.next)&&Y.function(t.throw)};Y.generatorFunction=Y4("GeneratorFunction");Y.instanceOf=function(t,a){return!t||!a?!1:Object.getPrototypeOf(t)===a.prototype};Y.iterable=function(t){return!Y.nullOrUndefined(t)&&Y.function(t[Symbol.iterator])};Y.map=Y4("Map");Y.nan=function(t){return Number.isNaN(t)};Y.null=function(t){return t===null};Y.nullOrUndefined=function(t){return Y.null(t)||Y.undefined(t)};Y.number=function(t){return lt("number")(t)&&!Y.nan(t)};Y.numericString=function(t){return Y.string(t)&&t.length>0&&!Number.isNaN(Number(t))};Y.object=function(t){return!Y.nullOrUndefined(t)&&(Y.function(t)||typeof t=="object")};Y.oneOf=function(t,a){return Y.array(t)?t.indexOf(a)>-1:!1};Y.plainFunction=Y4("Function");Y.plainObject=function(t){if(se(t)!=="Object")return!1;var a=Object.getPrototypeOf(t);return a===null||a===Object.getPrototypeOf({})};Y.primitive=function(t){return Y.null(t)||UF(typeof t)};Y.promise=Y4("Promise");Y.propertyOf=function(t,a,r){if(!Y.object(t)||!a)return!1;var e=t[a];return Y.function(r)?r(e):Y.defined(e)};Y.regexp=Y4("RegExp");Y.set=Y4("Set");Y.string=lt("string");Y.symbol=lt("symbol");Y.undefined=lt("undefined");Y.weakMap=Y4("WeakMap");Y.weakSet=Y4("WeakSet");var r1=Y;function WF(){for(var t=[],a=0;ai);return r1.undefined(e)||(h=h&&i===e),r1.undefined(n)||(h=h&&o===n),h}function th(t,a,r){var e=r.key,c=r.type,n=r.value,l=J4(t,e),o=J4(a,e),i=c==="added"?l:o,h=c==="added"?o:l;if(!r1.nullOrUndefined(n)){if(r1.defined(i)){if(r1.array(i)||r1.plainObject(i))return jF(i,h,n)}else return a0(h,n);return!1}return[l,o].every(r1.array)?!h.every(rh(i)):[l,o].every(r1.plainObject)?qF(Object.keys(i),Object.keys(h)):![l,o].every(function(v){return r1.primitive(v)&&r1.defined(v)})&&(c==="added"?!r1.defined(l)&&r1.defined(o):r1.defined(l)&&!r1.defined(o))}function ah(t,a,r){var e=r===void 0?{}:r,c=e.key,n=J4(t,c),l=J4(a,c);if(!df(n,l))throw new TypeError("Inputs have different types");if(!WF(n,l))throw new TypeError("Inputs don't have length");return[n,l].every(r1.plainObject)&&(n=Object.keys(n),l=Object.keys(l)),[n,l]}function hf(t){return function(a){var r=a[0],e=a[1];return r1.array(t)?a0(t,e)||t.some(function(c){return a0(c,e)||r1.array(e)&&rh(e)(c)}):r1.plainObject(t)&&t[r]?!!t[r]&&a0(t[r],e):a0(t,e)}}function qF(t,a){return a.some(function(r){return!t.includes(r)})}function vf(t){return function(a){return r1.array(t)?t.some(function(r){return a0(r,a)||r1.array(a)&&rh(a)(r)}):a0(t,a)}}function ot(t,a){return r1.array(t)?t.some(function(r){return a0(r,a)}):a0(t,a)}function rh(t){return function(a){return t.some(function(r){return a0(r,a)})}}function df(){for(var t=[],a=0;age(a)===t}function QF(t){return $F.includes(t)}function it(t){return a=>typeof a===t}function YF(t){return KF.includes(t)}function J(t){if(t===null)return"null";switch(typeof t){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined";default:}if(J.array(t))return"Array";if(J.plainFunction(t))return"Function";let a=ge(t);return a||"Object"}J.array=Array.isArray;J.arrayOf=(t,a)=>!J.array(t)&&!J.function(a)?!1:t.every(r=>a(r));J.asyncGeneratorFunction=t=>ge(t)==="AsyncGeneratorFunction";J.asyncFunction=t5("AsyncFunction");J.bigint=it("bigint");J.boolean=t=>t===!0||t===!1;J.date=t5("Date");J.defined=t=>!J.undefined(t);J.domElement=t=>J.object(t)&&!J.plainObject(t)&&t.nodeType===1&&J.string(t.nodeName)&&XF.every(a=>a in t);J.empty=t=>J.string(t)&&t.length===0||J.array(t)&&t.length===0||J.object(t)&&!J.map(t)&&!J.set(t)&&Object.keys(t).length===0||J.set(t)&&t.size===0||J.map(t)&&t.size===0;J.error=t5("Error");J.function=it("function");J.generator=t=>J.iterable(t)&&J.function(t.next)&&J.function(t.throw);J.generatorFunction=t5("GeneratorFunction");J.instanceOf=(t,a)=>!t||!a?!1:Object.getPrototypeOf(t)===a.prototype;J.iterable=t=>!J.nullOrUndefined(t)&&J.function(t[Symbol.iterator]);J.map=t5("Map");J.nan=t=>Number.isNaN(t);J.null=t=>t===null;J.nullOrUndefined=t=>J.null(t)||J.undefined(t);J.number=t=>it("number")(t)&&!J.nan(t);J.numericString=t=>J.string(t)&&t.length>0&&!Number.isNaN(Number(t));J.object=t=>!J.nullOrUndefined(t)&&(J.function(t)||typeof t=="object");J.oneOf=(t,a)=>J.array(t)?t.indexOf(a)>-1:!1;J.plainFunction=t5("Function");J.plainObject=t=>{if(ge(t)!=="Object")return!1;let a=Object.getPrototypeOf(t);return a===null||a===Object.getPrototypeOf({})};J.primitive=t=>J.null(t)||YF(typeof t);J.promise=t5("Promise");J.propertyOf=(t,a,r)=>{if(!J.object(t)||!a)return!1;let e=t[a];return J.function(r)?r(e):J.defined(e)};J.regexp=t5("RegExp");J.set=t5("Set");J.string=it("string");J.symbol=it("symbol");J.undefined=it("undefined");J.weakMap=t5("WeakMap");J.weakSet=t5("WeakSet");var p2=J;var gt=V(Z6()),vM=V(eh()),dM=V(pf()),Sh=V(ff()),X5=V(oh()),j3=V(ih());var m1=V(X()),W=V($i()),Vh=V(Cf());var i9=typeof window<"u"&&typeof document<"u"&&typeof navigator<"u",SO=function(){for(var t=["Edge","Trident","Firefox"],a=0;a=0)return 1;return 0}();function bO(t){var a=!1;return function(){a||(a=!0,window.Promise.resolve().then(function(){a=!1,t()}))}}function FO(t){var a=!1;return function(){a||(a=!0,setTimeout(function(){a=!1,t()},SO))}}var OO=i9&&window.Promise,kO=OO?bO:FO;function bf(t){var a={};return t&&a.toString.call(t)==="[object Function]"}function G6(t,a){if(t.nodeType!==1)return[];var r=t.ownerDocument.defaultView,e=r.getComputedStyle(t,null);return a?e[a]:e}function ph(t){return t.nodeName==="HTML"?t:t.parentNode||t.host}function h9(t){if(!t)return document.body;switch(t.nodeName){case"HTML":case"BODY":return t.ownerDocument.body;case"#document":return t.body}var a=G6(t),r=a.overflow,e=a.overflowX,c=a.overflowY;return/(auto|scroll|overlay)/.test(r+c+e)?t:h9(ph(t))}function Ff(t){return t&&t.referenceNode?t.referenceNode:t}var wf=i9&&!!(window.MSInputMethodContext&&document.documentMode),Bf=i9&&/MSIE 10/.test(navigator.userAgent);function st(t){return t===11?wf:t===10?Bf:wf||Bf}function vt(t){if(!t)return document.documentElement;for(var a=st(10)?document.body:null,r=t.offsetParent||null;r===a&&t.nextElementSibling;)r=(t=t.nextElementSibling).offsetParent;var e=r&&r.nodeName;return!e||e==="BODY"||e==="HTML"?t?t.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(r.nodeName)!==-1&&G6(r,"position")==="static"?vt(r):r}function RO(t){var a=t.nodeName;return a==="BODY"?!1:a==="HTML"||vt(t.firstElementChild)===t}function uh(t){return t.parentNode!==null?uh(t.parentNode):t}function ye(t,a){if(!t||!t.nodeType||!a||!a.nodeType)return document.documentElement;var r=t.compareDocumentPosition(a)&Node.DOCUMENT_POSITION_FOLLOWING,e=r?t:a,c=r?a:t,n=document.createRange();n.setStart(e,0),n.setEnd(c,0);var l=n.commonAncestorContainer;if(t!==l&&a!==l||e.contains(c))return RO(l)?l:vt(l);var o=uh(t);return o.host?ye(o.host,a):ye(t,uh(a).host)}function dt(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",r=a==="top"?"scrollTop":"scrollLeft",e=t.nodeName;if(e==="BODY"||e==="HTML"){var c=t.ownerDocument.documentElement,n=t.ownerDocument.scrollingElement||c;return n[r]}return t[r]}function IO(t,a){var r=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,e=dt(a,"top"),c=dt(a,"left"),n=r?-1:1;return t.top+=e*n,t.bottom+=e*n,t.left+=c*n,t.right+=c*n,t}function yf(t,a){var r=a==="x"?"Left":"Top",e=r==="Left"?"Right":"Bottom";return parseFloat(t["border"+r+"Width"])+parseFloat(t["border"+e+"Width"])}function Af(t,a,r,e){return Math.max(a["offset"+t],a["scroll"+t],r["client"+t],r["offset"+t],r["scroll"+t],st(10)?parseInt(r["offset"+t])+parseInt(e["margin"+(t==="Height"?"Top":"Left")])+parseInt(e["margin"+(t==="Height"?"Bottom":"Right")]):0)}function Of(t){var a=t.body,r=t.documentElement,e=st(10)&&getComputedStyle(r);return{height:Af("Height",a,r,e),width:Af("Width",a,r,e)}}var EO=function(t,a){if(!(t instanceof a))throw new TypeError("Cannot call a class as a function")},PO=function(){function t(a,r){for(var e=0;e2&&arguments[2]!==void 0?arguments[2]:!1,e=st(10),c=a.nodeName==="HTML",n=sh(t),l=sh(a),o=h9(t),i=G6(a),h=parseFloat(i.borderTopWidth),v=parseFloat(i.borderLeftWidth);r&&c&&(l.top=Math.max(l.top,0),l.left=Math.max(l.left,0));var d=W3({top:n.top-l.top-h,left:n.left-l.left-v,width:n.width,height:n.height});if(d.marginTop=0,d.marginLeft=0,!e&&c){var u=parseFloat(i.marginTop),s=parseFloat(i.marginLeft);d.top-=h-u,d.bottom-=h-u,d.left-=v-s,d.right-=v-s,d.marginTop=u,d.marginLeft=s}return(e&&!r?a.contains(o):a===o&&o.nodeName!=="BODY")&&(d=IO(d,a)),d}function TO(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,r=t.ownerDocument.documentElement,e=zh(t,r),c=Math.max(r.clientWidth,window.innerWidth||0),n=Math.max(r.clientHeight,window.innerHeight||0),l=a?0:dt(r),o=a?0:dt(r,"left"),i={top:l-e.top+e.marginTop,left:o-e.left+e.marginLeft,width:c,height:n};return W3(i)}function kf(t){var a=t.nodeName;if(a==="BODY"||a==="HTML")return!1;if(G6(t,"position")==="fixed")return!0;var r=ph(t);return r?kf(r):!1}function Rf(t){if(!t||!t.parentElement||st())return document.documentElement;for(var a=t.parentElement;a&&G6(a,"transform")==="none";)a=a.parentElement;return a||document.documentElement}function fh(t,a,r,e){var c=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,n={top:0,left:0},l=c?Rf(t):ye(t,Ff(a));if(e==="viewport")n=TO(l,c);else{var o=void 0;e==="scrollParent"?(o=h9(ph(a)),o.nodeName==="BODY"&&(o=t.ownerDocument.documentElement)):e==="window"?o=t.ownerDocument.documentElement:o=e;var i=zh(o,l,c);if(o.nodeName==="HTML"&&!kf(l)){var h=Of(t.ownerDocument),v=h.height,d=h.width;n.top+=i.top-i.marginTop,n.bottom=v+i.top,n.left+=i.left-i.marginLeft,n.right=d+i.left}else n=i}r=r||0;var u=typeof r=="number";return n.left+=u?r:r.left||0,n.top+=u?r:r.top||0,n.right-=u?r:r.right||0,n.bottom-=u?r:r.bottom||0,n}function _O(t){var a=t.width,r=t.height;return a*r}function If(t,a,r,e,c){var n=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(t.indexOf("auto")===-1)return t;var l=fh(r,e,n,c),o={top:{width:l.width,height:a.top-l.top},right:{width:l.right-a.right,height:l.height},bottom:{width:l.width,height:l.bottom-a.bottom},left:{width:a.left-l.left,height:l.height}},i=Object.keys(o).map(function(u){return C4({key:u},o[u],{area:_O(o[u])})}).sort(function(u,s){return s.area-u.area}),h=i.filter(function(u){var s=u.width,g=u.height;return s>=r.clientWidth&&g>=r.clientHeight}),v=h.length>0?h[0].key:i[0].key,d=t.split("-")[1];return v+(d?"-"+d:"")}function Ef(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,c=e?Rf(a):ye(a,Ff(r));return zh(r,c,e)}function Pf(t){var a=t.ownerDocument.defaultView,r=a.getComputedStyle(t),e=parseFloat(r.marginTop||0)+parseFloat(r.marginBottom||0),c=parseFloat(r.marginLeft||0)+parseFloat(r.marginRight||0),n={width:t.offsetWidth+c,height:t.offsetHeight+e};return n}function Ae(t){var a={left:"right",right:"left",bottom:"top",top:"bottom"};return t.replace(/left|right|bottom|top/g,function(r){return a[r]})}function Tf(t,a,r){r=r.split("-")[0];var e=Pf(t),c={width:e.width,height:e.height},n=["right","left"].indexOf(r)!==-1,l=n?"top":"left",o=n?"left":"top",i=n?"height":"width",h=n?"width":"height";return c[l]=a[l]+a[i]/2-e[i]/2,r===o?c[o]=a[o]-e[h]:c[o]=a[Ae(o)],c}function v9(t,a){return Array.prototype.find?t.find(a):t.filter(a)[0]}function DO(t,a,r){if(Array.prototype.findIndex)return t.findIndex(function(c){return c[a]===r});var e=v9(t,function(c){return c[a]===r});return t.indexOf(e)}function _f(t,a,r){var e=r===void 0?t:t.slice(0,DO(t,"name",r));return e.forEach(function(c){c.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var n=c.function||c.fn;c.enabled&&bf(n)&&(a.offsets.popper=W3(a.offsets.popper),a.offsets.reference=W3(a.offsets.reference),a=n(a,c))}),a}function NO(){if(!this.state.isDestroyed){var t={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};t.offsets.reference=Ef(this.state,this.popper,this.reference,this.options.positionFixed),t.placement=If(this.options.placement,t.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),t.originalPlacement=t.placement,t.positionFixed=this.options.positionFixed,t.offsets.popper=Tf(this.popper,t.offsets.reference,t.placement),t.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",t=_f(this.modifiers,t),this.state.isCreated?this.options.onUpdate(t):(this.state.isCreated=!0,this.options.onCreate(t))}}function Df(t,a){return t.some(function(r){var e=r.name,c=r.enabled;return c&&e===a})}function Mh(t){for(var a=[!1,"ms","Webkit","Moz","O"],r=t.charAt(0).toUpperCase()+t.slice(1),e=0;el[s]&&(t.offsets.popper[d]+=o[d]+g-l[s]),t.offsets.popper=W3(t.offsets.popper);var p=o[d]+o[h]/2-g/2,L=G6(t.instance.popper),f=parseFloat(L["margin"+v]),m=parseFloat(L["border"+v+"Width"]),H=p-t.offsets.popper[d]-f-m;return H=Math.max(Math.min(l[h]-g,H),0),t.arrowElement=e,t.offsets.arrow=(r={},ut(r,d,Math.round(H)),ut(r,u,""),r),t}function tk(t){return t==="end"?"start":t==="start"?"end":t}var Uf=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],vh=Uf.slice(3);function Sf(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,r=vh.indexOf(t),e=vh.slice(r+1).concat(vh.slice(0,r));return a?e.reverse():e}var dh={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function ak(t,a){if(Df(t.instance.modifiers,"inner")||t.flipped&&t.placement===t.originalPlacement)return t;var r=fh(t.instance.popper,t.instance.reference,a.padding,a.boundariesElement,t.positionFixed),e=t.placement.split("-")[0],c=Ae(e),n=t.placement.split("-")[1]||"",l=[];switch(a.behavior){case dh.FLIP:l=[e,c];break;case dh.CLOCKWISE:l=Sf(e);break;case dh.COUNTERCLOCKWISE:l=Sf(e,!0);break;default:l=a.behavior}return l.forEach(function(o,i){if(e!==o||l.length===i+1)return t;e=t.placement.split("-")[0],c=Ae(e);var h=t.offsets.popper,v=t.offsets.reference,d=Math.floor,u=e==="left"&&d(h.right)>d(v.left)||e==="right"&&d(h.left)d(v.top)||e==="bottom"&&d(h.top)d(r.right),p=d(h.top)d(r.bottom),f=e==="left"&&s||e==="right"&&g||e==="top"&&p||e==="bottom"&&L,m=["top","bottom"].indexOf(e)!==-1,H=!!a.flipVariations&&(m&&n==="start"&&s||m&&n==="end"&&g||!m&&n==="start"&&p||!m&&n==="end"&&L),w=!!a.flipVariationsByContent&&(m&&n==="start"&&g||m&&n==="end"&&s||!m&&n==="start"&&L||!m&&n==="end"&&p),A=H||w;(u||f||A)&&(t.flipped=!0,(u||f)&&(e=l[i+1]),A&&(n=tk(n)),t.placement=e+(n?"-"+n:""),t.offsets.popper=C4({},t.offsets.popper,Tf(t.instance.popper,t.offsets.reference,t.placement)),t=_f(t.instance.modifiers,t,"flip"))}),t}function rk(t){var a=t.offsets,r=a.popper,e=a.reference,c=t.placement.split("-")[0],n=Math.floor,l=["top","bottom"].indexOf(c)!==-1,o=l?"right":"bottom",i=l?"left":"top",h=l?"width":"height";return r[o]n(e[o])&&(t.offsets.popper[i]=n(e[o])),t}function ek(t,a,r,e){var c=t.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),n=+c[1],l=c[2];if(!n)return t;if(l.indexOf("%")===0){var o=void 0;switch(l){case"%p":o=r;break;case"%":case"%r":default:o=e}var i=W3(o);return i[a]/100*n}else if(l==="vh"||l==="vw"){var h=void 0;return l==="vh"?h=Math.max(document.documentElement.clientHeight,window.innerHeight||0):h=Math.max(document.documentElement.clientWidth,window.innerWidth||0),h/100*n}else return n}function ck(t,a,r,e){var c=[0,0],n=["right","left"].indexOf(e)!==-1,l=t.split(/(\+|\-)/).map(function(v){return v.trim()}),o=l.indexOf(v9(l,function(v){return v.search(/,|\s/)!==-1}));l[o]&&l[o].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var i=/\s*,\s*|\s+/,h=o!==-1?[l.slice(0,o).concat([l[o].split(i)[0]]),[l[o].split(i)[1]].concat(l.slice(o+1))]:[l];return h=h.map(function(v,d){var u=(d===1?!n:n)?"height":"width",s=!1;return v.reduce(function(g,p){return g[g.length-1]===""&&["+","-"].indexOf(p)!==-1?(g[g.length-1]=p,s=!0,g):s?(g[g.length-1]+=p,s=!1,g):g.concat(p)},[]).map(function(g){return ek(g,u,a,r)})}),h.forEach(function(v,d){v.forEach(function(u,s){mh(u)&&(c[d]+=u*(v[s-1]==="-"?-1:1))})}),c}function nk(t,a){var r=a.offset,e=t.placement,c=t.offsets,n=c.popper,l=c.reference,o=e.split("-")[0],i=void 0;return mh(+r)?i=[+r,0]:i=ck(r,n,l,o),o==="left"?(n.top+=i[0],n.left-=i[1]):o==="right"?(n.top+=i[0],n.left+=i[1]):o==="top"?(n.left+=i[0],n.top-=i[1]):o==="bottom"&&(n.left+=i[0],n.top+=i[1]),t.popper=n,t}function lk(t,a){var r=a.boundariesElement||vt(t.instance.popper);t.instance.reference===r&&(r=vt(r));var e=Mh("transform"),c=t.instance.popper.style,n=c.top,l=c.left,o=c[e];c.top="",c.left="",c[e]="";var i=fh(t.instance.popper,t.instance.reference,a.padding,r,t.positionFixed);c.top=n,c.left=l,c[e]=o,a.boundaries=i;var h=a.priority,v=t.offsets.popper,d={primary:function(s){var g=v[s];return v[s]i[s]&&!a.escapeWithReference&&(p=Math.min(v[g],i[s]-(s==="right"?v.width:v.height))),ut({},g,p)}};return h.forEach(function(u){var s=["left","top"].indexOf(u)!==-1?"primary":"secondary";v=C4({},v,d[s](u))}),t.offsets.popper=v,t}function ok(t){var a=t.placement,r=a.split("-")[0],e=a.split("-")[1];if(e){var c=t.offsets,n=c.reference,l=c.popper,o=["bottom","top"].indexOf(r)!==-1,i=o?"left":"top",h=o?"width":"height",v={start:ut({},i,n[i]),end:ut({},i,n[i]+n[h]-l[h])};t.offsets.popper=C4({},l,v[e])}return t}function ik(t){if(!Gf(t.instance.modifiers,"hide","preventOverflow"))return t;var a=t.offsets.reference,r=v9(t.instance.modifiers,function(e){return e.name==="preventOverflow"}).boundaries;if(a.bottomr.right||a.top>r.bottom||a.right2&&arguments[2]!==void 0?arguments[2]:{};EO(this,t),this.scheduleUpdate=function(){return requestAnimationFrame(e.update)},this.update=kO(this.update.bind(this)),this.options=C4({},t.Defaults,c),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=a&&a.jquery?a[0]:a,this.popper=r&&r.jquery?r[0]:r,this.options.modifiers={},Object.keys(C4({},t.Defaults.modifiers,c.modifiers)).forEach(function(l){e.options.modifiers[l]=C4({},t.Defaults.modifiers[l]||{},c.modifiers?c.modifiers[l]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(l){return C4({name:l},e.options.modifiers[l])}).sort(function(l,o){return l.order-o.order}),this.modifiers.forEach(function(l){l.enabled&&bf(l.onLoad)&&l.onLoad(e.reference,e.popper,e.options,l,e.state)}),this.update();var n=this.options.eventsEnabled;n&&this.enableEventListeners(),this.state.eventsEnabled=n}return PO(t,[{key:"update",value:function(){return NO.call(this)}},{key:"destroy",value:function(){return ZO.call(this)}},{key:"enableEventListeners",value:function(){return UO.call(this)}},{key:"disableEventListeners",value:function(){return jO.call(this)}}]),t}();Se.Utils=(typeof window<"u"?window:global).PopperUtils;Se.placements=Uf;Se.Defaults=dk;var xh=Se;var Fe=V(ih());var u9=V(Z6()),Xf=V(eh());function Wf(t,a){var r=Object.keys(t);if(Object.getOwnPropertySymbols){var e=Object.getOwnPropertySymbols(t);a&&(e=e.filter(function(c){return Object.getOwnPropertyDescriptor(t,c).enumerable})),r.push.apply(r,e)}return r}function o2(t){for(var a=1;a"u"||!Reflect.construct||Reflect.construct.sham)return!1;if(typeof Proxy=="function")return!0;try{return Boolean.prototype.valueOf.call(Reflect.construct(Boolean,[],function(){})),!0}catch{return!1}}function sk(t,a){if(t==null)return{};var r={},e=Object.keys(t),c,n;for(n=0;n=0)&&(r[c]=t[c]);return r}function $f(t,a){if(t==null)return{};var r=sk(t,a),e,c;if(Object.getOwnPropertySymbols){var n=Object.getOwnPropertySymbols(t);for(c=0;c=0)&&(!Object.prototype.propertyIsEnumerable.call(t,e)||(r[e]=t[e]))}return r}function j5(t){if(t===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return t}function gk(t,a){if(a&&(typeof a=="object"||typeof a=="function"))return a;if(a!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return j5(t)}function z9(t){var a=uk();return function(){var e=Oe(t),c;if(a){var n=Oe(this).constructor;c=Reflect.construct(e,arguments,n)}else c=e.apply(this,arguments);return gk(this,c)}}var pk={flip:{padding:20},preventOverflow:{padding:10}},S1={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},q5=Xf.default.canUseDOM,d9=u9.default.createPortal!==void 0;function Hh(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function be(t){var a=t.title,r=t.data,e=t.warn,c=e===void 0?!1:e,n=t.debug,l=n===void 0?!1:n,o=c?console.warn||console.error:console.log;l&&a&&r&&(console.groupCollapsed("%creact-floater: ".concat(a),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(r)?r.forEach(function(i){r1.plainObject(i)&&i.key?o.apply(console,[i.key,i.value]):o.apply(console,[i])}):o.apply(console,[r]),console.groupEnd())}function zk(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;t.addEventListener(a,r,e)}function fk(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;t.removeEventListener(a,r,e)}function Mk(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,c;c=function(l){r(l),fk(t,a,c)},zk(t,a,c,e)}function qf(){}var Kf=function(t){p9(r,t);var a=z9(r);function r(){return s9(this,r),a.apply(this,arguments)}return g9(r,[{key:"componentDidMount",value:function(){!q5||(this.node||this.appendNode(),d9||this.renderPortal())}},{key:"componentDidUpdate",value:function(){!q5||d9||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!q5||!this.node||(d9||u9.default.unmountComponentAtNode(this.node),this.node&&this.node.parentNode===document.body&&(document.body.removeChild(this.node),this.node=void 0))}},{key:"appendNode",value:function(){var c=this.props,n=c.id,l=c.zIndex;this.node||(this.node=document.createElement("div"),n&&(this.node.id=n),l&&(this.node.style.zIndex=l),document.body.appendChild(this.node))}},{key:"renderPortal",value:function(){if(!q5)return null;var c=this.props,n=c.children,l=c.setRef;if(this.node||this.appendNode(),d9)return u9.default.createPortal(n,this.node);var o=u9.default.unstable_renderSubtreeIntoContainer(this,n.length>1?m1.default.createElement("div",null,n):n[0],this.node);return l(o),null}},{key:"renderReact16",value:function(){var c=this.props,n=c.hasChildren,l=c.placement,o=c.target;return n?this.renderPortal():o||l==="center"?this.renderPortal():null}},{key:"render",value:function(){return d9?this.renderReact16():null}}]),r}(m1.default.Component);u0(Kf,"propTypes",{children:W.default.oneOfType([W.default.element,W.default.array]),hasChildren:W.default.bool,id:W.default.oneOfType([W.default.string,W.default.number]),placement:W.default.string,setRef:W.default.func.isRequired,target:W.default.oneOfType([W.default.object,W.default.string]),zIndex:W.default.number});var Qf=function(t){p9(r,t);var a=z9(r);function r(){return s9(this,r),a.apply(this,arguments)}return g9(r,[{key:"parentStyle",get:function(){var c=this.props,n=c.placement,l=c.styles,o=l.arrow.length,i={pointerEvents:"none",position:"absolute",width:"100%"};return n.startsWith("top")?(i.bottom=0,i.left=0,i.right=0,i.height=o):n.startsWith("bottom")?(i.left=0,i.right=0,i.top=0,i.height=o):n.startsWith("left")?(i.right=0,i.top=0,i.bottom=0):n.startsWith("right")&&(i.left=0,i.top=0),i}},{key:"render",value:function(){var c=this.props,n=c.placement,l=c.setArrowRef,o=c.styles,i=o.arrow,h=i.color,v=i.display,d=i.length,u=i.margin,s=i.position,g=i.spread,p={display:v,position:s},L,f=g,m=d;return n.startsWith("top")?(L="0,0 ".concat(f/2,",").concat(m," ").concat(f,",0"),p.bottom=0,p.marginLeft=u,p.marginRight=u):n.startsWith("bottom")?(L="".concat(f,",").concat(m," ").concat(f/2,",0 0,").concat(m),p.top=0,p.marginLeft=u,p.marginRight=u):n.startsWith("left")?(m=g,f=d,L="0,0 ".concat(f,",").concat(m/2," 0,").concat(m),p.right=0,p.marginTop=u,p.marginBottom=u):n.startsWith("right")&&(m=g,f=d,L="".concat(f,",").concat(m," ").concat(f,",0 0,").concat(m/2),p.left=0,p.marginTop=u,p.marginBottom=u),m1.default.createElement("div",{className:"__floater__arrow",style:this.parentStyle},m1.default.createElement("span",{ref:l,style:p},m1.default.createElement("svg",{width:f,height:m,version:"1.1",xmlns:"http://www.w3.org/2000/svg"},m1.default.createElement("polygon",{points:L,fill:h}))))}}]),r}(m1.default.Component);u0(Qf,"propTypes",{placement:W.default.string.isRequired,setArrowRef:W.default.func.isRequired,styles:W.default.object.isRequired});var mk=["color","height","width"],Yf=function(a){var r=a.handleClick,e=a.styles,c=e.color,n=e.height,l=e.width,o=$f(e,mk);return m1.default.createElement("button",{"aria-label":"close",onClick:r,style:o,type:"button"},m1.default.createElement("svg",{width:"".concat(l,"px"),height:"".concat(n,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid"},m1.default.createElement("g",null,m1.default.createElement("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:c}))))};Yf.propTypes={handleClick:W.default.func.isRequired,styles:W.default.object.isRequired};var Jf=function(a){var r=a.content,e=a.footer,c=a.handleClick,n=a.open,l=a.positionWrapper,o=a.showCloseButton,i=a.title,h=a.styles,v={content:m1.default.isValidElement(r)?r:m1.default.createElement("div",{className:"__floater__content",style:h.content},r)};return i&&(v.title=m1.default.isValidElement(i)?i:m1.default.createElement("div",{className:"__floater__title",style:h.title},i)),e&&(v.footer=m1.default.isValidElement(e)?e:m1.default.createElement("div",{className:"__floater__footer",style:h.footer},e)),(o||l)&&!r1.boolean(n)&&(v.close=m1.default.createElement(Yf,{styles:h.close,handleClick:c})),m1.default.createElement("div",{className:"__floater__container",style:h.container},v.close,v.title,v.content,v.footer)};Jf.propTypes={content:W.default.node.isRequired,footer:W.default.node,handleClick:W.default.func.isRequired,open:W.default.bool,positionWrapper:W.default.bool.isRequired,showCloseButton:W.default.bool.isRequired,styles:W.default.object.isRequired,title:W.default.node};var tM=function(t){p9(r,t);var a=z9(r);function r(){return s9(this,r),a.apply(this,arguments)}return g9(r,[{key:"style",get:function(){var c=this.props,n=c.disableAnimation,l=c.component,o=c.placement,i=c.hideArrow,h=c.status,v=c.styles,d=v.arrow.length,u=v.floater,s=v.floaterCentered,g=v.floaterClosing,p=v.floaterOpening,L=v.floaterWithAnimation,f=v.floaterWithComponent,m={};return i||(o.startsWith("top")?m.padding="0 0 ".concat(d,"px"):o.startsWith("bottom")?m.padding="".concat(d,"px 0 0"):o.startsWith("left")?m.padding="0 ".concat(d,"px 0 0"):o.startsWith("right")&&(m.padding="0 0 0 ".concat(d,"px"))),[S1.OPENING,S1.OPEN].indexOf(h)!==-1&&(m=o2(o2({},m),p)),h===S1.CLOSING&&(m=o2(o2({},m),g)),h===S1.OPEN&&!n&&(m=o2(o2({},m),L)),o==="center"&&(m=o2(o2({},m),s)),l&&(m=o2(o2({},m),f)),o2(o2({},u),m)}},{key:"render",value:function(){var c=this.props,n=c.component,l=c.handleClick,o=c.hideArrow,i=c.setFloaterRef,h=c.status,v={},d=["__floater"];return n?m1.default.isValidElement(n)?v.content=m1.default.cloneElement(n,{closeFn:l}):v.content=n({closeFn:l}):v.content=m1.default.createElement(Jf,this.props),h===S1.OPEN&&d.push("__floater__open"),o||(v.arrow=m1.default.createElement(Qf,this.props)),m1.default.createElement("div",{ref:i,className:d.join(" "),style:this.style},m1.default.createElement("div",{className:"__floater__body"},v.content,v.arrow))}}]),r}(m1.default.Component);u0(tM,"propTypes",{component:W.default.oneOfType([W.default.func,W.default.element]),content:W.default.node,disableAnimation:W.default.bool.isRequired,footer:W.default.node,handleClick:W.default.func.isRequired,hideArrow:W.default.bool.isRequired,open:W.default.bool,placement:W.default.string.isRequired,positionWrapper:W.default.bool.isRequired,setArrowRef:W.default.func.isRequired,setFloaterRef:W.default.func.isRequired,showCloseButton:W.default.bool,status:W.default.string.isRequired,styles:W.default.object.isRequired,title:W.default.node});var aM=function(t){p9(r,t);var a=z9(r);function r(){return s9(this,r),a.apply(this,arguments)}return g9(r,[{key:"render",value:function(){var c=this.props,n=c.children,l=c.handleClick,o=c.handleMouseEnter,i=c.handleMouseLeave,h=c.setChildRef,v=c.setWrapperRef,d=c.style,u=c.styles,s;if(n)if(m1.default.Children.count(n)===1)if(!m1.default.isValidElement(n))s=m1.default.createElement("span",null,n);else{var g=r1.function(n.type)?"innerRef":"ref";s=m1.default.cloneElement(m1.default.Children.only(n),u0({},g,h))}else s=n;return s?m1.default.createElement("span",{ref:v,style:o2(o2({},u),d),onClick:l,onMouseEnter:o,onMouseLeave:i},s):null}}]),r}(m1.default.Component);u0(aM,"propTypes",{children:W.default.node,handleClick:W.default.func.isRequired,handleMouseEnter:W.default.func.isRequired,handleMouseLeave:W.default.func.isRequired,setChildRef:W.default.func.isRequired,setWrapperRef:W.default.func.isRequired,style:W.default.object,styles:W.default.object.isRequired});var xk={zIndex:100};function Hk(t){var a=(0,Fe.default)(xk,t.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:a.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:a.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:a}}var Vk=["arrow","flip","offset"],Lk=["position","top","right","bottom","left"],ke=function(t){p9(r,t);var a=z9(r);function r(e){var c;return s9(this,r),c=a.call(this,e),u0(j5(c),"setArrowRef",function(n){c.arrowRef=n}),u0(j5(c),"setChildRef",function(n){c.childRef=n}),u0(j5(c),"setFloaterRef",function(n){c.floaterRef=n}),u0(j5(c),"setWrapperRef",function(n){c.wrapperRef=n}),u0(j5(c),"handleTransitionEnd",function(){var n=c.state.status,l=c.props.callback;c.wrapperPopper&&c.wrapperPopper.instance.update(),c.setState({status:n===S1.OPENING?S1.OPEN:S1.IDLE},function(){var o=c.state.status;l(o===S1.OPEN?"open":"close",c.props)})}),u0(j5(c),"handleClick",function(){var n=c.props,l=n.event,o=n.open;if(!r1.boolean(o)){var i=c.state,h=i.positionWrapper,v=i.status;(c.event==="click"||c.event==="hover"&&h)&&(be({title:"click",data:[{event:l,status:v===S1.OPEN?"closing":"opening"}],debug:c.debug}),c.toggle())}}),u0(j5(c),"handleMouseEnter",function(){var n=c.props,l=n.event,o=n.open;if(!(r1.boolean(o)||Hh())){var i=c.state.status;c.event==="hover"&&i===S1.IDLE&&(be({title:"mouseEnter",data:[{key:"originalEvent",value:l}],debug:c.debug}),clearTimeout(c.eventDelayTimeout),c.toggle())}}),u0(j5(c),"handleMouseLeave",function(){var n=c.props,l=n.event,o=n.eventDelay,i=n.open;if(!(r1.boolean(i)||Hh())){var h=c.state,v=h.status,d=h.positionWrapper;c.event==="hover"&&(be({title:"mouseLeave",data:[{key:"originalEvent",value:l}],debug:c.debug}),o?[S1.OPENING,S1.OPEN].indexOf(v)!==-1&&!d&&!c.eventDelayTimeout&&(c.eventDelayTimeout=setTimeout(function(){delete c.eventDelayTimeout,c.toggle()},o*1e3)):c.toggle(S1.IDLE))}}),c.state={currentPlacement:e.placement,needsUpdate:!1,positionWrapper:e.wrapperOptions.position&&!!e.target,status:S1.INIT,statusWrapper:S1.INIT},c._isMounted=!1,c.hasMounted=!1,q5&&window.addEventListener("load",function(){c.popper&&c.popper.instance.update(),c.wrapperPopper&&c.wrapperPopper.instance.update()}),c}return g9(r,[{key:"componentDidMount",value:function(){if(!!q5){var c=this.state.positionWrapper,n=this.props,l=n.children,o=n.open,i=n.target;this._isMounted=!0,be({title:"init",data:{hasChildren:!!l,hasTarget:!!i,isControlled:r1.boolean(o),positionWrapper:c,target:this.target,floater:this.floaterRef},debug:this.debug}),this.hasMounted||(this.initPopper(),this.hasMounted=!0),!l&&i&&r1.boolean(o)}}},{key:"componentDidUpdate",value:function(c,n){if(!!q5){var l=this.props,o=l.autoOpen,i=l.open,h=l.target,v=l.wrapperOptions,d=U3(n,this.state),u=d.changedFrom,s=d.changed;if(c.open!==i){var g;r1.boolean(i)&&(g=i?S1.OPENING:S1.CLOSING),this.toggle(g)}(c.wrapperOptions.position!==v.position||c.target!==h)&&this.changeWrapperPosition(this.props),s("status",S1.IDLE)&&i?this.toggle(S1.OPEN):u("status",S1.INIT,S1.IDLE)&&o&&this.toggle(S1.OPEN),this.popper&&s("status",S1.OPENING)&&this.popper.instance.update(),this.floaterRef&&(s("status",S1.OPENING)||s("status",S1.CLOSING))&&Mk(this.floaterRef,"transitionend",this.handleTransitionEnd),s("needsUpdate",!0)&&this.rebuildPopper()}}},{key:"componentWillUnmount",value:function(){!q5||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var c=this,n=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,l=this.state.positionWrapper,o=this.props,i=o.disableFlip,h=o.getPopper,v=o.hideArrow,d=o.offset,u=o.placement,s=o.wrapperOptions,g=u==="top"||u==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(u==="center")this.setState({status:S1.IDLE});else if(n&&this.floaterRef){var p=this.options,L=p.arrow,f=p.flip,m=p.offset,H=$f(p,Vk);new xh(n,this.floaterRef,{placement:u,modifiers:o2({arrow:o2({enabled:!v,element:this.arrowRef},L),flip:o2({enabled:!i,behavior:g},f),offset:o2({offset:"0, ".concat(d,"px")},m)},H),onCreate:function(C){var k;if(c.popper=C,!((k=c.floaterRef)!==null&&k!==void 0&&k.isConnected)){c.setState({needsUpdate:!0});return}h(C,"floater"),c._isMounted&&c.setState({currentPlacement:C.placement,status:S1.IDLE}),u!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){c.popper=C;var k=c.state.currentPlacement;c._isMounted&&C.placement!==k&&c.setState({currentPlacement:C.placement})}})}if(l){var w=r1.undefined(s.offset)?0:s.offset;new xh(this.target,this.wrapperRef,{placement:s.placement||u,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(w,"px")},flip:{enabled:!1}},onCreate:function(C){c.wrapperPopper=C,c._isMounted&&c.setState({statusWrapper:S1.IDLE}),h(C,"wrapper"),u!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"rebuildPopper",value:function(){var c=this;this.floaterRefInterval=setInterval(function(){var n;(n=c.floaterRef)!==null&&n!==void 0&&n.isConnected&&(clearInterval(c.floaterRefInterval),c.setState({needsUpdate:!1}),c.initPopper())},50)}},{key:"changeWrapperPosition",value:function(c){var n=c.target,l=c.wrapperOptions;this.setState({positionWrapper:l.position&&!!n})}},{key:"toggle",value:function(c){var n=this.state.status,l=n===S1.OPEN?S1.CLOSING:S1.OPENING;r1.undefined(c)||(l=c),this.setState({status:l})}},{key:"debug",get:function(){var c=this.props.debug;return c||!!global.ReactFloaterDebug}},{key:"event",get:function(){var c=this.props,n=c.disableHoverToClick,l=c.event;return l==="hover"&&Hh()&&!n?"click":l}},{key:"options",get:function(){var c=this.props.options;return(0,Fe.default)(pk,c||{})}},{key:"styles",get:function(){var c=this,n=this.state,l=n.status,o=n.positionWrapper,i=n.statusWrapper,h=this.props.styles,v=(0,Fe.default)(Hk(h),h);if(o){var d;[S1.IDLE].indexOf(l)===-1||[S1.IDLE].indexOf(i)===-1?d=v.wrapperPosition:d=this.wrapperPopper.styles,v.wrapper=o2(o2({},v.wrapper),d)}if(this.target){var u=window.getComputedStyle(this.target);this.wrapperStyles?v.wrapper=o2(o2({},v.wrapper),this.wrapperStyles):["relative","static"].indexOf(u.position)===-1&&(this.wrapperStyles={},o||(Lk.forEach(function(s){c.wrapperStyles[s]=u[s]}),v.wrapper=o2(o2({},v.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return v}},{key:"target",get:function(){if(!q5)return null;var c=this.props.target;return c?r1.domElement(c)?c:document.querySelector(c):this.childRef||this.wrapperRef}},{key:"render",value:function(){var c=this.state,n=c.currentPlacement,l=c.positionWrapper,o=c.status,i=this.props,h=i.children,v=i.component,d=i.content,u=i.disableAnimation,s=i.footer,g=i.hideArrow,p=i.id,L=i.open,f=i.showCloseButton,m=i.style,H=i.target,w=i.title,A=m1.default.createElement(aM,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:m,styles:this.styles.wrapper},h),C={};return l?C.wrapperInPortal=A:C.wrapperAsChildren=A,m1.default.createElement("span",null,m1.default.createElement(Kf,{hasChildren:!!h,id:p,placement:n,setRef:this.setFloaterRef,target:H,zIndex:this.styles.options.zIndex},m1.default.createElement(tM,{component:v,content:d,disableAnimation:u,footer:s,handleClick:this.handleClick,hideArrow:g||n==="center",open:L,placement:n,positionWrapper:l,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:f,status:o,styles:this.styles,title:w}),C.wrapperInPortal),C.wrapperAsChildren)}}]),r}(m1.default.Component);u0(ke,"propTypes",{autoOpen:W.default.bool,callback:W.default.func,children:W.default.node,component:(0,Vh.default)(W.default.oneOfType([W.default.func,W.default.element]),function(t){return!t.content}),content:(0,Vh.default)(W.default.node,function(t){return!t.component}),debug:W.default.bool,disableAnimation:W.default.bool,disableFlip:W.default.bool,disableHoverToClick:W.default.bool,event:W.default.oneOf(["hover","click"]),eventDelay:W.default.number,footer:W.default.node,getPopper:W.default.func,hideArrow:W.default.bool,id:W.default.oneOfType([W.default.string,W.default.number]),offset:W.default.number,open:W.default.bool,options:W.default.object,placement:W.default.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:W.default.bool,style:W.default.object,styles:W.default.object,target:W.default.oneOfType([W.default.object,W.default.string]),title:W.default.node,wrapperOptions:W.default.shape({offset:W.default.number,placement:W.default.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:W.default.bool})});u0(ke,"defaultProps",{autoOpen:!1,callback:qf,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:qf,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function rM(t,a){var r=Object.keys(t);if(Object.getOwnPropertySymbols){var e=Object.getOwnPropertySymbols(t);a&&(e=e.filter(function(c){return Object.getOwnPropertyDescriptor(t,c).enumerable})),r.push.apply(r,e)}return r}function K(t){for(var a=1;a"u"||!Reflect.construct||Reflect.construct.sham)return!1;if(typeof Proxy=="function")return!0;try{return Boolean.prototype.valueOf.call(Reflect.construct(Boolean,[],function(){})),!0}catch{return!1}}function wk(t,a){if(t==null)return{};var r={},e=Object.keys(t),c,n;for(n=0;n=0)&&(r[c]=t[c]);return r}function Ie(t,a){if(t==null)return{};var r=wk(t,a),e,c;if(Object.getOwnPropertySymbols){var n=Object.getOwnPropertySymbols(t);for(c=0;c=0)&&(!Object.prototype.propertyIsEnumerable.call(t,e)||(r[e]=t[e]))}return r}function z2(t){if(t===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return t}function Bk(t,a){if(a&&(typeof a=="object"||typeof a=="function"))return a;if(a!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return z2(t)}function j6(t){var a=Ck();return function(){var e=Re(t),c;if(a){var n=Re(this).constructor;c=Reflect.construct(e,arguments,n)}else c=e.apply(this,arguments);return Bk(this,c)}}var x1={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},s0={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},M1={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},L1={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},q3=vM.default.canUseDOM,f9=gt.createPortal!==void 0;function uM(){var t=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,a=t;return typeof window>"u"?a="node":document.documentMode?a="ie":/Edge/.test(t)?a="edge":Boolean(window.opera)||t.indexOf(" OPR/")>=0?a="opera":typeof window.InstallTrigger<"u"?a="firefox":window.chrome?a="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(t)&&(a="safari"),a}function Ch(t){return Object.prototype.toString.call(t).slice(8,-1).toLowerCase()}function M9(t){var a=[],r=function e(c){if(typeof c=="string"||typeof c=="number")a.push(c);else if(Array.isArray(c))c.forEach(function(l){return e(l)});else if(c&&c.props){var n=c.props.children;Array.isArray(n)?n.forEach(function(l){return e(l)}):e(n)}};return r(t),a.join(" ").trim()}function cM(t,a){return Object.prototype.hasOwnProperty.call(t,a)}function yk(t,a){return!p2.plainObject(t)||!p2.array(a)?!1:Object.keys(t).every(function(r){return a.indexOf(r)!==-1})}function Ak(t){var a=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,r=t.replace(a,function(c,n,l,o){return n+n+l+l+o+o}),e=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(r);return e?[parseInt(e[1],16),parseInt(e[2],16),parseInt(e[3],16)]:[]}function nM(t){return t.disableBeacon||t.placement==="center"}function yh(t,a){var r,e=(0,h1.isValidElement)(t)||(0,h1.isValidElement)(a),c=p2.undefined(t)||p2.undefined(a);if(Ch(t)!==Ch(a)||e||c)return!1;if(p2.domElement(t))return t.isSameNode(a);if(p2.number(t))return t===a;if(p2.function(t))return t.toString()===a.toString();for(var n in t)if(cM(t,n)){if(typeof t[n]>"u"||typeof a[n]>"u")return!1;if(r=Ch(t[n]),["object","array"].indexOf(r)!==-1&&yh(t[n],a[n])||r==="function"&&yh(t[n],a[n]))continue;if(t[n]!==a[n])return!1}for(var l in a)if(cM(a,l)&&typeof t[l]>"u")return!1;return!0}function lM(){return["chrome","safari","firefox","opera"].indexOf(uM())===-1}function U6(t){var a=t.title,r=t.data,e=t.warn,c=e===void 0?!1:e,n=t.debug,l=n===void 0?!1:n,o=c?console.warn||console.error:console.log;l&&(a&&r?(console.groupCollapsed("%creact-joyride: ".concat(a),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(r)?r.forEach(function(i){p2.plainObject(i)&&i.key?o.apply(console,[i.key,i.value]):o.apply(console,[i])}):o.apply(console,[r]),console.groupEnd()):console.error("Missing title or data props"))}var Sk={action:"",controlled:!1,index:0,lifecycle:M1.INIT,size:0,status:L1.IDLE},oM=["action","index","lifecycle","status"];function bk(t){var a=new Map,r=new Map,e=function(){function c(){var n=this,l=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},o=l.continuous,i=o===void 0?!1:o,h=l.stepIndex,v=l.steps,d=v===void 0?[]:v;$5(this,c),l1(this,"listener",void 0),l1(this,"setSteps",function(u){var s=n.getState(),g=s.size,p=s.status,L={size:u.length,status:p};r.set("steps",u),p===L1.WAITING&&!g&&u.length&&(L.status=L1.RUNNING),n.setState(L)}),l1(this,"addListener",function(u){n.listener=u}),l1(this,"update",function(u){if(!yk(u,oM))throw new Error("State is not valid. Valid keys: ".concat(oM.join(", ")));n.setState(K({},n.getNextState(K(K(K({},n.getState()),u),{},{action:u.action||x1.UPDATE}),!0)))}),l1(this,"start",function(u){var s=n.getState(),g=s.index,p=s.size;n.setState(K(K({},n.getNextState({action:x1.START,index:p2.number(u)?u:g},!0)),{},{status:p?L1.RUNNING:L1.WAITING}))}),l1(this,"stop",function(){var u=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,s=n.getState(),g=s.index,p=s.status;[L1.FINISHED,L1.SKIPPED].indexOf(p)===-1&&n.setState(K(K({},n.getNextState({action:x1.STOP,index:g+(u?1:0)})),{},{status:L1.PAUSED}))}),l1(this,"close",function(){var u=n.getState(),s=u.index,g=u.status;g===L1.RUNNING&&n.setState(K({},n.getNextState({action:x1.CLOSE,index:s+1})))}),l1(this,"go",function(u){var s=n.getState(),g=s.controlled,p=s.status;if(!(g||p!==L1.RUNNING)){var L=n.getSteps()[u];n.setState(K(K({},n.getNextState({action:x1.GO,index:u})),{},{status:L?p:L1.FINISHED}))}}),l1(this,"info",function(){return n.getState()}),l1(this,"next",function(){var u=n.getState(),s=u.index,g=u.status;g===L1.RUNNING&&n.setState(n.getNextState({action:x1.NEXT,index:s+1}))}),l1(this,"open",function(){var u=n.getState(),s=u.status;s===L1.RUNNING&&n.setState(K({},n.getNextState({action:x1.UPDATE,lifecycle:M1.TOOLTIP})))}),l1(this,"prev",function(){var u=n.getState(),s=u.index,g=u.status;g===L1.RUNNING&&n.setState(K({},n.getNextState({action:x1.PREV,index:s-1})))}),l1(this,"reset",function(){var u=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,s=n.getState(),g=s.controlled;g||n.setState(K(K({},n.getNextState({action:x1.RESET,index:0})),{},{status:u?L1.RUNNING:L1.READY}))}),l1(this,"skip",function(){var u=n.getState(),s=u.status;s===L1.RUNNING&&n.setState({action:x1.SKIP,lifecycle:M1.INIT,status:L1.SKIPPED})}),this.setState({action:x1.INIT,controlled:p2.number(h),continuous:i,index:p2.number(h)?h:0,lifecycle:M1.INIT,status:d.length?L1.READY:L1.IDLE},!0),this.setSteps(d)}return K5(c,[{key:"setState",value:function(l){var o=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,i=this.getState(),h=K(K({},i),l),v=h.action,d=h.index,u=h.lifecycle,s=h.size,g=h.status;a.set("action",v),a.set("index",d),a.set("lifecycle",u),a.set("size",s),a.set("status",g),o&&(a.set("controlled",l.controlled),a.set("continuous",l.continuous)),this.listener&&this.hasUpdatedState(i)&&this.listener(this.getState())}},{key:"getState",value:function(){return a.size?{action:a.get("action")||"",controlled:a.get("controlled")||!1,index:parseInt(a.get("index"),10),lifecycle:a.get("lifecycle")||"",size:a.get("size")||0,status:a.get("status")||""}:K({},Sk)}},{key:"getNextState",value:function(l){var o=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,i=this.getState(),h=i.action,v=i.controlled,d=i.index,u=i.size,s=i.status,g=p2.number(l.index)?l.index:d,p=v&&!o?d:Math.min(Math.max(g,0),u);return{action:l.action||h,controlled:v,index:p,lifecycle:l.lifecycle||M1.INIT,size:l.size||u,status:p===u?L1.FINISHED:l.status||s}}},{key:"hasUpdatedState",value:function(l){var o=JSON.stringify(l),i=JSON.stringify(this.getState());return o!==i}},{key:"getSteps",value:function(){var l=r.get("steps");return Array.isArray(l)?l:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),c}();return new e(t)}function sM(t){return t?t.getBoundingClientRect():{}}function Fk(){var t=document,a=t.body,r=t.documentElement;return!a||!r?0:Math.max(a.scrollHeight,a.offsetHeight,r.clientHeight,r.scrollHeight,r.offsetHeight)}function X3(t){return typeof t=="string"?document.querySelector(t):t}function Ok(t){return!t||t.nodeType!==1?{}:getComputedStyle(t)}function Ee(t,a,r){var e=(0,Sh.default)(t);if(e.isSameNode(H9()))return r?document:H9();var c=e.scrollHeight>e.offsetHeight;return!c&&!a?(e.style.overflow="initial",H9()):e}function Pe(t,a){if(!t)return!1;var r=Ee(t,a);return!r.isSameNode(H9())}function kk(t){return t.offsetParent!==document.body}function pt(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!t||!(t instanceof HTMLElement))return!1;var r=t.nodeName;return r==="BODY"||r==="HTML"?!1:Ok(t).position===a?!0:pt(t.parentNode,a)}function Rk(t){if(!t)return!1;for(var a=t;a&&a!==document.body;){if(a instanceof HTMLElement){var r=getComputedStyle(a),e=r.display,c=r.visibility;if(e==="none"||c==="hidden")return!1}a=a.parentNode}return!0}function Ik(t,a,r){var e=sM(t),c=Ee(t,r),n=Pe(t,r),l=0;c instanceof HTMLElement&&(l=c.scrollTop);var o=e.top+(!n&&!pt(t)?l:0);return Math.floor(o-a)}function Ah(t){return t instanceof HTMLElement?t.offsetParent instanceof HTMLElement?Ah(t.offsetParent)+t.offsetTop:t.offsetTop:0}function Ek(t,a,r){if(!t)return 0;var e=(0,Sh.default)(t),c=Ah(t);return Pe(t,r)&&!kk(t)&&(c-=Ah(e)),Math.floor(c-a)}function H9(){return document.scrollingElement||document.createElement("body")}function Pk(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:H9(),r=arguments.length>2&&arguments[2]!==void 0?arguments[2]:300;return new Promise(function(e,c){var n=a.scrollTop,l=t>n?t-n:n-t;dM.default.top(a,t,{duration:l<100?50:r},function(o){return o&&o.message!=="Element already at target scroll position"?c(o):e()})})}function Tk(t){function a(e,c,n,l,o,i){var h=l||"<>",v=i||n;if(c[n]==null)return e?new Error("Required ".concat(o," `").concat(v,"` was not specified in `").concat(h,"`.")):null;for(var d=arguments.length,u=new Array(d>6?d-6:0),s=6;s0&&arguments[0]!==void 0?arguments[0]:{},a=(0,j3.default)(_k,t.options||{}),r=290;window.innerWidth>480&&(r=380),a.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return p2.plainObject(t)?t.target?!0:(U6({title:"validateStep",data:"target is missing from the step",warn:!0,debug:a}),!1):(U6({title:"validateStep",data:"step must be an object",warn:!0,debug:a}),!1)}function hM(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return p2.array(t)?t.every(function(r){return gM(r,a)}):(U6({title:"validateSteps",data:"steps must be an array",warn:!0,debug:a}),!1)}var Zk=K5(function t(a){var r=this,e=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if($5(this,t),l1(this,"element",void 0),l1(this,"options",void 0),l1(this,"canBeTabbed",function(c){var n=c.tabIndex;(n===null||n<0)&&(n=void 0);var l=isNaN(n);return!l&&r.canHaveFocus(c)}),l1(this,"canHaveFocus",function(c){var n=/input|select|textarea|button|object/,l=c.nodeName.toLowerCase(),o=n.test(l)&&!c.getAttribute("disabled")||l==="a"&&!!c.getAttribute("href");return o&&r.isVisible(c)}),l1(this,"findValidTabElements",function(){return[].slice.call(r.element.querySelectorAll("*"),0).filter(r.canBeTabbed)}),l1(this,"handleKeyDown",function(c){var n=r.options.keyCode,l=n===void 0?9:n;c.keyCode===l&&r.interceptTab(c)}),l1(this,"interceptTab",function(c){var n=r.findValidTabElements();if(!!n.length){c.preventDefault();var l=c.shiftKey,o=n.indexOf(document.activeElement);o===-1||!l&&o+1===n.length?o=0:l&&o===0?o=n.length-1:o+=l?-1:1,n[o].focus()}}),l1(this,"isHidden",function(c){var n=c.offsetWidth<=0&&c.offsetHeight<=0,l=window.getComputedStyle(c);return n&&!c.innerHTML?!0:n&&l.getPropertyValue("overflow")!=="visible"||l.getPropertyValue("display")==="none"}),l1(this,"isVisible",function(c){for(var n=c;n;)if(n instanceof HTMLElement){if(n===document.body)break;if(r.isHidden(n))return!1;n=n.parentNode}return!0}),l1(this,"removeScope",function(){window.removeEventListener("keydown",r.handleKeyDown)}),l1(this,"checkFocus",function(c){document.activeElement!==c&&(c.focus(),window.requestAnimationFrame(function(){return r.checkFocus(c)}))}),l1(this,"setFocus",function(){var c=r.options.selector;if(!!c){var n=r.element.querySelector(c);n&&window.requestAnimationFrame(function(){return r.checkFocus(n)})}}),!(a instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=a,this.options=e,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),Gk=function(t){W6(r,t);var a=j6(r);function r(e){var c;if($5(this,r),c=a.call(this,e),l1(z2(c),"setBeaconRef",function(i){c.beacon=i}),!e.beaconComponent){var n=document.head||document.getElementsByTagName("head")[0],l=document.createElement("style"),o=` + `)}componentDidMount(){if(this.ref.current===null)return;let a=this.makeOptions();Nn(aZ).create(this.ref.current,a)}componentDidUpdate(a){a.disabled!==this.props.disabled&&this.sortable&&this.sortable.option("disabled",this.props.disabled)}render(){let{tag:a,style:r,className:e,id:c}=this.props,n={style:r,className:e,id:c},l=!a||a===null?"div":a;return(0,Sa.createElement)(l,{ref:this.ref,...n},this.getChildren())}getChildren(){let{children:a,dataIdAttr:r,selectedClass:e="sortable-selected",chosenClass:c="sortable-chosen",dragClass:n="sortable-drag",fallbackClass:l="sortable-falback",ghostClass:o="sortable-ghost",swapClass:i="sortable-swap-highlight",filter:h="sortable-filter",list:v}=this.props;if(!a||a==null)return null;let d=r||"data-id";return Sa.Children.map(a,(u,s)=>{if(u===void 0)return;let g=v[s]||{},{className:p}=u.props,L=typeof h=="string"&&{[h.replace(".","")]:!!g.filtered},f=Nn(rZ)(p,{[e]:g.selected,[c]:g.chosen,...L});return(0,Sa.cloneElement)(u,{[d]:u.key,className:f})})}get sortable(){let a=this.ref.current;if(a===null)return null;let r=Object.keys(a).find(e=>e.includes("Sortable"));return r?a[r]:null}makeOptions(){let a=["onAdd","onChoose","onDeselect","onEnd","onRemove","onSelect","onSpill","onStart","onUnchoose","onUpdate"],r=["onChange","onClone","onFilter","onSort"],e=oZ(this.props);return a.forEach(n=>e[n]=this.prepareOnHandlerPropAndDOM(n)),r.forEach(n=>e[n]=this.prepareOnHandlerProp(n)),{...e,onMove:(n,l)=>{let{onMove:o}=this.props,i=n.willInsertAfter||-1;if(!o)return i;let h=o(n,l,this.sortable,p4);return typeof h>"u"?!1:h}}}prepareOnHandlerPropAndDOM(a){return r=>{this.callOnHandlerProp(r,a),this[a](r)}}prepareOnHandlerProp(a){return r=>{this.callOnHandlerProp(r,a)}}callOnHandlerProp(a,r){let e=this.props[r];e&&e(a,this.sortable,p4)}onAdd(a){let{list:r,setList:e,clone:c}=this.props,n=[...p4.dragging.props.list],l=Eu(a,n);Iu(l);let o=Cw(l,r,a,c).map(i=>Object.assign(i,{selected:!1}));e(o,this.sortable,p4)}onRemove(a){let{list:r,setList:e}=this.props,c=ww(a),n=Eu(a,r);Hw(n);let l=[...r];if(a.pullMode!=="clone")l=Lw(n,l);else{let o=n;switch(c){case"multidrag":o=n.map((i,h)=>({...i,element:a.clones[h]}));break;case"normal":o=n.map(i=>({...i,element:a.clone}));break;case"swap":default:Nn(xw)(!0,`mode "${c}" cannot clone. Please remove "props.clone" from when using the "${c}" plugin`)}Iu(o),n.forEach(i=>{let h=i.oldIndex,v=this.props.clone(i.item,a);l.splice(h,1,v)})}l=l.map(o=>Object.assign(o,{selected:!1})),e(l,this.sortable,p4)}onUpdate(a){let{list:r,setList:e}=this.props,c=Eu(a,r);Iu(c),Hw(c);let n=nZ(c,r);return e(n,this.sortable,p4)}onStart(){p4.dragging=this}onEnd(){p4.dragging=null}onChoose(a){let{list:r,setList:e}=this.props,c=r.map((n,l)=>{let o=n;return l===a.oldIndex&&(o=Object.assign(n,{chosen:!0})),o});e(c,this.sortable,p4)}onUnchoose(a){let{list:r,setList:e}=this.props,c=r.map((n,l)=>{let o=n;return l===a.oldIndex&&(o=Object.assign(o,{chosen:!1})),o});e(c,this.sortable,p4)}onSpill(a){let{removeOnSpill:r,revertOnSpill:e}=this.props;r&&!e&&Vw(a.item)}onSelect(a){let{list:r,setList:e}=this.props,c=r.map(n=>Object.assign(n,{selected:!1}));a.newIndicies.forEach(n=>{let l=n.index;if(l===-1){console.log(`"${a.type}" had indice of "${n.index}", which is probably -1 and doesn't usually happen here.`),console.log(a);return}c[l].selected=!0}),e(c,this.sortable,p4)}onDeselect(a){let{list:r,setList:e}=this.props,c=r.map(n=>Object.assign(n,{selected:!1}));a.newIndicies.forEach(n=>{let l=n.index;l!==-1&&(c[l].selected=!0)}),e(c,this.sortable,p4)}};_s(Dn,"defaultProps",{clone:a=>a});var iZ={};eZ(j0.exports,iZ)});var Rs=jS;function jS(){let t={};return{subscribe:(a,r)=>(t[a]===void 0&&(t[a]=new Set),t[a].add(r),{unsubscribe:()=>{t[a].delete(r)}}),dispatch:(a,r)=>{t[a]?.forEach(e=>e(r))}}}var qS="TEMPLATE_CHOOSER",Is=qS;async function Es(){return new Promise(t=>{fetch("/testing-tree").then(a=>a.json()).then(a=>{t(a)}).catch(a=>{console.error("/testing-tree error",a),t(Is)})})}function Ps({messageDispatch:t,showMessages:a}){let r=a?console.log:(...c)=>{};return{sendMsg:c=>{switch(r("Static sendMsg()",c),c.path){case"READY-FOR-STATE":{Es().then(n=>{n==="TEMPLATE_CHOOSER"?t.dispatch("TEMPLATE_CHOOSER","USER-CHOICE"):t.dispatch("APP-INFO",{ui_tree:n,app_type:"SINGLE-FILE",app:{code:$S,libraries:["shiny"]}})});return}case"UPDATED-APP":{c.payload.info&&t.dispatch("APP-INFO",c.payload.info);return}case"APP-PREVIEW-REQUEST":return}},incomingMsgs:t,mode:"STATIC"}}var $S=` + + +ui <- + +server <- function(input, output) { + +} + +shinyApp(ui, server) +`;function Zl({onClose:t,messageDispatch:a,pathToWebsocket:r=window.location.host+window.location.pathname}){let e=!1;return new Promise(c=>{try{if(!document.location.host)throw new Error("Not on a served site!");let n=new WebSocket(XS(r)),l={sendMsg:o=>{KS(n,o)},incomingMsgs:a,mode:"HTTPUV"};n.onerror=o=>{c("NO-WS-CONNECTION")},n.onopen=o=>{QS(n,i=>{let{path:h,payload:v}=i;a.dispatch(h,v)}),c(l),e=!0},n.onclose=o=>{e?t():c("NO-WS-CONNECTION")}}catch{c("NO-WS-CONNECTION")}})}function XS(t){return(window.location.protocol==="https:"?"wss:":"ws:")+"//"+t}function KS(t,a){let r=new Blob([JSON.stringify(a)],{type:"application/json"});t.send(r)}function QS(t,a){t.addEventListener("message",r=>{a(YS(r))})}function YS(t){return JSON.parse(t.data)}var bS=V(mf());var vh=V($()),wf=V(b()),hh=console.log,HO={sendMsg:t=>hh("Sending message to backend",t),incomingMsgs:{subscribe:(t,a)=>(hh(`Request for subscription to ${t}:`,a),{unsubscribe:()=>hh(`Request for removing subscription to ${t}:`,a)})},mode:"HTTPUV"},Lf=vh.default.createContext(HO);function Cf({children:t,sendMsg:a,incomingMsgs:r,mode:e}){return(0,wf.jsx)(Lf.Provider,{value:{sendMsg:a,incomingMsgs:r,mode:e},children:t})}function y5(){return vh.default.useContext(Lf)}var Bt=V($());var h1=V($());function kf(t){return function(a){return typeof a===t}}var CO=kf("function"),wO=function(t){return t===null},uh=function(t){return Object.prototype.toString.call(t).slice(8,-1)==="RegExp"},sh=function(t){return!BO(t)&&!wO(t)&&(CO(t)||typeof t=="object")},BO=kf("undefined");var gh=function(t){var a=typeof Symbol=="function"&&Symbol.iterator,r=a&&t[a],e=0;if(r)return r.call(t);if(t&&typeof t.length=="number")return{next:function(){return t&&e>=t.length&&(t=void 0),{value:t&&t[e++],done:!t}}};throw new TypeError(a?"Object is not iterable.":"Symbol.iterator is not defined.")};function yO(t,a){var r=t.length;if(r!==a.length)return!1;for(var e=r;e--!==0;)if(!e0(t[e],a[e]))return!1;return!0}function AO(t,a){if(t.byteLength!==a.byteLength)return!1;for(var r=new DataView(t.buffer),e=new DataView(a.buffer),c=t.byteLength;c--;)if(r.getUint8(c)!==e.getUint8(c))return!1;return!0}function SO(t,a){var r,e,c,n;if(t.size!==a.size)return!1;try{for(var l=gh(t.entries()),o=l.next();!o.done;o=l.next()){var i=o.value;if(!a.has(i[0]))return!1}}catch(d){r={error:d}}finally{try{o&&!o.done&&(e=l.return)&&e.call(l)}finally{if(r)throw r.error}}try{for(var h=gh(t.entries()),v=h.next();!v.done;v=h.next()){var i=v.value;if(!e0(i[1],a.get(i[0])))return!1}}catch(d){c={error:d}}finally{try{v&&!v.done&&(n=h.return)&&n.call(h)}finally{if(c)throw c.error}}return!0}function bO(t,a){var r,e;if(t.size!==a.size)return!1;try{for(var c=gh(t.entries()),n=c.next();!n.done;n=c.next()){var l=n.value;if(!a.has(l[0]))return!1}}catch(o){r={error:o}}finally{try{n&&!n.done&&(e=c.return)&&e.call(c)}finally{if(r)throw r.error}}return!0}function e0(t,a){if(t===a)return!0;if(t&&sh(t)&&a&&sh(a)){if(t.constructor!==a.constructor)return!1;if(Array.isArray(t)&&Array.isArray(a))return yO(t,a);if(t instanceof Map&&a instanceof Map)return SO(t,a);if(t instanceof Set&&a instanceof Set)return bO(t,a);if(ArrayBuffer.isView(t)&&ArrayBuffer.isView(a))return AO(t,a);if(uh(t)&&uh(a))return t.source===a.source&&t.flags===a.flags;if(t.valueOf!==Object.prototype.valueOf)return t.valueOf()===a.valueOf();if(t.toString!==Object.prototype.toString)return t.toString()===a.toString();var r=Object.keys(t),e=Object.keys(a);if(r.length!==e.length)return!1;for(var c=r.length;c--!==0;)if(!Object.prototype.hasOwnProperty.call(a,r[c]))return!1;for(var c=r.length;c--!==0;){var n=r[c];if(!(n==="_owner"&&t.$$typeof)&&!e0(t[n],a[n]))return!1}return!0}return Number.isNaN(t)&&Number.isNaN(a)?!0:t===a}var FO=["innerHTML","ownerDocument","style","attributes","nodeValue"],OO=["Array","ArrayBuffer","AsyncFunction","AsyncGenerator","AsyncGeneratorFunction","Date","Error","Function","Generator","GeneratorFunction","HTMLElement","Map","Object","Promise","RegExp","Set","WeakMap","WeakSet"],kO=["bigint","boolean","null","number","string","symbol","undefined"];function Le(t){var a=Object.prototype.toString.call(t).slice(8,-1);if(/HTML\w+Element/.test(a))return"HTMLElement";if(_O(a))return a}function c5(t){return function(a){return Le(a)===t}}function _O(t){return OO.includes(t)}function st(t){return function(a){return typeof a===t}}function RO(t){return kO.includes(t)}function Y(t){if(t===null)return"null";switch(typeof t){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined";default:}if(Y.array(t))return"Array";if(Y.plainFunction(t))return"Function";var a=Le(t);return a||"Object"}Y.array=Array.isArray;Y.arrayOf=function(t,a){return!Y.array(t)&&!Y.function(a)?!1:t.every(function(r){return a(r)})};Y.asyncGeneratorFunction=function(t){return Le(t)==="AsyncGeneratorFunction"};Y.asyncFunction=c5("AsyncFunction");Y.bigint=st("bigint");Y.boolean=function(t){return t===!0||t===!1};Y.date=c5("Date");Y.defined=function(t){return!Y.undefined(t)};Y.domElement=function(t){return Y.object(t)&&!Y.plainObject(t)&&t.nodeType===1&&Y.string(t.nodeName)&&FO.every(function(a){return a in t})};Y.empty=function(t){return Y.string(t)&&t.length===0||Y.array(t)&&t.length===0||Y.object(t)&&!Y.map(t)&&!Y.set(t)&&Object.keys(t).length===0||Y.set(t)&&t.size===0||Y.map(t)&&t.size===0};Y.error=c5("Error");Y.function=st("function");Y.generator=function(t){return Y.iterable(t)&&Y.function(t.next)&&Y.function(t.throw)};Y.generatorFunction=c5("GeneratorFunction");Y.instanceOf=function(t,a){return!t||!a?!1:Object.getPrototypeOf(t)===a.prototype};Y.iterable=function(t){return!Y.nullOrUndefined(t)&&Y.function(t[Symbol.iterator])};Y.map=c5("Map");Y.nan=function(t){return Number.isNaN(t)};Y.null=function(t){return t===null};Y.nullOrUndefined=function(t){return Y.null(t)||Y.undefined(t)};Y.number=function(t){return st("number")(t)&&!Y.nan(t)};Y.numericString=function(t){return Y.string(t)&&t.length>0&&!Number.isNaN(Number(t))};Y.object=function(t){return!Y.nullOrUndefined(t)&&(Y.function(t)||typeof t=="object")};Y.oneOf=function(t,a){return Y.array(t)?t.indexOf(a)>-1:!1};Y.plainFunction=c5("Function");Y.plainObject=function(t){if(Le(t)!=="Object")return!1;var a=Object.getPrototypeOf(t);return a===null||a===Object.getPrototypeOf({})};Y.primitive=function(t){return Y.null(t)||RO(typeof t)};Y.promise=c5("Promise");Y.propertyOf=function(t,a,r){if(!Y.object(t)||!a)return!1;var e=t[a];return Y.function(r)?r(e):Y.defined(e)};Y.regexp=c5("RegExp");Y.set=c5("Set");Y.string=st("string");Y.symbol=st("symbol");Y.undefined=st("undefined");Y.weakMap=c5("WeakMap");Y.weakSet=c5("WeakSet");var r1=Y;function IO(){for(var t=[],a=0;ai);return r1.undefined(e)||(h=h&&i===e),r1.undefined(n)||(h=h&&o===n),h}function zh(t,a,r){var e=r.key,c=r.type,n=r.value,l=n5(t,e),o=n5(a,e),i=c==="added"?l:o,h=c==="added"?o:l;if(!r1.nullOrUndefined(n)){if(r1.defined(i)){if(r1.array(i)||r1.plainObject(i))return EO(i,h,n)}else return e0(h,n);return!1}return[l,o].every(r1.array)?!h.every(Mh(i)):[l,o].every(r1.plainObject)?PO(Object.keys(i),Object.keys(h)):![l,o].every(function(v){return r1.primitive(v)&&r1.defined(v)})&&(c==="added"?!r1.defined(l)&&r1.defined(o):r1.defined(l)&&!r1.defined(o))}function fh(t,a,r){var e=r===void 0?{}:r,c=e.key,n=n5(t,c),l=n5(a,c);if(!If(n,l))throw new TypeError("Inputs have different types");if(!IO(n,l))throw new TypeError("Inputs don't have length");return[n,l].every(r1.plainObject)&&(n=Object.keys(n),l=Object.keys(l)),[n,l]}function _f(t){return function(a){var r=a[0],e=a[1];return r1.array(t)?e0(t,e)||t.some(function(c){return e0(c,e)||r1.array(e)&&Mh(e)(c)}):r1.plainObject(t)&&t[r]?!!t[r]&&e0(t[r],e):e0(t,e)}}function PO(t,a){return a.some(function(r){return!t.includes(r)})}function Rf(t){return function(a){return r1.array(t)?t.some(function(r){return e0(r,a)||r1.array(a)&&Mh(a)(r)}):e0(t,a)}}function gt(t,a){return r1.array(t)?t.some(function(r){return e0(r,a)}):e0(t,a)}function Mh(t){return function(a){return t.some(function(r){return e0(r,a)})}}function If(){for(var t=[],a=0;aCe(a)===t}function ZO(t){return NO.includes(t)}function pt(t){return a=>typeof a===t}function GO(t){return DO.includes(t)}function J(t){if(t===null)return"null";switch(typeof t){case"bigint":return"bigint";case"boolean":return"boolean";case"number":return"number";case"string":return"string";case"symbol":return"symbol";case"undefined":return"undefined";default:}if(J.array(t))return"Array";if(J.plainFunction(t))return"Function";let a=Ce(t);return a||"Object"}J.array=Array.isArray;J.arrayOf=(t,a)=>!J.array(t)&&!J.function(a)?!1:t.every(r=>a(r));J.asyncGeneratorFunction=t=>Ce(t)==="AsyncGeneratorFunction";J.asyncFunction=l5("AsyncFunction");J.bigint=pt("bigint");J.boolean=t=>t===!0||t===!1;J.date=l5("Date");J.defined=t=>!J.undefined(t);J.domElement=t=>J.object(t)&&!J.plainObject(t)&&t.nodeType===1&&J.string(t.nodeName)&&TO.every(a=>a in t);J.empty=t=>J.string(t)&&t.length===0||J.array(t)&&t.length===0||J.object(t)&&!J.map(t)&&!J.set(t)&&Object.keys(t).length===0||J.set(t)&&t.size===0||J.map(t)&&t.size===0;J.error=l5("Error");J.function=pt("function");J.generator=t=>J.iterable(t)&&J.function(t.next)&&J.function(t.throw);J.generatorFunction=l5("GeneratorFunction");J.instanceOf=(t,a)=>!t||!a?!1:Object.getPrototypeOf(t)===a.prototype;J.iterable=t=>!J.nullOrUndefined(t)&&J.function(t[Symbol.iterator]);J.map=l5("Map");J.nan=t=>Number.isNaN(t);J.null=t=>t===null;J.nullOrUndefined=t=>J.null(t)||J.undefined(t);J.number=t=>pt("number")(t)&&!J.nan(t);J.numericString=t=>J.string(t)&&t.length>0&&!Number.isNaN(Number(t));J.object=t=>!J.nullOrUndefined(t)&&(J.function(t)||typeof t=="object");J.oneOf=(t,a)=>J.array(t)?t.indexOf(a)>-1:!1;J.plainFunction=l5("Function");J.plainObject=t=>{if(Ce(t)!=="Object")return!1;let a=Object.getPrototypeOf(t);return a===null||a===Object.getPrototypeOf({})};J.primitive=t=>J.null(t)||GO(typeof t);J.promise=l5("Promise");J.propertyOf=(t,a,r)=>{if(!J.object(t)||!a)return!1;let e=t[a];return J.function(r)?r(e):J.defined(e)};J.regexp=l5("RegExp");J.set=l5("Set");J.string=pt("string");J.symbol=pt("symbol");J.undefined=pt("undefined");J.weakMap=l5("WeakMap");J.weakSet=l5("WeakSet");var z2=J;var Ht=V(q6()),RM=V(mh()),IM=V(Nf()),Wh=V(Zf()),a3=V(Lh()),Q3=V(Ch());var m1=V($()),W=V(dh()),Ph=V(Xf());var f9=typeof window<"u"&&typeof document<"u"&&typeof navigator<"u",xk=function(){for(var t=["Edge","Trident","Firefox"],a=0;a=0)return 1;return 0}();function Hk(t){var a=!1;return function(){a||(a=!0,window.Promise.resolve().then(function(){a=!1,t()}))}}function Vk(t){var a=!1;return function(){a||(a=!0,setTimeout(function(){a=!1,t()},xk))}}var Lk=f9&&window.Promise,Ck=Lk?Hk:Vk;function aM(t){var a={};return t&&a.toString.call(t)==="[object Function]"}function $6(t,a){if(t.nodeType!==1)return[];var r=t.ownerDocument.defaultView,e=r.getComputedStyle(t,null);return a?e[a]:e}function Fh(t){return t.nodeName==="HTML"?t:t.parentNode||t.host}function M9(t){if(!t)return document.body;switch(t.nodeName){case"HTML":case"BODY":return t.ownerDocument.body;case"#document":return t.body}var a=$6(t),r=a.overflow,e=a.overflowX,c=a.overflowY;return/(auto|scroll|overlay)/.test(r+c+e)?t:M9(Fh(t))}function rM(t){return t&&t.referenceNode?t.referenceNode:t}var Kf=f9&&!!(window.MSInputMethodContext&&document.documentMode),Qf=f9&&/MSIE 10/.test(navigator.userAgent);function xt(t){return t===11?Kf:t===10?Qf:Kf||Qf}function ft(t){if(!t)return document.documentElement;for(var a=xt(10)?document.body:null,r=t.offsetParent||null;r===a&&t.nextElementSibling;)r=(t=t.nextElementSibling).offsetParent;var e=r&&r.nodeName;return!e||e==="BODY"||e==="HTML"?t?t.ownerDocument.documentElement:document.documentElement:["TH","TD","TABLE"].indexOf(r.nodeName)!==-1&&$6(r,"position")==="static"?ft(r):r}function wk(t){var a=t.nodeName;return a==="BODY"?!1:a==="HTML"||ft(t.firstElementChild)===t}function Ah(t){return t.parentNode!==null?Ah(t.parentNode):t}function Ee(t,a){if(!t||!t.nodeType||!a||!a.nodeType)return document.documentElement;var r=t.compareDocumentPosition(a)&Node.DOCUMENT_POSITION_FOLLOWING,e=r?t:a,c=r?a:t,n=document.createRange();n.setStart(e,0),n.setEnd(c,0);var l=n.commonAncestorContainer;if(t!==l&&a!==l||e.contains(c))return wk(l)?l:ft(l);var o=Ah(t);return o.host?Ee(o.host,a):Ee(t,Ah(a).host)}function Mt(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"top",r=a==="top"?"scrollTop":"scrollLeft",e=t.nodeName;if(e==="BODY"||e==="HTML"){var c=t.ownerDocument.documentElement,n=t.ownerDocument.scrollingElement||c;return n[r]}return t[r]}function Bk(t,a){var r=arguments.length>2&&arguments[2]!==void 0?arguments[2]:!1,e=Mt(a,"top"),c=Mt(a,"left"),n=r?-1:1;return t.top+=e*n,t.bottom+=e*n,t.left+=c*n,t.right+=c*n,t}function Yf(t,a){var r=a==="x"?"Left":"Top",e=r==="Left"?"Right":"Bottom";return parseFloat(t["border"+r+"Width"])+parseFloat(t["border"+e+"Width"])}function Jf(t,a,r,e){return Math.max(a["offset"+t],a["scroll"+t],r["client"+t],r["offset"+t],r["scroll"+t],xt(10)?parseInt(r["offset"+t])+parseInt(e["margin"+(t==="Height"?"Top":"Left")])+parseInt(e["margin"+(t==="Height"?"Bottom":"Right")]):0)}function eM(t){var a=t.body,r=t.documentElement,e=xt(10)&&getComputedStyle(r);return{height:Jf("Height",a,r,e),width:Jf("Width",a,r,e)}}var yk=function(t,a){if(!(t instanceof a))throw new TypeError("Cannot call a class as a function")},Ak=function(){function t(a,r){for(var e=0;e2&&arguments[2]!==void 0?arguments[2]:!1,e=xt(10),c=a.nodeName==="HTML",n=Sh(t),l=Sh(a),o=M9(t),i=$6(a),h=parseFloat(i.borderTopWidth),v=parseFloat(i.borderLeftWidth);r&&c&&(l.top=Math.max(l.top,0),l.left=Math.max(l.left,0));var d=K3({top:n.top-l.top-h,left:n.left-l.left-v,width:n.width,height:n.height});if(d.marginTop=0,d.marginLeft=0,!e&&c){var u=parseFloat(i.marginTop),s=parseFloat(i.marginLeft);d.top-=h-u,d.bottom-=h-u,d.left-=v-s,d.right-=v-s,d.marginTop=u,d.marginLeft=s}return(e&&!r?a.contains(o):a===o&&o.nodeName!=="BODY")&&(d=Bk(d,a)),d}function Sk(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,r=t.ownerDocument.documentElement,e=Oh(t,r),c=Math.max(r.clientWidth,window.innerWidth||0),n=Math.max(r.clientHeight,window.innerHeight||0),l=a?0:Mt(r),o=a?0:Mt(r,"left"),i={top:l-e.top+e.marginTop,left:o-e.left+e.marginLeft,width:c,height:n};return K3(i)}function cM(t){var a=t.nodeName;if(a==="BODY"||a==="HTML")return!1;if($6(t,"position")==="fixed")return!0;var r=Fh(t);return r?cM(r):!1}function nM(t){if(!t||!t.parentElement||xt())return document.documentElement;for(var a=t.parentElement;a&&$6(a,"transform")==="none";)a=a.parentElement;return a||document.documentElement}function kh(t,a,r,e){var c=arguments.length>4&&arguments[4]!==void 0?arguments[4]:!1,n={top:0,left:0},l=c?nM(t):Ee(t,rM(a));if(e==="viewport")n=Sk(l,c);else{var o=void 0;e==="scrollParent"?(o=M9(Fh(a)),o.nodeName==="BODY"&&(o=t.ownerDocument.documentElement)):e==="window"?o=t.ownerDocument.documentElement:o=e;var i=Oh(o,l,c);if(o.nodeName==="HTML"&&!cM(l)){var h=eM(t.ownerDocument),v=h.height,d=h.width;n.top+=i.top-i.marginTop,n.bottom=v+i.top,n.left+=i.left-i.marginLeft,n.right=d+i.left}else n=i}r=r||0;var u=typeof r=="number";return n.left+=u?r:r.left||0,n.top+=u?r:r.top||0,n.right-=u?r:r.right||0,n.bottom-=u?r:r.bottom||0,n}function bk(t){var a=t.width,r=t.height;return a*r}function lM(t,a,r,e,c){var n=arguments.length>5&&arguments[5]!==void 0?arguments[5]:0;if(t.indexOf("auto")===-1)return t;var l=kh(r,e,n,c),o={top:{width:l.width,height:a.top-l.top},right:{width:l.right-a.right,height:l.height},bottom:{width:l.width,height:l.bottom-a.bottom},left:{width:a.left-l.left,height:l.height}},i=Object.keys(o).map(function(u){return S4({key:u},o[u],{area:bk(o[u])})}).sort(function(u,s){return s.area-u.area}),h=i.filter(function(u){var s=u.width,g=u.height;return s>=r.clientWidth&&g>=r.clientHeight}),v=h.length>0?h[0].key:i[0].key,d=t.split("-")[1];return v+(d?"-"+d:"")}function oM(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:null,c=e?nM(a):Ee(a,rM(r));return Oh(r,c,e)}function iM(t){var a=t.ownerDocument.defaultView,r=a.getComputedStyle(t),e=parseFloat(r.marginTop||0)+parseFloat(r.marginBottom||0),c=parseFloat(r.marginLeft||0)+parseFloat(r.marginRight||0),n={width:t.offsetWidth+c,height:t.offsetHeight+e};return n}function Pe(t){var a={left:"right",right:"left",bottom:"top",top:"bottom"};return t.replace(/left|right|bottom|top/g,function(r){return a[r]})}function hM(t,a,r){r=r.split("-")[0];var e=iM(t),c={width:e.width,height:e.height},n=["right","left"].indexOf(r)!==-1,l=n?"top":"left",o=n?"left":"top",i=n?"height":"width",h=n?"width":"height";return c[l]=a[l]+a[i]/2-e[i]/2,r===o?c[o]=a[o]-e[h]:c[o]=a[Pe(o)],c}function m9(t,a){return Array.prototype.find?t.find(a):t.filter(a)[0]}function Fk(t,a,r){if(Array.prototype.findIndex)return t.findIndex(function(c){return c[a]===r});var e=m9(t,function(c){return c[a]===r});return t.indexOf(e)}function vM(t,a,r){var e=r===void 0?t:t.slice(0,Fk(t,"name",r));return e.forEach(function(c){c.function&&console.warn("`modifier.function` is deprecated, use `modifier.fn`!");var n=c.function||c.fn;c.enabled&&aM(n)&&(a.offsets.popper=K3(a.offsets.popper),a.offsets.reference=K3(a.offsets.reference),a=n(a,c))}),a}function Ok(){if(!this.state.isDestroyed){var t={instance:this,styles:{},arrowStyles:{},attributes:{},flipped:!1,offsets:{}};t.offsets.reference=oM(this.state,this.popper,this.reference,this.options.positionFixed),t.placement=lM(this.options.placement,t.offsets.reference,this.popper,this.reference,this.options.modifiers.flip.boundariesElement,this.options.modifiers.flip.padding),t.originalPlacement=t.placement,t.positionFixed=this.options.positionFixed,t.offsets.popper=hM(this.popper,t.offsets.reference,t.placement),t.offsets.popper.position=this.options.positionFixed?"fixed":"absolute",t=vM(this.modifiers,t),this.state.isCreated?this.options.onUpdate(t):(this.state.isCreated=!0,this.options.onCreate(t))}}function dM(t,a){return t.some(function(r){var e=r.name,c=r.enabled;return c&&e===a})}function _h(t){for(var a=[!1,"ms","Webkit","Moz","O"],r=t.charAt(0).toUpperCase()+t.slice(1),e=0;el[s]&&(t.offsets.popper[d]+=o[d]+g-l[s]),t.offsets.popper=K3(t.offsets.popper);var p=o[d]+o[h]/2-g/2,L=$6(t.instance.popper),f=parseFloat(L["margin"+v]),m=parseFloat(L["border"+v+"Width"]),H=p-t.offsets.popper[d]-f-m;return H=Math.max(Math.min(l[h]-g,H),0),t.arrowElement=e,t.offsets.arrow=(r={},mt(r,d,Math.round(H)),mt(r,u,""),r),t}function Wk(t){return t==="end"?"start":t==="start"?"end":t}var pM=["auto-start","auto","auto-end","top-start","top","top-end","right-start","right","right-end","bottom-end","bottom","bottom-start","left-end","left","left-start"],Bh=pM.slice(3);function tM(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,r=Bh.indexOf(t),e=Bh.slice(r+1).concat(Bh.slice(0,r));return a?e.reverse():e}var yh={FLIP:"flip",CLOCKWISE:"clockwise",COUNTERCLOCKWISE:"counterclockwise"};function jk(t,a){if(dM(t.instance.modifiers,"inner")||t.flipped&&t.placement===t.originalPlacement)return t;var r=kh(t.instance.popper,t.instance.reference,a.padding,a.boundariesElement,t.positionFixed),e=t.placement.split("-")[0],c=Pe(e),n=t.placement.split("-")[1]||"",l=[];switch(a.behavior){case yh.FLIP:l=[e,c];break;case yh.CLOCKWISE:l=tM(e);break;case yh.COUNTERCLOCKWISE:l=tM(e,!0);break;default:l=a.behavior}return l.forEach(function(o,i){if(e!==o||l.length===i+1)return t;e=t.placement.split("-")[0],c=Pe(e);var h=t.offsets.popper,v=t.offsets.reference,d=Math.floor,u=e==="left"&&d(h.right)>d(v.left)||e==="right"&&d(h.left)d(v.top)||e==="bottom"&&d(h.top)d(r.right),p=d(h.top)d(r.bottom),f=e==="left"&&s||e==="right"&&g||e==="top"&&p||e==="bottom"&&L,m=["top","bottom"].indexOf(e)!==-1,H=!!a.flipVariations&&(m&&n==="start"&&s||m&&n==="end"&&g||!m&&n==="start"&&p||!m&&n==="end"&&L),w=!!a.flipVariationsByContent&&(m&&n==="start"&&g||m&&n==="end"&&s||!m&&n==="start"&&L||!m&&n==="end"&&p),A=H||w;(u||f||A)&&(t.flipped=!0,(u||f)&&(e=l[i+1]),A&&(n=Wk(n)),t.placement=e+(n?"-"+n:""),t.offsets.popper=S4({},t.offsets.popper,hM(t.instance.popper,t.offsets.reference,t.placement)),t=vM(t.instance.modifiers,t,"flip"))}),t}function qk(t){var a=t.offsets,r=a.popper,e=a.reference,c=t.placement.split("-")[0],n=Math.floor,l=["top","bottom"].indexOf(c)!==-1,o=l?"right":"bottom",i=l?"left":"top",h=l?"width":"height";return r[o]n(e[o])&&(t.offsets.popper[i]=n(e[o])),t}function $k(t,a,r,e){var c=t.match(/((?:\-|\+)?\d*\.?\d*)(.*)/),n=+c[1],l=c[2];if(!n)return t;if(l.indexOf("%")===0){var o=void 0;switch(l){case"%p":o=r;break;case"%":case"%r":default:o=e}var i=K3(o);return i[a]/100*n}else if(l==="vh"||l==="vw"){var h=void 0;return l==="vh"?h=Math.max(document.documentElement.clientHeight,window.innerHeight||0):h=Math.max(document.documentElement.clientWidth,window.innerWidth||0),h/100*n}else return n}function Xk(t,a,r,e){var c=[0,0],n=["right","left"].indexOf(e)!==-1,l=t.split(/(\+|\-)/).map(function(v){return v.trim()}),o=l.indexOf(m9(l,function(v){return v.search(/,|\s/)!==-1}));l[o]&&l[o].indexOf(",")===-1&&console.warn("Offsets separated by white space(s) are deprecated, use a comma (,) instead.");var i=/\s*,\s*|\s+/,h=o!==-1?[l.slice(0,o).concat([l[o].split(i)[0]]),[l[o].split(i)[1]].concat(l.slice(o+1))]:[l];return h=h.map(function(v,d){var u=(d===1?!n:n)?"height":"width",s=!1;return v.reduce(function(g,p){return g[g.length-1]===""&&["+","-"].indexOf(p)!==-1?(g[g.length-1]=p,s=!0,g):s?(g[g.length-1]+=p,s=!1,g):g.concat(p)},[]).map(function(g){return $k(g,u,a,r)})}),h.forEach(function(v,d){v.forEach(function(u,s){Rh(u)&&(c[d]+=u*(v[s-1]==="-"?-1:1))})}),c}function Kk(t,a){var r=a.offset,e=t.placement,c=t.offsets,n=c.popper,l=c.reference,o=e.split("-")[0],i=void 0;return Rh(+r)?i=[+r,0]:i=Xk(r,n,l,o),o==="left"?(n.top+=i[0],n.left-=i[1]):o==="right"?(n.top+=i[0],n.left+=i[1]):o==="top"?(n.left+=i[0],n.top-=i[1]):o==="bottom"&&(n.left+=i[0],n.top+=i[1]),t.popper=n,t}function Qk(t,a){var r=a.boundariesElement||ft(t.instance.popper);t.instance.reference===r&&(r=ft(r));var e=_h("transform"),c=t.instance.popper.style,n=c.top,l=c.left,o=c[e];c.top="",c.left="",c[e]="";var i=kh(t.instance.popper,t.instance.reference,a.padding,r,t.positionFixed);c.top=n,c.left=l,c[e]=o,a.boundaries=i;var h=a.priority,v=t.offsets.popper,d={primary:function(s){var g=v[s];return v[s]i[s]&&!a.escapeWithReference&&(p=Math.min(v[g],i[s]-(s==="right"?v.width:v.height))),mt({},g,p)}};return h.forEach(function(u){var s=["left","top"].indexOf(u)!==-1?"primary":"secondary";v=S4({},v,d[s](u))}),t.offsets.popper=v,t}function Yk(t){var a=t.placement,r=a.split("-")[0],e=a.split("-")[1];if(e){var c=t.offsets,n=c.reference,l=c.popper,o=["bottom","top"].indexOf(r)!==-1,i=o?"left":"top",h=o?"width":"height",v={start:mt({},i,n[i]),end:mt({},i,n[i]+n[h]-l[h])};t.offsets.popper=S4({},l,v[e])}return t}function Jk(t){if(!gM(t.instance.modifiers,"hide","preventOverflow"))return t;var a=t.offsets.reference,r=m9(t.instance.modifiers,function(e){return e.name==="preventOverflow"}).boundaries;if(a.bottomr.right||a.top>r.bottom||a.right2&&arguments[2]!==void 0?arguments[2]:{};yk(this,t),this.scheduleUpdate=function(){return requestAnimationFrame(e.update)},this.update=Ck(this.update.bind(this)),this.options=S4({},t.Defaults,c),this.state={isDestroyed:!1,isCreated:!1,scrollParents:[]},this.reference=a&&a.jquery?a[0]:a,this.popper=r&&r.jquery?r[0]:r,this.options.modifiers={},Object.keys(S4({},t.Defaults.modifiers,c.modifiers)).forEach(function(l){e.options.modifiers[l]=S4({},t.Defaults.modifiers[l]||{},c.modifiers?c.modifiers[l]:{})}),this.modifiers=Object.keys(this.options.modifiers).map(function(l){return S4({name:l},e.options.modifiers[l])}).sort(function(l,o){return l.order-o.order}),this.modifiers.forEach(function(l){l.enabled&&aM(l.onLoad)&&l.onLoad(e.reference,e.popper,e.options,l,e.state)}),this.update();var n=this.options.eventsEnabled;n&&this.enableEventListeners(),this.state.eventsEnabled=n}return Ak(t,[{key:"update",value:function(){return Ok.call(this)}},{key:"destroy",value:function(){return kk.call(this)}},{key:"enableEventListeners",value:function(){return Rk.call(this)}},{key:"disableEventListeners",value:function(){return Ek.call(this)}}]),t}();Te.Utils=(typeof window<"u"?window:global).PopperUtils;Te.placements=pM;Te.Defaults=r_;var Ih=Te;var De=V(Ch());var H9=V(q6()),mM=V(mh());function zM(t,a){var r=Object.keys(t);if(Object.getOwnPropertySymbols){var e=Object.getOwnPropertySymbols(t);a&&(e=e.filter(function(c){return Object.getOwnPropertyDescriptor(t,c).enumerable})),r.push.apply(r,e)}return r}function i2(t){for(var a=1;a"u"||!Reflect.construct||Reflect.construct.sham)return!1;if(typeof Proxy=="function")return!0;try{return Boolean.prototype.valueOf.call(Reflect.construct(Boolean,[],function(){})),!0}catch{return!1}}function c_(t,a){if(t==null)return{};var r={},e=Object.keys(t),c,n;for(n=0;n=0)&&(r[c]=t[c]);return r}function xM(t,a){if(t==null)return{};var r=c_(t,a),e,c;if(Object.getOwnPropertySymbols){var n=Object.getOwnPropertySymbols(t);for(c=0;c=0)&&(!Object.prototype.propertyIsEnumerable.call(t,e)||(r[e]=t[e]))}return r}function J5(t){if(t===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return t}function n_(t,a){if(a&&(typeof a=="object"||typeof a=="function"))return a;if(a!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return J5(t)}function w9(t){var a=e_();return function(){var e=Ze(t),c;if(a){var n=Ze(this).constructor;c=Reflect.construct(e,arguments,n)}else c=e.apply(this,arguments);return n_(this,c)}}var l_={flip:{padding:20},preventOverflow:{padding:10}},S1={INIT:"init",IDLE:"idle",OPENING:"opening",OPEN:"open",CLOSING:"closing",ERROR:"error"},t3=mM.default.canUseDOM,x9=H9.default.createPortal!==void 0;function Eh(){return"ontouchstart"in window&&/Mobi/.test(navigator.userAgent)}function Ne(t){var a=t.title,r=t.data,e=t.warn,c=e===void 0?!1:e,n=t.debug,l=n===void 0?!1:n,o=c?console.warn||console.error:console.log;l&&a&&r&&(console.groupCollapsed("%creact-floater: ".concat(a),"color: #9b00ff; font-weight: bold; font-size: 12px;"),Array.isArray(r)?r.forEach(function(i){r1.plainObject(i)&&i.key?o.apply(console,[i.key,i.value]):o.apply(console,[i])}):o.apply(console,[r]),console.groupEnd())}function o_(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;t.addEventListener(a,r,e)}function i_(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1;t.removeEventListener(a,r,e)}function h_(t,a,r){var e=arguments.length>3&&arguments[3]!==void 0?arguments[3]:!1,c;c=function(l){r(l),i_(t,a,c)},o_(t,a,c,e)}function MM(){}var HM=function(t){C9(r,t);var a=w9(r);function r(){return V9(this,r),a.apply(this,arguments)}return L9(r,[{key:"componentDidMount",value:function(){!t3||(this.node||this.appendNode(),x9||this.renderPortal())}},{key:"componentDidUpdate",value:function(){!t3||x9||this.renderPortal()}},{key:"componentWillUnmount",value:function(){!t3||!this.node||(x9||H9.default.unmountComponentAtNode(this.node),this.node&&this.node.parentNode===document.body&&(document.body.removeChild(this.node),this.node=void 0))}},{key:"appendNode",value:function(){var c=this.props,n=c.id,l=c.zIndex;this.node||(this.node=document.createElement("div"),n&&(this.node.id=n),l&&(this.node.style.zIndex=l),document.body.appendChild(this.node))}},{key:"renderPortal",value:function(){if(!t3)return null;var c=this.props,n=c.children,l=c.setRef;if(this.node||this.appendNode(),x9)return H9.default.createPortal(n,this.node);var o=H9.default.unstable_renderSubtreeIntoContainer(this,n.length>1?m1.default.createElement("div",null,n):n[0],this.node);return l(o),null}},{key:"renderReact16",value:function(){var c=this.props,n=c.hasChildren,l=c.placement,o=c.target;return n?this.renderPortal():o||l==="center"?this.renderPortal():null}},{key:"render",value:function(){return x9?this.renderReact16():null}}]),r}(m1.default.Component);g0(HM,"propTypes",{children:W.default.oneOfType([W.default.element,W.default.array]),hasChildren:W.default.bool,id:W.default.oneOfType([W.default.string,W.default.number]),placement:W.default.string,setRef:W.default.func.isRequired,target:W.default.oneOfType([W.default.object,W.default.string]),zIndex:W.default.number});var VM=function(t){C9(r,t);var a=w9(r);function r(){return V9(this,r),a.apply(this,arguments)}return L9(r,[{key:"parentStyle",get:function(){var c=this.props,n=c.placement,l=c.styles,o=l.arrow.length,i={pointerEvents:"none",position:"absolute",width:"100%"};return n.startsWith("top")?(i.bottom=0,i.left=0,i.right=0,i.height=o):n.startsWith("bottom")?(i.left=0,i.right=0,i.top=0,i.height=o):n.startsWith("left")?(i.right=0,i.top=0,i.bottom=0):n.startsWith("right")&&(i.left=0,i.top=0),i}},{key:"render",value:function(){var c=this.props,n=c.placement,l=c.setArrowRef,o=c.styles,i=o.arrow,h=i.color,v=i.display,d=i.length,u=i.margin,s=i.position,g=i.spread,p={display:v,position:s},L,f=g,m=d;return n.startsWith("top")?(L="0,0 ".concat(f/2,",").concat(m," ").concat(f,",0"),p.bottom=0,p.marginLeft=u,p.marginRight=u):n.startsWith("bottom")?(L="".concat(f,",").concat(m," ").concat(f/2,",0 0,").concat(m),p.top=0,p.marginLeft=u,p.marginRight=u):n.startsWith("left")?(m=g,f=d,L="0,0 ".concat(f,",").concat(m/2," 0,").concat(m),p.right=0,p.marginTop=u,p.marginBottom=u):n.startsWith("right")&&(m=g,f=d,L="".concat(f,",").concat(m," ").concat(f,",0 0,").concat(m/2),p.left=0,p.marginTop=u,p.marginBottom=u),m1.default.createElement("div",{className:"__floater__arrow",style:this.parentStyle},m1.default.createElement("span",{ref:l,style:p},m1.default.createElement("svg",{width:f,height:m,version:"1.1",xmlns:"http://www.w3.org/2000/svg"},m1.default.createElement("polygon",{points:L,fill:h}))))}}]),r}(m1.default.Component);g0(VM,"propTypes",{placement:W.default.string.isRequired,setArrowRef:W.default.func.isRequired,styles:W.default.object.isRequired});var v_=["color","height","width"],LM=function(a){var r=a.handleClick,e=a.styles,c=e.color,n=e.height,l=e.width,o=xM(e,v_);return m1.default.createElement("button",{"aria-label":"close",onClick:r,style:o,type:"button"},m1.default.createElement("svg",{width:"".concat(l,"px"),height:"".concat(n,"px"),viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid"},m1.default.createElement("g",null,m1.default.createElement("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:c}))))};LM.propTypes={handleClick:W.default.func.isRequired,styles:W.default.object.isRequired};var CM=function(a){var r=a.content,e=a.footer,c=a.handleClick,n=a.open,l=a.positionWrapper,o=a.showCloseButton,i=a.title,h=a.styles,v={content:m1.default.isValidElement(r)?r:m1.default.createElement("div",{className:"__floater__content",style:h.content},r)};return i&&(v.title=m1.default.isValidElement(i)?i:m1.default.createElement("div",{className:"__floater__title",style:h.title},i)),e&&(v.footer=m1.default.isValidElement(e)?e:m1.default.createElement("div",{className:"__floater__footer",style:h.footer},e)),(o||l)&&!r1.boolean(n)&&(v.close=m1.default.createElement(LM,{styles:h.close,handleClick:c})),m1.default.createElement("div",{className:"__floater__container",style:h.container},v.close,v.title,v.content,v.footer)};CM.propTypes={content:W.default.node.isRequired,footer:W.default.node,handleClick:W.default.func.isRequired,open:W.default.bool,positionWrapper:W.default.bool.isRequired,showCloseButton:W.default.bool.isRequired,styles:W.default.object.isRequired,title:W.default.node};var wM=function(t){C9(r,t);var a=w9(r);function r(){return V9(this,r),a.apply(this,arguments)}return L9(r,[{key:"style",get:function(){var c=this.props,n=c.disableAnimation,l=c.component,o=c.placement,i=c.hideArrow,h=c.status,v=c.styles,d=v.arrow.length,u=v.floater,s=v.floaterCentered,g=v.floaterClosing,p=v.floaterOpening,L=v.floaterWithAnimation,f=v.floaterWithComponent,m={};return i||(o.startsWith("top")?m.padding="0 0 ".concat(d,"px"):o.startsWith("bottom")?m.padding="".concat(d,"px 0 0"):o.startsWith("left")?m.padding="0 ".concat(d,"px 0 0"):o.startsWith("right")&&(m.padding="0 0 0 ".concat(d,"px"))),[S1.OPENING,S1.OPEN].indexOf(h)!==-1&&(m=i2(i2({},m),p)),h===S1.CLOSING&&(m=i2(i2({},m),g)),h===S1.OPEN&&!n&&(m=i2(i2({},m),L)),o==="center"&&(m=i2(i2({},m),s)),l&&(m=i2(i2({},m),f)),i2(i2({},u),m)}},{key:"render",value:function(){var c=this.props,n=c.component,l=c.handleClick,o=c.hideArrow,i=c.setFloaterRef,h=c.status,v={},d=["__floater"];return n?m1.default.isValidElement(n)?v.content=m1.default.cloneElement(n,{closeFn:l}):v.content=n({closeFn:l}):v.content=m1.default.createElement(CM,this.props),h===S1.OPEN&&d.push("__floater__open"),o||(v.arrow=m1.default.createElement(VM,this.props)),m1.default.createElement("div",{ref:i,className:d.join(" "),style:this.style},m1.default.createElement("div",{className:"__floater__body"},v.content,v.arrow))}}]),r}(m1.default.Component);g0(wM,"propTypes",{component:W.default.oneOfType([W.default.func,W.default.element]),content:W.default.node,disableAnimation:W.default.bool.isRequired,footer:W.default.node,handleClick:W.default.func.isRequired,hideArrow:W.default.bool.isRequired,open:W.default.bool,placement:W.default.string.isRequired,positionWrapper:W.default.bool.isRequired,setArrowRef:W.default.func.isRequired,setFloaterRef:W.default.func.isRequired,showCloseButton:W.default.bool,status:W.default.string.isRequired,styles:W.default.object.isRequired,title:W.default.node});var BM=function(t){C9(r,t);var a=w9(r);function r(){return V9(this,r),a.apply(this,arguments)}return L9(r,[{key:"render",value:function(){var c=this.props,n=c.children,l=c.handleClick,o=c.handleMouseEnter,i=c.handleMouseLeave,h=c.setChildRef,v=c.setWrapperRef,d=c.style,u=c.styles,s;if(n)if(m1.default.Children.count(n)===1)if(!m1.default.isValidElement(n))s=m1.default.createElement("span",null,n);else{var g=r1.function(n.type)?"innerRef":"ref";s=m1.default.cloneElement(m1.default.Children.only(n),g0({},g,h))}else s=n;return s?m1.default.createElement("span",{ref:v,style:i2(i2({},u),d),onClick:l,onMouseEnter:o,onMouseLeave:i},s):null}}]),r}(m1.default.Component);g0(BM,"propTypes",{children:W.default.node,handleClick:W.default.func.isRequired,handleMouseEnter:W.default.func.isRequired,handleMouseLeave:W.default.func.isRequired,setChildRef:W.default.func.isRequired,setWrapperRef:W.default.func.isRequired,style:W.default.object,styles:W.default.object.isRequired});var d_={zIndex:100};function u_(t){var a=(0,De.default)(d_,t.options||{});return{wrapper:{cursor:"help",display:"inline-flex",flexDirection:"column",zIndex:a.zIndex},wrapperPosition:{left:-1e3,position:"absolute",top:-1e3,visibility:"hidden"},floater:{display:"inline-block",filter:"drop-shadow(0 0 3px rgba(0, 0, 0, 0.3))",maxWidth:300,opacity:0,position:"relative",transition:"opacity 0.3s",visibility:"hidden",zIndex:a.zIndex},floaterOpening:{opacity:1,visibility:"visible"},floaterWithAnimation:{opacity:1,transition:"opacity 0.3s, transform 0.2s",visibility:"visible"},floaterWithComponent:{maxWidth:"100%"},floaterClosing:{opacity:0,visibility:"visible"},floaterCentered:{left:"50%",position:"fixed",top:"50%",transform:"translate(-50%, -50%)"},container:{backgroundColor:"#fff",color:"#666",minHeight:60,minWidth:200,padding:20,position:"relative",zIndex:10},title:{borderBottom:"1px solid #555",color:"#555",fontSize:18,marginBottom:5,paddingBottom:6,paddingRight:18},content:{fontSize:15},close:{backgroundColor:"transparent",border:0,borderRadius:0,color:"#555",fontSize:0,height:15,outline:"none",padding:10,position:"absolute",right:0,top:0,width:15,WebkitAppearance:"none"},footer:{borderTop:"1px solid #ccc",fontSize:13,marginTop:10,paddingTop:5},arrow:{color:"#fff",display:"inline-flex",length:16,margin:8,position:"absolute",spread:32},options:a}}var s_=["arrow","flip","offset"],g_=["position","top","right","bottom","left"],Ge=function(t){C9(r,t);var a=w9(r);function r(e){var c;return V9(this,r),c=a.call(this,e),g0(J5(c),"setArrowRef",function(n){c.arrowRef=n}),g0(J5(c),"setChildRef",function(n){c.childRef=n}),g0(J5(c),"setFloaterRef",function(n){c.floaterRef=n}),g0(J5(c),"setWrapperRef",function(n){c.wrapperRef=n}),g0(J5(c),"handleTransitionEnd",function(){var n=c.state.status,l=c.props.callback;c.wrapperPopper&&c.wrapperPopper.instance.update(),c.setState({status:n===S1.OPENING?S1.OPEN:S1.IDLE},function(){var o=c.state.status;l(o===S1.OPEN?"open":"close",c.props)})}),g0(J5(c),"handleClick",function(){var n=c.props,l=n.event,o=n.open;if(!r1.boolean(o)){var i=c.state,h=i.positionWrapper,v=i.status;(c.event==="click"||c.event==="hover"&&h)&&(Ne({title:"click",data:[{event:l,status:v===S1.OPEN?"closing":"opening"}],debug:c.debug}),c.toggle())}}),g0(J5(c),"handleMouseEnter",function(){var n=c.props,l=n.event,o=n.open;if(!(r1.boolean(o)||Eh())){var i=c.state.status;c.event==="hover"&&i===S1.IDLE&&(Ne({title:"mouseEnter",data:[{key:"originalEvent",value:l}],debug:c.debug}),clearTimeout(c.eventDelayTimeout),c.toggle())}}),g0(J5(c),"handleMouseLeave",function(){var n=c.props,l=n.event,o=n.eventDelay,i=n.open;if(!(r1.boolean(i)||Eh())){var h=c.state,v=h.status,d=h.positionWrapper;c.event==="hover"&&(Ne({title:"mouseLeave",data:[{key:"originalEvent",value:l}],debug:c.debug}),o?[S1.OPENING,S1.OPEN].indexOf(v)!==-1&&!d&&!c.eventDelayTimeout&&(c.eventDelayTimeout=setTimeout(function(){delete c.eventDelayTimeout,c.toggle()},o*1e3)):c.toggle(S1.IDLE))}}),c.state={currentPlacement:e.placement,needsUpdate:!1,positionWrapper:e.wrapperOptions.position&&!!e.target,status:S1.INIT,statusWrapper:S1.INIT},c._isMounted=!1,c.hasMounted=!1,t3&&window.addEventListener("load",function(){c.popper&&c.popper.instance.update(),c.wrapperPopper&&c.wrapperPopper.instance.update()}),c}return L9(r,[{key:"componentDidMount",value:function(){if(!!t3){var c=this.state.positionWrapper,n=this.props,l=n.children,o=n.open,i=n.target;this._isMounted=!0,Ne({title:"init",data:{hasChildren:!!l,hasTarget:!!i,isControlled:r1.boolean(o),positionWrapper:c,target:this.target,floater:this.floaterRef},debug:this.debug}),this.hasMounted||(this.initPopper(),this.hasMounted=!0),!l&&i&&r1.boolean(o)}}},{key:"componentDidUpdate",value:function(c,n){if(!!t3){var l=this.props,o=l.autoOpen,i=l.open,h=l.target,v=l.wrapperOptions,d=X3(n,this.state),u=d.changedFrom,s=d.changed;if(c.open!==i){var g;r1.boolean(i)&&(g=i?S1.OPENING:S1.CLOSING),this.toggle(g)}(c.wrapperOptions.position!==v.position||c.target!==h)&&this.changeWrapperPosition(this.props),s("status",S1.IDLE)&&i?this.toggle(S1.OPEN):u("status",S1.INIT,S1.IDLE)&&o&&this.toggle(S1.OPEN),this.popper&&s("status",S1.OPENING)&&this.popper.instance.update(),this.floaterRef&&(s("status",S1.OPENING)||s("status",S1.CLOSING))&&h_(this.floaterRef,"transitionend",this.handleTransitionEnd),s("needsUpdate",!0)&&this.rebuildPopper()}}},{key:"componentWillUnmount",value:function(){!t3||(this._isMounted=!1,this.popper&&this.popper.instance.destroy(),this.wrapperPopper&&this.wrapperPopper.instance.destroy())}},{key:"initPopper",value:function(){var c=this,n=arguments.length>0&&arguments[0]!==void 0?arguments[0]:this.target,l=this.state.positionWrapper,o=this.props,i=o.disableFlip,h=o.getPopper,v=o.hideArrow,d=o.offset,u=o.placement,s=o.wrapperOptions,g=u==="top"||u==="bottom"?"flip":["right","bottom-end","top-end","left","top-start","bottom-start"];if(u==="center")this.setState({status:S1.IDLE});else if(n&&this.floaterRef){var p=this.options,L=p.arrow,f=p.flip,m=p.offset,H=xM(p,s_);new Ih(n,this.floaterRef,{placement:u,modifiers:i2({arrow:i2({enabled:!v,element:this.arrowRef},L),flip:i2({enabled:!i,behavior:g},f),offset:i2({offset:"0, ".concat(d,"px")},m)},H),onCreate:function(C){var k;if(c.popper=C,!((k=c.floaterRef)!==null&&k!==void 0&&k.isConnected)){c.setState({needsUpdate:!0});return}h(C,"floater"),c._isMounted&&c.setState({currentPlacement:C.placement,status:S1.IDLE}),u!==C.placement&&setTimeout(function(){C.instance.update()},1)},onUpdate:function(C){c.popper=C;var k=c.state.currentPlacement;c._isMounted&&C.placement!==k&&c.setState({currentPlacement:C.placement})}})}if(l){var w=r1.undefined(s.offset)?0:s.offset;new Ih(this.target,this.wrapperRef,{placement:s.placement||u,modifiers:{arrow:{enabled:!1},offset:{offset:"0, ".concat(w,"px")},flip:{enabled:!1}},onCreate:function(C){c.wrapperPopper=C,c._isMounted&&c.setState({statusWrapper:S1.IDLE}),h(C,"wrapper"),u!==C.placement&&setTimeout(function(){C.instance.update()},1)}})}}},{key:"rebuildPopper",value:function(){var c=this;this.floaterRefInterval=setInterval(function(){var n;(n=c.floaterRef)!==null&&n!==void 0&&n.isConnected&&(clearInterval(c.floaterRefInterval),c.setState({needsUpdate:!1}),c.initPopper())},50)}},{key:"changeWrapperPosition",value:function(c){var n=c.target,l=c.wrapperOptions;this.setState({positionWrapper:l.position&&!!n})}},{key:"toggle",value:function(c){var n=this.state.status,l=n===S1.OPEN?S1.CLOSING:S1.OPENING;r1.undefined(c)||(l=c),this.setState({status:l})}},{key:"debug",get:function(){var c=this.props.debug;return c||!!global.ReactFloaterDebug}},{key:"event",get:function(){var c=this.props,n=c.disableHoverToClick,l=c.event;return l==="hover"&&Eh()&&!n?"click":l}},{key:"options",get:function(){var c=this.props.options;return(0,De.default)(l_,c||{})}},{key:"styles",get:function(){var c=this,n=this.state,l=n.status,o=n.positionWrapper,i=n.statusWrapper,h=this.props.styles,v=(0,De.default)(u_(h),h);if(o){var d;[S1.IDLE].indexOf(l)===-1||[S1.IDLE].indexOf(i)===-1?d=v.wrapperPosition:d=this.wrapperPopper.styles,v.wrapper=i2(i2({},v.wrapper),d)}if(this.target){var u=window.getComputedStyle(this.target);this.wrapperStyles?v.wrapper=i2(i2({},v.wrapper),this.wrapperStyles):["relative","static"].indexOf(u.position)===-1&&(this.wrapperStyles={},o||(g_.forEach(function(s){c.wrapperStyles[s]=u[s]}),v.wrapper=i2(i2({},v.wrapper),this.wrapperStyles),this.target.style.position="relative",this.target.style.top="auto",this.target.style.right="auto",this.target.style.bottom="auto",this.target.style.left="auto"))}return v}},{key:"target",get:function(){if(!t3)return null;var c=this.props.target;return c?r1.domElement(c)?c:document.querySelector(c):this.childRef||this.wrapperRef}},{key:"render",value:function(){var c=this.state,n=c.currentPlacement,l=c.positionWrapper,o=c.status,i=this.props,h=i.children,v=i.component,d=i.content,u=i.disableAnimation,s=i.footer,g=i.hideArrow,p=i.id,L=i.open,f=i.showCloseButton,m=i.style,H=i.target,w=i.title,A=m1.default.createElement(BM,{handleClick:this.handleClick,handleMouseEnter:this.handleMouseEnter,handleMouseLeave:this.handleMouseLeave,setChildRef:this.setChildRef,setWrapperRef:this.setWrapperRef,style:m,styles:this.styles.wrapper},h),C={};return l?C.wrapperInPortal=A:C.wrapperAsChildren=A,m1.default.createElement("span",null,m1.default.createElement(HM,{hasChildren:!!h,id:p,placement:n,setRef:this.setFloaterRef,target:H,zIndex:this.styles.options.zIndex},m1.default.createElement(wM,{component:v,content:d,disableAnimation:u,footer:s,handleClick:this.handleClick,hideArrow:g||n==="center",open:L,placement:n,positionWrapper:l,setArrowRef:this.setArrowRef,setFloaterRef:this.setFloaterRef,showCloseButton:f,status:o,styles:this.styles,title:w}),C.wrapperInPortal),C.wrapperAsChildren)}}]),r}(m1.default.Component);g0(Ge,"propTypes",{autoOpen:W.default.bool,callback:W.default.func,children:W.default.node,component:(0,Ph.default)(W.default.oneOfType([W.default.func,W.default.element]),function(t){return!t.content}),content:(0,Ph.default)(W.default.node,function(t){return!t.component}),debug:W.default.bool,disableAnimation:W.default.bool,disableFlip:W.default.bool,disableHoverToClick:W.default.bool,event:W.default.oneOf(["hover","click"]),eventDelay:W.default.number,footer:W.default.node,getPopper:W.default.func,hideArrow:W.default.bool,id:W.default.oneOfType([W.default.string,W.default.number]),offset:W.default.number,open:W.default.bool,options:W.default.object,placement:W.default.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto","center"]),showCloseButton:W.default.bool,style:W.default.object,styles:W.default.object,target:W.default.oneOfType([W.default.object,W.default.string]),title:W.default.node,wrapperOptions:W.default.shape({offset:W.default.number,placement:W.default.oneOf(["top","top-start","top-end","bottom","bottom-start","bottom-end","left","left-start","left-end","right","right-start","right-end","auto"]),position:W.default.bool})});g0(Ge,"defaultProps",{autoOpen:!1,callback:MM,debug:!1,disableAnimation:!1,disableFlip:!1,disableHoverToClick:!1,event:"click",eventDelay:.4,getPopper:MM,hideArrow:!1,offset:15,placement:"bottom",showCloseButton:!1,styles:{},target:null,wrapperOptions:{position:!1}});function yM(t,a){var r=Object.keys(t);if(Object.getOwnPropertySymbols){var e=Object.getOwnPropertySymbols(t);a&&(e=e.filter(function(c){return Object.getOwnPropertyDescriptor(t,c).enumerable})),r.push.apply(r,e)}return r}function K(t){for(var a=1;a"u"||!Reflect.construct||Reflect.construct.sham)return!1;if(typeof Proxy=="function")return!0;try{return Boolean.prototype.valueOf.call(Reflect.construct(Boolean,[],function(){})),!0}catch{return!1}}function z_(t,a){if(t==null)return{};var r={},e=Object.keys(t),c,n;for(n=0;n=0)&&(r[c]=t[c]);return r}function We(t,a){if(t==null)return{};var r=z_(t,a),e,c;if(Object.getOwnPropertySymbols){var n=Object.getOwnPropertySymbols(t);for(c=0;c=0)&&(!Object.prototype.propertyIsEnumerable.call(t,e)||(r[e]=t[e]))}return r}function f2(t){if(t===void 0)throw new ReferenceError("this hasn't been initialised - super() hasn't been called");return t}function f_(t,a){if(a&&(typeof a=="object"||typeof a=="function"))return a;if(a!==void 0)throw new TypeError("Derived constructors may only return object or undefined");return f2(t)}function Q6(t){var a=p_();return function(){var e=Ue(t),c;if(a){var n=Ue(this).constructor;c=Reflect.construct(e,arguments,n)}else c=e.apply(this,arguments);return f_(this,c)}}var x1={INIT:"init",START:"start",STOP:"stop",RESET:"reset",PREV:"prev",NEXT:"next",GO:"go",CLOSE:"close",SKIP:"skip",UPDATE:"update"},p0={TOUR_START:"tour:start",STEP_BEFORE:"step:before",BEACON:"beacon",TOOLTIP:"tooltip",STEP_AFTER:"step:after",TOUR_END:"tour:end",TOUR_STATUS:"tour:status",TARGET_NOT_FOUND:"error:target_not_found",ERROR:"error"},M1={INIT:"init",READY:"ready",BEACON:"beacon",TOOLTIP:"tooltip",COMPLETE:"complete",ERROR:"error"},L1={IDLE:"idle",READY:"ready",WAITING:"waiting",RUNNING:"running",PAUSED:"paused",SKIPPED:"skipped",FINISHED:"finished",ERROR:"error"},Y3=RM.default.canUseDOM,B9=Ht.createPortal!==void 0;function EM(){var t=arguments.length>0&&arguments[0]!==void 0?arguments[0]:navigator.userAgent,a=t;return typeof window>"u"?a="node":document.documentMode?a="ie":/Edge/.test(t)?a="edge":Boolean(window.opera)||t.indexOf(" OPR/")>=0?a="opera":typeof window.InstallTrigger<"u"?a="firefox":window.chrome?a="chrome":/(Version\/([0-9._]+).*Safari|CriOS|FxiOS| Mobile\/)/.test(t)&&(a="safari"),a}function Nh(t){return Object.prototype.toString.call(t).slice(8,-1).toLowerCase()}function y9(t){var a=[],r=function e(c){if(typeof c=="string"||typeof c=="number")a.push(c);else if(Array.isArray(c))c.forEach(function(l){return e(l)});else if(c&&c.props){var n=c.props.children;Array.isArray(n)?n.forEach(function(l){return e(l)}):e(n)}};return r(t),a.join(" ").trim()}function SM(t,a){return Object.prototype.hasOwnProperty.call(t,a)}function M_(t,a){return!z2.plainObject(t)||!z2.array(a)?!1:Object.keys(t).every(function(r){return a.indexOf(r)!==-1})}function m_(t){var a=/^#?([a-f\d])([a-f\d])([a-f\d])$/i,r=t.replace(a,function(c,n,l,o){return n+n+l+l+o+o}),e=/^#?([a-f\d]{2})([a-f\d]{2})([a-f\d]{2})$/i.exec(r);return e?[parseInt(e[1],16),parseInt(e[2],16),parseInt(e[3],16)]:[]}function bM(t){return t.disableBeacon||t.placement==="center"}function Gh(t,a){var r,e=(0,h1.isValidElement)(t)||(0,h1.isValidElement)(a),c=z2.undefined(t)||z2.undefined(a);if(Nh(t)!==Nh(a)||e||c)return!1;if(z2.domElement(t))return t.isSameNode(a);if(z2.number(t))return t===a;if(z2.function(t))return t.toString()===a.toString();for(var n in t)if(SM(t,n)){if(typeof t[n]>"u"||typeof a[n]>"u")return!1;if(r=Nh(t[n]),["object","array"].indexOf(r)!==-1&&Gh(t[n],a[n])||r==="function"&&Gh(t[n],a[n]))continue;if(t[n]!==a[n])return!1}for(var l in a)if(SM(a,l)&&typeof t[l]>"u")return!1;return!0}function FM(){return["chrome","safari","firefox","opera"].indexOf(EM())===-1}function X6(t){var a=t.title,r=t.data,e=t.warn,c=e===void 0?!1:e,n=t.debug,l=n===void 0?!1:n,o=c?console.warn||console.error:console.log;l&&(a&&r?(console.groupCollapsed("%creact-joyride: ".concat(a),"color: #ff0044; font-weight: bold; font-size: 12px;"),Array.isArray(r)?r.forEach(function(i){z2.plainObject(i)&&i.key?o.apply(console,[i.key,i.value]):o.apply(console,[i])}):o.apply(console,[r]),console.groupEnd()):console.error("Missing title or data props"))}var x_={action:"",controlled:!1,index:0,lifecycle:M1.INIT,size:0,status:L1.IDLE},OM=["action","index","lifecycle","status"];function H_(t){var a=new Map,r=new Map,e=function(){function c(){var n=this,l=arguments.length>0&&arguments[0]!==void 0?arguments[0]:{},o=l.continuous,i=o===void 0?!1:o,h=l.stepIndex,v=l.steps,d=v===void 0?[]:v;r3(this,c),l1(this,"listener",void 0),l1(this,"setSteps",function(u){var s=n.getState(),g=s.size,p=s.status,L={size:u.length,status:p};r.set("steps",u),p===L1.WAITING&&!g&&u.length&&(L.status=L1.RUNNING),n.setState(L)}),l1(this,"addListener",function(u){n.listener=u}),l1(this,"update",function(u){if(!M_(u,OM))throw new Error("State is not valid. Valid keys: ".concat(OM.join(", ")));n.setState(K({},n.getNextState(K(K(K({},n.getState()),u),{},{action:u.action||x1.UPDATE}),!0)))}),l1(this,"start",function(u){var s=n.getState(),g=s.index,p=s.size;n.setState(K(K({},n.getNextState({action:x1.START,index:z2.number(u)?u:g},!0)),{},{status:p?L1.RUNNING:L1.WAITING}))}),l1(this,"stop",function(){var u=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,s=n.getState(),g=s.index,p=s.status;[L1.FINISHED,L1.SKIPPED].indexOf(p)===-1&&n.setState(K(K({},n.getNextState({action:x1.STOP,index:g+(u?1:0)})),{},{status:L1.PAUSED}))}),l1(this,"close",function(){var u=n.getState(),s=u.index,g=u.status;g===L1.RUNNING&&n.setState(K({},n.getNextState({action:x1.CLOSE,index:s+1})))}),l1(this,"go",function(u){var s=n.getState(),g=s.controlled,p=s.status;if(!(g||p!==L1.RUNNING)){var L=n.getSteps()[u];n.setState(K(K({},n.getNextState({action:x1.GO,index:u})),{},{status:L?p:L1.FINISHED}))}}),l1(this,"info",function(){return n.getState()}),l1(this,"next",function(){var u=n.getState(),s=u.index,g=u.status;g===L1.RUNNING&&n.setState(n.getNextState({action:x1.NEXT,index:s+1}))}),l1(this,"open",function(){var u=n.getState(),s=u.status;s===L1.RUNNING&&n.setState(K({},n.getNextState({action:x1.UPDATE,lifecycle:M1.TOOLTIP})))}),l1(this,"prev",function(){var u=n.getState(),s=u.index,g=u.status;g===L1.RUNNING&&n.setState(K({},n.getNextState({action:x1.PREV,index:s-1})))}),l1(this,"reset",function(){var u=arguments.length>0&&arguments[0]!==void 0?arguments[0]:!1,s=n.getState(),g=s.controlled;g||n.setState(K(K({},n.getNextState({action:x1.RESET,index:0})),{},{status:u?L1.RUNNING:L1.READY}))}),l1(this,"skip",function(){var u=n.getState(),s=u.status;s===L1.RUNNING&&n.setState({action:x1.SKIP,lifecycle:M1.INIT,status:L1.SKIPPED})}),this.setState({action:x1.INIT,controlled:z2.number(h),continuous:i,index:z2.number(h)?h:0,lifecycle:M1.INIT,status:d.length?L1.READY:L1.IDLE},!0),this.setSteps(d)}return e3(c,[{key:"setState",value:function(l){var o=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,i=this.getState(),h=K(K({},i),l),v=h.action,d=h.index,u=h.lifecycle,s=h.size,g=h.status;a.set("action",v),a.set("index",d),a.set("lifecycle",u),a.set("size",s),a.set("status",g),o&&(a.set("controlled",l.controlled),a.set("continuous",l.continuous)),this.listener&&this.hasUpdatedState(i)&&this.listener(this.getState())}},{key:"getState",value:function(){return a.size?{action:a.get("action")||"",controlled:a.get("controlled")||!1,index:parseInt(a.get("index"),10),lifecycle:a.get("lifecycle")||"",size:a.get("size")||0,status:a.get("status")||""}:K({},x_)}},{key:"getNextState",value:function(l){var o=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1,i=this.getState(),h=i.action,v=i.controlled,d=i.index,u=i.size,s=i.status,g=z2.number(l.index)?l.index:d,p=v&&!o?d:Math.min(Math.max(g,0),u);return{action:l.action||h,controlled:v,index:p,lifecycle:l.lifecycle||M1.INIT,size:l.size||u,status:p===u?L1.FINISHED:l.status||s}}},{key:"hasUpdatedState",value:function(l){var o=JSON.stringify(l),i=JSON.stringify(this.getState());return o!==i}},{key:"getSteps",value:function(){var l=r.get("steps");return Array.isArray(l)?l:[]}},{key:"getHelpers",value:function(){return{close:this.close,go:this.go,info:this.info,next:this.next,open:this.open,prev:this.prev,reset:this.reset,skip:this.skip}}}]),c}();return new e(t)}function PM(t){return t?t.getBoundingClientRect():{}}function V_(){var t=document,a=t.body,r=t.documentElement;return!a||!r?0:Math.max(a.scrollHeight,a.offsetHeight,r.clientHeight,r.scrollHeight,r.offsetHeight)}function J3(t){return typeof t=="string"?document.querySelector(t):t}function L_(t){return!t||t.nodeType!==1?{}:getComputedStyle(t)}function je(t,a,r){var e=(0,Wh.default)(t);if(e.isSameNode(b9()))return r?document:b9();var c=e.scrollHeight>e.offsetHeight;return!c&&!a?(e.style.overflow="initial",b9()):e}function qe(t,a){if(!t)return!1;var r=je(t,a);return!r.isSameNode(b9())}function C_(t){return t.offsetParent!==document.body}function Vt(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:"fixed";if(!t||!(t instanceof HTMLElement))return!1;var r=t.nodeName;return r==="BODY"||r==="HTML"?!1:L_(t).position===a?!0:Vt(t.parentNode,a)}function w_(t){if(!t)return!1;for(var a=t;a&&a!==document.body;){if(a instanceof HTMLElement){var r=getComputedStyle(a),e=r.display,c=r.visibility;if(e==="none"||c==="hidden")return!1}a=a.parentNode}return!0}function B_(t,a,r){var e=PM(t),c=je(t,r),n=qe(t,r),l=0;c instanceof HTMLElement&&(l=c.scrollTop);var o=e.top+(!n&&!Vt(t)?l:0);return Math.floor(o-a)}function Uh(t){return t instanceof HTMLElement?t.offsetParent instanceof HTMLElement?Uh(t.offsetParent)+t.offsetTop:t.offsetTop:0}function y_(t,a,r){if(!t)return 0;var e=(0,Wh.default)(t),c=Uh(t);return qe(t,r)&&!C_(t)&&(c-=Uh(e)),Math.floor(c-a)}function b9(){return document.scrollingElement||document.createElement("body")}function A_(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:b9(),r=arguments.length>2&&arguments[2]!==void 0?arguments[2]:300;return new Promise(function(e,c){var n=a.scrollTop,l=t>n?t-n:n-t;IM.default.top(a,t,{duration:l<100?50:r},function(o){return o&&o.message!=="Element already at target scroll position"?c(o):e()})})}function S_(t){function a(e,c,n,l,o,i){var h=l||"<>",v=i||n;if(c[n]==null)return e?new Error("Required ".concat(o," `").concat(v,"` was not specified in `").concat(h,"`.")):null;for(var d=arguments.length,u=new Array(d>6?d-6:0),s=6;s0&&arguments[0]!==void 0?arguments[0]:{},a=(0,Q3.default)(b_,t.options||{}),r=290;window.innerWidth>480&&(r=380),a.width&&(window.innerWidth1&&arguments[1]!==void 0?arguments[1]:!1;return z2.plainObject(t)?t.target?!0:(X6({title:"validateStep",data:"target is missing from the step",warn:!0,debug:a}),!1):(X6({title:"validateStep",data:"step must be an object",warn:!0,debug:a}),!1)}function _M(t){var a=arguments.length>1&&arguments[1]!==void 0?arguments[1]:!1;return z2.array(t)?t.every(function(r){return TM(r,a)}):(X6({title:"validateSteps",data:"steps must be an array",warn:!0,debug:a}),!1)}var k_=e3(function t(a){var r=this,e=arguments.length>1&&arguments[1]!==void 0?arguments[1]:{};if(r3(this,t),l1(this,"element",void 0),l1(this,"options",void 0),l1(this,"canBeTabbed",function(c){var n=c.tabIndex;(n===null||n<0)&&(n=void 0);var l=isNaN(n);return!l&&r.canHaveFocus(c)}),l1(this,"canHaveFocus",function(c){var n=/input|select|textarea|button|object/,l=c.nodeName.toLowerCase(),o=n.test(l)&&!c.getAttribute("disabled")||l==="a"&&!!c.getAttribute("href");return o&&r.isVisible(c)}),l1(this,"findValidTabElements",function(){return[].slice.call(r.element.querySelectorAll("*"),0).filter(r.canBeTabbed)}),l1(this,"handleKeyDown",function(c){var n=r.options.keyCode,l=n===void 0?9:n;c.keyCode===l&&r.interceptTab(c)}),l1(this,"interceptTab",function(c){var n=r.findValidTabElements();if(!!n.length){c.preventDefault();var l=c.shiftKey,o=n.indexOf(document.activeElement);o===-1||!l&&o+1===n.length?o=0:l&&o===0?o=n.length-1:o+=l?-1:1,n[o].focus()}}),l1(this,"isHidden",function(c){var n=c.offsetWidth<=0&&c.offsetHeight<=0,l=window.getComputedStyle(c);return n&&!c.innerHTML?!0:n&&l.getPropertyValue("overflow")!=="visible"||l.getPropertyValue("display")==="none"}),l1(this,"isVisible",function(c){for(var n=c;n;)if(n instanceof HTMLElement){if(n===document.body)break;if(r.isHidden(n))return!1;n=n.parentNode}return!0}),l1(this,"removeScope",function(){window.removeEventListener("keydown",r.handleKeyDown)}),l1(this,"checkFocus",function(c){document.activeElement!==c&&(c.focus(),window.requestAnimationFrame(function(){return r.checkFocus(c)}))}),l1(this,"setFocus",function(){var c=r.options.selector;if(!!c){var n=r.element.querySelector(c);n&&window.requestAnimationFrame(function(){return r.checkFocus(n)})}}),!(a instanceof HTMLElement))throw new TypeError("Invalid parameter: element must be an HTMLElement");this.element=a,this.options=e,window.addEventListener("keydown",this.handleKeyDown,!1),this.setFocus()}),__=function(t){K6(r,t);var a=Q6(r);function r(e){var c;if(r3(this,r),c=a.call(this,e),l1(f2(c),"setBeaconRef",function(i){c.beacon=i}),!e.beaconComponent){var n=document.head||document.getElementsByTagName("head")[0],l=document.createElement("style"),o=` @keyframes joyride-beacon-inner { 20% { opacity: 0.9; @@ -37,12 +47,12 @@ Please read the updated README.md at https://github.com/SortableJS/react-sortabl transform: scale(1); } } - `;l.type="text/css",l.id="joyride-beacon-animation",e.nonce!==void 0&&l.setAttribute("nonce",e.nonce),l.appendChild(document.createTextNode(o)),n.appendChild(l)}return c}return K5(r,[{key:"componentDidMount",value:function(){var c=this,n=this.props.shouldFocus;setTimeout(function(){p2.domElement(c.beacon)&&n&&c.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var c=document.getElementById("joyride-beacon-animation");c&&c.parentNode.removeChild(c)}},{key:"render",value:function(){var c=this.props,n=c.beaconComponent,l=c.locale,o=c.onClickOrHover,i=c.styles,h={"aria-label":l.open,onClick:o,onMouseEnter:o,ref:this.setBeaconRef,title:l.open},v;if(n){var d=n;v=h1.default.createElement(d,h)}else v=h1.default.createElement("button",i4({key:"JoyrideBeacon",className:"react-joyride__beacon",style:i.beacon,type:"button"},h),h1.default.createElement("span",{style:i.beaconInner}),h1.default.createElement("span",{style:i.beaconOuter}));return v}}]),r}(h1.default.Component);function Uk(t){var a=t.styles;return h1.default.createElement("div",{key:"JoyrideSpotlight",className:"react-joyride__spotlight",style:a})}var Wk=["mixBlendMode","zIndex"],jk=function(t){W6(r,t);var a=j6(r);function r(){var e;$5(this,r);for(var c=arguments.length,n=new Array(c),l=0;l=s&&p<=s+v,m=L>=d&&L<=d+g,H=m&&f;H!==i&&e.updateState({mouseOverSpotlight:H})}),l1(z2(e),"handleScroll",function(){var o=e.props.target,i=X3(o);if(e.scrollParent!==document){var h=e.state.isScrolling;h||e.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(e.scrollTimeout),e.scrollTimeout=setTimeout(function(){e.updateState({isScrolling:!1,showSpotlight:!0})},50)}else pt(i,"sticky")&&e.updateState({})}),l1(z2(e),"handleResize",function(){clearTimeout(e.resizeTimeout),e.resizeTimeout=setTimeout(function(){!e._isMounted||e.forceUpdate()},100)}),e}return K5(r,[{key:"componentDidMount",value:function(){var c=this.props;c.debug,c.disableScrolling;var n=c.disableScrollParentFix,l=c.target,o=X3(l);this.scrollParent=Ee(o,n,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(c){var n=this,l=this.props,o=l.lifecycle,i=l.spotlightClicks,h=U3(c,this.props),v=h.changed;v("lifecycle",M1.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var d=n.state.isScrolling;d||n.updateState({showSpotlight:!0})},100)),(v("spotlightClicks")||v("disableOverlay")||v("lifecycle"))&&(i&&o===M1.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):o!==M1.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var c=this.state.showSpotlight,n=this.props,l=n.disableScrollParentFix,o=n.spotlightClicks,i=n.spotlightPadding,h=n.styles,v=n.target,d=X3(v),u=sM(d),s=pt(d),g=Ik(d,i,l);return K(K({},lM()?h.spotlightLegacy:h.spotlight),{},{height:Math.round(u.height+i*2),left:Math.round(u.left-i),opacity:c?1:0,pointerEvents:o?"none":"auto",position:s?"fixed":"absolute",top:g,transition:"opacity 0.2s",width:Math.round(u.width+i*2)})}},{key:"updateState",value:function(c){!this._isMounted||this.setState(c)}},{key:"render",value:function(){var c=this.state,n=c.mouseOverSpotlight,l=c.showSpotlight,o=this.props,i=o.disableOverlay,h=o.disableOverlayClose,v=o.lifecycle,d=o.onClickOverlay,u=o.placement,s=o.styles;if(i||v!==M1.TOOLTIP)return null;var g=s.overlay;lM()&&(g=u==="center"?s.overlayLegacyCenter:s.overlayLegacy);var p=K({cursor:h?"default":"pointer",height:Fk(),pointerEvents:n?"none":"auto"},g),L=u!=="center"&&l&&h1.default.createElement(Uk,{styles:this.spotlightStyles});if(uM()==="safari"){p.mixBlendMode,p.zIndex;var f=Ie(p,Wk);L=h1.default.createElement("div",{style:K({},f)},L),delete p.backgroundColor}return h1.default.createElement("div",{className:"react-joyride__overlay",style:p,onClick:d},L)}}]),r}(h1.default.Component),qk=["styles"],Xk=["color","height","width"];function $k(t){var a=t.styles,r=Ie(t,qk),e=a.color,c=a.height,n=a.width,l=Ie(a,Xk);return h1.default.createElement("button",i4({style:l,type:"button"},r),h1.default.createElement("svg",{width:typeof n=="number"?"".concat(n,"px"):n,height:typeof c=="number"?"".concat(c,"px"):c,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid"},h1.default.createElement("g",null,h1.default.createElement("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:e}))))}var Kk=function(t){W6(r,t);var a=j6(r);function r(){return $5(this,r),a.apply(this,arguments)}return K5(r,[{key:"render",value:function(){var c=this.props,n=c.backProps,l=c.closeProps,o=c.continuous,i=c.index,h=c.isLastStep,v=c.primaryProps,d=c.size,u=c.skipProps,s=c.step,g=c.tooltipProps,p=s.content,L=s.hideBackButton,f=s.hideCloseButton,m=s.hideFooter,H=s.showProgress,w=s.showSkipButton,A=s.title,C=s.styles,k=s.locale,E=k.back,_=k.close,U=k.last,j=k.next,Q=k.skip,T={primary:_};return o&&(T.primary=h?U:j,H&&(T.primary=h1.default.createElement("span",null,T.primary," (",i+1,"/",d,")"))),w&&!h&&(T.skip=h1.default.createElement("button",i4({style:C.buttonSkip,type:"button","aria-live":"off"},u),Q)),!L&&i>0&&(T.back=h1.default.createElement("button",i4({style:C.buttonBack,type:"button"},n),E)),T.close=!f&&h1.default.createElement($k,i4({styles:C.buttonClose},l)),h1.default.createElement("div",i4({key:"JoyrideTooltip",className:"react-joyride__tooltip",style:C.tooltip},g),h1.default.createElement("div",{style:C.tooltipContainer},A&&h1.default.createElement("h4",{style:C.tooltipTitle,"aria-label":A},A),h1.default.createElement("div",{style:C.tooltipContent},p)),!m&&h1.default.createElement("div",{style:C.tooltipFooter},h1.default.createElement("div",{style:C.tooltipFooterSpacer},T.skip),T.back,h1.default.createElement("button",i4({style:C.buttonNext,type:"button"},v),T.primary)),T.close)}}]),r}(h1.default.Component),Qk=["beaconComponent","tooltipComponent"],Yk=function(t){W6(r,t);var a=j6(r);function r(){var e;$5(this,r);for(var c=arguments.length,n=new Array(c),l=0;l0||l===x1.PREV),C=m("action")||m("index")||m("lifecycle")||m("status"),k=H("lifecycle",[M1.TOOLTIP,M1.INIT],M1.INIT),E=m("action",[x1.NEXT,x1.PREV,x1.SKIP,x1.CLOSE]);if(E&&(k||h)&&o(K(K({},w),{},{index:c.index,lifecycle:M1.COMPLETE,step:c.step,type:s0.STEP_AFTER})),p.placement==="center"&&g===L1.RUNNING&&m("index")&&l!==x1.START&&u===M1.INIT&&L({lifecycle:M1.READY}),C){var _=X3(p.target),U=!!_,j=U&&Rk(_);j?(H("status",L1.READY,L1.RUNNING)||H("lifecycle",M1.INIT,M1.READY))&&o(K(K({},w),{},{step:p,type:s0.STEP_BEFORE})):(console.warn(U?"Target not visible":"Target not mounted",p),o(K(K({},w),{},{type:s0.TARGET_NOT_FOUND,step:p})),h||L({index:d+([x1.PREV].indexOf(l)!==-1?-1:1)}))}H("lifecycle",M1.INIT,M1.READY)&&L({lifecycle:nM(p)||A?M1.TOOLTIP:M1.BEACON}),m("index")&&U6({title:"step:".concat(u),data:[{key:"props",value:this.props}],debug:v}),m("lifecycle",M1.BEACON)&&o(K(K({},w),{},{step:p,type:s0.BEACON})),m("lifecycle",M1.TOOLTIP)&&(o(K(K({},w),{},{step:p,type:s0.TOOLTIP})),this.scope=new Zk(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),H("lifecycle",[M1.TOOLTIP,M1.INIT],M1.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var c=this.props,n=c.step,l=c.lifecycle;return!!(nM(n)||l===M1.TOOLTIP)}},{key:"render",value:function(){var c=this.props,n=c.continuous,l=c.debug,o=c.helpers,i=c.index,h=c.lifecycle,v=c.nonce,d=c.shouldScroll,u=c.size,s=c.step,g=X3(s.target);return!gM(s)||!p2.domElement(g)?null:h1.default.createElement("div",{key:"JoyrideStep-".concat(i),className:"react-joyride__step"},h1.default.createElement(Jk,{id:"react-joyride-portal"},h1.default.createElement(jk,i4({},s,{debug:l,lifecycle:h,onClickOverlay:this.handleClickOverlay}))),h1.default.createElement(ke,i4({component:h1.default.createElement(Yk,{continuous:n,helpers:o,index:i,isLastStep:i+1===u,setTooltipRef:this.setTooltipRef,size:u,step:s}),debug:l,getPopper:this.setPopper,id:"react-joyride-step-".concat(i),isPositioned:s.isFixed||pt(g),open:this.open,placement:s.placement,target:s.target},s.floaterProps),h1.default.createElement(Gk,{beaconComponent:s.beaconComponent,locale:s.locale,nonce:v,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:d,styles:s.styles})))}}]),r}(h1.default.Component),bh=function(t){W6(r,t);var a=j6(r);function r(e){var c;return $5(this,r),c=a.call(this,e),l1(z2(c),"initStore",function(){var n=c.props,l=n.debug,o=n.getHelpers,i=n.run,h=n.stepIndex;c.store=new bk(K(K({},c.props),{},{controlled:i&&p2.number(h)})),c.helpers=c.store.getHelpers();var v=c.store.addListener;return U6({title:"init",data:[{key:"props",value:c.props},{key:"state",value:c.state}],debug:l}),v(c.syncState),o(c.helpers),c.store.getState()}),l1(z2(c),"callback",function(n){var l=c.props.callback;p2.function(l)&&l(n)}),l1(z2(c),"handleKeyboard",function(n){var l=c.state,o=l.index,i=l.lifecycle,h=c.props.steps,v=h[o],d=window.Event?n.which:n.keyCode;i===M1.TOOLTIP&&d===27&&v&&!v.disableCloseOnEsc&&c.store.close()}),l1(z2(c),"syncState",function(n){c.setState(n)}),l1(z2(c),"setPopper",function(n,l){l==="wrapper"?c.beaconPopper=n:c.tooltipPopper=n}),l1(z2(c),"shouldScroll",function(n,l,o,i,h,v,d){return!n&&(l!==0||o||i===M1.TOOLTIP)&&h.placement!=="center"&&(!h.isFixed||!pt(v))&&d.lifecycle!==i&&[M1.BEACON,M1.TOOLTIP].indexOf(i)!==-1}),c.state=c.initStore(),c}return K5(r,[{key:"componentDidMount",value:function(){if(!!q3){var c=this.props,n=c.disableCloseOnEsc,l=c.debug,o=c.run,i=c.steps,h=this.store.start;hM(i,l)&&o&&h(),n||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(c,n){if(!!q3){var l=this.state,o=l.action,i=l.controlled,h=l.index,v=l.lifecycle,d=l.status,u=this.props,s=u.debug,g=u.run,p=u.stepIndex,L=u.steps,f=c.steps,m=c.stepIndex,H=this.store,w=H.reset,A=H.setSteps,C=H.start,k=H.stop,E=H.update,_=U3(c,this.props),U=_.changed,j=U3(n,this.state),Q=j.changed,T=j.changedFrom,c1=x9(L[h],this.props),H1=!yh(f,L),w1=p2.number(p)&&U("stepIndex"),W1=X3(c1?.target);if(H1&&(hM(L,s)?A(L):console.warn("Steps are not valid",L)),U("run")&&(g?C(p):k()),w1){var P1=m=0?C:0,i===L1.RUNNING&&Pk(C,A,p)}}}},{key:"render",value:function(){if(!q3)return null;var c=this.state,n=c.index,l=c.status,o=this.props,i=o.continuous,h=o.debug,v=o.nonce,d=o.scrollToFirstStep,u=o.steps,s=x9(u[n],this.props),g;return l===L1.RUNNING&&s&&(g=h1.default.createElement(tR,i4({},this.state,{callback:this.callback,continuous:i,debug:h,setPopper:this.setPopper,helpers:this.helpers,nonce:v,shouldScroll:!s.disableScrolling&&(n!==0||d),step:s,update:this.store.update}))),h1.default.createElement("div",{className:"react-joyride"},g)}}]),r}(h1.default.Component);l1(bh,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});var pM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==";var zM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==";var fM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==";var q6="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==";var V9="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=";var L9="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=";var MM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==";var mM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==";var xM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==";var HM="b30ec9ca513dba5aa4a1130db74a11c0b2b1498b68890d9cae40e0cc99ca14a9",vR=`img._icon_1467k_1 { + `;l.type="text/css",l.id="joyride-beacon-animation",e.nonce!==void 0&&l.setAttribute("nonce",e.nonce),l.appendChild(document.createTextNode(o)),n.appendChild(l)}return c}return e3(r,[{key:"componentDidMount",value:function(){var c=this,n=this.props.shouldFocus;setTimeout(function(){z2.domElement(c.beacon)&&n&&c.beacon.focus()},0)}},{key:"componentWillUnmount",value:function(){var c=document.getElementById("joyride-beacon-animation");c&&c.parentNode.removeChild(c)}},{key:"render",value:function(){var c=this.props,n=c.beaconComponent,l=c.locale,o=c.onClickOrHover,i=c.styles,h={"aria-label":l.open,onClick:o,onMouseEnter:o,ref:this.setBeaconRef,title:l.open},v;if(n){var d=n;v=h1.default.createElement(d,h)}else v=h1.default.createElement("button",u4({key:"JoyrideBeacon",className:"react-joyride__beacon",style:i.beacon,type:"button"},h),h1.default.createElement("span",{style:i.beaconInner}),h1.default.createElement("span",{style:i.beaconOuter}));return v}}]),r}(h1.default.Component);function R_(t){var a=t.styles;return h1.default.createElement("div",{key:"JoyrideSpotlight",className:"react-joyride__spotlight",style:a})}var I_=["mixBlendMode","zIndex"],E_=function(t){K6(r,t);var a=Q6(r);function r(){var e;r3(this,r);for(var c=arguments.length,n=new Array(c),l=0;l=s&&p<=s+v,m=L>=d&&L<=d+g,H=m&&f;H!==i&&e.updateState({mouseOverSpotlight:H})}),l1(f2(e),"handleScroll",function(){var o=e.props.target,i=J3(o);if(e.scrollParent!==document){var h=e.state.isScrolling;h||e.updateState({isScrolling:!0,showSpotlight:!1}),clearTimeout(e.scrollTimeout),e.scrollTimeout=setTimeout(function(){e.updateState({isScrolling:!1,showSpotlight:!0})},50)}else Vt(i,"sticky")&&e.updateState({})}),l1(f2(e),"handleResize",function(){clearTimeout(e.resizeTimeout),e.resizeTimeout=setTimeout(function(){!e._isMounted||e.forceUpdate()},100)}),e}return e3(r,[{key:"componentDidMount",value:function(){var c=this.props;c.debug,c.disableScrolling;var n=c.disableScrollParentFix,l=c.target,o=J3(l);this.scrollParent=je(o,n,!0),this._isMounted=!0,window.addEventListener("resize",this.handleResize)}},{key:"componentDidUpdate",value:function(c){var n=this,l=this.props,o=l.lifecycle,i=l.spotlightClicks,h=X3(c,this.props),v=h.changed;v("lifecycle",M1.TOOLTIP)&&(this.scrollParent.addEventListener("scroll",this.handleScroll,{passive:!0}),setTimeout(function(){var d=n.state.isScrolling;d||n.updateState({showSpotlight:!0})},100)),(v("spotlightClicks")||v("disableOverlay")||v("lifecycle"))&&(i&&o===M1.TOOLTIP?window.addEventListener("mousemove",this.handleMouseMove,!1):o!==M1.TOOLTIP&&window.removeEventListener("mousemove",this.handleMouseMove))}},{key:"componentWillUnmount",value:function(){this._isMounted=!1,window.removeEventListener("mousemove",this.handleMouseMove),window.removeEventListener("resize",this.handleResize),clearTimeout(this.resizeTimeout),clearTimeout(this.scrollTimeout),this.scrollParent.removeEventListener("scroll",this.handleScroll)}},{key:"spotlightStyles",get:function(){var c=this.state.showSpotlight,n=this.props,l=n.disableScrollParentFix,o=n.spotlightClicks,i=n.spotlightPadding,h=n.styles,v=n.target,d=J3(v),u=PM(d),s=Vt(d),g=B_(d,i,l);return K(K({},FM()?h.spotlightLegacy:h.spotlight),{},{height:Math.round(u.height+i*2),left:Math.round(u.left-i),opacity:c?1:0,pointerEvents:o?"none":"auto",position:s?"fixed":"absolute",top:g,transition:"opacity 0.2s",width:Math.round(u.width+i*2)})}},{key:"updateState",value:function(c){!this._isMounted||this.setState(c)}},{key:"render",value:function(){var c=this.state,n=c.mouseOverSpotlight,l=c.showSpotlight,o=this.props,i=o.disableOverlay,h=o.disableOverlayClose,v=o.lifecycle,d=o.onClickOverlay,u=o.placement,s=o.styles;if(i||v!==M1.TOOLTIP)return null;var g=s.overlay;FM()&&(g=u==="center"?s.overlayLegacyCenter:s.overlayLegacy);var p=K({cursor:h?"default":"pointer",height:V_(),pointerEvents:n?"none":"auto"},g),L=u!=="center"&&l&&h1.default.createElement(R_,{styles:this.spotlightStyles});if(EM()==="safari"){p.mixBlendMode,p.zIndex;var f=We(p,I_);L=h1.default.createElement("div",{style:K({},f)},L),delete p.backgroundColor}return h1.default.createElement("div",{className:"react-joyride__overlay",style:p,onClick:d},L)}}]),r}(h1.default.Component),P_=["styles"],T_=["color","height","width"];function N_(t){var a=t.styles,r=We(t,P_),e=a.color,c=a.height,n=a.width,l=We(a,T_);return h1.default.createElement("button",u4({style:l,type:"button"},r),h1.default.createElement("svg",{width:typeof n=="number"?"".concat(n,"px"):n,height:typeof c=="number"?"".concat(c,"px"):c,viewBox:"0 0 18 18",version:"1.1",xmlns:"http://www.w3.org/2000/svg",preserveAspectRatio:"xMidYMid"},h1.default.createElement("g",null,h1.default.createElement("path",{d:"M8.13911129,9.00268191 L0.171521827,17.0258467 C-0.0498027049,17.248715 -0.0498027049,17.6098394 0.171521827,17.8327545 C0.28204354,17.9443526 0.427188206,17.9998706 0.572051765,17.9998706 C0.71714958,17.9998706 0.862013139,17.9443526 0.972581703,17.8327545 L9.0000937,9.74924618 L17.0276057,17.8327545 C17.1384085,17.9443526 17.2832721,17.9998706 17.4281356,17.9998706 C17.5729992,17.9998706 17.718097,17.9443526 17.8286656,17.8327545 C18.0499901,17.6098862 18.0499901,17.2487618 17.8286656,17.0258467 L9.86135722,9.00268191 L17.8340066,0.973848225 C18.0553311,0.750979934 18.0553311,0.389855532 17.8340066,0.16694039 C17.6126821,-0.0556467968 17.254037,-0.0556467968 17.0329467,0.16694039 L9.00042166,8.25611765 L0.967006424,0.167268345 C0.745681892,-0.0553188426 0.387317931,-0.0553188426 0.165993399,0.167268345 C-0.0553311331,0.390136635 -0.0553311331,0.751261038 0.165993399,0.974176179 L8.13920499,9.00268191 L8.13911129,9.00268191 Z",fill:e}))))}var D_=function(t){K6(r,t);var a=Q6(r);function r(){return r3(this,r),a.apply(this,arguments)}return e3(r,[{key:"render",value:function(){var c=this.props,n=c.backProps,l=c.closeProps,o=c.continuous,i=c.index,h=c.isLastStep,v=c.primaryProps,d=c.size,u=c.skipProps,s=c.step,g=c.tooltipProps,p=s.content,L=s.hideBackButton,f=s.hideCloseButton,m=s.hideFooter,H=s.showProgress,w=s.showSkipButton,A=s.title,C=s.styles,k=s.locale,I=k.back,T=k.close,U=k.last,j=k.next,Q=k.skip,P={primary:T};return o&&(P.primary=h?U:j,H&&(P.primary=h1.default.createElement("span",null,P.primary," (",i+1,"/",d,")"))),w&&!h&&(P.skip=h1.default.createElement("button",u4({style:C.buttonSkip,type:"button","aria-live":"off"},u),Q)),!L&&i>0&&(P.back=h1.default.createElement("button",u4({style:C.buttonBack,type:"button"},n),I)),P.close=!f&&h1.default.createElement(N_,u4({styles:C.buttonClose},l)),h1.default.createElement("div",u4({key:"JoyrideTooltip",className:"react-joyride__tooltip",style:C.tooltip},g),h1.default.createElement("div",{style:C.tooltipContainer},A&&h1.default.createElement("h4",{style:C.tooltipTitle,"aria-label":A},A),h1.default.createElement("div",{style:C.tooltipContent},p)),!m&&h1.default.createElement("div",{style:C.tooltipFooter},h1.default.createElement("div",{style:C.tooltipFooterSpacer},P.skip),P.back,h1.default.createElement("button",u4({style:C.buttonNext,type:"button"},v),P.primary)),P.close)}}]),r}(h1.default.Component),Z_=["beaconComponent","tooltipComponent"],G_=function(t){K6(r,t);var a=Q6(r);function r(){var e;r3(this,r);for(var c=arguments.length,n=new Array(c),l=0;l0||l===x1.PREV),C=m("action")||m("index")||m("lifecycle")||m("status"),k=H("lifecycle",[M1.TOOLTIP,M1.INIT],M1.INIT),I=m("action",[x1.NEXT,x1.PREV,x1.SKIP,x1.CLOSE]);if(I&&(k||h)&&o(K(K({},w),{},{index:c.index,lifecycle:M1.COMPLETE,step:c.step,type:p0.STEP_AFTER})),p.placement==="center"&&g===L1.RUNNING&&m("index")&&l!==x1.START&&u===M1.INIT&&L({lifecycle:M1.READY}),C){var T=J3(p.target),U=!!T,j=U&&w_(T);j?(H("status",L1.READY,L1.RUNNING)||H("lifecycle",M1.INIT,M1.READY))&&o(K(K({},w),{},{step:p,type:p0.STEP_BEFORE})):(console.warn(U?"Target not visible":"Target not mounted",p),o(K(K({},w),{},{type:p0.TARGET_NOT_FOUND,step:p})),h||L({index:d+([x1.PREV].indexOf(l)!==-1?-1:1)}))}H("lifecycle",M1.INIT,M1.READY)&&L({lifecycle:bM(p)||A?M1.TOOLTIP:M1.BEACON}),m("index")&&X6({title:"step:".concat(u),data:[{key:"props",value:this.props}],debug:v}),m("lifecycle",M1.BEACON)&&o(K(K({},w),{},{step:p,type:p0.BEACON})),m("lifecycle",M1.TOOLTIP)&&(o(K(K({},w),{},{step:p,type:p0.TOOLTIP})),this.scope=new k_(this.tooltip,{selector:"[data-action=primary]"}),this.scope.setFocus()),H("lifecycle",[M1.TOOLTIP,M1.INIT],M1.INIT)&&(this.scope.removeScope(),delete this.beaconPopper,delete this.tooltipPopper)}},{key:"componentWillUnmount",value:function(){this.scope.removeScope()}},{key:"open",get:function(){var c=this.props,n=c.step,l=c.lifecycle;return!!(bM(n)||l===M1.TOOLTIP)}},{key:"render",value:function(){var c=this.props,n=c.continuous,l=c.debug,o=c.helpers,i=c.index,h=c.lifecycle,v=c.nonce,d=c.shouldScroll,u=c.size,s=c.step,g=J3(s.target);return!TM(s)||!z2.domElement(g)?null:h1.default.createElement("div",{key:"JoyrideStep-".concat(i),className:"react-joyride__step"},h1.default.createElement(U_,{id:"react-joyride-portal"},h1.default.createElement(E_,u4({},s,{debug:l,lifecycle:h,onClickOverlay:this.handleClickOverlay}))),h1.default.createElement(Ge,u4({component:h1.default.createElement(G_,{continuous:n,helpers:o,index:i,isLastStep:i+1===u,setTooltipRef:this.setTooltipRef,size:u,step:s}),debug:l,getPopper:this.setPopper,id:"react-joyride-step-".concat(i),isPositioned:s.isFixed||Vt(g),open:this.open,placement:s.placement,target:s.target},s.floaterProps),h1.default.createElement(__,{beaconComponent:s.beaconComponent,locale:s.locale,nonce:v,onClickOrHover:this.handleClickHoverBeacon,shouldFocus:d,styles:s.styles})))}}]),r}(h1.default.Component),jh=function(t){K6(r,t);var a=Q6(r);function r(e){var c;return r3(this,r),c=a.call(this,e),l1(f2(c),"initStore",function(){var n=c.props,l=n.debug,o=n.getHelpers,i=n.run,h=n.stepIndex;c.store=new H_(K(K({},c.props),{},{controlled:i&&z2.number(h)})),c.helpers=c.store.getHelpers();var v=c.store.addListener;return X6({title:"init",data:[{key:"props",value:c.props},{key:"state",value:c.state}],debug:l}),v(c.syncState),o(c.helpers),c.store.getState()}),l1(f2(c),"callback",function(n){var l=c.props.callback;z2.function(l)&&l(n)}),l1(f2(c),"handleKeyboard",function(n){var l=c.state,o=l.index,i=l.lifecycle,h=c.props.steps,v=h[o],d=window.Event?n.which:n.keyCode;i===M1.TOOLTIP&&d===27&&v&&!v.disableCloseOnEsc&&c.store.close()}),l1(f2(c),"syncState",function(n){c.setState(n)}),l1(f2(c),"setPopper",function(n,l){l==="wrapper"?c.beaconPopper=n:c.tooltipPopper=n}),l1(f2(c),"shouldScroll",function(n,l,o,i,h,v,d){return!n&&(l!==0||o||i===M1.TOOLTIP)&&h.placement!=="center"&&(!h.isFixed||!Vt(v))&&d.lifecycle!==i&&[M1.BEACON,M1.TOOLTIP].indexOf(i)!==-1}),c.state=c.initStore(),c}return e3(r,[{key:"componentDidMount",value:function(){if(!!Y3){var c=this.props,n=c.disableCloseOnEsc,l=c.debug,o=c.run,i=c.steps,h=this.store.start;_M(i,l)&&o&&h(),n||document.body.addEventListener("keydown",this.handleKeyboard,{passive:!0})}}},{key:"componentDidUpdate",value:function(c,n){if(!!Y3){var l=this.state,o=l.action,i=l.controlled,h=l.index,v=l.lifecycle,d=l.status,u=this.props,s=u.debug,g=u.run,p=u.stepIndex,L=u.steps,f=c.steps,m=c.stepIndex,H=this.store,w=H.reset,A=H.setSteps,C=H.start,k=H.stop,I=H.update,T=X3(c,this.props),U=T.changed,j=X3(n,this.state),Q=j.changed,P=j.changedFrom,c1=S9(L[h],this.props),H1=!Gh(f,L),w1=z2.number(p)&&U("stepIndex"),j1=J3(c1?.target);if(H1&&(_M(L,s)?A(L):console.warn("Steps are not valid",L)),U("run")&&(g?C(p):k()),w1){var P1=m=0?C:0,i===L1.RUNNING&&A_(C,A,p)}}}},{key:"render",value:function(){if(!Y3)return null;var c=this.state,n=c.index,l=c.status,o=this.props,i=o.continuous,h=o.debug,v=o.nonce,d=o.scrollToFirstStep,u=o.steps,s=S9(u[n],this.props),g;return l===L1.RUNNING&&s&&(g=h1.default.createElement(W_,u4({},this.state,{callback:this.callback,continuous:i,debug:h,setPopper:this.setPopper,helpers:this.helpers,nonce:v,shouldScroll:!s.disableScrolling&&(n!==0||d),step:s,update:this.store.update}))),h1.default.createElement("div",{className:"react-joyride"},g)}}]),r}(h1.default.Component);l1(jh,"defaultProps",{continuous:!1,debug:!1,disableCloseOnEsc:!1,disableOverlay:!1,disableOverlayClose:!1,disableScrolling:!1,disableScrollParentFix:!1,getHelpers:function(){},hideBackButton:!1,run:!0,scrollOffset:20,scrollDuration:300,scrollToFirstStep:!1,showSkipButton:!1,showProgress:!1,spotlightClicks:!1,spotlightPadding:10,steps:[]});var NM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAABq0lEQVRYhe2YsU7DMBCGvyDUDToxsuUREN27gUACBpZuvAMFXgBBH4KtCwMggWDrDuIRujIxAVuXMMRIbuU09vlKiMgnRYniO/uv4zv7mmRZRh1YDjHuX4+Lmsp+beJ6OThMvcde8rasmEaoNo1QbSRCL8mj3L7KmLUfhA4qEXoKDAV+PwyBk1AnidAMOAJGAt+R8Q3eZaRrdAIcAC8BPq/GZyIZMCaYPoAdoHC7shgD28ZHRGzUvwNb5h5jU4pGehoDu8Cno+3LtPnM+ly08ugzsM/0+psAe6YtGs2Eb0d0TGZwEnTM82AIrFvPamgLBbhYQJ/12esTVyky5yT/a8ye/os+/V8opKbKl9p8+qIZdRZjVeJco0Vor92mCvXkGOhrd6qd8HvkpQrAG4q7k+aMdoEr8kBMzHNXq3MtoRvADdCy3rXMu02NATSEpsAj0Ha0tYEHYxNFrNA14MncY2xKiRG6AtzjN1upsV2VDiYV2gLugE6ATwe4ZXodeyMRGhPRdmYIQiL0nDxfSumZPoKQJPwzc9mI/nEO4V/v9QuhEapNbYQGnfCr5BtYaFWUrHRSSwAAAABJRU5ErkJggg==";var DM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAiElEQVRYhe3YwQmAIBhA4YxGaaZGaYhGaaZ2sauCB8MX9cP7bnaIxx9imHLOUwTz1wG9DKWFCV1aD/fzKpdPdlsaqikc21qtw0zUUJqhNENphtLChDaP0BcMH8NhJmoozVCaoTRDaYbSDKUZSuv5HyWuaYbfEX6if7iGrr5CmIkm7/BhhtIMpd2GuAxXhhY/aAAAAABJRU5ErkJggg==";var ZM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAhUlEQVRYhe3ZwQmAMBAAwZxYijVZikVYijXZS/zmoRDJQjjY+ZlHWE6RiFFrLRksswN6GUozlLa+LR7XPf1VcO5btNe5J1pKiY/1adJPtPXnef26E8N7pJmooTRDaYbSDKUZSjOUZiit5zxKGP5iSDNRQ2mG0gylGUpLExr+bIAZSksT+gD98QxXbjF/TQAAAABJRU5ErkJggg==";var Y6="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAgklEQVRYhe3Y0QmAIBRA0Wc0SjM1SkM0SjO1i00gGl2MB/f+2sfhQSqWWmtkaPkbMJpQOqF0aaBr74PjuqftX+e+ldZamokKpRNKJ5ROKF0aaPcIjYjmsTazNBMVSieUbuSvb/XlQv16J0kzUaF0QumE0gmlSwMtPo3DCaUTSpcG+gDcmgtUpwOm6gAAAABJRU5ErkJggg==";var F9="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAjElEQVRYhe3ZwQmAMBBEUVcsxZosxSIsxZrsJZ4UIQYUh5WB/456+awhCRillM5B/3fAU4SqDa0X87odizeSWk7LNFbPbCZqE9r89Dcy97FqudlMlFA1QtUIVSNUzSb0zRGafou6spkooWqEqmVenD/tGjYTJVSNUDVC1QhVswnl4qwW/GwQI1TNJnQHKA8MWeSBgoAAAAAASUVORK5CYII=";var O9="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACoAAAAqCAYAAADFw8lbAAAACXBIWXMAABYlAAAWJQFJUiTwAAAAkklEQVRYhe3ZwQmAMAyF4UQcxZkcxSEcxZncJV70UmlVfEYevO/ay0+KNKBHhDHo/g64S6Fofe1gWtbMjkOYmc3j4OUBzURpQqtXb/s1JDlddYlmogpFUyiaQtEUikYT2npCL5+1TDQTVSiaQtFaX/0Tb5dsLc7pFIqmUDSFoikUDfWEfr5k00zU9bMBTKFoNKEbp/QMWe71dFoAAAAASUVORK5CYII=";var GM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABA0lEQVRYhe2ZwQ6CMBBEH8Yv9uDNsMabB38ZLxBRkdDtxlmSzqUktDAvs2yb0A3DwJ51UBuoVQNQqwGotXuAY8nk8+3hfc+8Vxtw3brwfjmt3lckYEAf9TBVCRlBEP8G6HiVjxEAoSqhMAhlCYVAFHUh3rtJrWwc+9n15u40Sb0PGJVJlCYwqXOuW5KNoysJdQKTDGcSWQDACZEJABwQ2QDgG2JVGQGgoF1nBCjqRtkAPs3bz5mjMgEUm4c8AC7z4N+JvWeipR3cbR70CVSZh/IEvGegpcSqzYMugRDzoAEIMw/+j9ireSlVmwddCYWYBw1AmHmArv3gEKsBqNUA1No9wBNu3jnWLc/KGQAAAABJRU5ErkJggg==";var UM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAADT0lEQVRYhe2ZP2gUURDGf1ELSy/YpUrELt1BLHIpxAtCOO0SBP80woWAiGyxuWZB2eayxYIiSAJpTBPuQARtJNedacTrgk3IWYlWuVR2EouZl907Lwnue8cRyMDj7e3OMvO9mTfzvb2Rw8NDzrJcGLYDtnIOYNhy5gFcyvqiH8anqZSAMjADdIAmUAF+HvdCFHj/7UdmAKdICfiQ+n0FGAfmgJvAjitDg0ihaRLnK8AocA2oA1eBdZfGBhGBeZ1XosBb0esOsOCH8VdgConQRxfGBhGBgs71Ps/MvRlXxgYB4EDnXJ9nEzrvuTI2CABNnat+GB+B8MM4j1SlP8BnV8Zc74ExIK/XeWDPD+M6Eg2zN14D31wZdAlgDHiHbNIOsAK0kbSpqs5L4JlDm84ATCLlcQpoAbNR4HXMQz+M20ANiYqzCgRu9kB65f9xHiAKvDoSlQLSI0oO7AJuIrAOXAcaUeDNnqDXRspoFQHxXe83gQawkcW4bQSmgdvq3AKAH8a5dPVJizY209zGdTwC3gIPszhgC8A0pHoUeB11fIuk3gPgh/EEkkJEgVdBqIUZi6pWzOKALQCz0ibn8zo6fXSLfhgXAaLAa5uBpA9k7M62e8CsdFvnvqmTur/lh3GDboBm5ZtkEFsAvRHo/W3ENLdd+qfKJrCUxQFbAE3gFpIeLZJuW6SbzBmnQ+AX3ZFqcsIh5zSx3QMmf5eBfRJHq8dUojlkk9dSI7PzYA9gm6Q5HZCQtBawmtKrIGl1D3hqabNLXHTibeAuUhILQCcKPNMTlkGqDkm5fAJcdmAXcEunH+jc0nkRKKdKZx1JuetIyjkRVwBKCNMEWANQPpSjO5VMF76Poyi4ADAJvNfriq40fhiXEQATek0UeA0cR8EWgGGiF4E1c4jXtEmvfNpZp1GwBfCGhIkuwhHvqenz50hlOi4KZUv7VgBGgTvoJxMQJorU+RzSXV+ge4LuKJh71l8nbAAc0YbUAaaG8KNPwGO9t0FPFFyKDZXYQxwr6AcrEM6zizj/O6W7hvSIVT+M50m4USYClxZbLrREchYG+II4/6NHz5y2AhK6sQm8srRvDWAHuEGyoq0TdDcQgjejevuWtgEYOf+PbMhyDmDY8hfkuOfRCqd6WwAAAABJRU5ErkJggg==";var WM="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAADAAAAAoCAYAAAC4h3lxAAAACXBIWXMAAAsTAAALEwEAmpwYAAABDElEQVRYhe2ZsQ7CMAxEr4gvZmBDXMXGwC+XgVQqERDbCbEr5ZaoalXdq+0kTqdlWbBnHbwN1GoAeGsAeGv3AMdfN8+3h+ZdVwDcXE8GP7hfTqrnW0UgN99NLQDczAP1AFvzM4xpU6MagNw8vz75R1kBQpgHCrPQF0nNW3eJqjTURiDMl1+liYDUvLWQTRGTRiDcl18lAQhrHigDhDYPlAGYxpDmAXkNhG2cSwBzGolXOoWTJIVCQ0hSiAgMIa0BIiiEZiVmGvOpNVfXgtfuhYhgkbDsRpnGUiS6NDfWfoAIEomajowIAFHbExPvEN1X7BanEsTnGuiiVudChBPENH5wOGsAeGsAeGv3AE8yEDlUwXXxqQAAAABJRU5ErkJggg==";var jM="27a770d1993c94bbddbde0af15f72cad7ba9e6466aa7be7cfd88f67216d2d196",aR=`img._icon_1467k_1 { height: 30px; /* outline: 2px solid green; */ display: block; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(HM)){var t=document.createElement("style");t.id=HM,t.textContent=vR,document.head.appendChild(t)}})();var VM={icon:"_icon_1467k_1"};var CM=V(b()),dR={undo:xM,redo:MM,tour:mM,alignTop:fM,alignBottom:zM,alignCenter:pM,alignSpread:q6,alignTextCenter:q6,alignTextLeft:V9,alignTextRight:L9};function LM({id:t,alt:a=t,size:r}){return(0,CM.jsx)("img",{src:dR[t],alt:a,className:VM.icon,style:r?{height:r}:{}})}var zt=V(X());var Fh=V(X()),Oh={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},kh=Fh.default.createContext&&Fh.default.createContext(Oh);var $3=function(){return $3=Object.assign||function(t){for(var a,r=1,e=arguments.length;r(0,Ih.jsx)("svg",{width:"1em",height:"1em",viewBox:"0 0 15 8",fill:"none",xmlns:"http://www.w3.org/2000/svg",...t,children:(0,Ih.jsx)("path",{d:"M7.38 7.477 14.432.691H.328L7.38 7.477Z",fill:"#75A8DB"})}),Eh=CR;var Ph=V(b()),wR=t=>(0,Ph.jsx)("svg",{xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em",...t,children:(0,Ph.jsx)("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})}),Th=wR;var ft=V(b()),BR=t=>(0,ft.jsxs)("svg",{xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em",...t,children:[(0,ft.jsx)("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),(0,ft.jsx)("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),(0,ft.jsx)("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]}),Q5=BR;var _h=V(b()),yR=t=>(0,_h.jsx)("svg",{xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em",...t,children:(0,_h.jsx)("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})}),Dh=yR;var Nh=V(b()),AR=t=>(0,Nh.jsx)("svg",{width:"1em",height:"1em",viewBox:"0 0 15 8",fill:"none",xmlns:"http://www.w3.org/2000/svg",...t,children:(0,Nh.jsx)("path",{d:"m7.38.477 7.052 6.786H.328L7.38.477Z",fill:"#75A8DB"})}),Zh=AR;var BM=LM;function N1(...t){return t.filter(a=>a).join(" ")}var yM="d453dea880dea6588bf35562f77702c60403b2a0b7704a30b22f97aeded6030d",SR=`._button_1y00r_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(jM)){var t=document.createElement("style");t.id=jM,t.textContent=aR,document.head.appendChild(t)}})();var qM={icon:"_icon_1467k_1"};var XM=V(b()),rR={undo:WM,redo:GM,tour:UM,alignTop:ZM,alignBottom:DM,alignCenter:NM,alignSpread:Y6,alignTextCenter:Y6,alignTextLeft:F9,alignTextRight:O9};function $M({id:t,alt:a=t,size:r}){return(0,XM.jsx)("img",{src:rR[t],alt:a,className:qM.icon,style:r?{height:r}:{}})}var Lt=V($());var qh=V($()),$h={color:void 0,size:void 0,className:void 0,style:void 0,attr:void 0},Xh=qh.default.createContext&&qh.default.createContext($h);var t6=function(){return t6=Object.assign||function(t){for(var a,r=1,e=arguments.length;r(0,Qh.jsx)("svg",{width:"1em",height:"1em",viewBox:"0 0 15 8",fill:"none",xmlns:"http://www.w3.org/2000/svg",...t,children:(0,Qh.jsx)("path",{d:"M7.38 7.477 14.432.691H.328L7.38 7.477Z",fill:"#75A8DB"})}),Yh=pR;var Jh=V(b()),zR=t=>(0,Jh.jsx)("svg",{xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 49 40",width:"1em",height:"1em",...t,children:(0,Jh.jsx)("path",{stroke:"currentColor",strokeWidth:2,d:"M27.42 8.115h2.074l10.592 11.414v1.052L28.705 32.04H27.4v-5.954H13.328l.105-11.975 13.988-.058V8.115Z"})}),tv=zR;var Ct=V(b()),fR=t=>(0,Ct.jsxs)("svg",{xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 16 20",width:"1em",height:"1em",...t,children:[(0,Ct.jsx)("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M0 4h16"}),(0,Ct.jsx)("path",{stroke:"currentColor",strokeLinejoin:"round",d:"M5.5 6.5 6 16m2-9.5V16m2.5-9.5L10 16"}),(0,Ct.jsx)("path",{stroke:"currentColor",strokeLinejoin:"round",strokeWidth:1.5,d:"M5.5 4.5v-2l1.5-1h2l1.5 1v2m-8 0 .5 12 1.5 2h7l1.5-2 .5-12"})]}),c3=fR;var av=V(b()),MR=t=>(0,av.jsx)("svg",{xmlns:"http://www.w3.org/2000/svg",fill:"none",viewBox:"0 0 44 40",width:"1em",height:"1em",...t,children:(0,av.jsx)("path",{stroke:"currentColor",strokeWidth:2,d:"M17.08 8.115h-2.074L4.414 19.529v1.052L15.795 32.04H17.1v-5.954h14.072l-.105-11.975-13.988-.058V8.115Z"})}),rv=MR;var ev=V(b()),mR=t=>(0,ev.jsx)("svg",{width:"1em",height:"1em",viewBox:"0 0 15 8",fill:"none",xmlns:"http://www.w3.org/2000/svg",...t,children:(0,ev.jsx)("path",{d:"m7.38.477 7.052 6.786H.328L7.38.477Z",fill:"#75A8DB"})}),cv=mR;var QM=$M;function J1(...t){return t.filter(a=>a).join(" ")}var YM="4b4f64fbe97f076423c323dfa6ec19d54ad31ce59a305afa7d9dff2f9d60fa44",xR=`._button_1y00r_1 { --background-color: var(--rstudio-white); --text-color: var(--font-color); --outline-color: transparent; @@ -87,7 +97,9 @@ Please read the updated README.md at https://github.com/SortableJS/react-sortabl --outline-color: transparent; --background-color: transparent; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(yM)){var t=document.createElement("style");t.id=yM,t.textContent=SR,document.head.appendChild(t)}})();var Te={button:"_button_1y00r_1",regular:"_regular_1y00r_26",delete:"_delete_1y00r_30",icon:"_icon_1y00r_34",transparent:"_transparent_1y00r_42"};var AM=V(b()),bR=({children:t,variant:a="regular",className:r,...e})=>{let c=a?Array.isArray(a)?a.map(n=>Te[n]).join(" "):Te[a]:"";return(0,AM.jsx)("button",{className:N1(Te.button,c,r),...e,children:t})},Y1=bR;var Mt=V(b()),SM=(0,Mt.jsxs)("div",{children:[(0,Mt.jsx)("p",{children:"You can see how the changes impact your app with the app preview."}),(0,Mt.jsx)("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),(0,Mt.jsx)("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]});var Y5=V(b()),bM=(0,Y5.jsxs)("div",{children:[(0,Y5.jsx)("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),(0,Y5.jsx)("p",{children:"You can click on elements to select them or drag them around to move them."}),(0,Y5.jsx)("p",{children:"Cards can be resized by dragging resize handles on the sides."}),(0,Y5.jsx)("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),(0,Y5.jsx)("p",{children:(0,Y5.jsx)("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]});var C9=V(b()),FM=(0,C9.jsxs)("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",(0,C9.jsx)("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",(0,C9.jsx)("span",{className:"can-accept-drop",style:{padding:"2px"},children:"orange outline."})]});var w9=V(b()),OM=(0,w9.jsxs)("div",{children:[(0,w9.jsx)("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),(0,w9.jsx)("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]});var K3=V(b()),FR=[{target:".app-view",content:bM,disableBeacon:!0},{target:".elements-panel",content:FM,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:OM,placement:"left-start"},{target:".app-preview",content:SM,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function RM(){let[t,a]=mt.useState(0),[r,e]=mt.useState(!1),c=mt.useCallback(l=>{let{action:o,index:i,type:h}=l;(h===s0.STEP_AFTER||h===s0.TARGET_NOT_FOUND)&&(o===x1.NEXT?a(i+1):o===x1.PREV?a(i-1):o===x1.CLOSE&&e(!1)),h===s0.TOUR_END&&(o===x1.NEXT&&(e(!1),a(0)),o===x1.SKIP&&e(!1))},[]),n=mt.useCallback(()=>{e(!0)},[]);return(0,K3.jsxs)(K3.Fragment,{children:[(0,K3.jsxs)(Y1,{onClick:n,title:"Take a guided tour of app",variant:"transparent",children:[(0,K3.jsx)(BM,{id:"tour",size:"24px"}),"Tour App"]}),(0,K3.jsx)(bh,{callback:c,steps:FR,stepIndex:t,run:r,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:kR})]})}var kM="#e07189",OR="#f6d5dc",kR={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:kM},beaconOuter:{backgroundColor:OR,border:`2px solid ${kM}`}};var y5=V(X());var _e=RR;function RR(t,a,r){var e=null,c=null,n=function(){e&&(clearTimeout(e),c=null,e=null)},l=function(){var i=c;n(),i&&i()},o=function(){if(!a)return t.apply(this,arguments);var i=this,h=arguments,v=r&&!e;if(n(),c=function(){t.apply(i,h)},e=setTimeout(function(){if(e=null,!v){var d=c;return c=null,d()}},a),v)return c()};return o.cancel=n,o.flush=l,o}var um=V(Uh()),sm=V(NM());var Wh=V(Z6());function YR(t){t()}var ZM=YR,GM=t=>ZM=t,UM=()=>ZM;var Ge=V(X());var jM=V(X());var WM=V(X()),C0=(0,WM.createContext)(null);function Ne(){return(0,jM.useContext)(C0)}var Ze=()=>{throw new Error("uSES not initialized!")};var qM=Ze,XM=t=>{qM=t},JR=(t,a)=>t===a;function $M(t=C0){let a=t===C0?Ne:()=>(0,Ge.useContext)(t);return function(e,c=JR){let{store:n,subscription:l,getServerState:o}=a(),i=qM(l.addNestedSub,n.getState,o||n.getState,e,c);return(0,Ge.useDebugValue)(i),i}}var w4=$M();var fI=V(rm()),ac=V(X()),MI=V(lm());function gI(){let t=UM(),a=null,r=null;return{clear(){a=null,r=null},notify(){t(()=>{let e=a;for(;e;)e.callback(),e=e.next})},get(){let e=[],c=a;for(;c;)e.push(c),c=c.next;return e},subscribe(e){let c=!0,n=r={callback:e,next:null,prev:r};return n.prev?n.prev.next=n:a=n,function(){!c||a===null||(c=!1,n.next?n.next.prev=n.prev:r=n.prev,n.prev?n.prev.next=n.next:a=n.next)}}}}var im={notify(){},get:()=>[]};function Kh(t,a){let r,e=im;function c(d){return i(),e.subscribe(d)}function n(){e.notify()}function l(){v.onStateChange&&v.onStateChange()}function o(){return Boolean(r)}function i(){r||(r=a?a.addNestedSub(l):t.subscribe(l),e=gI())}function h(){r&&(r(),r=void 0,e.clear(),e=im)}let v={addNestedSub:c,notifyNestedSubs:n,handleChangeWrapper:l,isSubscribed:o,trySubscribe:i,tryUnsubscribe:h,getListeners:()=>e};return v}var tc=V(X()),pI=typeof window<"u"&&typeof window.document<"u"&&typeof window.document.createElement<"u",Qh=pI?tc.useLayoutEffect:tc.useEffect;var mI=Ze,hm=t=>{mI=t};var B9=V(X());function xI({store:t,context:a,children:r,serverState:e}){let c=(0,B9.useMemo)(()=>{let o=Kh(t);return{store:t,subscription:o,getServerState:e?()=>e:void 0}},[t,e]),n=(0,B9.useMemo)(()=>t.getState(),[t]);Qh(()=>{let{subscription:o}=c;return o.onStateChange=o.notifyNestedSubs,o.trySubscribe(),n!==t.getState()&&o.notifyNestedSubs(),()=>{o.tryUnsubscribe(),o.onStateChange=void 0}},[c,n]);let l=a||C0;return B9.default.createElement(l.Provider,{value:c},r)}var Yh=xI;var vm=V(X());function rc(t=C0){let a=t===C0?Ne:()=>(0,vm.useContext)(t);return function(){let{store:e}=a();return e}}var Jh=rc();function dm(t=C0){let a=t===C0?Jh:rc(t);return function(){return a().dispatch}}var g0=dm();XM(sm.useSyncExternalStoreWithSelector);hm(um.useSyncExternalStore);GM(Wh.unstable_batchedUpdates);var Ly=V(X());var fy=V(X());function y4(t){for(var a=arguments.length,r=Array(a>1?a-1:0),e=1;e3?a.i-4:a.i:Array.isArray(t)?1:iv(t)?2:hv(t)?3:0}function Ht(t,a){return Lt(t)===2?t.has(a):Object.prototype.hasOwnProperty.call(t,a)}function HI(t,a){return Lt(t)===2?t.get(a):t[a]}function Hm(t,a,r){var e=Lt(t);e===2?t.set(a,r):e===3?(t.delete(a),t.add(r)):t[a]=r}function Vm(t,a){return t===a?t!==0||1/t==1/a:t!=t&&a!=a}function iv(t){return BI&&t instanceof Map}function hv(t){return yI&&t instanceof Set}function Q3(t){return t.o||t.t}function vv(t){if(Array.isArray(t))return Array.prototype.slice.call(t);var a=wm(t);delete a[i2];for(var r=Vt(a),e=0;e1&&(t.set=t.add=t.clear=t.delete=VI),Object.freeze(t),a&&X6(t,function(r,e){return dv(e,!0)},!0)),t}function VI(){y4(2)}function uv(t){return t==null||typeof t!="object"||Object.isFrozen(t)}function x5(t){var a=ov[t];return a||y4(18,t),a}function LI(t,a){ov[t]||(ov[t]=a)}function cv(){return A9}function tv(t,a){a&&(x5("Patches"),t.u=[],t.s=[],t.v=a)}function ec(t){nv(t),t.p.forEach(CI),t.p=null}function nv(t){t===A9&&(A9=t.l)}function gm(t){return A9={p:[],l:A9,h:t,m:!0,_:0}}function CI(t){var a=t[i2];a.i===0||a.i===1?a.j():a.O=!0}function av(t,a){a._=a.p.length;var r=a.p[0],e=t!==void 0&&t!==r;return a.h.g||x5("ES5").S(a,t,e),e?(r[i2].P&&(ec(a),y4(4)),a5(t)&&(t=cc(a,t),a.l||nc(a,t)),a.u&&x5("Patches").M(r[i2].t,t,a.u,a.s)):t=cc(a,r,[]),ec(a),a.u&&a.v(a.u,a.s),t!==Cm?t:void 0}function cc(t,a,r){if(uv(a))return a;var e=a[i2];if(!e)return X6(a,function(n,l){return pm(t,e,a,n,l,r)},!0),a;if(e.A!==t)return a;if(!e.P)return nc(t,e.t,!0),e.t;if(!e.I){e.I=!0,e.A._--;var c=e.i===4||e.i===5?e.o=vv(e.k):e.o;X6(e.i===3?new Set(c):c,function(n,l){return pm(t,e,c,n,l,r)}),nc(t,c,!1),r&&t.u&&x5("Patches").R(e,r,t.u,t.s)}return e.o}function pm(t,a,r,e,c,n){if(J5(c)){var l=cc(t,c,n&&a&&a.i!==3&&!Ht(a.D,e)?n.concat(e):void 0);if(Hm(r,e,l),!J5(l))return;t.m=!1}if(a5(c)&&!uv(c)){if(!t.h.F&&t._<1)return;cc(t,c),a&&a.A.l||nc(t,c)}}function nc(t,a,r){r===void 0&&(r=!1),t.h.F&&t.m&&dv(a,r)}function rv(t,a){var r=t[i2];return(r?Q3(r):t)[a]}function zm(t,a){if(a in t)for(var r=Object.getPrototypeOf(t);r;){var e=Object.getOwnPropertyDescriptor(r,a);if(e)return e;r=Object.getPrototypeOf(r)}}function Y3(t){t.P||(t.P=!0,t.l&&Y3(t.l))}function ev(t){t.o||(t.o=vv(t.t))}function lv(t,a,r){var e=iv(a)?x5("MapSet").N(a,r):hv(a)?x5("MapSet").T(a,r):t.g?function(c,n){var l=Array.isArray(c),o={i:l?1:0,A:n?n.A:cv(),P:!1,I:!1,D:{},l:n,t:c,k:null,o:null,j:null,C:!1},i=o,h=S9;l&&(i=[o],h=y9);var v=Proxy.revocable(i,h),d=v.revoke,u=v.proxy;return o.k=u,o.j=d,u}(a,r):x5("ES5").J(a,r);return(r?r.A:cv()).p.push(e),e}function wI(t){return J5(t)||y4(22,t),function a(r){if(!a5(r))return r;var e,c=r[i2],n=Lt(r);if(c){if(!c.P&&(c.i<4||!x5("ES5").K(c)))return c.t;c.I=!0,e=fm(r,n),c.I=!1}else e=fm(r,n);return X6(e,function(l,o){c&&HI(c.t,l)===o||Hm(e,l,a(o))}),n===3?new Set(e):e}(t)}function fm(t,a){switch(a){case 2:return new Map(t);case 3:return Array.from(t)}return vv(t)}function Lm(){function t(l,o){var i=n[l];return i?i.enumerable=o:n[l]=i={configurable:!0,enumerable:o,get:function(){var h=this[i2];return S9.get(h,l)},set:function(h){var v=this[i2];S9.set(v,l,h)}},i}function a(l){for(var o=l.length-1;o>=0;o--){var i=l[o][i2];if(!i.P)switch(i.i){case 5:e(i)&&Y3(i);break;case 4:r(i)&&Y3(i)}}}function r(l){for(var o=l.t,i=l.k,h=Vt(i),v=h.length-1;v>=0;v--){var d=h[v];if(d!==i2){var u=o[d];if(u===void 0&&!Ht(o,d))return!0;var s=i[d],g=s&&s[i2];if(g?g.t!==u:!Vm(s,u))return!0}}var p=!!o[i2];return h.length!==Vt(o).length+(p?0:1)}function e(l){var o=l.k;if(o.length!==l.t.length)return!0;var i=Object.getOwnPropertyDescriptor(o,o.length-1);if(i&&!i.get)return!0;for(var h=0;h1?f-1:0),H=1;H1?v-1:0),u=1;u=0;c--){var n=e[c];if(n.path.length===0&&n.op==="replace"){r=n.value;break}}c>-1&&(e=e.slice(c+1));var l=x5("Patches").$;return J5(r)?l(r,e):this.produce(r,function(o){return l(o,e)})},t}(),h4=new SI,bI=h4.produce,VX=h4.produceWithPatches.bind(h4),LX=h4.setAutoFreeze.bind(h4),CX=h4.setUseProxies.bind(h4),wX=h4.applyPatches.bind(h4),BX=h4.createDraft.bind(h4),yX=h4.finishDraft.bind(h4),p0=bI;function J3(t){return J3=typeof Symbol=="function"&&typeof Symbol.iterator=="symbol"?function(a){return typeof a}:function(a){return a&&typeof Symbol=="function"&&a.constructor===Symbol&&a!==Symbol.prototype?"symbol":typeof a},J3(t)}function gv(t,a){if(J3(t)!=="object"||t===null)return t;var r=t[Symbol.toPrimitive];if(r!==void 0){var e=r.call(t,a||"default");if(J3(e)!=="object")return e;throw new TypeError("@@toPrimitive must return a primitive value.")}return(a==="string"?String:Number)(t)}function pv(t){var a=gv(t,"string");return J3(a)==="symbol"?a:String(a)}function zv(t,a,r){return a=pv(a),a in t?Object.defineProperty(t,a,{value:r,enumerable:!0,configurable:!0,writable:!0}):t[a]=r,t}function Bm(t,a){var r=Object.keys(t);if(Object.getOwnPropertySymbols){var e=Object.getOwnPropertySymbols(t);a&&(e=e.filter(function(c){return Object.getOwnPropertyDescriptor(t,c).enumerable})),r.push.apply(r,e)}return r}function lc(t){for(var a=1;a"u"&&(r=a,a=void 0),typeof r<"u"){if(typeof r!="function")throw new Error(z0(1));return r(Mv)(t,a)}if(typeof t!="function")throw new Error(z0(2));var c=t,n=a,l=[],o=l,i=!1;function h(){o===l&&(o=l.slice())}function v(){if(i)throw new Error(z0(3));return n}function d(p){if(typeof p!="function")throw new Error(z0(4));if(i)throw new Error(z0(5));var L=!0;return h(),o.push(p),function(){if(!!L){if(i)throw new Error(z0(6));L=!1,h();var m=o.indexOf(p);o.splice(m,1),l=null}}}function u(p){if(!FI(p))throw new Error(z0(7));if(typeof p.type>"u")throw new Error(z0(8));if(i)throw new Error(z0(9));try{i=!0,n=c(n,p)}finally{i=!1}for(var L=l=o,f=0;f"u")throw new Error(z0(12));if(typeof r(void 0,{type:oc.PROBE_UNKNOWN_ACTION()})>"u")throw new Error(z0(13))})}function Am(t){for(var a=Object.keys(t),r={},e=0;e"u"){var H=v&&v.type;throw new Error(z0(14))}s[p]=m,u=u||m!==f}return u=u||n.length!==Object.keys(h).length,u?s:h}}function Ct(){for(var t=arguments.length,a=new Array(t),r=0;r0&&n[n.length-1])&&(h[0]===6||h[0]===2)){r=0;continue}if(h[0]===3&&(!n||h[1]>n[0]&&h[1]0)for(var H=s.getState(),w=Array.from(r.values()),A=0,C=w;AArray.from({length:t},(r,e)=>e),St=(t,a)=>{let r=Math.abs(a-t)+1,e=tt+n*e)};function Av(t){let a=1/0,r=-1/0;for(let n of t)nr&&(r=n);let e=r-a,c=Array.isArray(t)?t.length:t.size;return{minVal:a,maxVal:r,span:e,isSequence:e===c-1}}function a6(t,a){return[...new Array(a)].fill(t)}function Qm(t,a){return t.filter(r=>!a.includes(r))}function I9(t,a){return[...t.slice(0,a),...t.slice(a+1)]}function H5(t,a,r){if(a<0)throw new Error("Can't add item at a negative index");let e=[...t];return a>e.length-1&&(e.length=a),e.splice(a,0,r),e}function Ym(t,a,r){if(r<0)throw new Error("Can't add item at a negative index");if(a<0||a>t.length)throw new Error("Requested to move an element that is not in array");let e=[...t],c=e[a];return e[a]=void 0,e=H5(e,r,c),e.filter(n=>typeof n<"u")}function Jm(t,a=", ",r=" and "){let e=t.length;if(e===1)return t[0];let c=t[e-1];return[...t].splice(0,e-1).join(a)+r+c}function tx(t){return[...new Set(t)]}function K6(t){return Array.isArray(t)?t:[t]}var E9=V(b()),r6=({type:t,name:a,className:r})=>(0,E9.jsxs)("code",{className:r,children:[(0,E9.jsxs)("span",{style:{opacity:.55},children:[t,"$"]}),(0,E9.jsx)("span",{children:a})]});var a3=V(b()),fE=4,ME=25,mE=$6(ME).map(t=>(0,a3.jsx)("div",{className:"faux-row",children:$6(fE).map(a=>(0,a3.jsx)("div",{className:"faux-cell",children:"i"},a))},t)),xE=({uiArguments:t,path:a,wrapperProps:r})=>(0,a3.jsx)("div",{className:"dtDTOutput",...r,children:(0,a3.jsxs)("div",{className:"faux-table",style:{"--table-w":t.width,"--table-h":t.height},children:[(0,a3.jsxs)("div",{className:"faux-header",children:["Table: ",(0,a3.jsx)(r6,{type:"output",name:t.outputId})]}),(0,a3.jsx)("div",{className:"faux-table-body",children:mE})]})}),ax=xE;var rx={title:"DT Table",UiComponent:ax,settingsInfo:{outputId:{inputType:"string",label:"Output ID",defaultValue:"myTable"},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0,useDefaultIfOptional:!0},height:{label:"Height",inputType:"cssMeasure",defaultValue:"auto",optional:!0}},acceptsChildren:!0,iconSrc:Km,category:"Outputs",description:"`DataTable` table output"};var ex="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";var mc=V(X());var cx="864391d0784cf77598c5c8dc5cea034997dbc6ea8757fc15e8b95ccd8abafc15",VE=`._deleteButton_1en02_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(YM)){var t=document.createElement("style");t.id=YM,t.textContent=xR,document.head.appendChild(t)}})();var $e={button:"_button_1y00r_1",regular:"_regular_1y00r_26",delete:"_delete_1y00r_30",icon:"_icon_1y00r_34",transparent:"_transparent_1y00r_42"};var JM=V(b()),HR=({children:t,variant:a="regular",className:r,...e})=>{let c=a?Array.isArray(a)?a.map(n=>$e[n]).join(" "):$e[a]:"";return(0,JM.jsx)("button",{className:J1($e.button,c,r),...e,children:t})},Z1=HR;var wt=V(b()),tm=(0,wt.jsxs)("div",{children:[(0,wt.jsx)("p",{children:"You can see how the changes impact your app with the app preview."}),(0,wt.jsx)("p",{children:"Click in the center of the preview to expand it to full screen to get a better view of your app."}),(0,wt.jsx)("p",{children:'Any log messages from the app will be placed into the "App Logs" drawer.'})]});var n3=V(b()),am=(0,n3.jsxs)("div",{children:[(0,n3.jsx)("p",{children:"The app view shows a skeleton view of the current state of your app's UI."}),(0,n3.jsx)("p",{children:"You can click on elements to select them or drag them around to move them."}),(0,n3.jsx)("p",{children:"Cards can be resized by dragging resize handles on the sides."}),(0,n3.jsx)("p",{children:"Rows and Columns can be resized by dragging between tracts and added by hovering over the left and top respectively to reveal the tract controls widget."}),(0,n3.jsx)("p",{children:(0,n3.jsx)("a",{href:"https://rstudio.github.io/shinyuieditor/articles/how-to.html#show-size-widget",children:"More info"})})]});var k9=V(b()),rm=(0,k9.jsxs)("div",{children:["Drag elements from the elements palette into the app pane on the right to add them to your app. ",(0,k9.jsx)("br",{})," In the app view, the areas available for the element to be dropped in will pulse with an"," ",(0,k9.jsx)("span",{className:"can-accept-drop",style:{padding:"2px"},children:"orange outline."})]});var _9=V(b()),em=(0,_9.jsxs)("div",{children:[(0,_9.jsx)("p",{children:"After selecting an element in your app, you can adjust the settings for that element in the properties pane."}),(0,_9.jsx)("p",{children:"Changes made will be automatically applied to your element both in the app view and your code so there's no need to save or submit these changes."})]});var a6=V(b()),VR=[{target:".app-view",content:am,disableBeacon:!0},{target:".elements-panel",content:rm,placement:"right-start",disableBeacon:!0},{target:".properties-panel",content:em,placement:"left-start"},{target:".app-preview",content:tm,placement:"top-start"},{target:".undo-redo-buttons",content:"Mess something up? You can use the change history to undo or redo your changes",placement:"bottom"}];function nm(){let[t,a]=Bt.useState(0),[r,e]=Bt.useState(!1),c=Bt.useCallback(l=>{let{action:o,index:i,type:h}=l;(h===p0.STEP_AFTER||h===p0.TARGET_NOT_FOUND)&&(o===x1.NEXT?a(i+1):o===x1.PREV?a(i-1):o===x1.CLOSE&&e(!1)),h===p0.TOUR_END&&(o===x1.NEXT&&(e(!1),a(0)),o===x1.SKIP&&e(!1))},[]),n=Bt.useCallback(()=>{e(!0)},[]);return(0,a6.jsxs)(a6.Fragment,{children:[(0,a6.jsxs)(Z1,{onClick:n,title:"Take a guided tour of app",variant:"transparent",children:[(0,a6.jsx)(QM,{id:"tour",size:"24px"}),"Tour App"]}),(0,a6.jsx)(jh,{callback:c,steps:VR,stepIndex:t,run:r,continuous:!0,showProgress:!0,showSkipButton:!0,disableScrolling:!0,locale:{next:"Next",back:"Back",close:"Close",last:"Let's go!",open:"Open the dialog",skip:"Skip tour"},styles:CR})]})}var cm="#e07189",LR="#f6d5dc",CR={options:{arrowColor:"var(--rstudio-white, white)",backgroundColor:"var(--rstudio-white, white)",primaryColor:"var(--rstudio-blue, steelblue)",textColor:"var(--rstudio-grey, black)"},beaconInner:{backgroundColor:cm},beaconOuter:{backgroundColor:LR,border:`2px solid ${cm}`}};var _5=V($());var Xe=wR;function wR(t,a,r){var e=null,c=null,n=function(){e&&(clearTimeout(e),c=null,e=null)},l=function(){var i=c;n(),i&&i()},o=function(){if(!a)return t.apply(this,arguments);var i=this,h=arguments,v=r&&!e;if(n(),c=function(){t.apply(i,h)},e=setTimeout(function(){if(e=null,!v){var d=c;return c=null,d()}},a),v)return c()};return o.cancel=n,o.flush=l,o}var Em=V(lv()),Pm=V(um());var ov=V(q6());function GR(t){t()}var sm=GR,gm=t=>sm=t,pm=()=>sm;var Je=V($());var fm=V($());var zm=V($()),B0=(0,zm.createContext)(null);function Qe(){return(0,fm.useContext)(B0)}var Ye=()=>{throw new Error("uSES not initialized!")};var Mm=Ye,mm=t=>{Mm=t},UR=(t,a)=>t===a;function xm(t=B0){let a=t===B0?Qe:()=>(0,Je.useContext)(t);return function(e,c=UR){let{store:n,subscription:l,getServerState:o}=a(),i=Mm(l.addNestedSub,n.getState,o||n.getState,e,c);return(0,Je.useDebugValue)(i),i}}var b4=xm();var iI=V(ym()),dc=V($()),hI=V(Fm());function nI(){let t=pm(),a=null,r=null;return{clear(){a=null,r=null},notify(){t(()=>{let e=a;for(;e;)e.callback(),e=e.next})},get(){let e=[],c=a;for(;c;)e.push(c),c=c.next;return e},subscribe(e){let c=!0,n=r={callback:e,next:null,prev:r};return n.prev?n.prev.next=n:a=n,function(){!c||a===null||(c=!1,n.next?n.next.prev=n.prev:r=n.prev,n.prev?n.prev.next=n.next:a=n.next)}}}}var km={notify(){},get:()=>[]};function uv(t,a){let r,e=km;function c(d){return i(),e.subscribe(d)}function n(){e.notify()}function l(){v.onStateChange&&v.onStateChange()}function o(){return Boolean(r)}function i(){r||(r=a?a.addNestedSub(l):t.subscribe(l),e=nI())}function h(){r&&(r(),r=void 0,e.clear(),e=km)}let v={addNestedSub:c,notifyNestedSubs:n,handleChangeWrapper:l,isSubscribed:o,trySubscribe:i,tryUnsubscribe:h,getListeners:()=>e};return v}var vc=V($()),lI=typeof window<"u"&&typeof window.document<"u"&&typeof window.document.createElement<"u",sv=lI?vc.useLayoutEffect:vc.useEffect;var vI=Ye,_m=t=>{vI=t};var R9=V($());function dI({store:t,context:a,children:r,serverState:e}){let c=(0,R9.useMemo)(()=>{let o=uv(t);return{store:t,subscription:o,getServerState:e?()=>e:void 0}},[t,e]),n=(0,R9.useMemo)(()=>t.getState(),[t]);sv(()=>{let{subscription:o}=c;return o.onStateChange=o.notifyNestedSubs,o.trySubscribe(),n!==t.getState()&&o.notifyNestedSubs(),()=>{o.tryUnsubscribe(),o.onStateChange=void 0}},[c,n]);let l=a||B0;return R9.default.createElement(l.Provider,{value:c},r)}var gv=dI;var Rm=V($());function uc(t=B0){let a=t===B0?Qe:()=>(0,Rm.useContext)(t);return function(){let{store:e}=a();return e}}var I9=uc();function Im(t=B0){let a=t===B0?I9:uc(t);return function(){return a().dispatch}}var z0=Im();mm(Pm.useSyncExternalStoreWithSelector);_m(Em.useSyncExternalStore);gm(ov.unstable_batchedUpdates);var lA=V($());var aA=V($());function O4(t){for(var a=arguments.length,r=Array(a>1?a-1:0),e=1;e3?a.i-4:a.i:Array.isArray(t)?1:Lv(t)?2:Cv(t)?3:0}function At(t,a){return bt(t)===2?t.has(a):Object.prototype.hasOwnProperty.call(t,a)}function uI(t,a){return bt(t)===2?t.get(a):t[a]}function jm(t,a,r){var e=bt(t);e===2?t.set(a,r):e===3?(t.delete(a),t.add(r)):t[a]=r}function qm(t,a){return t===a?t!==0||1/t==1/a:t!=t&&a!=a}function Lv(t){return fI&&t instanceof Map}function Cv(t){return MI&&t instanceof Set}function r6(t){return t.o||t.t}function wv(t){if(Array.isArray(t))return Array.prototype.slice.call(t);var a=Km(t);delete a[h2];for(var r=St(a),e=0;e1&&(t.set=t.add=t.clear=t.delete=sI),Object.freeze(t),a&&J6(t,function(r,e){return Bv(e,!0)},!0)),t}function sI(){O4(2)}function yv(t){return t==null||typeof t!="object"||Object.isFrozen(t)}function A5(t){var a=Vv[t];return a||O4(18,t),a}function gI(t,a){Vv[t]||(Vv[t]=a)}function mv(){return P9}function pv(t,a){a&&(A5("Patches"),t.u=[],t.s=[],t.v=a)}function sc(t){xv(t),t.p.forEach(pI),t.p=null}function xv(t){t===P9&&(P9=t.l)}function Tm(t){return P9={p:[],l:P9,h:t,m:!0,_:0}}function pI(t){var a=t[h2];a.i===0||a.i===1?a.j():a.O=!0}function zv(t,a){a._=a.p.length;var r=a.p[0],e=t!==void 0&&t!==r;return a.h.g||A5("ES5").S(a,t,e),e?(r[h2].P&&(sc(a),O4(4)),o5(t)&&(t=gc(a,t),a.l||pc(a,t)),a.u&&A5("Patches").M(r[h2].t,t,a.u,a.s)):t=gc(a,r,[]),sc(a),a.u&&a.v(a.u,a.s),t!==Xm?t:void 0}function gc(t,a,r){if(yv(a))return a;var e=a[h2];if(!e)return J6(a,function(n,l){return Nm(t,e,a,n,l,r)},!0),a;if(e.A!==t)return a;if(!e.P)return pc(t,e.t,!0),e.t;if(!e.I){e.I=!0,e.A._--;var c=e.i===4||e.i===5?e.o=wv(e.k):e.o;J6(e.i===3?new Set(c):c,function(n,l){return Nm(t,e,c,n,l,r)}),pc(t,c,!1),r&&t.u&&A5("Patches").R(e,r,t.u,t.s)}return e.o}function Nm(t,a,r,e,c,n){if(l3(c)){var l=gc(t,c,n&&a&&a.i!==3&&!At(a.D,e)?n.concat(e):void 0);if(jm(r,e,l),!l3(l))return;t.m=!1}if(o5(c)&&!yv(c)){if(!t.h.F&&t._<1)return;gc(t,c),a&&a.A.l||pc(t,c)}}function pc(t,a,r){r===void 0&&(r=!1),t.h.F&&t.m&&Bv(a,r)}function fv(t,a){var r=t[h2];return(r?r6(r):t)[a]}function Dm(t,a){if(a in t)for(var r=Object.getPrototypeOf(t);r;){var e=Object.getOwnPropertyDescriptor(r,a);if(e)return e;r=Object.getPrototypeOf(r)}}function e6(t){t.P||(t.P=!0,t.l&&e6(t.l))}function Mv(t){t.o||(t.o=wv(t.t))}function Hv(t,a,r){var e=Lv(a)?A5("MapSet").N(a,r):Cv(a)?A5("MapSet").T(a,r):t.g?function(c,n){var l=Array.isArray(c),o={i:l?1:0,A:n?n.A:mv(),P:!1,I:!1,D:{},l:n,t:c,k:null,o:null,j:null,C:!1},i=o,h=T9;l&&(i=[o],h=E9);var v=Proxy.revocable(i,h),d=v.revoke,u=v.proxy;return o.k=u,o.j=d,u}(a,r):A5("ES5").J(a,r);return(r?r.A:mv()).p.push(e),e}function zI(t){return l3(t)||O4(22,t),function a(r){if(!o5(r))return r;var e,c=r[h2],n=bt(r);if(c){if(!c.P&&(c.i<4||!A5("ES5").K(c)))return c.t;c.I=!0,e=Zm(r,n),c.I=!1}else e=Zm(r,n);return J6(e,function(l,o){c&&uI(c.t,l)===o||jm(e,l,a(o))}),n===3?new Set(e):e}(t)}function Zm(t,a){switch(a){case 2:return new Map(t);case 3:return Array.from(t)}return wv(t)}function $m(){function t(l,o){var i=n[l];return i?i.enumerable=o:n[l]=i={configurable:!0,enumerable:o,get:function(){var h=this[h2];return T9.get(h,l)},set:function(h){var v=this[h2];T9.set(v,l,h)}},i}function a(l){for(var o=l.length-1;o>=0;o--){var i=l[o][h2];if(!i.P)switch(i.i){case 5:e(i)&&e6(i);break;case 4:r(i)&&e6(i)}}}function r(l){for(var o=l.t,i=l.k,h=St(i),v=h.length-1;v>=0;v--){var d=h[v];if(d!==h2){var u=o[d];if(u===void 0&&!At(o,d))return!0;var s=i[d],g=s&&s[h2];if(g?g.t!==u:!qm(s,u))return!0}}var p=!!o[h2];return h.length!==St(o).length+(p?0:1)}function e(l){var o=l.k;if(o.length!==l.t.length)return!0;var i=Object.getOwnPropertyDescriptor(o,o.length-1);if(i&&!i.get)return!0;for(var h=0;h1?f-1:0),H=1;H1?v-1:0),u=1;u=0;c--){var n=e[c];if(n.path.length===0&&n.op==="replace"){r=n.value;break}}c>-1&&(e=e.slice(c+1));var l=A5("Patches").$;return l3(r)?l(r,e):this.produce(r,function(o){return l(o,e)})},t}(),s4=new xI,HI=s4.produce,RX=s4.produceWithPatches.bind(s4),IX=s4.setAutoFreeze.bind(s4),EX=s4.setUseProxies.bind(s4),PX=s4.applyPatches.bind(s4),TX=s4.createDraft.bind(s4),NX=s4.finishDraft.bind(s4),f0=HI;function c6(t){return c6=typeof Symbol=="function"&&typeof Symbol.iterator=="symbol"?function(a){return typeof a}:function(a){return a&&typeof Symbol=="function"&&a.constructor===Symbol&&a!==Symbol.prototype?"symbol":typeof a},c6(t)}function Sv(t,a){if(c6(t)!=="object"||t===null)return t;var r=t[Symbol.toPrimitive];if(r!==void 0){var e=r.call(t,a||"default");if(c6(e)!=="object")return e;throw new TypeError("@@toPrimitive must return a primitive value.")}return(a==="string"?String:Number)(t)}function bv(t){var a=Sv(t,"string");return c6(a)==="symbol"?a:String(a)}function Fv(t,a,r){return a=bv(a),a in t?Object.defineProperty(t,a,{value:r,enumerable:!0,configurable:!0,writable:!0}):t[a]=r,t}function Qm(t,a){var r=Object.keys(t);if(Object.getOwnPropertySymbols){var e=Object.getOwnPropertySymbols(t);a&&(e=e.filter(function(c){return Object.getOwnPropertyDescriptor(t,c).enumerable})),r.push.apply(r,e)}return r}function zc(t){for(var a=1;a"u"&&(r=a,a=void 0),typeof r<"u"){if(typeof r!="function")throw new Error(M0(1));return r(kv)(t,a)}if(typeof t!="function")throw new Error(M0(2));var c=t,n=a,l=[],o=l,i=!1;function h(){o===l&&(o=l.slice())}function v(){if(i)throw new Error(M0(3));return n}function d(p){if(typeof p!="function")throw new Error(M0(4));if(i)throw new Error(M0(5));var L=!0;return h(),o.push(p),function(){if(!!L){if(i)throw new Error(M0(6));L=!1,h();var m=o.indexOf(p);o.splice(m,1),l=null}}}function u(p){if(!VI(p))throw new Error(M0(7));if(typeof p.type>"u")throw new Error(M0(8));if(i)throw new Error(M0(9));try{i=!0,n=c(n,p)}finally{i=!1}for(var L=l=o,f=0;f"u")throw new Error(M0(12));if(typeof r(void 0,{type:fc.PROBE_UNKNOWN_ACTION()})>"u")throw new Error(M0(13))})}function Jm(t){for(var a=Object.keys(t),r={},e=0;e"u"){var H=v&&v.type;throw new Error(M0(14))}s[p]=m,u=u||m!==f}return u=u||n.length!==Object.keys(h).length,u?s:h}}function Ft(){for(var t=arguments.length,a=new Array(t),r=0;r0&&n[n.length-1])&&(h[0]===6||h[0]===2)){r=0;continue}if(h[0]===3&&(!n||h[1]>n[0]&&h[1]0)for(var H=s.getState(),w=Array.from(r.values()),A=0,C=w;AArray.from({length:t},(r,e)=>e),It=(t,a)=>{let r=Math.abs(a-t)+1,e=tt+n*e)};function Gv(t){let a=1/0,r=-1/0;for(let n of t)nr&&(r=n);let e=r-a,c=Array.isArray(t)?t.length:t.size;return{minVal:a,maxVal:r,span:e,isSequence:e===c-1}}function l6(t,a){return[...new Array(a)].fill(t)}function xx(t,a){return t.filter(r=>!a.includes(r))}function U9(t,a){return[...t.slice(0,a),...t.slice(a+1)]}function S5(t,a,r){if(a<0)throw new Error("Can't add item at a negative index");let e=[...t];return a>e.length-1&&(e.length=a),e.splice(a,0,r),e}function Hx(t,a,r){if(r<0)throw new Error("Can't add item at a negative index");if(a<0||a>t.length)throw new Error("Requested to move an element that is not in array");let e=[...t],c=e[a];return e[a]=void 0,e=S5(e,r,c),e.filter(n=>typeof n<"u")}function Vx(t,a=", ",r=" and "){let e=t.length;if(e===1)return t[0];let c=t[e-1];return[...t].splice(0,e-1).join(a)+r+c}function Lx(t){return[...new Set(t)]}function a8(t){return Array.isArray(t)?t:[t]}var W9=V(b()),o6=({type:t,name:a,className:r})=>(0,W9.jsxs)("code",{className:r,children:[(0,W9.jsxs)("span",{style:{opacity:.55},children:[t,"$"]}),(0,W9.jsx)("span",{children:a})]});var i3=V(b()),lE=4,oE=25,iE=t8(oE).map(t=>(0,i3.jsx)("div",{className:"faux-row",children:t8(lE).map(a=>(0,i3.jsx)("div",{className:"faux-cell",children:"i"},a))},t)),hE=({uiArguments:t,path:a,wrapperProps:r})=>(0,i3.jsx)("div",{className:"dtDTOutput",...r,children:(0,i3.jsxs)("div",{className:"faux-table",style:{"--table-w":t.width,"--table-h":t.height},children:[(0,i3.jsxs)("div",{className:"faux-header",children:["Table: ",(0,i3.jsx)(o6,{type:"output",name:t.outputId})]}),(0,i3.jsx)("div",{className:"faux-table-body",children:iE})]})}),Cx=hE;var wx={title:"DT Table",UiComponent:Cx,settingsInfo:{outputId:{inputType:"string",label:"Output ID",defaultValue:"myTable"},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0,useDefaultIfOptional:!0},height:{label:"Height",inputType:"cssMeasure",defaultValue:"auto",optional:!0}},serverBindings:{outputs:{outputIdKey:"outputId",renderScaffold:`renderDT({ + iris +})`}},acceptsChildren:!0,iconSrc:mx,category:"Outputs",description:"`DataTable` table output"};var Bx="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEO0lEQVR4nO3dsYqcVRiH8WeNrkXMDRgLixRWRjSiXoMWG0iUXIGNsii4wRsQTApD0EIvQBCJ2RD0GqIoRjthC4vsHaRxRcbi7MDk28kMgv+c92SfH2zxfbPFmZcnZ06+LWZjNpsh/d+e6L0APZ4MSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqWIJ3svYJ2db/aW3d4Etg5/3gCePby3Mfm96RcFjfj6feAe8CtwE7gFHEx+jyvvnJne6qp8WEucB64AtSaZ8wzwwuHPJWAPuAx813NR64z0UXgC+JQ20OMS1TJngBu0WZzovJaHGmnH+gTY6b2IQuazuNx1FQ8xyo51gaNRHQDXaWesUxw9n3B4b/FnxNdP0d7jdY6erXZosylnhLA2gc8m9/aB14Bt4A7tgPu4uk97j9u097w/ef0abUaljBDWReC5hesD4C3gbpfV9HUXeBP4a+HeaeDtLqtZYYSwtibXX3I8o5r7Dfhqcm+rwzpWGiGsVyfXX3dZRS3TGZzrsooVRvhf4fOT63LniQ7usPywX8YIO9bUkafOqmfEsDQAw1LECGesdX+oPa5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqUIw1LECGes0s9rOio9F3csRRiWIgxLESOcsUqdHQopPRd3LEUYliIMSxEjnLFKP6/pqPRc3LEUYViKMCxFjHDGKnV2KKT0XNyxFGFYijAsRYxwxir9vKaj0nNxx1KEYSnCsBQxwhmr1NmhkNJzccdShGEpwrAUMcIZq/Tzmo5Kz8UdSxGGpQjDUsQIZ6xSZ4dCSs/FHUsRhqWIEcPyK08GMEJYf9Ce2cx/Xu67nBJe58GZ/Nl1NUuMENbvk+tLXVZRy3QGP3dZxQojhLU7uX4XONthHVW8SJvBot0O61hphLC+Be4tXD8NfA+81GU1fZ0FfqDNYG6fNqNSRgjrAPhwcu808CPt+5DPAScf8ZoepZO093gN+In23hd9wINf5VvCCA9Iof2LvAp8tHBvk/YF3NsL96YPDdf9oXa016euUnC3gjF2rLmPgc97L6KQL2gzKWmksP4B3gcuAHud19LTHnAReI82k5JG+ShcdAO4TRvueeAV2rnjqZ6LCvqbdkD/BbhJ++gr//XFG7PZuo9x6b8b6aNQAzEsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliL+BXaHdHGUC5uqAAAAAElFTkSuQmCC";var Sc=V($());var yx="9e760262874d6a2a7c0f4cd10d6a37f767014cce9893c3d560a622e91a7a5513",dE=`._deleteButton_1en02_1 { color: var(--red); display: flex; align-items: center; @@ -97,7 +109,7 @@ Please read the updated README.md at https://github.com/SortableJS/react-sortabl ._deleteButton_1en02_1 > svg { font-size: 1.5rem; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(cx)){var t=document.createElement("style");t.id=cx,t.textContent=VE,document.head.appendChild(t)}})();var nx={deleteButton:"_deleteButton_1en02_1"};var dc=V(b());function LE({path:t,justIcon:a=!1,label:r="Delete Node"}){let e=uc(t);return(0,dc.jsxs)(Y1,{className:nx.deleteButton,onClick:c=>{c.stopPropagation(),e()},"aria-label":r,title:r,variant:a?"icon":"delete",type:"button",children:[(0,dc.jsx)(Q5,{}),a?null:"Delete Element"]})}var vc=LE;var Sv=V(X()),bv=V(b()),bt=Sv.default.forwardRef(({className:t="",children:a,...r},e)=>{let c=t+" card";return(0,bv.jsx)("div",{ref:e,className:c,...r,children:a})}),lx=Sv.default.forwardRef(({className:t="",...a},r)=>{let e=t+" card-header";return(0,bv.jsx)("div",{ref:r,className:e,...a})});var P9=V(X());var sc=V(X()),hx=V(b()),gc=sc.default.createContext([null,t=>{}]);function ox({children:t}){let a=sc.default.useState(null);return(0,hx.jsx)(gc.Provider,{value:a,children:t})}function ix(){return sc.default.useContext(gc)}function pc({nodeInfo:t,immovable:a=!1}){let r=P9.default.useRef(!1),[,e]=P9.default.useContext(gc),c=P9.default.useCallback(l=>{r.current===!1||a||(e(null),r.current=!1,document.body.removeEventListener("dragover",vx),document.body.removeEventListener("drop",c))},[a,e]),n=P9.default.useCallback(l=>{l.stopPropagation(),e(t),r.current=!0,document.body.addEventListener("dragover",vx),document.body.addEventListener("drop",c)},[c,t,e]);return t.currentPath?.length===0||a?{}:{onDragStart:n,onDragEnd:c,draggable:!0}}function vx(t){t.preventDefault()}function D2(t,a){return[...t,a]}function e6(t){return t.join("-")}var fx=V(X());var gx=V(X());var dx=yt({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(t,a)=>a.payload.path,STEP_BACK_SELECTION:t=>t===null||t.length===0?null:(t.pop(),t)}}),{SET_SELECTION:c6,STEP_BACK_SELECTION:B$}=dx.actions;function ux(){return w4(t=>t.selectedPath)}var sx=dx.reducer;function Ft(){let t=g0(),a=w4(e=>e.selectedPath),r=gx.useCallback(e=>{t(c6({path:e}))},[t]);return[a,r]}function px(){return w4(a=>a.selectedPath)}function r5(t,a){if(t===a)return!0;if(t.length!==a.length)return!1;for(let r=0;r!r.includes(n)),c=Object.keys(a).filter(n=>!r.includes(n));if(!r5(e,c))return!1;for(let n of e)if(t[n]!==a[n])return!1;return!0}function Mx(t){let[a,r]=Ft(),e=fx.default.useCallback(n=>{n.stopPropagation(),r(t)},[t,r]),c=Boolean(a&&r5(a,t));return{onClick:e,isSelected:c}}function zc(t,a){let r=pc({nodeInfo:{node:t,currentPath:a}}),{onClick:e,isSelected:c}=Mx(a);return{onClick:e,"data-sue-path":e6(a),"data-is-selected-node":c,"aria-label":t.uiName,...r}}var mx=V(b()),CE=({path:t,node:a})=>{let{uiName:r,uiArguments:e,uiChildren:c}=a,n=N2[r].UiComponent,l=zc(a,t);return(0,mx.jsx)(n,{wrapperProps:l,uiArguments:e,uiChildren:c,path:t})},T0=CE;var xx="3fc894399f57b739e010a59a7332df58df456100a538904581acb590f553a599",wE=`._container_1a2os_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(yx)){var t=document.createElement("style");t.id=yx,t.textContent=dE,document.head.appendChild(t)}})();var Ax={deleteButton:"_deleteButton_1en02_1"};var Hc=V(b());function uE({path:t,justIcon:a=!1,label:r="Delete Node"}){let e=Vc(t);return(0,Hc.jsxs)(Z1,{className:Ax.deleteButton,onClick:c=>{c.stopPropagation(),e()},"aria-label":r,title:r,variant:a?"icon":"delete",type:"button",children:[(0,Hc.jsx)(c3,{}),a?null:"Delete Element"]})}var xc=uE;var Uv=V($()),Wv=V(b()),Et=Uv.default.forwardRef(({className:t="",children:a,...r},e)=>{let c=t+" card";return(0,Wv.jsx)("div",{ref:e,className:c,...r,children:a})}),Sx=Uv.default.forwardRef(({className:t="",...a},r)=>{let e=t+" card-header";return(0,Wv.jsx)("div",{ref:r,className:e,...a})});var j9=V($());var Lc=V($()),Ox=V(b()),Cc=Lc.default.createContext([null,t=>{}]);function bx({children:t}){let a=Lc.default.useState(null);return(0,Ox.jsx)(Cc.Provider,{value:a,children:t})}function Fx(){return Lc.default.useContext(Cc)}function wc({nodeInfo:t,immovable:a=!1}){let r=j9.default.useRef(!1),[,e]=j9.default.useContext(Cc),c=j9.default.useCallback(l=>{r.current===!1||a||(e(null),r.current=!1,document.body.removeEventListener("dragover",kx),document.body.removeEventListener("drop",c))},[a,e]),n=j9.default.useCallback(l=>{l.stopPropagation(),e(t),r.current=!0,document.body.addEventListener("dragover",kx),document.body.addEventListener("drop",c)},[c,t,e]);return t.currentPath?.length===0||a?{}:{onDragStart:n,onDragEnd:c,draggable:!0}}function kx(t){t.preventDefault()}function Z2(t,a){return[...t,a]}function i6(t){return t.join("-")}var Nx=V($());var Ex=V($());var _x=_t({name:"selectedPath",initialState:[],reducers:{SET_SELECTION:(t,a)=>a.payload.path,STEP_BACK_SELECTION:t=>t===null||t.length===0?null:(t.pop(),t)}}),{SET_SELECTION:h6,STEP_BACK_SELECTION:PK}=_x.actions;function Rx(){return b4(t=>t.selected_path)}var Ix=_x.reducer;function Pt(){let t=z0(),a=b4(e=>e.selected_path),r=Ex.useCallback(e=>{t(h6({path:e}))},[t]);return[a,r]}function Px(){return b4(a=>a.selected_path)}function i5(t,a){if(t===a)return!0;if(t.length!==a.length)return!1;for(let r=0;r!r.includes(n)),c=Object.keys(a).filter(n=>!r.includes(n));if(!i5(e,c))return!1;for(let n of e)if(t[n]!==a[n])return!1;return!0}function Dx(t){let[a,r]=Pt(),e=Nx.default.useCallback(n=>{n.stopPropagation(),r(t)},[t,r]),c=Boolean(a&&i5(a,t));return{onClick:e,isSelected:c}}function Bc(t,a){let r=wc({nodeInfo:{node:t,currentPath:a}}),{onClick:e,isSelected:c}=Dx(a);return{onClick:e,"data-sue-path":i6(a),"data-is-selected-node":c,"aria-label":t.uiName,...r}}var Zx=V(b()),sE=({path:t,node:a})=>{let{uiName:r,uiArguments:e,uiChildren:c}=a,n=L2[r].UiComponent,l=Bc(a,t);return(0,Zx.jsx)(n,{wrapperProps:l,uiArguments:e,uiChildren:c,path:t})},D0=sE;var Gx="0d8aaaf1e8530a62a211c3616d5aeefb8cc178aab3c280598f8f53b400f061c1",gE=`._container_1a2os_1 { position: relative; height: 100%; width: 100%; @@ -258,7 +270,7 @@ div._emptyGridCard_1a2os_144 > button { font-style: italic; opacity: 0.5; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(xx)){var t=document.createElement("style");t.id=xx,t.textContent=wE,document.head.appendChild(t)}})();var A4={container:"_container_1a2os_1",withTitle:"_withTitle_1a2os_13",panelTitle:"_panelTitle_1a2os_22",contentHolder:"_contentHolder_1a2os_27",dropWatcher:"_dropWatcher_1a2os_68",lastDropWatcher:"_lastDropWatcher_1a2os_76",firstDropWatcher:"_firstDropWatcher_1a2os_79",middleDropWatcher:"_middleDropWatcher_1a2os_90",onlyDropWatcher:"_onlyDropWatcher_1a2os_94",hoveringOverSwap:"_hoveringOverSwap_1a2os_99",availableToSwap:"_availableToSwap_1a2os_100",pulse:"_pulse_1a2os_1",emptyGridCard:"_emptyGridCard_1a2os_144",emptyMessage:"_emptyMessage_1a2os_161"};var Fv=V(X());function V5(t){return t.length}function fc(t,a,r){return r===0?!0:r5(t.slice(0,r),a.slice(0,r))}function Hx(t,a){let r=V5(t),e=V5(a);return r>=e?!1:fc(t,a,r)}function Ot(t,a){let r=t.length,e=a.length;if(r!==e)return!1;let c=r-1;return!!r5(t.slice(0,c),a.slice(0,c))}function Mc({fromPath:t,toPath:a}){if(t==null)return!0;if(Hx(t,a))return!1;if(Ot(t,a)){let r=t.length,e=t[r-1],c=a[r-1];if(e===c||e===c-1)return!1}return!0}var r3=V(X());function n6({watcherRef:t,getCanAcceptDrop:a=()=>!0,onDrop:r,onDragOver:e,canAcceptDropClass:c="can-accept-drop",hoveringOverClass:n="hovering-over"}){let[l,o]=ix(),{addCanAcceptDropHighlight:i,addHoveredOverHighlight:h,removeHoveredOverHighlight:v,removeAllHighlights:d}=BE({watcherRef:t,canAcceptDropClass:c,hoveringOverClass:n}),u=l?a(l):!1,s=r3.default.useCallback(L=>{L.preventDefault(),L.stopPropagation(),h(),e?.()},[h,e]),g=r3.default.useCallback(L=>{L.preventDefault(),v()},[v]),p=r3.default.useCallback(L=>{if(L.stopPropagation(),v(),!l){console.error("No dragged node in context but a drop was detected...");return}u?r(l):console.error("Incompatable drag pairing"),o(null)},[u,l,r,v,o]);r3.default.useEffect(()=>{let L=t.current;if(!!L)return u&&(i(),L.addEventListener("dragenter",s),L.addEventListener("dragleave",g),L.addEventListener("dragover",s),L.addEventListener("drop",p)),()=>{d(),L.removeEventListener("dragenter",s),L.removeEventListener("dragleave",g),L.removeEventListener("dragover",s),L.removeEventListener("drop",p)}},[i,u,g,s,p,d,t])}function BE({watcherRef:t,canAcceptDropClass:a,hoveringOverClass:r}){let e=r3.default.useCallback(()=>{!t.current||(t.current.classList.add(a),t.current.classList.add("can-accept-drop"))},[a,t]),c=r3.default.useCallback(()=>{!t.current||t.current.classList.add(r)},[r,t]),n=r3.default.useCallback(()=>{!t.current||t.current.classList.remove(r)},[r,t]),l=r3.default.useCallback(()=>{!t.current||(t.current.classList.remove(r),t.current.classList.remove(a),t.current.classList.remove("can-accept-drop"))},[a,r,t]);return{addCanAcceptDropHighlight:e,addHoveredOverHighlight:c,removeHoveredOverHighlight:n,removeAllHighlights:l}}function Lx({watcherRef:t,positionInChildren:a,parentPath:r}){let e=l6(),c=Fv.default.useCallback(({node:l,currentPath:o})=>Vx(l)!==null&&Mc({fromPath:o,toPath:[...r,a]}),[a,r]),n=Fv.default.useCallback(({node:l,currentPath:o})=>{let i=Vx(l);if(!i)throw new Error("No node to place...");e({node:i,currentPath:o,path:D2(r,a)})},[a,r,e]);n6({watcherRef:t,getCanAcceptDrop:c,onDrop:n})}function Vx(t){let a=t.uiName;return a==="gridlayout::grid_card"&&t.uiChildren?.length===1?t.uiChildren[0]:a.includes("gridlayout::grid_card")?null:t}var Iv=V(X());var yE=["gridlayout::grid_card_text","gridlayout::grid_card","gridlayout::grid_card_plot"];function T9(t){return yE.includes(t.uiName)}var Ov=V(X()),kv=Ov.default.createContext(null);function Cx(){return Ov.default.useContext(kv)}var wx="69e6cbf435ad5d179348021b44c2d259597c5fea34efd4fd2e4004f139b5ca00",AE=`._container_1a2os_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(Gx)){var t=document.createElement("style");t.id=Gx,t.textContent=gE,document.head.appendChild(t)}})();var k4={container:"_container_1a2os_1",withTitle:"_withTitle_1a2os_13",panelTitle:"_panelTitle_1a2os_22",contentHolder:"_contentHolder_1a2os_27",dropWatcher:"_dropWatcher_1a2os_68",lastDropWatcher:"_lastDropWatcher_1a2os_76",firstDropWatcher:"_firstDropWatcher_1a2os_79",middleDropWatcher:"_middleDropWatcher_1a2os_90",onlyDropWatcher:"_onlyDropWatcher_1a2os_94",hoveringOverSwap:"_hoveringOverSwap_1a2os_99",availableToSwap:"_availableToSwap_1a2os_100",pulse:"_pulse_1a2os_1",emptyGridCard:"_emptyGridCard_1a2os_144",emptyMessage:"_emptyMessage_1a2os_161"};var jv=V($());function b5(t){return t.length}function yc(t,a,r){return r===0?!0:i5(t.slice(0,r),a.slice(0,r))}function Ux(t,a){let r=b5(t),e=b5(a);return r>=e?!1:yc(t,a,r)}function Tt(t,a){let r=t.length,e=a.length;if(r!==e)return!1;let c=r-1;return!!i5(t.slice(0,c),a.slice(0,c))}function Ac({fromPath:t,toPath:a}){if(t==null)return!0;if(Ux(t,a))return!1;if(Tt(t,a)){let r=t.length,e=t[r-1],c=a[r-1];if(e===c||e===c-1)return!1}return!0}var h3=V($());function v6({watcherRef:t,getCanAcceptDrop:a=()=>!0,onDrop:r,onDragOver:e,canAcceptDropClass:c="can-accept-drop",hoveringOverClass:n="hovering-over"}){let[l,o]=Fx(),{addCanAcceptDropHighlight:i,addHoveredOverHighlight:h,removeHoveredOverHighlight:v,removeAllHighlights:d}=pE({watcherRef:t,canAcceptDropClass:c,hoveringOverClass:n}),u=l?a(l):!1,s=h3.default.useCallback(L=>{L.preventDefault(),L.stopPropagation(),h(),e?.()},[h,e]),g=h3.default.useCallback(L=>{L.preventDefault(),v()},[v]),p=h3.default.useCallback(L=>{if(L.stopPropagation(),v(),!l){console.error("No dragged node in context but a drop was detected...");return}u?r(l):console.error("Incompatable drag pairing"),o(null)},[u,l,r,v,o]);h3.default.useEffect(()=>{let L=t.current;if(!!L)return u&&(i(),L.addEventListener("dragenter",s),L.addEventListener("dragleave",g),L.addEventListener("dragover",s),L.addEventListener("drop",p)),()=>{d(),L.removeEventListener("dragenter",s),L.removeEventListener("dragleave",g),L.removeEventListener("dragover",s),L.removeEventListener("drop",p)}},[i,u,g,s,p,d,t])}function pE({watcherRef:t,canAcceptDropClass:a,hoveringOverClass:r}){let e=h3.default.useCallback(()=>{!t.current||(t.current.classList.add(a),t.current.classList.add("can-accept-drop"))},[a,t]),c=h3.default.useCallback(()=>{!t.current||t.current.classList.add(r)},[r,t]),n=h3.default.useCallback(()=>{!t.current||t.current.classList.remove(r)},[r,t]),l=h3.default.useCallback(()=>{!t.current||(t.current.classList.remove(r),t.current.classList.remove(a),t.current.classList.remove("can-accept-drop"))},[a,r,t]);return{addCanAcceptDropHighlight:e,addHoveredOverHighlight:c,removeHoveredOverHighlight:n,removeAllHighlights:l}}function jx({watcherRef:t,positionInChildren:a,parentPath:r}){let e=d6(),c=jv.default.useCallback(({node:l,currentPath:o})=>Wx(l)!==null&&Ac({fromPath:o,toPath:[...r,a]}),[a,r]),n=jv.default.useCallback(({node:l,currentPath:o})=>{let i=Wx(l);if(!i)throw new Error("No node to place...");e({node:i,currentPath:o,path:Z2(r,a)})},[a,r,e]);v6({watcherRef:t,getCanAcceptDrop:c,onDrop:n})}function Wx(t){let a=t.uiName;return a==="gridlayout::grid_card"&&t.uiChildren?.length===1?t.uiChildren[0]:a.includes("gridlayout::grid_card")?null:t}var Kv=V($());var zE=["gridlayout::grid_card_text","gridlayout::grid_card","gridlayout::grid_card_plot"];function q9(t){return zE.includes(t.uiName)}var qv=V($()),$v=qv.default.createContext(null);function qx(){return qv.default.useContext($v)}var $x="5e7f9ef54bd4d7c43c8967b0c09dec643e98eae6738521a451e36e3bd53700d9",fE=`._container_1a2os_1 { position: relative; height: 100%; width: 100%; @@ -419,7 +431,7 @@ div._emptyGridCard_1a2os_144 > button { font-style: italic; opacity: 0.5; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(wx)){var t=document.createElement("style");t.id=wx,t.textContent=AE,document.head.appendChild(t)}})();var Rv={container:"_container_1a2os_1",withTitle:"_withTitle_1a2os_13",panelTitle:"_panelTitle_1a2os_22",contentHolder:"_contentHolder_1a2os_27",dropWatcher:"_dropWatcher_1a2os_68",lastDropWatcher:"_lastDropWatcher_1a2os_76",firstDropWatcher:"_firstDropWatcher_1a2os_79",middleDropWatcher:"_middleDropWatcher_1a2os_90",onlyDropWatcher:"_onlyDropWatcher_1a2os_94",hoveringOverSwap:"_hoveringOverSwap_1a2os_99",availableToSwap:"_availableToSwap_1a2os_100",pulse:"_pulse_1a2os_1",emptyGridCard:"_emptyGridCard_1a2os_144",emptyMessage:"_emptyMessage_1a2os_161"};function kt({containerRef:t,path:a,area:r}){let e=Cx(),c=Iv.default.useCallback(({node:l,currentPath:o})=>o===void 0||!T9(l)?!1:Ot(o,a),[a]),n=Iv.default.useCallback(l=>{if(!("area"in l.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:l});return}let o=l.node.uiArguments.area??"__BAD_DROP__";e?.({type:"SWAP_ITEMS",item_a:r,item_b:o})},[r,e]);n6({watcherRef:t,getCanAcceptDrop:c,onDrop:n,canAcceptDropClass:Rv.availableToSwap,hoveringOverClass:Rv.hoveringOverSwap})}var _0=V(b()),SE=({uiArguments:{area:t,item_gap:a,title:r},uiChildren:e,path:c,wrapperProps:n})=>{let l=mc.default.useRef(null),o=e?.length??0;return kt({containerRef:l,area:t,path:c}),(0,_0.jsxs)(bt,{className:N1(A4.container,r?A4.withTitle:null),ref:l,style:{gridArea:t,"--item-gap":a},...n,children:[r?(0,_0.jsx)(lx,{className:A4.panelTitle,children:r}):null,(0,_0.jsxs)("div",{className:A4.contentHolder,"data-alignment":"top",children:[(0,_0.jsx)(Bx,{index:0,parentPath:c,numChildren:o}),o>0?e?.map((i,h)=>(0,_0.jsxs)(mc.default.Fragment,{children:[(0,_0.jsx)(T0,{path:D2(c,h),node:i}),(0,_0.jsx)(Bx,{index:h+1,numChildren:e.length,parentPath:c})]},c.join(".")+h)):(0,_0.jsx)(FE,{path:c})]})]})};function Bx({index:t,numChildren:a,parentPath:r}){let e=mc.default.useRef(null);Lx({watcherRef:e,positionInChildren:t,parentPath:r});let c=bE(t,a);return(0,_0.jsx)("div",{ref:e,className:N1(A4.dropWatcher,c),role:"region","aria-label":"drop watcher"})}function bE(t,a){return t===0&&a===0?A4.onlyDropWatcher:t===0?A4.firstDropWatcher:t===a?A4.lastDropWatcher:A4.middleDropWatcher}function FE({path:t}){return(0,_0.jsxs)("div",{className:A4.emptyGridCard,children:[(0,_0.jsx)("span",{className:A4.emptyMessage,children:"Empty grid card"}),(0,_0.jsx)(vc,{path:t,justIcon:!0,label:"Delete empty grid card"})]})}var yx=SE;var Ax={title:"Grid Card",UiComponent:yx,settingsInfo:{area:{label:"Name of grid area",inputType:"string",defaultValue:"default-area"},title:{inputType:"string",label:"Panel title",defaultValue:"My Card",optional:!0},item_gap:{inputType:"cssMeasure",label:"Gap size between contents",defaultValue:"10px",units:["px","rem"],optional:!0}},acceptsChildren:!0,iconSrc:ex,category:"gridlayout",description:"The standard element for placing elements on the grid in a simple card container."};var Rt="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";var kx=V(X());var It=V(X());function Sx(t){return f2({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(t)}var bx="45a4f96546d7521c90cad3be4b82d47c239be33adc728c3df4ff460cc2aa35ca",kE=`._container_1rlbk_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById($x)){var t=document.createElement("style");t.id=$x,t.textContent=fE,document.head.appendChild(t)}})();var Xv={container:"_container_1a2os_1",withTitle:"_withTitle_1a2os_13",panelTitle:"_panelTitle_1a2os_22",contentHolder:"_contentHolder_1a2os_27",dropWatcher:"_dropWatcher_1a2os_68",lastDropWatcher:"_lastDropWatcher_1a2os_76",firstDropWatcher:"_firstDropWatcher_1a2os_79",middleDropWatcher:"_middleDropWatcher_1a2os_90",onlyDropWatcher:"_onlyDropWatcher_1a2os_94",hoveringOverSwap:"_hoveringOverSwap_1a2os_99",availableToSwap:"_availableToSwap_1a2os_100",pulse:"_pulse_1a2os_1",emptyGridCard:"_emptyGridCard_1a2os_144",emptyMessage:"_emptyMessage_1a2os_161"};function Nt({containerRef:t,path:a,area:r}){let e=qx(),c=Kv.default.useCallback(({node:l,currentPath:o})=>o===void 0||!q9(l)?!1:Tt(o,a),[a]),n=Kv.default.useCallback(l=>{if(!("area"in l.node.uiArguments)){console.error("Invalid grid area swap drop",{dropInfo:l});return}let o=l.node.uiArguments.area??"__BAD_DROP__";e?.({type:"SWAP_ITEMS",item_a:r,item_b:o})},[r,e]);v6({watcherRef:t,getCanAcceptDrop:c,onDrop:n,canAcceptDropClass:Xv.availableToSwap,hoveringOverClass:Xv.hoveringOverSwap})}var Z0=V(b()),ME=({uiArguments:{area:t,item_gap:a,title:r},uiChildren:e,path:c,wrapperProps:n})=>{let l=Sc.default.useRef(null),o=e?.length??0;return Nt({containerRef:l,area:t,path:c}),(0,Z0.jsxs)(Et,{className:J1(k4.container,r?k4.withTitle:null),ref:l,style:{gridArea:t,"--item-gap":a},...n,children:[r?(0,Z0.jsx)(Sx,{className:k4.panelTitle,children:r}):null,(0,Z0.jsxs)("div",{className:k4.contentHolder,"data-alignment":"top",children:[(0,Z0.jsx)(Xx,{index:0,parentPath:c,numChildren:o}),o>0?e?.map((i,h)=>(0,Z0.jsxs)(Sc.default.Fragment,{children:[(0,Z0.jsx)(D0,{path:Z2(c,h),node:i}),(0,Z0.jsx)(Xx,{index:h+1,numChildren:e.length,parentPath:c})]},c.join(".")+h)):(0,Z0.jsx)(xE,{path:c})]})]})};function Xx({index:t,numChildren:a,parentPath:r}){let e=Sc.default.useRef(null);jx({watcherRef:e,positionInChildren:t,parentPath:r});let c=mE(t,a);return(0,Z0.jsx)("div",{ref:e,className:J1(k4.dropWatcher,c),role:"region","aria-label":"drop watcher"})}function mE(t,a){return t===0&&a===0?k4.onlyDropWatcher:t===0?k4.firstDropWatcher:t===a?k4.lastDropWatcher:k4.middleDropWatcher}function xE({path:t}){return(0,Z0.jsxs)("div",{className:k4.emptyGridCard,children:[(0,Z0.jsx)("span",{className:k4.emptyMessage,children:"Empty grid card"}),(0,Z0.jsx)(xc,{path:t,justIcon:!0,label:"Delete empty grid card"})]})}var Kx=ME;var Qx={title:"Grid Card",UiComponent:Kx,settingsInfo:{area:{label:"Name of grid area",inputType:"string",defaultValue:"default-area"},title:{inputType:"string",label:"Panel title",defaultValue:"My Card",optional:!0},item_gap:{inputType:"cssMeasure",label:"Gap size between contents",defaultValue:"10px",units:["px","rem"],optional:!0}},acceptsChildren:!0,iconSrc:Bx,category:"gridlayout",description:"The standard element for placing elements on the grid in a simple card container."};var Dt="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAACYElEQVR4nO3cMYoUQQBA0RqRPYBn8E5GhqYbLiZeYDNzs428k1dwU8M2UGFZFmYUf/d013vRTEFDBZ+qomj6tCzLgP/t1dYT4JiERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEVCWCSERUJYJIRFQlgkhEXi9dYT+Fd3X78tz4ZOm0xkJffv3m49hb9ixSIhrPNuxhifxxjfxxiPv3/fbDqjHdjtVrii+zHG7ZP/t2OMH2OMj9tMZx+sWOe9f2Hsw+qz2BlhnffmwjGeEBYJYZEQFglhkRAWCWF1pr5YdUHamfpi1YrVmfpiVVidqS9WZwpr6jPP2mY6Y0195lnbTCvW1Geetc0U1tRnnrXNFBYrEhYJYZEQFglhkRAWCWGREBYJYZEQFglhkRAWiZnCerxwbOvnDmGmsB5eGPtyhc8dwkwv+t2NXx9n+/Ne1sMY49MVPncIp2V5/mG8ffBFv+s201bIioRF4khnrH3u6Zfb1VZvxSIhLBLCIrHb6waumxWLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi4SwSAiLhLBICIuEsEgIi8RPaOk2ptnQzzIAAAAASUVORK5CYII=";var rH=V($());var Zt=V($());function Yx(t){return M2({tag:"svg",attr:{viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M16 14v1H0V0h1v14h15zM5 13H3V8h2v5zm4 0H7V3h2v10zm4 0h-2V6h2v7z"}}]})(t)}var Jx="7cea4fc03dcbdb904acc4e1a8504d71a06275de48c5f55dd7ea3305111993702",VE=`._container_1rlbk_1 { max-height: 100%; } @@ -445,7 +457,7 @@ div._emptyGridCard_1a2os_144 > button { ._plotPlaceholder_1rlbk_5 > svg { margin-inline: auto; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(bx)){var t=document.createElement("style");t.id=bx,t.textContent=kE,document.head.appendChild(t)}})();var Ev={container:"_container_1rlbk_1",plotPlaceholder:"_plotPlaceholder_1rlbk_5",label:"_label_1rlbk_19"};var _9=V(b());function xc({outputId:t}){let a=It.useRef(null),r=RE(a),e=r===null?100:Math.min(r.width,r.height);return(0,_9.jsxs)("div",{ref:a,className:Ev.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[(0,_9.jsx)(r6,{className:Ev.label,type:"output",name:t}),(0,_9.jsx)(Sx,{size:`calc(${e}px - 80px)`})]})}function RE(t){let[a,r]=It.useState(null);return It.useEffect(()=>{if(typeof ResizeObserver>"u")return;let e=new ResizeObserver(c=>{if(!t.current)return;let{offsetHeight:n,offsetWidth:l}=t.current;r({width:l,height:n})});return t.current&&e.observe(t.current),()=>e.disconnect()},[t]),a}var Fx="6cad05c4d8cdebef0197c5216067ae60393fdb99b191c522947f2dc28f7a0f65",IE=`._gridCardPlot_1a94v_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(Jx)){var t=document.createElement("style");t.id=Jx,t.textContent=VE,document.head.appendChild(t)}})();var Qv={container:"_container_1rlbk_1",plotPlaceholder:"_plotPlaceholder_1rlbk_5",label:"_label_1rlbk_19"};var $9=V(b());function bc({outputId:t}){let a=Zt.useRef(null),r=LE(a),e=r===null?100:Math.min(r.width,r.height);return(0,$9.jsxs)("div",{ref:a,className:Qv.plotPlaceholder,"aria-label":"shiny::plotOutput placeholder",children:[(0,$9.jsx)(o6,{className:Qv.label,type:"output",name:t}),(0,$9.jsx)(Yx,{size:`calc(${e}px - 80px)`})]})}function LE(t){let[a,r]=Zt.useState(null);return Zt.useEffect(()=>{if(typeof ResizeObserver>"u")return;let e=new ResizeObserver(c=>{if(!t.current)return;let{offsetHeight:n,offsetWidth:l}=t.current;r({width:l,height:n})});return t.current&&e.observe(t.current),()=>e.disconnect()},[t]),a}var tH="281ee09b518a396af33546da36a1a26bc50ba8d9902488afd238a97824196361",CE=`._gridCardPlot_1a94v_1 { background-color: var(--rstudio-white); width: 100%; height: 100%; @@ -457,7 +469,10 @@ div._emptyGridCard_1a2os_144 > button { ._gridCardPlot_1a94v_1 > h1 { font-size: 2rem; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Fx)){var t=document.createElement("style");t.id=Fx,t.textContent=IE,document.head.appendChild(t)}})();var Ox={gridCardPlot:"_gridCardPlot_1a94v_1"};var Pv=V(b()),EE=({uiArguments:{outputId:t,area:a},path:r,wrapperProps:e})=>{let c=kx.useRef(null);return kt({containerRef:c,area:a,path:r}),(0,Pv.jsx)(bt,{ref:c,style:{gridArea:a},className:N1(Ox.gridCardPlot,"gridlayout-gridCardPlot"),...e,children:(0,Pv.jsx)(xc,{outputId:t??a})})},Rx=EE;var Ix={title:"Grid Plot Card",UiComponent:Rx,settingsInfo:{area:{label:"Name of grid area",inputType:"string",defaultValue:"default-area"},outputId:{label:"Output ID",inputType:"string",defaultValue:t=>t&&"area"in t.uiArguments?t.uiArguments.area:"MyPlot",optional:!0}},acceptsChildren:!1,iconSrc:Rt,category:"gridlayout",description:"A wrapper for `shiny::plotOutput()` that uses `gridlayout`-friendly sizing defaults. \n For when you want to have a grid area filled entirely with a single plot."};var Ex="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=";var _x=V(X());var Px="317370e7a3816d3ee396e1f64d40861522c85c6089dc5e824fe134532d4ee013",TE=`._textPanel_525i2_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(tH)){var t=document.createElement("style");t.id=tH,t.textContent=CE,document.head.appendChild(t)}})();var aH={gridCardPlot:"_gridCardPlot_1a94v_1"};var Yv=V(b()),wE=({uiArguments:{outputId:t,area:a},path:r,wrapperProps:e})=>{let c=rH.useRef(null);return Nt({containerRef:c,area:a,path:r}),(0,Yv.jsx)(Et,{ref:c,style:{gridArea:a},className:J1(aH.gridCardPlot,"gridlayout-gridCardPlot"),...e,children:(0,Yv.jsx)(bc,{outputId:t??a})})},eH=wE;var cH={title:"Grid Plot Card",UiComponent:eH,settingsInfo:{area:{label:"Name of grid area",inputType:"string",defaultValue:"default-area"},outputId:{label:"Output ID",inputType:"string",defaultValue:t=>t&&"area"in t.uiArguments?t.uiArguments.area:"MyPlot",optional:!0}},serverBindings:{outputs:{outputIdKey:t=>t.outputId?"outputId":"area",renderScaffold:`renderPlot({ + #Plot code goes here + $0plot(rnorm(100)) +})`}},acceptsChildren:!1,iconSrc:Dt,category:"gridlayout",description:"A wrapper for `shiny::plotOutput()` that uses `gridlayout`-friendly sizing defaults. \n For when you want to have a grid area filled entirely with a single plot."};var nH="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFn0lEQVR4nO3b4VHjRgCG4c+ZNMCV4BtVwJVgSjiiCqACJZRgogqgAuUoAZcAFShHC5RAfnh9rBdJFsaf8TrvM5MZzvZJTvxmtVovk5eXFwG79ttnvwEcJ8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcHi989+A2NMJpNRr6uadibpPnn4rC6LxXvP2XGsy7osbt97HJeXl5fPfguDjm3E+j7yMZgdTVhV056oO6KL8Bz26GjC0jKqvoAu9vlGcHxhrdxJiudVhLVnRxFW1bRTSbPoobvwz8o0TMaxJ0cRltZHq+e6LFZhPUePM2rt0bGEFUdzJ0l1WTxrfdT6ziR+f7JYxxoSLnHT6KG75Oc4ugtJ1zs4519ajpKn0cMLSYu6LN59/HC8U729q936mJ9tcugLbdLwAmnVtDd6jeepLouvyfM/9Rrem+cHjvtmgVTSk6QbrYecepZ0PmZRtmrai3C8Mc7DJV4SC6RWHWtXdx0vi1fLPzKJP9UytKGopOWSx33VtIMLs+F/iLFRSdKPMLJlIeuwtByp4nlTV1jpY9tO4uO/dyvpW10Wk7osJpK+dZznJtytvlE17bzjfVxL+hod84ukq+Q181zubrO+FFZN+6DXec5jXRbfel53r/XliC9hct+r53vHwctcCCYeVW7rsrjccNxnLb/PfOw55qmkh+ihRV0WZ4f+uWU7YoX/4PHkuWu06ntum1FrFUDv3Kkuiyst52G/ztNxJ5qe+7IvqnDMR63fcMz6RsJDkm1YensHtSmsj65pXQ8FEEl3QPwaKTvmhIt4Qj4gPe9p56sOSM7LDXEci7osnvpeWJfFc9W08dLDtGra7yM/1JXBS2f8XpI/n+o1+nR+NGo7T3ifa/OBv//gUrhz4Y5r06Q9lb7Gsp2mY1Sb9vwsvR2JjkauI1YaxU24fX/XMaqmnQ6NdB/wpNeIhlb7Hec+CNmNWAP7rrax702A/5uvlLILS7v9Mtn1xXRfQGPnadnL8VK4tpNBy0XF0R9Ysqa1zSR+jDisocvddMPz2cpqxOpau3pPVKu/k/x5p6NWeI+xp56fpQyWDbaV24j1nrWrPneS5nodVWY7nsQPLSmkywszjdhtEe6Cf0QPnWu7f/e9yWrE0vro8rzNr3V17NOSxk3iN068w41F/B6f4uWHjnPPNn1ZHaQj28EvU2QTVsfa1Ud+xy8Na8yugfmI3QXplpqu0Sh93zcdl89fwnPxeQcXgw9FNmHp7Vxo60tBGOniD+dk5Mgxr5r2IQ2satpZuCmIj/HY9Quu4dxxcCeSHqqmncffAVZNexK+1H5IDpHFpr8sdjf8+c+/U0k/o4d6dzKMFeKYRw8t6rI4i57v2t0w1pOW22p6byySDYpjXa12kx7655bLiLWLSXsqPcamXQNjz7nQhqgkKWynuRx6TeI8py3KuYS1s8vgSpinpJP/oRFkETbgXfWc/1rLbTVnY5dA6rK43XDMhZaj1MSw1maVxaUQ+cllxEJmCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCgsV/EcmMRmtHHXoAAAAASUVORK5CYII=";var iH=V($());var lH="86ca68690332ab09635695545aa255d24b6e93bd22036a445e95d5399e73c68b",yE=`._textPanel_525i2_1 { background-color: var(--rstudio-white); /* outline: var(--outline); */ display: grid; @@ -471,8 +486,8 @@ div._emptyGridCard_1a2os_144 > button { ._textPanel_525i2_1 > h1 { font-size: 2rem; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Px)){var t=document.createElement("style");t.id=Px,t.textContent=TE,document.head.appendChild(t)}})();var Tx={textPanel:"_textPanel_525i2_1"};var Tv=V(b()),_E=({uiArguments:{content:t,area:a,alignment:r},path:e,wrapperProps:c})=>{let n=_x.useRef(null);return kt({containerRef:n,area:a,path:e}),(0,Tv.jsx)(bt,{ref:n,className:N1(Tx.textPanel,"gridlayout-textPanel"),style:{gridArea:a,justifyItems:r},...c,children:(0,Tv.jsx)("h1",{children:t})})},Dx=_E;var Nx={title:"Grid Text Card",UiComponent:Dx,settingsInfo:{content:{label:"Panel text",inputType:"string",defaultValue:"Text for card"},alignment:{label:"Text alignment",inputType:"radio",defaultValue:"start",choices:{start:{icon:V9,label:"left"},center:{icon:q6,label:"center"},end:{icon:L9,label:"right"}}},area:{label:"Name of grid area",inputType:"string",defaultValue:"default-area"},is_title:{label:"Use text as website title",inputType:"boolean",defaultValue:!1,optional:!0}},acceptsChildren:!1,iconSrc:Ex,category:"gridlayout",description:"A grid card that contains just text that is vertically centered within the panel. Useful for app titles or displaying text-based statistics."};var Hc="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEVklEQVR4nO3cwYpcRRiG4XeMjouYGzAuXGThyohG1GvQxQQSJVfgRhkUnOANCCYLh6ALvQBBQkxE9BqiKEZ3wixcZO4gm4xIu6geaE+PDMp8VZU67wNncc5ppqqrP7r++Q/0xmKxQDppj7WegMZksBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBTxeK2Bdr7aO+ryJrC1PF4Dnl5e25i8bvqTON5fv/8AuA/8AtwGvgEOJq/j2lvnppciqgXrCBeBa0Cddzq+p4DnlscVYA+4CnzdYjIttsJTwMeUN2yocs4Btyhrfar24C2+sT4CdhqMO1eHa3215qC1v7EusR6qA+AGpcY6w3r9wPLa6uH99ftnKGt4g/Xaaoey9tXUDNYm8Mnk2j7wCrAN3KUUoPp/HlDWcJuypvuT+7uUz6CKmsG6DDyzcn4AvAHcqziHubgHvA48XLl2Fniz1gRqBmtrcv45hirpV+CLybWtWoPXDNbLk/MvT/BvLyaHiukaX6g1cM3/Cp+dnFfb72fsLkcX+3EtH+msdYU1Dp8VKqLlI52T1OTrXv+uZrCOe5CqjCbr7laoCIOliFFqLLfZztQMlh92G7PrY2lgBksRo9RYbrOdsY81PvtYGofBUsQoNZbbbGfsY43PPpbGYbAUMUqN5TbbGftY47OPpXEYLEWMUmO5zXbGPtb47GNpHAZLEaPUWG6znbGPNT77WBqHwVLEKDVWD7+z3sv9LkoM+1jjs4+lcRgsRYxSYx33dT/3+9XZxxqffSyNw2ApYpQaq6dttqe5NGMfa3z2sTQOg6WIUWqsnrbZnubSjH2s8dnH0jgMliJGqbF62mZ7mksz9rHGZx9L4zBYihilxuppm+1pLs3YxxqffSyNw2ApYpQaq6dttqe5NGMfa3z2sTQOg6WIlsHabDi2wmoG63dKYXt4vHiCf3tjcrTU01xe5Z9r/ketgWsG67fJ+ZWKY8/VdI1/qjVwzWDdmZy/DZyvOP7cPE9Z41V3ag1eM1g3gfsr508C3wEvVJzDXJwHvqes8aF9ymdQRc1gHQDvT66dBX4AdoELwOmK8xnNacoa7gI/UtZ21XvAw1qTqd15vwlcBz5YubYJbC+PQz3/Yt6jcH/qOhW/raBNu+FD4NMG487VZ5Q1r6pFsP4C3gUuAXsNxp+LPeAy8A5lzatq+RD6FvAt5c1fBF6i1AVPNJzTo+xPSoH+M3CbsvUdtJrMxmJx3PYs/Xc+K1SEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVLE32A0lLomuWLgAAAAAElFTkSuQmCC";var Q6=D9;function D9(t){let a=t;var r={}.toString.call(t).slice(8,-1);if(r=="Set")return new Set([...t].map(c=>D9(c)));if(r=="Map")return new Map([...t].map(c=>[D9(c[0]),D9(c[1])]));if(r=="Date")return new Date(t.getTime());if(r=="RegExp")return RegExp(t.source,NE(t));if(r=="Array"||r=="Object"){a=Array.isArray(t)?[]:{};for(var e in t)a[e]=D9(t[e])}return a}function NE(t){if(typeof t.source.flags=="string")return t.source.flags;var a=[];return t.global&&a.push("g"),t.ignoreCase&&a.push("i"),t.multiline&&a.push("m"),t.sticky&&a.push("y"),t.unicode&&a.push("u"),a.join("")}function S4(t){let a=t.length,r=t[0].length;for(let e of t)if(e.length!==r)throw new Error("Inconsistant number of columns in matrix");return{numRows:a,numCols:r}}function Zx(t,{index:a,arr:r,dir:e}){let c=Q6(t);switch(e){case"rows":return H5(c,a,r);case"cols":return c.map((n,l)=>H5(n,a,r[l]))}}function Gx(t,{index:a,dir:r}){let e=Q6(t);switch(r){case"rows":return I9(e,a);case"cols":return e.map((c,n)=>I9(c,a))}}var Z2=".";function Et(t){let a=new Map;return ZE(t).forEach(({itemRows:r,itemCols:e},c)=>{if(c===Z2)return;let n=Av(r),l=Av(e);a.set(c,{colStart:l.minVal,rowStart:n.minVal,colSpan:l.span+1,rowSpan:n.span+1,isValid:n.isSequence&&l.isSequence})}),a}function ZE(t){let a=new Map,{numRows:r,numCols:e}=S4(t);for(let c=0;c=e-1&&i=c-1&&v{let n=e==="rows"?"cols":"rows",l=Wx(c);if(a>l[e].length)throw new Error(`Can't add a tract after index ${a}. Not enought tracts.`);if(a<0)throw new Error("Cant add a tract at a negative index");let o=Et(c.areas),i=a6(Z2,l[n].length);o.forEach((h,v)=>{let{itemStart:d,itemEnd:u}=N9(h,e);if(d<=a&&u>a){let g=N9(h,n);for(let p=g.itemStart-1;p{for(let c of r)GE(e,c)})}function jx(t,a){return Dv(t,a)}function G9(t,a,r=!1){let{dir:e,index:c}=a,n=a.index-1;if(!r){let i=Nv(t.areas,a);if(i.length!==0)throw new Error(`Can't remove ${e==="rows"?"row":"col"} ${c} as items ${Jm(i)} are entirely contained within it.`)}let l={areas:Gx(t.areas,{index:n,dir:e})},o=e==="rows"?"row_sizes":"col_sizes";return UE(t[o])&&(l[o]=I9(t[o],n)),{...t,...l}}function Nv(t,a){let r=Et(t);return WE(r,a)}function UE(t){return Array.isArray(t)&&t.length>1}function WE(t,{index:a,dir:r}){let e=[];return t.forEach((c,n)=>{let l=N9(c,r);if(!l)return;let{itemStart:o,itemEnd:i}=l;o===a&&o===i&&e.push(n)}),e}function qx(t,a,r){return p0(t,({areas:e})=>{let{numRows:c,numCols:n}=S4(e);for(let l=0;l{let n=r==="rows"?"row_sizes":"col_sizes";c[n][a-1]=e})}function jE(t,{item_a:a,item_b:r}){return a===r?t:p0(t,e=>{let{n_rows:c,n_cols:n}=qE(e.areas),l=!1,o=!1;for(let i=0;i{d!==Z2&&l.add(d)});let v=h.length;if(c===-1&&(c=v),c!==v)throw new Error("Invalid layout definition. Not consistant number of columns in every row")}if(!r)r=a6("1fr",c);else if(r.length!==c)throw new Error("Column sizes vector doesn't match layout definition.");if(!a)a=a6("1fr",n);else if(a.length!==n)throw new Error("Row sizes vector doesn't match layout definition.");return{uniqueAreas:[...l],areas:o,col_sizes:r,row_sizes:a,gap_size:e??"12px"}}function XE(t){let a=[];for(let r of t)a.push(r.trim().split(/\s+/));return a}function Vc({areas:t,...a}){return{layout:$E(t),...a}}function Kx({layout:t,...a}){return{areas:XE(t),...a}}function $E(t){let{numCols:a}=S4(t),r=[],e=a6(-1,a);for(let c of t)for(let n=0;nn+l.padEnd(e[o]," ")+(o{if("area"in r.uiArguments&&r.uiArguments.area!==void 0){let e=r.uiArguments.area;a.push(e)}}),a}var QE=["gridlayout::grid_page","gridlayout::grid_container"];function Jx(t){return QE.includes(t.uiName)}function Cc(t,{path:a,node:r}){let e=tH({tree:t,pathToGridItem:a});if(e===null)return;let{gridPageNode:c}=e,n=Yx(c.uiChildren)[Qx(a)],l=r.uiArguments.area??Z2;n!==l&&(c.uiArguments=U9(c.uiArguments,{type:"RENAME_ITEM",oldName:n,newName:l}))}function wc(t,{path:a}){let r=tH({tree:t,pathToGridItem:a});if(r===null)return;let{gridPageNode:e,gridItemNode:c}=r,n=c.uiArguments.area;if(!n){console.error("Deleted node appears to not have a grid area, ignoring");return}e.uiArguments=U9(e.uiArguments,{type:"REMOVE_ITEM",name:n})}function tH({tree:t,pathToGridItem:a}){if(a.length===0)return null;let r=f0(t,a.slice(0,-1));if(!Jx(r))return null;let e=r.uiChildren[a[a.length-1]];return"area"in e.uiArguments?{gridPageNode:r,gridItemNode:e}:null}var En=V(X());function YE(t,a){let{numRows:r,numCols:e}=S4(t),c=[];for(let n=0;n1,v=e>1,d=[];return(cH({colRange:i,rowIndex:t-1,layoutAreas:c})||h)&&d.push("up"),(cH({colRange:i,rowIndex:n+1,layoutAreas:c})||h)&&d.push("down"),(nH({rowRange:o,colIndex:r-1,layoutAreas:c})||v)&&d.push("left"),(nH({rowRange:o,colIndex:l+1,layoutAreas:c})||v)&&d.push("right"),d}function cH({colRange:t,rowIndex:a,layoutAreas:r}){return a<1||a>r.length?!1:t.every(e=>r[a-1][e-1]===Z2)}function nH({rowRange:t,colIndex:a,layoutAreas:r}){return a<1||a>r[0].length?!1:t.every(e=>r[e-1][a-1]===Z2)}var oH="36427ecd5ad2cc0bca44064f565c65c1d0aae3bac9dd3c7f6a50e07daeaacefe",JE=`._marker_mumaw_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(lH)){var t=document.createElement("style");t.id=lH,t.textContent=yE,document.head.appendChild(t)}})();var oH={textPanel:"_textPanel_525i2_1"};var Jv=V(b()),AE=({uiArguments:{content:t,area:a,alignment:r},path:e,wrapperProps:c})=>{let n=iH.useRef(null);return Nt({containerRef:n,area:a,path:e}),(0,Jv.jsx)(Et,{ref:n,className:J1(oH.textPanel,"gridlayout-textPanel"),style:{gridArea:a,justifyItems:r},...c,children:(0,Jv.jsx)("h1",{children:t})})},hH=AE;var vH={title:"Grid Text Card",UiComponent:hH,settingsInfo:{content:{label:"Panel text",inputType:"string",defaultValue:"Text for card"},alignment:{label:"Text alignment",inputType:"radio",defaultValue:"start",choices:{start:{icon:F9,label:"left"},center:{icon:Y6,label:"center"},end:{icon:O9,label:"right"}}},area:{label:"Name of grid area",inputType:"string",defaultValue:"default-area"},is_title:{label:"Use text as website title",inputType:"boolean",defaultValue:!1,optional:!0}},acceptsChildren:!1,iconSrc:nH,category:"gridlayout",description:"A grid card that contains just text that is vertically centered within the panel. Useful for app titles or displaying text-based statistics."};var Fc="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEVklEQVR4nO3cwYpcRRiG4XeMjouYGzAuXGThyohG1GvQxQQSJVfgRhkUnOANCCYLh6ALvQBBQkxE9BqiKEZ3wixcZO4gm4xIu6geaE+PDMp8VZU67wNncc5ppqqrP7r++Q/0xmKxQDppj7WegMZksBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBRhsBTxeK2Bdr7aO+ryJrC1PF4Dnl5e25i8bvqTON5fv/8AuA/8AtwGvgEOJq/j2lvnppciqgXrCBeBa0Cddzq+p4DnlscVYA+4CnzdYjIttsJTwMeUN2yocs4Btyhrfar24C2+sT4CdhqMO1eHa3215qC1v7EusR6qA+AGpcY6w3r9wPLa6uH99ftnKGt4g/Xaaoey9tXUDNYm8Mnk2j7wCrAN3KUUoPp/HlDWcJuypvuT+7uUz6CKmsG6DDyzcn4AvAHcqziHubgHvA48XLl2Fniz1gRqBmtrcv45hirpV+CLybWtWoPXDNbLk/MvT/BvLyaHiukaX6g1cM3/Cp+dnFfb72fsLkcX+3EtH+msdYU1Dp8VKqLlI52T1OTrXv+uZrCOe5CqjCbr7laoCIOliFFqLLfZztQMlh92G7PrY2lgBksRo9RYbrOdsY81PvtYGofBUsQoNZbbbGfsY43PPpbGYbAUMUqN5TbbGftY47OPpXEYLEWMUmO5zXbGPtb47GNpHAZLEaPUWG6znbGPNT77WBqHwVLEKDVWD7+z3sv9LkoM+1jjs4+lcRgsRYxSYx33dT/3+9XZxxqffSyNw2ApYpQaq6dttqe5NGMfa3z2sTQOg6WIUWqsnrbZnubSjH2s8dnH0jgMliJGqbF62mZ7mksz9rHGZx9L4zBYihilxuppm+1pLs3YxxqffSyNw2ApYpQaq6dttqe5NGMfa3z2sTQOg6WIlsHabDi2wmoG63dKYXt4vHiCf3tjcrTU01xe5Z9r/ketgWsG67fJ+ZWKY8/VdI1/qjVwzWDdmZy/DZyvOP7cPE9Z41V3ag1eM1g3gfsr508C3wEvVJzDXJwHvqes8aF9ymdQRc1gHQDvT66dBX4AdoELwOmK8xnNacoa7gI/UtZ21XvAw1qTqd15vwlcBz5YubYJbC+PQz3/Yt6jcH/qOhW/raBNu+FD4NMG487VZ5Q1r6pFsP4C3gUuAXsNxp+LPeAy8A5lzatq+RD6FvAt5c1fBF6i1AVPNJzTo+xPSoH+M3CbsvUdtJrMxmJx3PYs/Xc+K1SEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVKEwVLE32A0lLomuWLgAAAAAElFTkSuQmCC";var r8=X9;function X9(t){let a=t;var r={}.toString.call(t).slice(8,-1);if(r=="Set")return new Set([...t].map(c=>X9(c)));if(r=="Map")return new Map([...t].map(c=>[X9(c[0]),X9(c[1])]));if(r=="Date")return new Date(t.getTime());if(r=="RegExp")return RegExp(t.source,bE(t));if(r=="Array"||r=="Object"){a=Array.isArray(t)?[]:{};for(var e in t)a[e]=X9(t[e])}return a}function bE(t){if(typeof t.source.flags=="string")return t.source.flags;var a=[];return t.global&&a.push("g"),t.ignoreCase&&a.push("i"),t.multiline&&a.push("m"),t.sticky&&a.push("y"),t.unicode&&a.push("u"),a.join("")}function _4(t){let a=t.length,r=t[0].length;for(let e of t)if(e.length!==r)throw new Error("Inconsistant number of columns in matrix");return{numRows:a,numCols:r}}function dH(t,{index:a,arr:r,dir:e}){let c=r8(t);switch(e){case"rows":return S5(c,a,r);case"cols":return c.map((n,l)=>S5(n,a,r[l]))}}function uH(t,{index:a,dir:r}){let e=r8(t);switch(r){case"rows":return U9(e,a);case"cols":return e.map((c,n)=>U9(c,a))}}var G2=".";function Gt(t){let a=new Map;return FE(t).forEach(({itemRows:r,itemCols:e},c)=>{if(c===G2)return;let n=Gv(r),l=Gv(e);a.set(c,{colStart:l.minVal,rowStart:n.minVal,colSpan:l.span+1,rowSpan:n.span+1,isValid:n.isSequence&&l.isSequence})}),a}function FE(t){let a=new Map,{numRows:r,numCols:e}=_4(t);for(let c=0;c=e-1&&i=c-1&&v{let n=e==="rows"?"cols":"rows",l=gH(c);if(a>l[e].length)throw new Error(`Can't add a tract after index ${a}. Not enought tracts.`);if(a<0)throw new Error("Cant add a tract at a negative index");let o=Gt(c.areas),i=l6(G2,l[n].length);o.forEach((h,v)=>{let{itemStart:d,itemEnd:u}=K9(h,e);if(d<=a&&u>a){let g=K9(h,n);for(let p=g.itemStart-1;p{for(let c of r)OE(e,c)})}function pH(t,a){return ad(t,a)}function Y9(t,a,r=!1){let{dir:e,index:c}=a,n=a.index-1;if(!r){let i=rd(t.areas,a);if(i.length!==0)throw new Error(`Can't remove ${e==="rows"?"row":"col"} ${c} as items ${Vx(i)} are entirely contained within it.`)}let l={areas:uH(t.areas,{index:n,dir:e})},o=e==="rows"?"row_sizes":"col_sizes";return kE(t[o])&&(l[o]=U9(t[o],n)),{...t,...l}}function rd(t,a){let r=Gt(t);return _E(r,a)}function kE(t){return Array.isArray(t)&&t.length>1}function _E(t,{index:a,dir:r}){let e=[];return t.forEach((c,n)=>{let l=K9(c,r);if(!l)return;let{itemStart:o,itemEnd:i}=l;o===a&&o===i&&e.push(n)}),e}function zH(t,a,r){return f0(t,({areas:e})=>{let{numRows:c,numCols:n}=_4(e);for(let l=0;l{let n=r==="rows"?"row_sizes":"col_sizes";c[n][a-1]=e})}function RE(t,{item_a:a,item_b:r}){return a===r?t:f0(t,e=>{let{n_rows:c,n_cols:n}=IE(e.areas),l=!1,o=!1;for(let i=0;i{d!==G2&&l.add(d)});let v=h.length;if(c===-1&&(c=v),c!==v)throw new Error("Invalid layout definition. Not consistant number of columns in every row")}if(!r)r=l6("1fr",c);else if(r.length!==c)throw new Error("Column sizes vector doesn't match layout definition.");if(!a)a=l6("1fr",n);else if(a.length!==n)throw new Error("Row sizes vector doesn't match layout definition.");return{uniqueAreas:[...l],areas:o,col_sizes:r,row_sizes:a,gap_size:e??"12px"}}function EE(t){let a=[];for(let r of t)a.push(r.trim().split(/\s+/));return a}function Oc({areas:t,...a}){return{layout:PE(t),...a}}function mH({layout:t,...a}){return{areas:EE(t),...a}}function PE(t){let{numCols:a}=_4(t),r=[],e=l6(-1,a);for(let c of t)for(let n=0;nn+l.padEnd(e[o]," ")+(o{if("area"in r.uiArguments&&r.uiArguments.area!==void 0){let e=r.uiArguments.area;a.push(e)}}),a}var NE=["gridlayout::grid_page","gridlayout::grid_container"];function VH(t){return NE.includes(t.uiName)}function _c(t,{path:a,node:r}){let e=LH({tree:t,pathToGridItem:a});if(e===null)return;let{gridPageNode:c}=e,n=HH(c.uiChildren)[xH(a)],l=r.uiArguments.area??G2;n!==l&&(c.uiArguments=J9(c.uiArguments,{type:"RENAME_ITEM",oldName:n,newName:l}))}function Rc(t,{path:a}){let r=LH({tree:t,pathToGridItem:a});if(r===null)return;let{gridPageNode:e,gridItemNode:c}=r,n=c.uiArguments.area;if(!n){console.error("Deleted node appears to not have a grid area, ignoring");return}e.uiArguments=J9(e.uiArguments,{type:"REMOVE_ITEM",name:n})}function LH({tree:t,pathToGridItem:a}){if(a.length===0)return null;let r=m0(t,a.slice(0,-1));if(!VH(r))return null;let e=r.uiChildren[a[a.length-1]];return"area"in e.uiArguments?{gridPageNode:r,gridItemNode:e}:null}var jn=V($());function DE(t,a){let{numRows:r,numCols:e}=_4(t),c=[];for(let n=0;n1,v=e>1,d=[];return(yH({colRange:i,rowIndex:t-1,layoutAreas:c})||h)&&d.push("up"),(yH({colRange:i,rowIndex:n+1,layoutAreas:c})||h)&&d.push("down"),(AH({rowRange:o,colIndex:r-1,layoutAreas:c})||v)&&d.push("left"),(AH({rowRange:o,colIndex:l+1,layoutAreas:c})||v)&&d.push("right"),d}function yH({colRange:t,rowIndex:a,layoutAreas:r}){return a<1||a>r.length?!1:t.every(e=>r[a-1][e-1]===G2)}function AH({rowRange:t,colIndex:a,layoutAreas:r}){return a<1||a>r[0].length?!1:t.every(e=>r[e-1][a-1]===G2)}var bH="60f995c98ad490f782b5ef201a79498ca7928ac7699d07e0f90ae4269cf66e99",ZE=`._marker_mumaw_1 { font-weight: lighter; font-style: italic; padding: 2px; @@ -559,7 +574,7 @@ div._emptyGridCard_1a2os_144 > button { ._dragger_mumaw_32.left { left: 0; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(oH)){var t=document.createElement("style");t.id=oH,t.textContent=JE,document.head.appendChild(t)}})();var Wv={marker:"_marker_mumaw_1",dragger:"_dragger_mumaw_32",move:"_move_mumaw_52"};var j9=V(X());function Y6({rowStart:t,rowSpan:a,colStart:r,colSpan:e}){return{rowStart:t,rowEnd:t+a-1,colStart:r,colEnd:r+e-1}}function iH(t,a){return typeof t>"u"&&typeof a>"u"?!0:typeof t>"u"||typeof a>"u"?!1:("colSpan"in t&&(t=Y6(t)),"colSpan"in a&&(a=Y6(a)),t.colStart===a.colStart&&t.colEnd===a.colEnd&&t.rowStart===a.rowStart&&t.rowEnd===a.rowEnd)}function hH({row:t,col:a}){return`row${t}-col${a}`}function jv({dragDirection:t,gridLocation:a,layoutAreas:r}){let{rowStart:e,rowEnd:c,colStart:n,colEnd:l}=Y6(a),o=r.length,i=r[0].length,h,v,d;switch(t){case"up":if(e===1)return{shrinkExtent:c,growExtent:1};h=e-1,v=1,d=c;break;case"left":if(n===1)return{shrinkExtent:l,growExtent:1};h=n-1,v=1,d=l;break;case"down":if(c===o)return{shrinkExtent:e,growExtent:o};h=c+1,v=o,d=e;break;case"right":if(l===i)return{shrinkExtent:n,growExtent:i};h=l+1,v=i,d=n;break}let u=t==="up"||t==="down",s=t==="left"||t==="up",[g,p]=u?[n,l]:[e,c],L=(H,w)=>{let[A,C]=u?[H,w]:[w,H];return r[A-1][C-1]!==Z2},f=St(g,p),m=St(h,v);for(let H of m)for(let w of f)if(L(H,w))return{shrinkExtent:d,growExtent:H+(s?1:-1)};return{shrinkExtent:d,growExtent:v}}function qv(t,a,r){let e=a=e&&t<=c}function vH({dir:t,gridContainerStyles:a,gridContainerBoundingRect:r}){let e=Xv(a.getPropertyValue("gap")),n=Xv(a.getPropertyValue("padding"))+e/2,l=r[t==="rows"?"y":"x"],o=tP(a,t),i=o.length,h=[];for(let v=0;vqv(n,i,h));if(l===void 0)return;let o=rP[r];return c[o]=l.index,c}var rP={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function sH({overlayRef:t,gridLocation:a,layoutAreas:r,onDragEnd:e}){let c=Y6(a),n=j9.default.useRef(null),l=j9.default.useCallback(h=>{let v=t.current,d=n.current;if(!v||!d)throw new Error("For some reason we are observing dragging when we shouldn't");let u=aP({mousePos:h,dragState:d});u&&uH(v,u)},[t]),o=j9.default.useCallback(()=>{let h=t.current,v=n.current;if(!h||!v)return;let d=v.gridItemExtent;iH(d,c)||e(d),h.classList.remove("dragging"),document.removeEventListener("mousemove",l),dH("on")},[c,l,e,t]);return j9.default.useCallback(h=>{let v=t.current;if(!v)return;let d=v.parentElement;if(!d)return;let u=getComputedStyle(v.parentElement),s=d.getBoundingClientRect(),g=h==="down"||h==="up"?"rows":"cols",{shrinkExtent:p,growExtent:L}=jv({dragDirection:h,gridLocation:a,layoutAreas:r});n.current={dragHandle:h,gridItemExtent:Y6(a),tractExtents:vH({dir:g,gridContainerStyles:u,gridContainerBoundingRect:s}).filter(({index:f})=>qv(f,p,L))},uH(t.current,n.current.gridItemExtent),v.classList.add("dragging"),document.addEventListener("mousemove",l),document.addEventListener("mouseup",o,{once:!0}),dH("off")},[o,a,r,l,t])}function dH(t){let a=document.querySelector("body")?.classList;t==="off"?a?.add("disable-text-selection"):a?.remove("disable-text-selection")}function uH(t,{rowStart:a,rowEnd:r,colStart:e,colEnd:c}){t.style.setProperty("--drag-grid-row-start",String(a)),t.style.setProperty("--drag-grid-row-end",String(r+1)),t.style.setProperty("--drag-grid-column-start",String(e)),t.style.setProperty("--drag-grid-column-end",String(c+1))}var J6=V(b());function pH({area:t,gridLocation:a,areas:r,onNewPos:e}){if(typeof a>"u")throw new Error(`Item in ${t} is not in the location map`);let c=q9.default.useRef(null),n=sH({overlayRef:c,gridLocation:a,layoutAreas:r,onDragEnd:e}),l=q9.default.useMemo(()=>lH({gridLocation:a,layoutAreas:r}),[a,r]),o=q9.default.useMemo(()=>{let i=[];for(let h of l)i.push((0,J6.jsx)("div",{className:N1(Wv.dragger,h),title:`resize ${t} ${h}`,onMouseDown:v=>{gH(v),n(h)},children:eP[h]},h));return i},[t,l,n]);return q9.default.useEffect(()=>{c.current?.style.setProperty("--grid-area",t)},[t]),(0,J6.jsx)("div",{ref:c,onClick:gH,className:Wv.marker+" grid-area-overlay",children:o})}function gH(t){t.preventDefault(),t.stopPropagation()}var eP={up:(0,J6.jsx)(Uv,{}),down:(0,J6.jsx)(Uv,{}),left:(0,J6.jsx)(Gv,{}),right:(0,J6.jsx)(Gv,{})};var Kt=V(X());var zH="d06469845999a16239f9147720e01d1b0533f90eb9c7030455d2c7f75c2a909d",cP=`._ResizableGrid_i4cq9_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(bH)){var t=document.createElement("style");t.id=bH,t.textContent=ZE,document.head.appendChild(t)}})();var ld={marker:"_marker_mumaw_1",dragger:"_dragger_mumaw_32",move:"_move_mumaw_52"};var aa=V($());function e8({rowStart:t,rowSpan:a,colStart:r,colSpan:e}){return{rowStart:t,rowEnd:t+a-1,colStart:r,colEnd:r+e-1}}function FH(t,a){return typeof t>"u"&&typeof a>"u"?!0:typeof t>"u"||typeof a>"u"?!1:("colSpan"in t&&(t=e8(t)),"colSpan"in a&&(a=e8(a)),t.colStart===a.colStart&&t.colEnd===a.colEnd&&t.rowStart===a.rowStart&&t.rowEnd===a.rowEnd)}function OH({row:t,col:a}){return`row${t}-col${a}`}function od({dragDirection:t,gridLocation:a,layoutAreas:r}){let{rowStart:e,rowEnd:c,colStart:n,colEnd:l}=e8(a),o=r.length,i=r[0].length,h,v,d;switch(t){case"up":if(e===1)return{shrinkExtent:c,growExtent:1};h=e-1,v=1,d=c;break;case"left":if(n===1)return{shrinkExtent:l,growExtent:1};h=n-1,v=1,d=l;break;case"down":if(c===o)return{shrinkExtent:e,growExtent:o};h=c+1,v=o,d=e;break;case"right":if(l===i)return{shrinkExtent:n,growExtent:i};h=l+1,v=i,d=n;break}let u=t==="up"||t==="down",s=t==="left"||t==="up",[g,p]=u?[n,l]:[e,c],L=(H,w)=>{let[A,C]=u?[H,w]:[w,H];return r[A-1][C-1]!==G2},f=It(g,p),m=It(h,v);for(let H of m)for(let w of f)if(L(H,w))return{shrinkExtent:d,growExtent:H+(s?1:-1)};return{shrinkExtent:d,growExtent:v}}function id(t,a,r){let e=a=e&&t<=c}function kH({dir:t,gridContainerStyles:a,gridContainerBoundingRect:r}){let e=hd(a.getPropertyValue("gap")),n=hd(a.getPropertyValue("padding"))+e/2,l=r[t==="rows"?"y":"x"],o=GE(a,t),i=o.length,h=[];for(let v=0;vid(n,i,h));if(l===void 0)return;let o=WE[r];return c[o]=l.index,c}var WE={right:"colEnd",left:"colStart",up:"rowStart",down:"rowEnd"};function IH({overlayRef:t,gridLocation:a,layoutAreas:r,onDragEnd:e}){let c=e8(a),n=aa.default.useRef(null),l=aa.default.useCallback(h=>{let v=t.current,d=n.current;if(!v||!d)throw new Error("For some reason we are observing dragging when we shouldn't");let u=UE({mousePos:h,dragState:d});u&&RH(v,u)},[t]),o=aa.default.useCallback(()=>{let h=t.current,v=n.current;if(!h||!v)return;let d=v.gridItemExtent;FH(d,c)||e(d),h.classList.remove("dragging"),document.removeEventListener("mousemove",l),_H("on")},[c,l,e,t]);return aa.default.useCallback(h=>{let v=t.current;if(!v)return;let d=v.parentElement;if(!d)return;let u=getComputedStyle(v.parentElement),s=d.getBoundingClientRect(),g=h==="down"||h==="up"?"rows":"cols",{shrinkExtent:p,growExtent:L}=od({dragDirection:h,gridLocation:a,layoutAreas:r});n.current={dragHandle:h,gridItemExtent:e8(a),tractExtents:kH({dir:g,gridContainerStyles:u,gridContainerBoundingRect:s}).filter(({index:f})=>id(f,p,L))},RH(t.current,n.current.gridItemExtent),v.classList.add("dragging"),document.addEventListener("mousemove",l),document.addEventListener("mouseup",o,{once:!0}),_H("off")},[o,a,r,l,t])}function _H(t){let a=document.querySelector("body")?.classList;t==="off"?a?.add("disable-text-selection"):a?.remove("disable-text-selection")}function RH(t,{rowStart:a,rowEnd:r,colStart:e,colEnd:c}){t.style.setProperty("--drag-grid-row-start",String(a)),t.style.setProperty("--drag-grid-row-end",String(r+1)),t.style.setProperty("--drag-grid-column-start",String(e)),t.style.setProperty("--drag-grid-column-end",String(c+1))}var c8=V(b());function PH({area:t,gridLocation:a,areas:r,onNewPos:e}){if(typeof a>"u")throw new Error(`Item in ${t} is not in the location map`);let c=ra.default.useRef(null),n=IH({overlayRef:c,gridLocation:a,layoutAreas:r,onDragEnd:e}),l=ra.default.useMemo(()=>SH({gridLocation:a,layoutAreas:r}),[a,r]),o=ra.default.useMemo(()=>{let i=[];for(let h of l)i.push((0,c8.jsx)("div",{className:J1(ld.dragger,h),title:`resize ${t} ${h}`,onMouseDown:v=>{EH(v),n(h)},children:jE[h]},h));return i},[t,l,n]);return ra.default.useEffect(()=>{c.current?.style.setProperty("--grid-area",t)},[t]),(0,c8.jsx)("div",{ref:c,onClick:EH,className:ld.marker+" grid-area-overlay",children:o})}function EH(t){t.preventDefault(),t.stopPropagation()}var jE={up:(0,c8.jsx)(nd,{}),down:(0,c8.jsx)(nd,{}),left:(0,c8.jsx)(cd,{}),right:(0,c8.jsx)(cd,{})};var e7=V($());var TH="6cdeda9e7222d7ca12fbe162663d0b038383359903bc46ff51a5f09d5f067096",qE=`._ResizableGrid_i4cq9_1 { --grid-gap: 5px; --grid-pad: var(--pad, 10px); @@ -592,19 +607,19 @@ div#_size-detection-cell_i4cq9_1 { grid-row: 1/-1; grid-column: 1/-1; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(zH)){var t=document.createElement("style");t.id=zH,t.textContent=cP,document.head.appendChild(t)}})();var fH={ResizableGrid:"_ResizableGrid_i4cq9_1",resizableGrid:"_ResizableGrid_i4cq9_1","size-detection-cell":"_size-detection-cell_i4cq9_1",sizeDetectionCell:"_size-detection-cell_i4cq9_1"};var LC=V(X());var nP=/(^[\d|.]+)\s*(px|%|rem|fr)|(^auto$)/;function MH(t){return nP.test(t)}var lP=/(px|%|rem|fr|auto)/g,oP=/^[\d|.]*/g;function Tt(t){let a=t.match(lP)?.[0]||"px",r=t.match(oP)?.[0],e=r?Number(r):null;if(a==="auto"){if(e!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(e===null)throw new Error("You must have a count for non-auto units.");if(a==="fr"&&e<0)throw new Error(`Can't have a negative count with ${a} units.`);return{count:e,unit:a}}function _t(t){return t.unit==="auto"?"auto":`${t.count}${t.unit}`}var eC=V(X());var g8=V(X());var mH=["http","https","mailto","tel"];function xH(t){let a=(t||"").trim(),r=a.charAt(0);if(r==="#"||r==="/")return a;let e=a.indexOf(":");if(e===-1)return a;let c=-1;for(;++cc||(c=a.indexOf("#"),c!==-1&&e>c)?a:"javascript:void(0)"}var vn=V(X(),1);var yH=V(Bc(),1);function e3(t){return!t||typeof t!="object"?"":"position"in t||"type"in t?VH(t.position):"start"in t||"end"in t?VH(t):"line"in t||"column"in t?$v(t):""}function $v(t){return LH(t&&t.line)+":"+LH(t&&t.column)}function VH(t){return $v(t&&t.start)+"-"+$v(t&&t.end)}function LH(t){return t&&typeof t=="number"?t:1}var w0=class extends Error{constructor(a,r,e){let c=[null,null],n={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof r=="string"&&(e=r,r=void 0),typeof e=="string"){let l=e.indexOf(":");l===-1?c[1]=e:(c[0]=e.slice(0,l),c[1]=e.slice(l+1))}r&&("type"in r||"position"in r?r.position&&(n=r.position):"start"in r||"end"in r?n=r:("line"in r||"column"in r)&&(n.start=r)),this.name=e3(r)||"1:1",this.message=typeof a=="object"?a.message:a,this.stack="",typeof a=="object"&&a.stack&&(this.stack=a.stack),this.reason=this.message,this.fatal,this.line=n.start.line,this.column=n.start.column,this.position=n,this.source=c[0],this.ruleId=c[1],this.file,this.actual,this.expected,this.url,this.note}};w0.prototype.file="";w0.prototype.name="";w0.prototype.reason="";w0.prototype.message="";w0.prototype.stack="";w0.prototype.fatal=null;w0.prototype.column=null;w0.prototype.line=null;w0.prototype.source=null;w0.prototype.ruleId=null;w0.prototype.position=null;var e5={basename:iP,dirname:hP,extname:vP,join:dP,sep:"/"};function iP(t,a){if(a!==void 0&&typeof a!="string")throw new TypeError('"ext" argument must be a string');X9(t);let r=0,e=-1,c=t.length,n;if(a===void 0||a.length===0||a.length>t.length){for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else e<0&&(n=!0,e=c+1);return e<0?"":t.slice(r,e)}if(a===t)return"";let l=-1,o=a.length-1;for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else l<0&&(n=!0,l=c+1),o>-1&&(t.charCodeAt(c)===a.charCodeAt(o--)?o<0&&(e=c):(o=-1,e=l));return r===e?e=l:e<0&&(e=t.length),t.slice(r,e)}function hP(t){if(X9(t),t.length===0)return".";let a=-1,r=t.length,e;for(;--r;)if(t.charCodeAt(r)===47){if(e){a=r;break}}else e||(e=!0);return a<0?t.charCodeAt(0)===47?"/":".":a===1&&t.charCodeAt(0)===47?"//":t.slice(0,a)}function vP(t){X9(t);let a=t.length,r=-1,e=0,c=-1,n=0,l;for(;a--;){let o=t.charCodeAt(a);if(o===47){if(l){e=a+1;break}continue}r<0&&(l=!0,r=a+1),o===46?c<0?c=a:n!==1&&(n=1):c>-1&&(n=-1)}return c<0||r<0||n===0||n===1&&c===r-1&&c===e+1?"":t.slice(c,r)}function dP(...t){let a=-1,r;for(;++a0&&t.charCodeAt(t.length-1)===47&&(r+="/"),a?"/"+r:r}function sP(t,a){let r="",e=0,c=-1,n=0,l=-1,o,i;for(;++l<=t.length;){if(l2){if(i=r.lastIndexOf("/"),i!==r.length-1){i<0?(r="",e=0):(r=r.slice(0,i),e=r.length-1-r.lastIndexOf("/")),c=l,n=0;continue}}else if(r.length>0){r="",e=0,c=l,n=0;continue}}a&&(r=r.length>0?r+"/..":"..",e=2)}else r.length>0?r+="/"+t.slice(c+1,l):r=t.slice(c+1,l),e=l-c-1;c=l,n=0}else o===46&&n>-1?n++:n=-1}return r}function X9(t){if(typeof t!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(t))}var CH={cwd:gP};function gP(){return"/"}function Dt(t){return t!==null&&typeof t=="object"&&t.href&&t.origin}function wH(t){if(typeof t=="string")t=new URL(t);else if(!Dt(t)){let a=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+t+"`");throw a.code="ERR_INVALID_ARG_TYPE",a}if(t.protocol!=="file:"){let a=new TypeError("The URL must be of scheme file");throw a.code="ERR_INVALID_URL_SCHEME",a}return pP(t)}function pP(t){if(t.hostname!==""){let e=new TypeError('File URL host must be "localhost" or empty on darwin');throw e.code="ERR_INVALID_FILE_URL_HOST",e}let a=t.pathname,r=-1;for(;++rl.length,i;o&&l.push(c);try{i=t.apply(this,l)}catch(h){let v=h;if(o&&r)throw v;return c(v)}o||(i instanceof Promise?i.then(n,c):i instanceof Error?c(i):n(i))}function c(l,...o){r||(r=!0,a(l,...o))}function n(l){c(null,l)}}var NH=V(Bc(),1);var B0=class extends Error{constructor(a,r,e){let c=[null,null],n={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof r=="string"&&(e=r,r=void 0),typeof e=="string"){let l=e.indexOf(":");l===-1?c[1]=e:(c[0]=e.slice(0,l),c[1]=e.slice(l+1))}r&&("type"in r||"position"in r?r.position&&(n=r.position):"start"in r||"end"in r?n=r:("line"in r||"column"in r)&&(n.start=r)),this.name=e3(r)||"1:1",this.message=typeof a=="object"?a.message:a,this.stack="",typeof a=="object"&&a.stack&&(this.stack=a.stack),this.reason=this.message,this.fatal,this.line=n.start.line,this.column=n.start.column,this.position=n,this.source=c[0],this.ruleId=c[1],this.file,this.actual,this.expected,this.url,this.note}};B0.prototype.file="";B0.prototype.name="";B0.prototype.reason="";B0.prototype.message="";B0.prototype.stack="";B0.prototype.fatal=null;B0.prototype.column=null;B0.prototype.line=null;B0.prototype.source=null;B0.prototype.ruleId=null;B0.prototype.position=null;var c5={basename:fP,dirname:MP,extname:mP,join:xP,sep:"/"};function fP(t,a){if(a!==void 0&&typeof a!="string")throw new TypeError('"ext" argument must be a string');Q9(t);let r=0,e=-1,c=t.length,n;if(a===void 0||a.length===0||a.length>t.length){for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else e<0&&(n=!0,e=c+1);return e<0?"":t.slice(r,e)}if(a===t)return"";let l=-1,o=a.length-1;for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else l<0&&(n=!0,l=c+1),o>-1&&(t.charCodeAt(c)===a.charCodeAt(o--)?o<0&&(e=c):(o=-1,e=l));return r===e?e=l:e<0&&(e=t.length),t.slice(r,e)}function MP(t){if(Q9(t),t.length===0)return".";let a=-1,r=t.length,e;for(;--r;)if(t.charCodeAt(r)===47){if(e){a=r;break}}else e||(e=!0);return a<0?t.charCodeAt(0)===47?"/":".":a===1&&t.charCodeAt(0)===47?"//":t.slice(0,a)}function mP(t){Q9(t);let a=t.length,r=-1,e=0,c=-1,n=0,l;for(;a--;){let o=t.charCodeAt(a);if(o===47){if(l){e=a+1;break}continue}r<0&&(l=!0,r=a+1),o===46?c<0?c=a:n!==1&&(n=1):c>-1&&(n=-1)}return c<0||r<0||n===0||n===1&&c===r-1&&c===e+1?"":t.slice(c,r)}function xP(...t){let a=-1,r;for(;++a0&&t.charCodeAt(t.length-1)===47&&(r+="/"),a?"/"+r:r}function VP(t,a){let r="",e=0,c=-1,n=0,l=-1,o,i;for(;++l<=t.length;){if(l2){if(i=r.lastIndexOf("/"),i!==r.length-1){i<0?(r="",e=0):(r=r.slice(0,i),e=r.length-1-r.lastIndexOf("/")),c=l,n=0;continue}}else if(r.length>0){r="",e=0,c=l,n=0;continue}}a&&(r=r.length>0?r+"/..":"..",e=2)}else r.length>0?r+="/"+t.slice(c+1,l):r=t.slice(c+1,l),e=l-c-1;c=l,n=0}else o===46&&n>-1?n++:n=-1}return r}function Q9(t){if(typeof t!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(t))}var TH={cwd:LP};function LP(){return"/"}function Nt(t){return t!==null&&typeof t=="object"&&t.href&&t.origin}function _H(t){if(typeof t=="string")t=new URL(t);else if(!Nt(t)){let a=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+t+"`");throw a.code="ERR_INVALID_ARG_TYPE",a}if(t.protocol!=="file:"){let a=new TypeError("The URL must be of scheme file");throw a.code="ERR_INVALID_URL_SCHEME",a}return CP(t)}function CP(t){if(t.hostname!==""){let e=new TypeError('File URL host must be "localhost" or empty on darwin');throw e.code="ERR_INVALID_FILE_URL_HOST",e}let a=t.pathname,r=-1;for(;++r{if(C||!k||!E)A(C);else{let _=n.stringify(k,E);_==null||(yP(_)?E.value=_:E.result=_),A(C,E)}});function A(C,k){C||!k?H(C):m?m(k):L(null,k)}}}function g(p){let L;n.freeze(),ed("processSync",n.Parser),cd("processSync",n.Compiler);let f=J9(p);return n.process(f,m),UH("processSync","process",L),f;function m(H){L=!0,Jv(H)}}}function ZH(t,a){return typeof t=="function"&&t.prototype&&(wP(t.prototype)||a in t.prototype)}function wP(t){let a;for(a in t)if(jH.call(t,a))return!0;return!1}function ed(t,a){if(typeof a!="function")throw new TypeError("Cannot `"+t+"` without `Parser`")}function cd(t,a){if(typeof a!="function")throw new TypeError("Cannot `"+t+"` without `Compiler`")}function nd(t,a){if(a)throw new Error("Cannot call `"+t+"` on a frozen processor.\nCreate a new processor first, by calling it: use `processor()` instead of `processor`.")}function GH(t){if(!K9(t)||typeof t.type!="string")throw new TypeError("Expected node, got `"+t+"`")}function UH(t,a,r){if(!r)throw new Error("`"+t+"` finished async. Use `"+a+"` instead")}function J9(t){return BP(t)?t:new Y9(t)}function BP(t){return Boolean(t&&typeof t=="object"&&"message"in t&&"messages"in t)}function yP(t){return typeof t=="string"||(0,WH.default)(t)}function $H(t,a){var{includeImageAlt:r=!0}=a||{};return KH(t,r)}function KH(t,a){return t&&typeof t=="object"&&(t.value||(a?t.alt:"")||"children"in t&&XH(t.children,a)||Array.isArray(t)&&XH(t,a))||""}function XH(t,a){for(var r=[],e=-1;++ec?0:c+a:a=a>c?c:a,r=r>0?r:0,e.length<1e4)l=Array.from(e),l.unshift(a,r),[].splice.apply(t,l);else for(r&&[].splice.apply(t,[a,r]);n0?(r0(t,t.length,0,a),t):a}var QH={}.hasOwnProperty;function YH(t){let a={},r=-1;for(;++rl))return;let k=a.events.length,E=k,_,U;for(;E--;)if(a.events[E][0]==="exit"&&a.events[E][1].type==="chunkFlow"){if(_){U=a.events[E][1].end;break}_=!0}for(f(e),C=k;CH;){let A=r[w];a.containerState=A[1],A[0].exit.call(a,t)}r.length=H}function m(){c.write([null]),n=void 0,c=void 0,a.containerState._closeFlow=void 0}}function OP(t,a,r){return u1(t,t.attempt(this.parser.constructs.document,a,r),"linePrefix",this.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function hd(t){if(t===null||k2(t)||rV(t))return 1;if(eV(t))return 2}function Zt(t,a,r){let e=[],c=-1;for(;++c1&&t[r][1].end.offset-t[r][1].start.offset>1?2:1;let d=Object.assign({},t[e][1].end),u=Object.assign({},t[r][1].start);oV(d,-i),oV(u,i),l={type:i>1?"strongSequence":"emphasisSequence",start:d,end:Object.assign({},t[e][1].end)},o={type:i>1?"strongSequence":"emphasisSequence",start:Object.assign({},t[r][1].start),end:u},n={type:i>1?"strongText":"emphasisText",start:Object.assign({},t[e][1].end),end:Object.assign({},t[r][1].start)},c={type:i>1?"strong":"emphasis",start:Object.assign({},l.start),end:Object.assign({},o.end)},t[e][1].end=Object.assign({},l.start),t[r][1].start=Object.assign({},o.end),h=[],t[e][1].end.offset-t[e][1].start.offset&&(h=y0(h,[["enter",t[e][1],a],["exit",t[e][1],a]])),h=y0(h,[["enter",c,a],["enter",l,a],["exit",l,a],["enter",n,a]]),h=y0(h,Zt(a.parser.constructs.insideSpan.null,t.slice(e+1,r),a)),h=y0(h,[["exit",n,a],["enter",o,a],["exit",o,a],["exit",c,a]]),t[r][1].end.offset-t[r][1].start.offset?(v=2,h=y0(h,[["enter",t[r][1],a],["exit",t[r][1],a]])):v=0,r0(t,e-1,r-e+3,h),r=e+h.length-v-2;break}}for(r=-1;++r=4?l(h):r(h)}function l(h){return h===null?i(h):a1(h)?t.attempt(GP,l,i)(h):(t.enter("codeFlowValue"),o(h))}function o(h){return h===null||a1(h)?(t.exit("codeFlowValue"),l(h)):(t.consume(h),o)}function i(h){return t.exit("codeIndented"),a(h)}}function WP(t,a,r){let e=this;return c;function c(l){return e.parser.lazy[e.now().line]?r(l):a1(l)?(t.enter("lineEnding"),t.consume(l),t.exit("lineEnding"),c):u1(t,n,"linePrefix",4+1)(l)}function n(l){let o=e.events[e.events.length-1];return o&&o[1].type==="linePrefix"&&o[2].sliceSerialize(o[1],!0).length>=4?a(l):a1(l)?c(l):r(l)}}var dd={name:"codeText",tokenize:XP,resolve:jP,previous:qP};function jP(t){let a=t.length-4,r=3,e,c;if((t[r][1].type==="lineEnding"||t[r][1].type==="space")&&(t[a][1].type==="lineEnding"||t[a][1].type==="space")){for(e=r;++e=4?a(l):t.interrupt(e.parser.constructs.flow,r,a)(l)}}function kc(t,a,r,e,c,n,l,o,i){let h=i||Number.POSITIVE_INFINITY,v=0;return d;function d(f){return f===60?(t.enter(e),t.enter(c),t.enter(n),t.consume(f),t.exit(n),u):f===null||f===41||aa(f)?r(f):(t.enter(e),t.enter(l),t.enter(o),t.enter("chunkString",{contentType:"string"}),p(f))}function u(f){return f===62?(t.enter(n),t.consume(f),t.exit(n),t.exit(c),t.exit(e),a):(t.enter(o),t.enter("chunkString",{contentType:"string"}),s(f))}function s(f){return f===62?(t.exit("chunkString"),t.exit(o),u(f)):f===null||f===60||a1(f)?r(f):(t.consume(f),f===92?g:s)}function g(f){return f===60||f===62||f===92?(t.consume(f),s):s(f)}function p(f){return f===40?++v>h?r(f):(t.consume(f),p):f===41?v--?(t.consume(f),p):(t.exit("chunkString"),t.exit(o),t.exit(l),t.exit(e),a(f)):f===null||k2(f)?v?r(f):(t.exit("chunkString"),t.exit(o),t.exit(l),t.exit(e),a(f)):aa(f)?r(f):(t.consume(f),f===92?L:p)}function L(f){return f===40||f===41||f===92?(t.consume(f),p):p(f)}}function Rc(t,a,r,e,c,n){let l=this,o=0,i;return h;function h(s){return t.enter(e),t.enter(c),t.consume(s),t.exit(c),t.enter(n),v}function v(s){return s===null||s===91||s===93&&!i||s===94&&!o&&"_hiddenFootnoteSupport"in l.parser.constructs||o>999?r(s):s===93?(t.exit(n),t.enter(c),t.consume(s),t.exit(c),t.exit(e),a):a1(s)?(t.enter("lineEnding"),t.consume(s),t.exit("lineEnding"),v):(t.enter("chunkString",{contentType:"string"}),d(s))}function d(s){return s===null||s===91||s===93||a1(s)||o++>999?(t.exit("chunkString"),v(s)):(t.consume(s),i=i||!G1(s),s===92?u:d)}function u(s){return s===91||s===92||s===93?(t.consume(s),o++,d):d(s)}}function Ic(t,a,r,e,c,n){let l;return o;function o(u){return t.enter(e),t.enter(c),t.consume(u),t.exit(c),l=u===40?41:u,i}function i(u){return u===l?(t.enter(c),t.consume(u),t.exit(c),t.exit(e),a):(t.enter(n),h(u))}function h(u){return u===l?(t.exit(n),i(l)):u===null?r(u):a1(u)?(t.enter("lineEnding"),t.consume(u),t.exit("lineEnding"),u1(t,h,"linePrefix")):(t.enter("chunkString",{contentType:"string"}),v(u))}function v(u){return u===l||u===null||a1(u)?(t.exit("chunkString"),h(u)):(t.consume(u),u===92?d:v)}function d(u){return u===l||u===92?(t.consume(u),v):v(u)}}function t8(t,a){let r;return e;function e(c){return a1(c)?(t.enter("lineEnding"),t.consume(c),t.exit("lineEnding"),r=!0,e):G1(c)?u1(t,e,r?"linePrefix":"lineSuffix")(c):a(c)}}function c3(t){return t.replace(/[\t\n\r ]+/g," ").replace(/^ | $/g,"").toLowerCase().toUpperCase()}var sd={name:"definition",tokenize:aT},tT={tokenize:rT,partial:!0};function aT(t,a,r){let e=this,c;return n;function n(i){return t.enter("definition"),Rc.call(e,t,l,r,"definitionLabel","definitionLabelMarker","definitionLabelString")(i)}function l(i){return c=c3(e.sliceSerialize(e.events[e.events.length-1][1]).slice(1,-1)),i===58?(t.enter("definitionMarker"),t.consume(i),t.exit("definitionMarker"),t8(t,kc(t,t.attempt(tT,u1(t,o,"whitespace"),u1(t,o,"whitespace")),r,"definitionDestination","definitionDestinationLiteral","definitionDestinationLiteralMarker","definitionDestinationRaw","definitionDestinationString"))):r(i)}function o(i){return i===null||a1(i)?(t.exit("definition"),e.parser.defined.includes(c)||e.parser.defined.push(c),a(i)):r(i)}}function rT(t,a,r){return e;function e(l){return k2(l)?t8(t,c)(l):r(l)}function c(l){return l===34||l===39||l===40?Ic(t,u1(t,n,"whitespace"),r,"definitionTitle","definitionTitleMarker","definitionTitleString")(l):r(l)}function n(l){return l===null||a1(l)?a(l):r(l)}}var gd={name:"hardBreakEscape",tokenize:eT};function eT(t,a,r){return e;function e(n){return t.enter("hardBreakEscape"),t.enter("escapeMarker"),t.consume(n),c}function c(n){return a1(n)?(t.exit("escapeMarker"),t.exit("hardBreakEscape"),a(n)):r(n)}}var pd={name:"headingAtx",tokenize:nT,resolve:cT};function cT(t,a){let r=t.length-2,e=3,c,n;return t[e][1].type==="whitespace"&&(e+=2),r-2>e&&t[r][1].type==="whitespace"&&(r-=2),t[r][1].type==="atxHeadingSequence"&&(e===r-1||r-4>e&&t[r-2][1].type==="whitespace")&&(r-=e+1===r?2:4),r>e&&(c={type:"atxHeadingText",start:t[e][1].start,end:t[r][1].end},n={type:"chunkText",start:t[e][1].start,end:t[r][1].end,contentType:"text"},r0(t,e,r-e+1,[["enter",c,a],["enter",n,a],["exit",n,a],["exit",c,a]])),t}function nT(t,a,r){let e=this,c=0;return n;function n(v){return t.enter("atxHeading"),t.enter("atxHeadingSequence"),l(v)}function l(v){return v===35&&c++<6?(t.consume(v),l):v===null||k2(v)?(t.exit("atxHeadingSequence"),e.interrupt?a(v):o(v)):r(v)}function o(v){return v===35?(t.enter("atxHeadingSequence"),i(v)):v===null||a1(v)?(t.exit("atxHeading"),a(v)):G1(v)?u1(t,o,"whitespace")(v):(t.enter("atxHeadingText"),h(v))}function i(v){return v===35?(t.consume(v),i):(t.exit("atxHeadingSequence"),o(v))}function h(v){return v===null||v===35||k2(v)?(t.exit("atxHeadingText"),o(v)):(t.consume(v),h)}}var hV=["address","article","aside","base","basefont","blockquote","body","caption","center","col","colgroup","dd","details","dialog","dir","div","dl","dt","fieldset","figcaption","figure","footer","form","frame","frameset","h1","h2","h3","h4","h5","h6","head","header","hr","html","iframe","legend","li","link","main","menu","menuitem","nav","noframes","ol","optgroup","option","p","param","section","summary","table","tbody","td","tfoot","th","thead","title","tr","track","ul"],zd=["pre","script","style","textarea"];var fd={name:"htmlFlow",tokenize:iT,resolveTo:oT,concrete:!0},lT={tokenize:hT,partial:!0};function oT(t){let a=t.length;for(;a--&&!(t[a][0]==="enter"&&t[a][1].type==="htmlFlow"););return a>1&&t[a-2][1].type==="linePrefix"&&(t[a][1].start=t[a-2][1].start,t[a+1][1].start=t[a-2][1].start,t.splice(a-2,2)),t}function iT(t,a,r){let e=this,c,n,l,o,i;return h;function h(S){return t.enter("htmlFlow"),t.enter("htmlFlowData"),t.consume(S),v}function v(S){return S===33?(t.consume(S),d):S===47?(t.consume(S),g):S===63?(t.consume(S),c=3,e.interrupt?a:B1):v4(S)?(t.consume(S),l=String.fromCharCode(S),n=!0,p):r(S)}function d(S){return S===45?(t.consume(S),c=2,u):S===91?(t.consume(S),c=5,l="CDATA[",o=0,s):v4(S)?(t.consume(S),c=4,e.interrupt?a:B1):r(S)}function u(S){return S===45?(t.consume(S),e.interrupt?a:B1):r(S)}function s(S){return S===l.charCodeAt(o++)?(t.consume(S),o===l.length?e.interrupt?a:j:s):r(S)}function g(S){return v4(S)?(t.consume(S),l=String.fromCharCode(S),p):r(S)}function p(S){return S===null||S===47||S===62||k2(S)?S!==47&&n&&zd.includes(l.toLowerCase())?(c=1,e.interrupt?a(S):j(S)):hV.includes(l.toLowerCase())?(c=6,S===47?(t.consume(S),L):e.interrupt?a(S):j(S)):(c=7,e.interrupt&&!e.parser.lazy[e.now().line]?r(S):n?m(S):f(S)):S===45||X2(S)?(t.consume(S),l+=String.fromCharCode(S),p):r(S)}function L(S){return S===62?(t.consume(S),e.interrupt?a:j):r(S)}function f(S){return G1(S)?(t.consume(S),f):_(S)}function m(S){return S===47?(t.consume(S),_):S===58||S===95||v4(S)?(t.consume(S),H):G1(S)?(t.consume(S),m):_(S)}function H(S){return S===45||S===46||S===58||S===95||X2(S)?(t.consume(S),H):w(S)}function w(S){return S===61?(t.consume(S),A):G1(S)?(t.consume(S),w):m(S)}function A(S){return S===null||S===60||S===61||S===62||S===96?r(S):S===34||S===39?(t.consume(S),i=S,C):G1(S)?(t.consume(S),A):(i=null,k(S))}function C(S){return S===null||a1(S)?r(S):S===i?(t.consume(S),E):(t.consume(S),C)}function k(S){return S===null||S===34||S===39||S===60||S===61||S===62||S===96||k2(S)?w(S):(t.consume(S),k)}function E(S){return S===47||S===62||G1(S)?m(S):r(S)}function _(S){return S===62?(t.consume(S),U):r(S)}function U(S){return G1(S)?(t.consume(S),U):S===null||a1(S)?j(S):r(S)}function j(S){return S===45&&c===2?(t.consume(S),H1):S===60&&c===1?(t.consume(S),w1):S===62&&c===4?(t.consume(S),k1):S===63&&c===3?(t.consume(S),B1):S===93&&c===5?(t.consume(S),P1):a1(S)&&(c===6||c===7)?t.check(lT,k1,Q)(S):S===null||a1(S)?Q(S):(t.consume(S),j)}function Q(S){return t.exit("htmlFlowData"),T(S)}function T(S){return S===null?F(S):a1(S)?t.attempt({tokenize:c1,partial:!0},T,F)(S):(t.enter("htmlFlowData"),j(S))}function c1(S,g4,C2){return E2;function E2(S2){return S.enter("lineEnding"),S.consume(S2),S.exit("lineEnding"),Q2}function Q2(S2){return e.parser.lazy[e.now().line]?C2(S2):g4(S2)}}function H1(S){return S===45?(t.consume(S),B1):j(S)}function w1(S){return S===47?(t.consume(S),l="",W1):j(S)}function W1(S){return S===62&&zd.includes(l.toLowerCase())?(t.consume(S),k1):v4(S)&&l.length<8?(t.consume(S),l+=String.fromCharCode(S),W1):j(S)}function P1(S){return S===93?(t.consume(S),B1):j(S)}function B1(S){return S===62?(t.consume(S),k1):S===45&&c===2?(t.consume(S),B1):j(S)}function k1(S){return S===null||a1(S)?(t.exit("htmlFlowData"),F(S)):(t.consume(S),k1)}function F(S){return t.exit("htmlFlow"),a(S)}}function hT(t,a,r){return e;function e(c){return t.exit("htmlFlowData"),t.enter("lineEndingBlank"),t.consume(c),t.exit("lineEndingBlank"),t.attempt(i6,a,r)}}var Md={name:"htmlText",tokenize:vT};function vT(t,a,r){let e=this,c,n,l,o;return i;function i(F){return t.enter("htmlText"),t.enter("htmlTextData"),t.consume(F),h}function h(F){return F===33?(t.consume(F),v):F===47?(t.consume(F),k):F===63?(t.consume(F),A):v4(F)?(t.consume(F),U):r(F)}function v(F){return F===45?(t.consume(F),d):F===91?(t.consume(F),n="CDATA[",l=0,L):v4(F)?(t.consume(F),w):r(F)}function d(F){return F===45?(t.consume(F),u):r(F)}function u(F){return F===null||F===62?r(F):F===45?(t.consume(F),s):g(F)}function s(F){return F===null||F===62?r(F):g(F)}function g(F){return F===null?r(F):F===45?(t.consume(F),p):a1(F)?(o=g,P1(F)):(t.consume(F),g)}function p(F){return F===45?(t.consume(F),k1):g(F)}function L(F){return F===n.charCodeAt(l++)?(t.consume(F),l===n.length?f:L):r(F)}function f(F){return F===null?r(F):F===93?(t.consume(F),m):a1(F)?(o=f,P1(F)):(t.consume(F),f)}function m(F){return F===93?(t.consume(F),H):f(F)}function H(F){return F===62?k1(F):F===93?(t.consume(F),H):f(F)}function w(F){return F===null||F===62?k1(F):a1(F)?(o=w,P1(F)):(t.consume(F),w)}function A(F){return F===null?r(F):F===63?(t.consume(F),C):a1(F)?(o=A,P1(F)):(t.consume(F),A)}function C(F){return F===62?k1(F):A(F)}function k(F){return v4(F)?(t.consume(F),E):r(F)}function E(F){return F===45||X2(F)?(t.consume(F),E):_(F)}function _(F){return a1(F)?(o=_,P1(F)):G1(F)?(t.consume(F),_):k1(F)}function U(F){return F===45||X2(F)?(t.consume(F),U):F===47||F===62||k2(F)?j(F):r(F)}function j(F){return F===47?(t.consume(F),k1):F===58||F===95||v4(F)?(t.consume(F),Q):a1(F)?(o=j,P1(F)):G1(F)?(t.consume(F),j):k1(F)}function Q(F){return F===45||F===46||F===58||F===95||X2(F)?(t.consume(F),Q):T(F)}function T(F){return F===61?(t.consume(F),c1):a1(F)?(o=T,P1(F)):G1(F)?(t.consume(F),T):j(F)}function c1(F){return F===null||F===60||F===61||F===62||F===96?r(F):F===34||F===39?(t.consume(F),c=F,H1):a1(F)?(o=c1,P1(F)):G1(F)?(t.consume(F),c1):(t.consume(F),c=void 0,W1)}function H1(F){return F===c?(t.consume(F),w1):F===null?r(F):a1(F)?(o=H1,P1(F)):(t.consume(F),H1)}function w1(F){return F===62||F===47||k2(F)?j(F):r(F)}function W1(F){return F===null||F===34||F===39||F===60||F===61||F===96?r(F):F===62||k2(F)?j(F):(t.consume(F),W1)}function P1(F){return t.exit("htmlTextData"),t.enter("lineEnding"),t.consume(F),t.exit("lineEnding"),u1(t,B1,"linePrefix",e.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function B1(F){return t.enter("htmlTextData"),o(F)}function k1(F){return F===62?(t.consume(F),t.exit("htmlTextData"),t.exit("htmlText"),a):r(F)}}var a8={name:"labelEnd",tokenize:zT,resolveTo:pT,resolveAll:gT},dT={tokenize:fT},uT={tokenize:MT},sT={tokenize:mT};function gT(t){let a=-1,r;for(;++a-1&&(l[0]=l[0].slice(e)),n>0&&l.push(t[c].slice(0,n))),l}function ET(t,a){let r=-1,e=[],c;for(;++r"u")&&!document.getElementById(TH)){var t=document.createElement("style");t.id=TH,t.textContent=qE,document.head.appendChild(t)}})();var NH={ResizableGrid:"_ResizableGrid_i4cq9_1",resizableGrid:"_ResizableGrid_i4cq9_1","size-detection-cell":"_size-detection-cell_i4cq9_1",sizeDetectionCell:"_size-detection-cell_i4cq9_1"};var jC=V($());var $E=/(^[\d|.]+)\s*(px|%|rem|fr)|(^auto$)/;function DH(t){return $E.test(t)}var XE=/(px|%|rem|fr|auto)/g,KE=/^[\d|.]*/g;function Wt(t){let a=t.match(XE)?.[0]||"px",r=t.match(KE)?.[0],e=r?Number(r):null;if(a==="auto"){if(e!==null)throw new Error("Cant have a count value with auto units.");return{count:null,unit:"auto"}}if(e===null)throw new Error("You must have a count for non-auto units.");if(a==="fr"&&e<0)throw new Error(`Can't have a negative count with ${a} units.`);return{count:e,unit:a}}function jt(t){return t.unit==="auto"?"auto":`${t.count}${t.unit}`}var BC=V($());var m8=V($());var ZH=["http","https","mailto","tel"];function GH(t){let a=(t||"").trim(),r=a.charAt(0);if(r==="#"||r==="/")return a;let e=a.indexOf(":");if(e===-1)return a;let c=-1;for(;++cc||(c=a.indexOf("#"),c!==-1&&e>c)?a:"javascript:void(0)"}var xn=V($(),1);var KH=V(Ic(),1);function v3(t){return!t||typeof t!="object"?"":"position"in t||"type"in t?WH(t.position):"start"in t||"end"in t?WH(t):"line"in t||"column"in t?vd(t):""}function vd(t){return jH(t&&t.line)+":"+jH(t&&t.column)}function WH(t){return vd(t&&t.start)+"-"+vd(t&&t.end)}function jH(t){return t&&typeof t=="number"?t:1}var y0=class extends Error{constructor(a,r,e){let c=[null,null],n={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof r=="string"&&(e=r,r=void 0),typeof e=="string"){let l=e.indexOf(":");l===-1?c[1]=e:(c[0]=e.slice(0,l),c[1]=e.slice(l+1))}r&&("type"in r||"position"in r?r.position&&(n=r.position):"start"in r||"end"in r?n=r:("line"in r||"column"in r)&&(n.start=r)),this.name=v3(r)||"1:1",this.message=typeof a=="object"?a.message:a,this.stack="",typeof a=="object"&&a.stack&&(this.stack=a.stack),this.reason=this.message,this.fatal,this.line=n.start.line,this.column=n.start.column,this.position=n,this.source=c[0],this.ruleId=c[1],this.file,this.actual,this.expected,this.url,this.note}};y0.prototype.file="";y0.prototype.name="";y0.prototype.reason="";y0.prototype.message="";y0.prototype.stack="";y0.prototype.fatal=null;y0.prototype.column=null;y0.prototype.line=null;y0.prototype.source=null;y0.prototype.ruleId=null;y0.prototype.position=null;var h5={basename:QE,dirname:YE,extname:JE,join:tP,sep:"/"};function QE(t,a){if(a!==void 0&&typeof a!="string")throw new TypeError('"ext" argument must be a string');ea(t);let r=0,e=-1,c=t.length,n;if(a===void 0||a.length===0||a.length>t.length){for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else e<0&&(n=!0,e=c+1);return e<0?"":t.slice(r,e)}if(a===t)return"";let l=-1,o=a.length-1;for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else l<0&&(n=!0,l=c+1),o>-1&&(t.charCodeAt(c)===a.charCodeAt(o--)?o<0&&(e=c):(o=-1,e=l));return r===e?e=l:e<0&&(e=t.length),t.slice(r,e)}function YE(t){if(ea(t),t.length===0)return".";let a=-1,r=t.length,e;for(;--r;)if(t.charCodeAt(r)===47){if(e){a=r;break}}else e||(e=!0);return a<0?t.charCodeAt(0)===47?"/":".":a===1&&t.charCodeAt(0)===47?"//":t.slice(0,a)}function JE(t){ea(t);let a=t.length,r=-1,e=0,c=-1,n=0,l;for(;a--;){let o=t.charCodeAt(a);if(o===47){if(l){e=a+1;break}continue}r<0&&(l=!0,r=a+1),o===46?c<0?c=a:n!==1&&(n=1):c>-1&&(n=-1)}return c<0||r<0||n===0||n===1&&c===r-1&&c===e+1?"":t.slice(c,r)}function tP(...t){let a=-1,r;for(;++a0&&t.charCodeAt(t.length-1)===47&&(r+="/"),a?"/"+r:r}function rP(t,a){let r="",e=0,c=-1,n=0,l=-1,o,i;for(;++l<=t.length;){if(l2){if(i=r.lastIndexOf("/"),i!==r.length-1){i<0?(r="",e=0):(r=r.slice(0,i),e=r.length-1-r.lastIndexOf("/")),c=l,n=0;continue}}else if(r.length>0){r="",e=0,c=l,n=0;continue}}a&&(r=r.length>0?r+"/..":"..",e=2)}else r.length>0?r+="/"+t.slice(c+1,l):r=t.slice(c+1,l),e=l-c-1;c=l,n=0}else o===46&&n>-1?n++:n=-1}return r}function ea(t){if(typeof t!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(t))}var qH={cwd:eP};function eP(){return"/"}function qt(t){return t!==null&&typeof t=="object"&&t.href&&t.origin}function $H(t){if(typeof t=="string")t=new URL(t);else if(!qt(t)){let a=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+t+"`");throw a.code="ERR_INVALID_ARG_TYPE",a}if(t.protocol!=="file:"){let a=new TypeError("The URL must be of scheme file");throw a.code="ERR_INVALID_URL_SCHEME",a}return cP(t)}function cP(t){if(t.hostname!==""){let e=new TypeError('File URL host must be "localhost" or empty on darwin');throw e.code="ERR_INVALID_FILE_URL_HOST",e}let a=t.pathname,r=-1;for(;++rl.length,i;o&&l.push(c);try{i=t.apply(this,l)}catch(h){let v=h;if(o&&r)throw v;return c(v)}o||(i instanceof Promise?i.then(n,c):i instanceof Error?c(i):n(i))}function c(l,...o){r||(r=!0,a(l,...o))}function n(l){c(null,l)}}var vV=V(Ic(),1);var A0=class extends Error{constructor(a,r,e){let c=[null,null],n={start:{line:null,column:null},end:{line:null,column:null}};if(super(),typeof r=="string"&&(e=r,r=void 0),typeof e=="string"){let l=e.indexOf(":");l===-1?c[1]=e:(c[0]=e.slice(0,l),c[1]=e.slice(l+1))}r&&("type"in r||"position"in r?r.position&&(n=r.position):"start"in r||"end"in r?n=r:("line"in r||"column"in r)&&(n.start=r)),this.name=v3(r)||"1:1",this.message=typeof a=="object"?a.message:a,this.stack="",typeof a=="object"&&a.stack&&(this.stack=a.stack),this.reason=this.message,this.fatal,this.line=n.start.line,this.column=n.start.column,this.position=n,this.source=c[0],this.ruleId=c[1],this.file,this.actual,this.expected,this.url,this.note}};A0.prototype.file="";A0.prototype.name="";A0.prototype.reason="";A0.prototype.message="";A0.prototype.stack="";A0.prototype.fatal=null;A0.prototype.column=null;A0.prototype.line=null;A0.prototype.source=null;A0.prototype.ruleId=null;A0.prototype.position=null;var v5={basename:lP,dirname:oP,extname:iP,join:hP,sep:"/"};function lP(t,a){if(a!==void 0&&typeof a!="string")throw new TypeError('"ext" argument must be a string');la(t);let r=0,e=-1,c=t.length,n;if(a===void 0||a.length===0||a.length>t.length){for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else e<0&&(n=!0,e=c+1);return e<0?"":t.slice(r,e)}if(a===t)return"";let l=-1,o=a.length-1;for(;c--;)if(t.charCodeAt(c)===47){if(n){r=c+1;break}}else l<0&&(n=!0,l=c+1),o>-1&&(t.charCodeAt(c)===a.charCodeAt(o--)?o<0&&(e=c):(o=-1,e=l));return r===e?e=l:e<0&&(e=t.length),t.slice(r,e)}function oP(t){if(la(t),t.length===0)return".";let a=-1,r=t.length,e;for(;--r;)if(t.charCodeAt(r)===47){if(e){a=r;break}}else e||(e=!0);return a<0?t.charCodeAt(0)===47?"/":".":a===1&&t.charCodeAt(0)===47?"//":t.slice(0,a)}function iP(t){la(t);let a=t.length,r=-1,e=0,c=-1,n=0,l;for(;a--;){let o=t.charCodeAt(a);if(o===47){if(l){e=a+1;break}continue}r<0&&(l=!0,r=a+1),o===46?c<0?c=a:n!==1&&(n=1):c>-1&&(n=-1)}return c<0||r<0||n===0||n===1&&c===r-1&&c===e+1?"":t.slice(c,r)}function hP(...t){let a=-1,r;for(;++a0&&t.charCodeAt(t.length-1)===47&&(r+="/"),a?"/"+r:r}function dP(t,a){let r="",e=0,c=-1,n=0,l=-1,o,i;for(;++l<=t.length;){if(l2){if(i=r.lastIndexOf("/"),i!==r.length-1){i<0?(r="",e=0):(r=r.slice(0,i),e=r.length-1-r.lastIndexOf("/")),c=l,n=0;continue}}else if(r.length>0){r="",e=0,c=l,n=0;continue}}a&&(r=r.length>0?r+"/..":"..",e=2)}else r.length>0?r+="/"+t.slice(c+1,l):r=t.slice(c+1,l),e=l-c-1;c=l,n=0}else o===46&&n>-1?n++:n=-1}return r}function la(t){if(typeof t!="string")throw new TypeError("Path must be a string. Received "+JSON.stringify(t))}var oV={cwd:uP};function uP(){return"/"}function $t(t){return t!==null&&typeof t=="object"&&t.href&&t.origin}function iV(t){if(typeof t=="string")t=new URL(t);else if(!$t(t)){let a=new TypeError('The "path" argument must be of type string or an instance of URL. Received `'+t+"`");throw a.code="ERR_INVALID_ARG_TYPE",a}if(t.protocol!=="file:"){let a=new TypeError("The URL must be of scheme file");throw a.code="ERR_INVALID_URL_SCHEME",a}return sP(t)}function sP(t){if(t.hostname!==""){let e=new TypeError('File URL host must be "localhost" or empty on darwin');throw e.code="ERR_INVALID_FILE_URL_HOST",e}let a=t.pathname,r=-1;for(;++r{if(C||!k||!I)A(C);else{let T=n.stringify(k,I);T==null||(zP(T)?I.value=T:I.result=T),A(C,I)}});function A(C,k){C||!k?H(C):m?m(k):L(null,k)}}}function g(p){let L;n.freeze(),Md("processSync",n.Parser),md("processSync",n.Compiler);let f=ia(p);return n.process(f,m),sV("processSync","process",L),f;function m(H){L=!0,gd(H)}}}function dV(t,a){return typeof t=="function"&&t.prototype&&(gP(t.prototype)||a in t.prototype)}function gP(t){let a;for(a in t)if(pV.call(t,a))return!0;return!1}function Md(t,a){if(typeof a!="function")throw new TypeError("Cannot `"+t+"` without `Parser`")}function md(t,a){if(typeof a!="function")throw new TypeError("Cannot `"+t+"` without `Compiler`")}function xd(t,a){if(a)throw new Error("Cannot call `"+t+"` on a frozen processor.\nCreate a new processor first, by calling it: use `processor()` instead of `processor`.")}function uV(t){if(!na(t)||typeof t.type!="string")throw new TypeError("Expected node, got `"+t+"`")}function sV(t,a,r){if(!r)throw new Error("`"+t+"` finished async. Use `"+a+"` instead")}function ia(t){return pP(t)?t:new oa(t)}function pP(t){return Boolean(t&&typeof t=="object"&&"message"in t&&"messages"in t)}function zP(t){return typeof t=="string"||(0,gV.default)(t)}function MV(t,a){var{includeImageAlt:r=!0}=a||{};return mV(t,r)}function mV(t,a){return t&&typeof t=="object"&&(t.value||(a?t.alt:"")||"children"in t&&fV(t.children,a)||Array.isArray(t)&&fV(t,a))||""}function fV(t,a){for(var r=[],e=-1;++ec?0:c+a:a=a>c?c:a,r=r>0?r:0,e.length<1e4)l=Array.from(e),l.unshift(a,r),[].splice.apply(t,l);else for(r&&[].splice.apply(t,[a,r]);n0?(c0(t,t.length,0,a),t):a}var xV={}.hasOwnProperty;function HV(t){let a={},r=-1;for(;++rl))return;let k=a.events.length,I=k,T,U;for(;I--;)if(a.events[I][0]==="exit"&&a.events[I][1].type==="chunkFlow"){if(T){U=a.events[I][1].end;break}T=!0}for(f(e),C=k;CH;){let A=r[w];a.containerState=A[1],A[0].exit.call(a,t)}r.length=H}function m(){c.write([null]),n=void 0,c=void 0,a.containerState._closeFlow=void 0}}function HP(t,a,r){return u1(t,t.attempt(this.parser.constructs.document,a,r),"linePrefix",this.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function Cd(t){if(t===null||R2(t)||wV(t))return 1;if(BV(t))return 2}function Xt(t,a,r){let e=[],c=-1;for(;++c1&&t[r][1].end.offset-t[r][1].start.offset>1?2:1;let d=Object.assign({},t[e][1].end),u=Object.assign({},t[r][1].start);bV(d,-i),bV(u,i),l={type:i>1?"strongSequence":"emphasisSequence",start:d,end:Object.assign({},t[e][1].end)},o={type:i>1?"strongSequence":"emphasisSequence",start:Object.assign({},t[r][1].start),end:u},n={type:i>1?"strongText":"emphasisText",start:Object.assign({},t[e][1].end),end:Object.assign({},t[r][1].start)},c={type:i>1?"strong":"emphasis",start:Object.assign({},l.start),end:Object.assign({},o.end)},t[e][1].end=Object.assign({},l.start),t[r][1].start=Object.assign({},o.end),h=[],t[e][1].end.offset-t[e][1].start.offset&&(h=S0(h,[["enter",t[e][1],a],["exit",t[e][1],a]])),h=S0(h,[["enter",c,a],["enter",l,a],["exit",l,a],["enter",n,a]]),h=S0(h,Xt(a.parser.constructs.insideSpan.null,t.slice(e+1,r),a)),h=S0(h,[["exit",n,a],["enter",o,a],["exit",o,a],["exit",c,a]]),t[r][1].end.offset-t[r][1].start.offset?(v=2,h=S0(h,[["enter",t[r][1],a],["exit",t[r][1],a]])):v=0,c0(t,e-1,r-e+3,h),r=e+h.length-v-2;break}}for(r=-1;++r=4?l(h):r(h)}function l(h){return h===null?i(h):a1(h)?t.attempt(OP,l,i)(h):(t.enter("codeFlowValue"),o(h))}function o(h){return h===null||a1(h)?(t.exit("codeFlowValue"),l(h)):(t.consume(h),o)}function i(h){return t.exit("codeIndented"),a(h)}}function _P(t,a,r){let e=this;return c;function c(l){return e.parser.lazy[e.now().line]?r(l):a1(l)?(t.enter("lineEnding"),t.consume(l),t.exit("lineEnding"),c):u1(t,n,"linePrefix",4+1)(l)}function n(l){let o=e.events[e.events.length-1];return o&&o[1].type==="linePrefix"&&o[2].sliceSerialize(o[1],!0).length>=4?a(l):a1(l)?c(l):r(l)}}var Bd={name:"codeText",tokenize:EP,resolve:RP,previous:IP};function RP(t){let a=t.length-4,r=3,e,c;if((t[r][1].type==="lineEnding"||t[r][1].type==="space")&&(t[a][1].type==="lineEnding"||t[a][1].type==="space")){for(e=r;++e=4?a(l):t.interrupt(e.parser.constructs.flow,r,a)(l)}}function Gc(t,a,r,e,c,n,l,o,i){let h=i||Number.POSITIVE_INFINITY,v=0;return d;function d(f){return f===60?(t.enter(e),t.enter(c),t.enter(n),t.consume(f),t.exit(n),u):f===null||f===41||va(f)?r(f):(t.enter(e),t.enter(l),t.enter(o),t.enter("chunkString",{contentType:"string"}),p(f))}function u(f){return f===62?(t.enter(n),t.consume(f),t.exit(n),t.exit(c),t.exit(e),a):(t.enter(o),t.enter("chunkString",{contentType:"string"}),s(f))}function s(f){return f===62?(t.exit("chunkString"),t.exit(o),u(f)):f===null||f===60||a1(f)?r(f):(t.consume(f),f===92?g:s)}function g(f){return f===60||f===62||f===92?(t.consume(f),s):s(f)}function p(f){return f===40?++v>h?r(f):(t.consume(f),p):f===41?v--?(t.consume(f),p):(t.exit("chunkString"),t.exit(o),t.exit(l),t.exit(e),a(f)):f===null||R2(f)?v?r(f):(t.exit("chunkString"),t.exit(o),t.exit(l),t.exit(e),a(f)):va(f)?r(f):(t.consume(f),f===92?L:p)}function L(f){return f===40||f===41||f===92?(t.consume(f),p):p(f)}}function Uc(t,a,r,e,c,n){let l=this,o=0,i;return h;function h(s){return t.enter(e),t.enter(c),t.consume(s),t.exit(c),t.enter(n),v}function v(s){return s===null||s===91||s===93&&!i||s===94&&!o&&"_hiddenFootnoteSupport"in l.parser.constructs||o>999?r(s):s===93?(t.exit(n),t.enter(c),t.consume(s),t.exit(c),t.exit(e),a):a1(s)?(t.enter("lineEnding"),t.consume(s),t.exit("lineEnding"),v):(t.enter("chunkString",{contentType:"string"}),d(s))}function d(s){return s===null||s===91||s===93||a1(s)||o++>999?(t.exit("chunkString"),v(s)):(t.consume(s),i=i||!U1(s),s===92?u:d)}function u(s){return s===91||s===92||s===93?(t.consume(s),o++,d):d(s)}}function Wc(t,a,r,e,c,n){let l;return o;function o(u){return t.enter(e),t.enter(c),t.consume(u),t.exit(c),l=u===40?41:u,i}function i(u){return u===l?(t.enter(c),t.consume(u),t.exit(c),t.exit(e),a):(t.enter(n),h(u))}function h(u){return u===l?(t.exit(n),i(l)):u===null?r(u):a1(u)?(t.enter("lineEnding"),t.consume(u),t.exit("lineEnding"),u1(t,h,"linePrefix")):(t.enter("chunkString",{contentType:"string"}),v(u))}function v(u){return u===l||u===null||a1(u)?(t.exit("chunkString"),h(u)):(t.consume(u),u===92?d:v)}function d(u){return u===l||u===92?(t.consume(u),v):v(u)}}function n8(t,a){let r;return e;function e(c){return a1(c)?(t.enter("lineEnding"),t.consume(c),t.exit("lineEnding"),r=!0,e):U1(c)?u1(t,e,r?"linePrefix":"lineSuffix")(c):a(c)}}function d3(t){return t.replace(/[\t\n\r ]+/g," ").replace(/^ | $/g,"").toLowerCase().toUpperCase()}var Ad={name:"definition",tokenize:UP},GP={tokenize:WP,partial:!0};function UP(t,a,r){let e=this,c;return n;function n(i){return t.enter("definition"),Uc.call(e,t,l,r,"definitionLabel","definitionLabelMarker","definitionLabelString")(i)}function l(i){return c=d3(e.sliceSerialize(e.events[e.events.length-1][1]).slice(1,-1)),i===58?(t.enter("definitionMarker"),t.consume(i),t.exit("definitionMarker"),n8(t,Gc(t,t.attempt(GP,u1(t,o,"whitespace"),u1(t,o,"whitespace")),r,"definitionDestination","definitionDestinationLiteral","definitionDestinationLiteralMarker","definitionDestinationRaw","definitionDestinationString"))):r(i)}function o(i){return i===null||a1(i)?(t.exit("definition"),e.parser.defined.includes(c)||e.parser.defined.push(c),a(i)):r(i)}}function WP(t,a,r){return e;function e(l){return R2(l)?n8(t,c)(l):r(l)}function c(l){return l===34||l===39||l===40?Wc(t,u1(t,n,"whitespace"),r,"definitionTitle","definitionTitleMarker","definitionTitleString")(l):r(l)}function n(l){return l===null||a1(l)?a(l):r(l)}}var Sd={name:"hardBreakEscape",tokenize:jP};function jP(t,a,r){return e;function e(n){return t.enter("hardBreakEscape"),t.enter("escapeMarker"),t.consume(n),c}function c(n){return a1(n)?(t.exit("escapeMarker"),t.exit("hardBreakEscape"),a(n)):r(n)}}var bd={name:"headingAtx",tokenize:$P,resolve:qP};function qP(t,a){let r=t.length-2,e=3,c,n;return t[e][1].type==="whitespace"&&(e+=2),r-2>e&&t[r][1].type==="whitespace"&&(r-=2),t[r][1].type==="atxHeadingSequence"&&(e===r-1||r-4>e&&t[r-2][1].type==="whitespace")&&(r-=e+1===r?2:4),r>e&&(c={type:"atxHeadingText",start:t[e][1].start,end:t[r][1].end},n={type:"chunkText",start:t[e][1].start,end:t[r][1].end,contentType:"text"},c0(t,e,r-e+1,[["enter",c,a],["enter",n,a],["exit",n,a],["exit",c,a]])),t}function $P(t,a,r){let e=this,c=0;return n;function n(v){return t.enter("atxHeading"),t.enter("atxHeadingSequence"),l(v)}function l(v){return v===35&&c++<6?(t.consume(v),l):v===null||R2(v)?(t.exit("atxHeadingSequence"),e.interrupt?a(v):o(v)):r(v)}function o(v){return v===35?(t.enter("atxHeadingSequence"),i(v)):v===null||a1(v)?(t.exit("atxHeading"),a(v)):U1(v)?u1(t,o,"whitespace")(v):(t.enter("atxHeadingText"),h(v))}function i(v){return v===35?(t.consume(v),i):(t.exit("atxHeadingSequence"),o(v))}function h(v){return v===null||v===35||R2(v)?(t.exit("atxHeadingText"),o(v)):(t.consume(v),h)}}var OV=["address","article","aside","base","basefont","blockquote","body","caption","center","col","colgroup","dd","details","dialog","dir","div","dl","dt","fieldset","figcaption","figure","footer","form","frame","frameset","h1","h2","h3","h4","h5","h6","head","header","hr","html","iframe","legend","li","link","main","menu","menuitem","nav","noframes","ol","optgroup","option","p","param","section","summary","table","tbody","td","tfoot","th","thead","title","tr","track","ul"],Fd=["pre","script","style","textarea"];var Od={name:"htmlFlow",tokenize:QP,resolveTo:KP,concrete:!0},XP={tokenize:YP,partial:!0};function KP(t){let a=t.length;for(;a--&&!(t[a][0]==="enter"&&t[a][1].type==="htmlFlow"););return a>1&&t[a-2][1].type==="linePrefix"&&(t[a][1].start=t[a-2][1].start,t[a+1][1].start=t[a-2][1].start,t.splice(a-2,2)),t}function QP(t,a,r){let e=this,c,n,l,o,i;return h;function h(S){return t.enter("htmlFlow"),t.enter("htmlFlowData"),t.consume(S),v}function v(S){return S===33?(t.consume(S),d):S===47?(t.consume(S),g):S===63?(t.consume(S),c=3,e.interrupt?a:B1):g4(S)?(t.consume(S),l=String.fromCharCode(S),n=!0,p):r(S)}function d(S){return S===45?(t.consume(S),c=2,u):S===91?(t.consume(S),c=5,l="CDATA[",o=0,s):g4(S)?(t.consume(S),c=4,e.interrupt?a:B1):r(S)}function u(S){return S===45?(t.consume(S),e.interrupt?a:B1):r(S)}function s(S){return S===l.charCodeAt(o++)?(t.consume(S),o===l.length?e.interrupt?a:j:s):r(S)}function g(S){return g4(S)?(t.consume(S),l=String.fromCharCode(S),p):r(S)}function p(S){return S===null||S===47||S===62||R2(S)?S!==47&&n&&Fd.includes(l.toLowerCase())?(c=1,e.interrupt?a(S):j(S)):OV.includes(l.toLowerCase())?(c=6,S===47?(t.consume(S),L):e.interrupt?a(S):j(S)):(c=7,e.interrupt&&!e.parser.lazy[e.now().line]?r(S):n?m(S):f(S)):S===45||K2(S)?(t.consume(S),l+=String.fromCharCode(S),p):r(S)}function L(S){return S===62?(t.consume(S),e.interrupt?a:j):r(S)}function f(S){return U1(S)?(t.consume(S),f):T(S)}function m(S){return S===47?(t.consume(S),T):S===58||S===95||g4(S)?(t.consume(S),H):U1(S)?(t.consume(S),m):T(S)}function H(S){return S===45||S===46||S===58||S===95||K2(S)?(t.consume(S),H):w(S)}function w(S){return S===61?(t.consume(S),A):U1(S)?(t.consume(S),w):m(S)}function A(S){return S===null||S===60||S===61||S===62||S===96?r(S):S===34||S===39?(t.consume(S),i=S,C):U1(S)?(t.consume(S),A):(i=null,k(S))}function C(S){return S===null||a1(S)?r(S):S===i?(t.consume(S),I):(t.consume(S),C)}function k(S){return S===null||S===34||S===39||S===60||S===61||S===62||S===96||R2(S)?w(S):(t.consume(S),k)}function I(S){return S===47||S===62||U1(S)?m(S):r(S)}function T(S){return S===62?(t.consume(S),U):r(S)}function U(S){return U1(S)?(t.consume(S),U):S===null||a1(S)?j(S):r(S)}function j(S){return S===45&&c===2?(t.consume(S),H1):S===60&&c===1?(t.consume(S),w1):S===62&&c===4?(t.consume(S),_1):S===63&&c===3?(t.consume(S),B1):S===93&&c===5?(t.consume(S),P1):a1(S)&&(c===6||c===7)?t.check(XP,_1,Q)(S):S===null||a1(S)?Q(S):(t.consume(S),j)}function Q(S){return t.exit("htmlFlowData"),P(S)}function P(S){return S===null?F(S):a1(S)?t.attempt({tokenize:c1,partial:!0},P,F)(S):(t.enter("htmlFlowData"),j(S))}function c1(S,m4,B2){return P2;function P2(F2){return S.enter("lineEnding"),S.consume(F2),S.exit("lineEnding"),J2}function J2(F2){return e.parser.lazy[e.now().line]?B2(F2):m4(F2)}}function H1(S){return S===45?(t.consume(S),B1):j(S)}function w1(S){return S===47?(t.consume(S),l="",j1):j(S)}function j1(S){return S===62&&Fd.includes(l.toLowerCase())?(t.consume(S),_1):g4(S)&&l.length<8?(t.consume(S),l+=String.fromCharCode(S),j1):j(S)}function P1(S){return S===93?(t.consume(S),B1):j(S)}function B1(S){return S===62?(t.consume(S),_1):S===45&&c===2?(t.consume(S),B1):j(S)}function _1(S){return S===null||a1(S)?(t.exit("htmlFlowData"),F(S)):(t.consume(S),_1)}function F(S){return t.exit("htmlFlow"),a(S)}}function YP(t,a,r){return e;function e(c){return t.exit("htmlFlowData"),t.enter("lineEndingBlank"),t.consume(c),t.exit("lineEndingBlank"),t.attempt(s6,a,r)}}var kd={name:"htmlText",tokenize:JP};function JP(t,a,r){let e=this,c,n,l,o;return i;function i(F){return t.enter("htmlText"),t.enter("htmlTextData"),t.consume(F),h}function h(F){return F===33?(t.consume(F),v):F===47?(t.consume(F),k):F===63?(t.consume(F),A):g4(F)?(t.consume(F),U):r(F)}function v(F){return F===45?(t.consume(F),d):F===91?(t.consume(F),n="CDATA[",l=0,L):g4(F)?(t.consume(F),w):r(F)}function d(F){return F===45?(t.consume(F),u):r(F)}function u(F){return F===null||F===62?r(F):F===45?(t.consume(F),s):g(F)}function s(F){return F===null||F===62?r(F):g(F)}function g(F){return F===null?r(F):F===45?(t.consume(F),p):a1(F)?(o=g,P1(F)):(t.consume(F),g)}function p(F){return F===45?(t.consume(F),_1):g(F)}function L(F){return F===n.charCodeAt(l++)?(t.consume(F),l===n.length?f:L):r(F)}function f(F){return F===null?r(F):F===93?(t.consume(F),m):a1(F)?(o=f,P1(F)):(t.consume(F),f)}function m(F){return F===93?(t.consume(F),H):f(F)}function H(F){return F===62?_1(F):F===93?(t.consume(F),H):f(F)}function w(F){return F===null||F===62?_1(F):a1(F)?(o=w,P1(F)):(t.consume(F),w)}function A(F){return F===null?r(F):F===63?(t.consume(F),C):a1(F)?(o=A,P1(F)):(t.consume(F),A)}function C(F){return F===62?_1(F):A(F)}function k(F){return g4(F)?(t.consume(F),I):r(F)}function I(F){return F===45||K2(F)?(t.consume(F),I):T(F)}function T(F){return a1(F)?(o=T,P1(F)):U1(F)?(t.consume(F),T):_1(F)}function U(F){return F===45||K2(F)?(t.consume(F),U):F===47||F===62||R2(F)?j(F):r(F)}function j(F){return F===47?(t.consume(F),_1):F===58||F===95||g4(F)?(t.consume(F),Q):a1(F)?(o=j,P1(F)):U1(F)?(t.consume(F),j):_1(F)}function Q(F){return F===45||F===46||F===58||F===95||K2(F)?(t.consume(F),Q):P(F)}function P(F){return F===61?(t.consume(F),c1):a1(F)?(o=P,P1(F)):U1(F)?(t.consume(F),P):j(F)}function c1(F){return F===null||F===60||F===61||F===62||F===96?r(F):F===34||F===39?(t.consume(F),c=F,H1):a1(F)?(o=c1,P1(F)):U1(F)?(t.consume(F),c1):(t.consume(F),c=void 0,j1)}function H1(F){return F===c?(t.consume(F),w1):F===null?r(F):a1(F)?(o=H1,P1(F)):(t.consume(F),H1)}function w1(F){return F===62||F===47||R2(F)?j(F):r(F)}function j1(F){return F===null||F===34||F===39||F===60||F===61||F===96?r(F):F===62||R2(F)?j(F):(t.consume(F),j1)}function P1(F){return t.exit("htmlTextData"),t.enter("lineEnding"),t.consume(F),t.exit("lineEnding"),u1(t,B1,"linePrefix",e.parser.constructs.disable.null.includes("codeIndented")?void 0:4)}function B1(F){return t.enter("htmlTextData"),o(F)}function _1(F){return F===62?(t.consume(F),t.exit("htmlTextData"),t.exit("htmlText"),a):r(F)}}var l8={name:"labelEnd",tokenize:nT,resolveTo:cT,resolveAll:eT},tT={tokenize:lT},aT={tokenize:oT},rT={tokenize:iT};function eT(t){let a=-1,r;for(;++a-1&&(l[0]=l[0].slice(e)),n>0&&l.push(t[c].slice(0,n))),l}function wT(t,a){let r=-1,e=[],c;for(;++rUT,contentInitial:()=>TT,disable:()=>WT,document:()=>PT,flow:()=>DT,flowInitial:()=>_T,insideSpan:()=>GT,string:()=>NT,text:()=>ZT});var PT={[42]:M0,[43]:M0,[45]:M0,[48]:M0,[49]:M0,[50]:M0,[51]:M0,[52]:M0,[53]:M0,[54]:M0,[55]:M0,[56]:M0,[57]:M0,[62]:Ac},TT={[91]:sd},_T={[-2]:ea,[-1]:ea,[32]:ea},DT={[35]:pd,[42]:r8,[45]:[Ec,r8],[60]:fd,[61]:Ec,[95]:r8,[96]:Fc,[126]:Fc},NT={[38]:bc,[92]:Sc},ZT={[-5]:ca,[-4]:ca,[-3]:ca,[33]:md,[38]:bc,[42]:ra,[60]:[vd,Md],[91]:xd,[92]:[gd,Sc],[93]:a8,[95]:ra,[96]:dd},GT={null:[ra,dV]},UT={null:[42,95]},WT={null:[]};function fV(t={}){let a=YH([Hd].concat(t.extensions||[])),r={defined:[],lazy:{},constructs:a,content:e(cV),document:e(lV),flow:e(vV),string:e(uV),text:e(sV)};return r;function e(c){return n;function n(l){return zV(r,c,l)}}}var MV=/[\0\t\n\r]/g;function mV(){let t=1,a="",r=!0,e;return c;function c(n,l,o){let i=[],h,v,d,u,s;for(n=a+n.toString(l),d=0,a="",r&&(n.charCodeAt(0)===65279&&d++,r=void 0);d13&&r<32||r>126&&r<160||r>55295&&r<57344||r>64975&&r<65008||(r&65535)===65535||(r&65535)===65534||r>1114111?"\uFFFD":String.fromCharCode(r)}var jT=/\\([!-/:-@[-`{-~])|&(#(?:\d{1,7}|x[\da-f]{1,6})|[\da-z]{1,31});/gi;function HV(t){return t.replace(jT,qT)}function qT(t,a,r){if(a)return a;if(r.charCodeAt(0)===35){let c=r.charCodeAt(1),n=c===120||c===88;return Pc(r.slice(n?2:1),n?16:10)}return Gt(r)||t}var Vd={}.hasOwnProperty,Ld=function(t,a,r){return typeof a!="string"&&(r=a,a=void 0),XT(r)(xV(fV(r).document().write(mV()(t,a,!0))))};function XT(t={}){let a=LV({transforms:[],canContainEols:["emphasis","fragment","heading","paragraph","strong"],enter:{autolink:i($0),autolinkProtocol:Q,autolinkEmail:Q,atxHeading:i(q1),blockQuote:i(O1),characterEscape:Q,characterReference:Q,codeFenced:i(o1),codeFencedFenceInfo:h,codeFencedFenceMeta:h,codeIndented:i(o1,h),codeText:i(j1,h),codeTextData:Q,data:Q,codeFlowValue:Q,definition:i(_4),definitionDestinationString:h,definitionLabelString:h,definitionTitleString:h,emphasis:i(A5),hardBreakEscape:i(X0),hardBreakTrailing:i(X0),htmlFlow:i(D4,h),htmlFlowData:Q,htmlText:i(D4,h),htmlTextData:Q,image:i(h2),label:h,link:i($0),listItem:i(S5),listItemValue:p,listOrdered:i(b0,g),listUnordered:i(b0),paragraph:i(w2),reference:Q2,referenceString:h,resourceDestinationString:h,resourceTitleString:h,setextHeading:i(q1),strong:i(p4),thematicBreak:i(m3)},exit:{atxHeading:d(),atxHeadingSequence:E,autolink:d(),autolinkEmail:G,autolinkProtocol:Q1,blockQuote:d(),characterEscapeValue:T,characterReferenceMarkerHexadecimal:p1,characterReferenceMarkerNumeric:p1,characterReferenceValue:T4,codeFenced:d(H),codeFencedFence:m,codeFencedFenceInfo:L,codeFencedFenceMeta:f,codeFlowValue:T,codeIndented:d(w),codeText:d(P1),codeTextData:T,data:T,definition:d(),definitionDestinationString:k,definitionLabelString:A,definitionTitleString:C,emphasis:d(),hardBreakEscape:d(H1),hardBreakTrailing:d(H1),htmlFlow:d(w1),htmlFlowData:T,htmlText:d(W1),htmlTextData:T,image:d(k1),label:S,labelText:F,lineEnding:c1,link:d(B1),listItem:d(),listOrdered:d(),listUnordered:d(),paragraph:d(),referenceString:S2,resourceDestinationString:g4,resourceTitleString:C2,resource:E2,setextHeading:d(j),setextHeadingLineSequence:U,setextHeadingText:_,strong:d(),thematicBreak:d()}},t.mdastExtensions||[]),r={};return e;function e(P){let q={type:"root",children:[]},i1=[q],y1=[],P2=[],N4={stack:i1,tokenStack:y1,config:a,enter:v,exit:u,buffer:h,resume:s,setData:n,getData:l},R1=-1;for(;++R10){let A1=y1[y1.length-1];(A1[1]||VV).call(N4,void 0,A1[0])}for(q.position={start:o(P.length>0?P[0][1].start:{line:1,column:1,offset:0}),end:o(P.length>0?P[P.length-2][1].end:{line:1,column:1,offset:0})},R1=-1;++R1{let e=this.data("settings");return Ld(r,Object.assign({},e,t,{extensions:this.data("micromarkExtensions")||[],mdastExtensions:this.data("fromMarkdownExtensions")||[]}))}})}var CV=Cd;var F1=function(t,a,r){var e={type:String(t)};return r==null&&(typeof a=="string"||Array.isArray(a))?r=a:Object.assign(e,a),Array.isArray(r)?e.children=r:r!=null&&(e.value=String(r)),e};var Tc={}.hasOwnProperty;function KT(t,a){let r=a.data||{};return"value"in a&&!(Tc.call(r,"hName")||Tc.call(r,"hProperties")||Tc.call(r,"hChildren"))?t.augment(a,F1("text",a.value)):t(a,"div",I1(t,a))}function wd(t,a,r){let e=a&&a.type,c;if(!e)throw new Error("Expected node, got `"+a+"`");return Tc.call(t.handlers,e)?c=t.handlers[e]:t.passThrough&&t.passThrough.includes(e)?c=QT:c=t.unknownHandler,(typeof c=="function"?c:KT)(t,a,r)}function QT(t,a){return"children"in a?{...a,children:I1(t,a)}:a}function I1(t,a){let r=[];if("children"in a){let e=a.children,c=-1;for(;++c":""))+")"})),u;function u(){let s=[],g,p,L;if((!a||c(o,i,h[h.length-1]||null))&&(s=c_(r(o,h)),s[0]===wV))return s;if(o.children&&s[0]!==e_)for(p=(e?o.children.length:-1)+n,L=h.concat(o);p>-1&&p-1?e.offset:null}}}function AV(t){return!t||!t.position||!t.position.start||!t.position.start.line||!t.position.start.column||!t.position.end||!t.position.end.line||!t.position.end.column}var SV={}.hasOwnProperty;function FV(t){let a=Object.create(null);if(!t||!t.type)throw new Error("mdast-util-definitions expected node");return Dc(t,"definition",e=>{let c=bV(e.identifier);c&&!SV.call(a,c)&&(a[c]=e)}),r;function r(e){let c=bV(e);return c&&SV.call(a,c)?a[c]:null}}function bV(t){return String(t||"").toUpperCase()}function b4(t){let a=[],r=-1,e=0,c=0;for(;++r55295&&n<57344){let o=t.charCodeAt(r+1);n<56320&&o>56319&&o<57344?(l=String.fromCharCode(n,o),c=1):l="\uFFFD"}else l=String.fromCharCode(n);l&&(a.push(t.slice(e,r),encodeURIComponent(l)),e=r+c+1,l=""),c&&(r+=c,c=0)}return a.join("")+t.slice(e)}function D0(t,a){let r=[],e=-1;for(a&&r.push(F1("text",` +`;break}case-2:{l=a?" ":" ";break}case-1:{if(!a&&c)continue;l=" ";break}default:l=String.fromCharCode(n)}c=n===-2,e.push(l)}return e.join("")}var Id={};ks(Id,{attentionMarkers:()=>kT,contentInitial:()=>yT,disable:()=>_T,document:()=>BT,flow:()=>ST,flowInitial:()=>AT,insideSpan:()=>OT,string:()=>bT,text:()=>FT});var BT={[42]:x0,[43]:x0,[45]:x0,[48]:x0,[49]:x0,[50]:x0,[51]:x0,[52]:x0,[53]:x0,[54]:x0,[55]:x0,[56]:x0,[57]:x0,[62]:Pc},yT={[91]:Ad},AT={[-2]:ua,[-1]:ua,[32]:ua},ST={[35]:bd,[42]:o8,[45]:[jc,o8],[60]:Od,[61]:jc,[95]:o8,[96]:Dc,[126]:Dc},bT={[38]:Nc,[92]:Tc},FT={[-5]:sa,[-4]:sa,[-3]:sa,[33]:_d,[38]:Nc,[42]:da,[60]:[wd,kd],[91]:Rd,[92]:[Sd,Tc],[93]:l8,[95]:da,[96]:Bd},OT={null:[da,_V]},kT={null:[42,95]},_T={null:[]};function NV(t={}){let a=HV([Id].concat(t.extensions||[])),r={defined:[],lazy:{},constructs:a,content:e(yV),document:e(SV),flow:e(kV),string:e(RV),text:e(IV)};return r;function e(c){return n;function n(l){return TV(r,c,l)}}}var DV=/[\0\t\n\r]/g;function ZV(){let t=1,a="",r=!0,e;return c;function c(n,l,o){let i=[],h,v,d,u,s;for(n=a+n.toString(l),d=0,a="",r&&(n.charCodeAt(0)===65279&&d++,r=void 0);d13&&r<32||r>126&&r<160||r>55295&&r<57344||r>64975&&r<65008||(r&65535)===65535||(r&65535)===65534||r>1114111?"\uFFFD":String.fromCharCode(r)}var RT=/\\([!-/:-@[-`{-~])|&(#(?:\d{1,7}|x[\da-f]{1,6})|[\da-z]{1,31});/gi;function UV(t){return t.replace(RT,IT)}function IT(t,a,r){if(a)return a;if(r.charCodeAt(0)===35){let c=r.charCodeAt(1),n=c===120||c===88;return qc(r.slice(n?2:1),n?16:10)}return Kt(r)||t}var Ed={}.hasOwnProperty,Pd=function(t,a,r){return typeof a!="string"&&(r=a,a=void 0),ET(r)(GV(NV(r).document().write(ZV()(t,a,!0))))};function ET(t={}){let a=jV({transforms:[],canContainEols:["emphasis","fragment","heading","paragraph","strong"],enter:{autolink:i(J0),autolinkProtocol:Q,autolinkEmail:Q,atxHeading:i($1),blockQuote:i(k1),characterEscape:Q,characterReference:Q,codeFenced:i(o1),codeFencedFenceInfo:h,codeFencedFenceMeta:h,codeIndented:i(o1,h),codeText:i(q1,h),codeTextData:Q,data:Q,codeFlowValue:Q,definition:i(W4),definitionDestinationString:h,definitionLabelString:h,definitionTitleString:h,emphasis:i(R5),hardBreakEscape:i(Y0),hardBreakTrailing:i(Y0),htmlFlow:i(j4,h),htmlFlowData:Q,htmlText:i(j4,h),htmlTextData:Q,image:i(v2),label:h,link:i(J0),listItem:i(I5),listItemValue:p,listOrdered:i(k0,g),listUnordered:i(k0),paragraph:i(y2),reference:J2,referenceString:h,resourceDestinationString:h,resourceTitleString:h,setextHeading:i($1),strong:i(x4),thematicBreak:i(w3)},exit:{atxHeading:d(),atxHeadingSequence:I,autolink:d(),autolinkEmail:G,autolinkProtocol:Y1,blockQuote:d(),characterEscapeValue:P,characterReferenceMarkerHexadecimal:p1,characterReferenceMarkerNumeric:p1,characterReferenceValue:U4,codeFenced:d(H),codeFencedFence:m,codeFencedFenceInfo:L,codeFencedFenceMeta:f,codeFlowValue:P,codeIndented:d(w),codeText:d(P1),codeTextData:P,data:P,definition:d(),definitionDestinationString:k,definitionLabelString:A,definitionTitleString:C,emphasis:d(),hardBreakEscape:d(H1),hardBreakTrailing:d(H1),htmlFlow:d(w1),htmlFlowData:P,htmlText:d(j1),htmlTextData:P,image:d(_1),label:S,labelText:F,lineEnding:c1,link:d(B1),listItem:d(),listOrdered:d(),listUnordered:d(),paragraph:d(),referenceString:F2,resourceDestinationString:m4,resourceTitleString:B2,resource:P2,setextHeading:d(j),setextHeadingLineSequence:U,setextHeadingText:T,strong:d(),thematicBreak:d()}},t.mdastExtensions||[]),r={};return e;function e(E){let q={type:"root",children:[]},i1=[q],y1=[],T2=[],q4={stack:i1,tokenStack:y1,config:a,enter:v,exit:u,buffer:h,resume:s,setData:n,getData:l},R1=-1;for(;++R10){let A1=y1[y1.length-1];(A1[1]||WV).call(q4,void 0,A1[0])}for(q.position={start:o(E.length>0?E[0][1].start:{line:1,column:1,offset:0}),end:o(E.length>0?E[E.length-2][1].end:{line:1,column:1,offset:0})},R1=-1;++R1{let e=this.data("settings");return Pd(r,Object.assign({},e,t,{extensions:this.data("micromarkExtensions")||[],mdastExtensions:this.data("fromMarkdownExtensions")||[]}))}})}var qV=Td;var F1=function(t,a,r){var e={type:String(t)};return r==null&&(typeof a=="string"||Array.isArray(a))?r=a:Object.assign(e,a),Array.isArray(r)?e.children=r:r!=null&&(e.value=String(r)),e};var $c={}.hasOwnProperty;function TT(t,a){let r=a.data||{};return"value"in a&&!($c.call(r,"hName")||$c.call(r,"hProperties")||$c.call(r,"hChildren"))?t.augment(a,F1("text",a.value)):t(a,"div",I1(t,a))}function Nd(t,a,r){let e=a&&a.type,c;if(!e)throw new Error("Expected node, got `"+a+"`");return $c.call(t.handlers,e)?c=t.handlers[e]:t.passThrough&&t.passThrough.includes(e)?c=NT:c=t.unknownHandler,(typeof c=="function"?c:TT)(t,a,r)}function NT(t,a){return"children"in a?{...a,children:I1(t,a)}:a}function I1(t,a){let r=[];if("children"in a){let e=a.children,c=-1;for(;++c":""))+")"})),u;function u(){let s=[],g,p,L;if((!a||c(o,i,h[h.length-1]||null))&&(s=qT(r(o,h)),s[0]===$V))return s;if(o.children&&s[0]!==jT)for(p=(e?o.children.length:-1)+n,L=h.concat(o);p>-1&&p-1?e.offset:null}}}function QV(t){return!t||!t.position||!t.position.start||!t.position.start.line||!t.position.start.column||!t.position.end||!t.position.end.line||!t.position.end.column}var YV={}.hasOwnProperty;function tL(t){let a=Object.create(null);if(!t||!t.type)throw new Error("mdast-util-definitions expected node");return Kc(t,"definition",e=>{let c=JV(e.identifier);c&&!YV.call(a,c)&&(a[c]=e)}),r;function r(e){let c=JV(e);return c&&YV.call(a,c)?a[c]:null}}function JV(t){return String(t||"").toUpperCase()}function R4(t){let a=[],r=-1,e=0,c=0;for(;++r55295&&n<57344){let o=t.charCodeAt(r+1);n<56320&&o>56319&&o<57344?(l=String.fromCharCode(n,o),c=1):l="\uFFFD"}else l=String.fromCharCode(n);l&&(a.push(t.slice(e,r),encodeURIComponent(l)),e=r+c+1,l=""),c&&(r+=c,c=0)}return a.join("")+t.slice(e)}function G0(t,a){let r=[],e=-1;for(a&&r.push(F1("text",` `));++e0&&r.push(F1("text",` -`)),r}function OV(t){let a=-1,r=[];for(;++a1?"-"+o:""),dataFootnoteBackref:!0,className:["data-footnote-backref"],ariaLabel:t.footnoteBackLabel},children:[{type:"text",value:"\u21A9"}]};o>1&&d.children.push({type:"element",tagName:"sup",children:[{type:"text",value:String(o)}]}),i.length>0&&i.push({type:"text",value:" "}),i.push(d)}let h=c[c.length-1];if(h&&h.type==="element"&&h.tagName==="p"){let d=h.children[h.children.length-1];d&&d.type==="text"?d.value+=" ":h.children.push({type:"text",value:" "}),h.children.push(...i)}else c.push(...i);let v={type:"element",tagName:"li",properties:{id:t.clobberPrefix+"fn-"+l},children:D0(c,!0)};e.position&&(v.position=e.position),r.push(v)}return r.length===0?null:{type:"element",tagName:"section",properties:{dataFootnotes:!0,className:["footnotes"]},children:[{type:"element",tagName:t.footnoteLabelTagName,properties:{...JSON.parse(JSON.stringify(t.footnoteLabelProperties)),id:"footnote-label"},children:[F1("text",t.footnoteLabel)]},{type:"text",value:` -`},{type:"element",tagName:"ol",properties:{},children:D0(r,!0)},{type:"text",value:` -`}]}}function kV(t,a){return t(a,"blockquote",D0(I1(t,a),!0))}function RV(t,a){return[t(a,"br"),F1("text",` -`)]}function IV(t,a){let r=a.value?a.value+` -`:"",e=a.lang&&a.lang.match(/^[^ \t]+(?=[ \t]|$)/),c={};e&&(c.className=["language-"+e]);let n=t(a,"code",c,[F1("text",r)]);return a.meta&&(n.data={meta:a.meta}),t(a.position,"pre",[n])}function EV(t,a){return t(a,"del",I1(t,a))}function PV(t,a){return t(a,"em",I1(t,a))}function Gc(t,a){let r=String(a.identifier),e=b4(r.toLowerCase()),c=t.footnoteOrder.indexOf(r),n;c===-1?(t.footnoteOrder.push(r),t.footnoteCounts[r]=1,n=t.footnoteOrder.length):(t.footnoteCounts[r]++,n=c+1);let l=t.footnoteCounts[r];return t(a,"sup",[t(a.position,"a",{href:"#"+t.clobberPrefix+"fn-"+e,id:t.clobberPrefix+"fnref-"+e+(l>1?"-"+l:""),dataFootnoteRef:!0,ariaDescribedBy:"footnote-label"},[F1("text",String(n))])])}function TV(t,a){let r=t.footnoteById,e=1;for(;e in r;)e++;let c=String(e);return r[c]={type:"footnoteDefinition",identifier:c,children:[{type:"paragraph",children:a.children}],position:a.position},Gc(t,{type:"footnoteReference",identifier:c,position:a.position})}function _V(t,a){return t(a,"h"+a.depth,I1(t,a))}function DV(t,a){return t.dangerous?t.augment(a,F1("raw",a.value)):null}function Uc(t,a){let r=a.referenceType,e="]";if(r==="collapsed"?e+="[]":r==="full"&&(e+="["+(a.label||a.identifier)+"]"),a.type==="imageReference")return F1("text","!["+a.alt+e);let c=I1(t,a),n=c[0];n&&n.type==="text"?n.value="["+n.value:c.unshift(F1("text","["));let l=c[c.length-1];return l&&l.type==="text"?l.value+=e:c.push(F1("text",e)),c}function NV(t,a){let r=t.definition(a.identifier);if(!r)return Uc(t,a);let e={src:b4(r.url||""),alt:a.alt};return r.title!==null&&r.title!==void 0&&(e.title=r.title),t(a,"img",e)}function ZV(t,a){let r={src:b4(a.url),alt:a.alt};return a.title!==null&&a.title!==void 0&&(r.title=a.title),t(a,"img",r)}function GV(t,a){return t(a,"code",[F1("text",a.value.replace(/\r?\n|\r/g," "))])}function UV(t,a){let r=t.definition(a.identifier);if(!r)return Uc(t,a);let e={href:b4(r.url||"")};return r.title!==null&&r.title!==void 0&&(e.title=r.title),t(a,"a",e,I1(t,a))}function WV(t,a){let r={href:b4(a.url)};return a.title!==null&&a.title!==void 0&&(r.title=a.title),t(a,"a",r,I1(t,a))}function jV(t,a,r){let e=I1(t,a),c=r?n_(r):qV(a),n={},l=[];if(typeof a.checked=="boolean"){let h;e[0]&&e[0].type==="element"&&e[0].tagName==="p"?h=e[0]:(h=t(null,"p",[]),e.unshift(h)),h.children.length>0&&h.children.unshift(F1("text"," ")),h.children.unshift(t(null,"input",{type:"checkbox",checked:a.checked,disabled:!0})),n.className=["task-list-item"]}let o=-1;for(;++o1?"-"+o:""),dataFootnoteBackref:!0,className:["data-footnote-backref"],ariaLabel:t.footnoteBackLabel},children:[{type:"text",value:"\u21A9"}]};o>1&&d.children.push({type:"element",tagName:"sup",children:[{type:"text",value:String(o)}]}),i.length>0&&i.push({type:"text",value:" "}),i.push(d)}let h=c[c.length-1];if(h&&h.type==="element"&&h.tagName==="p"){let d=h.children[h.children.length-1];d&&d.type==="text"?d.value+=" ":h.children.push({type:"text",value:" "}),h.children.push(...i)}else c.push(...i);let v={type:"element",tagName:"li",properties:{id:t.clobberPrefix+"fn-"+l},children:G0(c,!0)};e.position&&(v.position=e.position),r.push(v)}return r.length===0?null:{type:"element",tagName:"section",properties:{dataFootnotes:!0,className:["footnotes"]},children:[{type:"element",tagName:t.footnoteLabelTagName,properties:{...JSON.parse(JSON.stringify(t.footnoteLabelProperties)),id:"footnote-label"},children:[F1("text",t.footnoteLabel)]},{type:"text",value:` +`},{type:"element",tagName:"ol",properties:{},children:G0(r,!0)},{type:"text",value:` +`}]}}function rL(t,a){return t(a,"blockquote",G0(I1(t,a),!0))}function eL(t,a){return[t(a,"br"),F1("text",` +`)]}function cL(t,a){let r=a.value?a.value+` +`:"",e=a.lang&&a.lang.match(/^[^ \t]+(?=[ \t]|$)/),c={};e&&(c.className=["language-"+e]);let n=t(a,"code",c,[F1("text",r)]);return a.meta&&(n.data={meta:a.meta}),t(a.position,"pre",[n])}function nL(t,a){return t(a,"del",I1(t,a))}function lL(t,a){return t(a,"em",I1(t,a))}function Jc(t,a){let r=String(a.identifier),e=R4(r.toLowerCase()),c=t.footnoteOrder.indexOf(r),n;c===-1?(t.footnoteOrder.push(r),t.footnoteCounts[r]=1,n=t.footnoteOrder.length):(t.footnoteCounts[r]++,n=c+1);let l=t.footnoteCounts[r];return t(a,"sup",[t(a.position,"a",{href:"#"+t.clobberPrefix+"fn-"+e,id:t.clobberPrefix+"fnref-"+e+(l>1?"-"+l:""),dataFootnoteRef:!0,ariaDescribedBy:"footnote-label"},[F1("text",String(n))])])}function oL(t,a){let r=t.footnoteById,e=1;for(;e in r;)e++;let c=String(e);return r[c]={type:"footnoteDefinition",identifier:c,children:[{type:"paragraph",children:a.children}],position:a.position},Jc(t,{type:"footnoteReference",identifier:c,position:a.position})}function iL(t,a){return t(a,"h"+a.depth,I1(t,a))}function hL(t,a){return t.dangerous?t.augment(a,F1("raw",a.value)):null}function tn(t,a){let r=a.referenceType,e="]";if(r==="collapsed"?e+="[]":r==="full"&&(e+="["+(a.label||a.identifier)+"]"),a.type==="imageReference")return F1("text","!["+a.alt+e);let c=I1(t,a),n=c[0];n&&n.type==="text"?n.value="["+n.value:c.unshift(F1("text","["));let l=c[c.length-1];return l&&l.type==="text"?l.value+=e:c.push(F1("text",e)),c}function vL(t,a){let r=t.definition(a.identifier);if(!r)return tn(t,a);let e={src:R4(r.url||""),alt:a.alt};return r.title!==null&&r.title!==void 0&&(e.title=r.title),t(a,"img",e)}function dL(t,a){let r={src:R4(a.url),alt:a.alt};return a.title!==null&&a.title!==void 0&&(r.title=a.title),t(a,"img",r)}function uL(t,a){return t(a,"code",[F1("text",a.value.replace(/\r?\n|\r/g," "))])}function sL(t,a){let r=t.definition(a.identifier);if(!r)return tn(t,a);let e={href:R4(r.url||"")};return r.title!==null&&r.title!==void 0&&(e.title=r.title),t(a,"a",e,I1(t,a))}function gL(t,a){let r={href:R4(a.url)};return a.title!==null&&a.title!==void 0&&(r.title=a.title),t(a,"a",r,I1(t,a))}function pL(t,a,r){let e=I1(t,a),c=r?$T(r):zL(a),n={},l=[];if(typeof a.checked=="boolean"){let h;e[0]&&e[0].type==="element"&&e[0].tagName==="p"?h=e[0]:(h=t(null,"p",[]),e.unshift(h)),h.children.length>0&&h.children.unshift(F1("text"," ")),h.children.unshift(t(null,"input",{type:"checkbox",checked:a.checked,disabled:!0})),n.className=["task-list-item"]}let o=-1;for(;++o1}function XV(t,a){let r={},e=a.ordered?"ol":"ul",c=I1(t,a),n=-1;for(typeof a.start=="number"&&a.start!==1&&(r.start=a.start);++n0,!0),e[0]),c=e.index+e[0].length,e=r.exec(a);return n.push(JV(a.slice(c),c>0,!1)),n.join("")}function JV(t,a,r){let e=0,c=t.length;if(a){let n=t.codePointAt(e);for(;n===9||n===32;)e++,n=t.codePointAt(e)}if(r){let n=t.codePointAt(c-1);for(;n===9||n===32;)c--,n=t.codePointAt(c-1)}return c>e?t.slice(e,c):""}function aL(t,a){return t.augment(a,F1("text",tL(String(a.value))))}function rL(t,a){return t(a,"hr")}var yd={blockquote:kV,break:RV,code:IV,delete:EV,emphasis:PV,footnoteReference:Gc,footnote:TV,heading:_V,html:DV,imageReference:NV,image:ZV,inlineCode:GV,linkReference:UV,link:WV,listItem:jV,list:XV,paragraph:$V,root:KV,strong:QV,table:YV,text:aL,thematicBreak:rL,toml:Wc,yaml:Wc,definition:Wc,footnoteDefinition:Wc};function Wc(){return null}var l_={}.hasOwnProperty;function o_(t,a){let r=a||{},e=r.allowDangerousHtml||!1,c={};return l.dangerous=e,l.clobberPrefix=r.clobberPrefix===void 0||r.clobberPrefix===null?"user-content-":r.clobberPrefix,l.footnoteLabel=r.footnoteLabel||"Footnotes",l.footnoteLabelTagName=r.footnoteLabelTagName||"h2",l.footnoteLabelProperties=r.footnoteLabelProperties||{className:["sr-only"]},l.footnoteBackLabel=r.footnoteBackLabel||"Back to content",l.definition=FV(t),l.footnoteById=c,l.footnoteOrder=[],l.footnoteCounts={},l.augment=n,l.handlers={...yd,...r.handlers},l.unknownHandler=r.unknownHandler,l.passThrough=r.passThrough,Dc(t,"footnoteDefinition",o=>{let i=String(o.identifier).toUpperCase();l_.call(c,i)||(c[i]=o)}),l;function n(o,i){if(o&&"data"in o&&o.data){let h=o.data;h.hName&&(i.type!=="element"&&(i={type:"element",tagName:"",properties:{},children:[]}),i.tagName=h.hName),i.type==="element"&&h.hProperties&&(i.properties={...i.properties,...h.hProperties}),"children"in i&&i.children&&h.hChildren&&(i.children=h.hChildren)}if(o){let h="type"in o?o:{position:o};AV(h)||(i.position={start:Nc(h),end:Zc(h)})}return i}function l(o,i,h,v){return Array.isArray(h)&&(v=h,h={}),n(o,{type:"element",tagName:i,properties:h||{},children:v||[]})}}function jc(t,a){let r=o_(t,a),e=wd(r,t,null),c=OV(r);return c&&e.children.push(F1("text",` -`),c),Array.isArray(e)?{type:"root",children:e}:e}var i_=function(t,a){return t&&"run"in t?h_(t,a):v_(t||a)},Ad=i_;function h_(t,a){return(r,e,c)=>{t.run(jc(r,a),e,n=>{c(n)})}}function v_(t){return a=>jc(a,t)}var v1=V($i(),1);var n3=class{constructor(a,r,e){this.property=a,this.normal=r,e&&(this.space=e)}};n3.prototype.property={};n3.prototype.normal={};n3.prototype.space=null;function Sd(t,a){let r={},e={},c=-1;for(;++cg1,booleanish:()=>V2,commaOrSpaceSeparated:()=>N0,commaSeparated:()=>h6,number:()=>N,overloadedBoolean:()=>bd,spaceSeparated:()=>$1});var d_=0,g1=e8(),V2=e8(),bd=e8(),N=e8(),$1=e8(),h6=e8(),N0=e8();function e8(){return 2**++d_}var Fd=Object.keys(la),c8=class extends m0{constructor(a,r,e,c){let n=-1;if(super(a,r),eL(this,"space",c),typeof e=="number")for(;++n4&&r.slice(0,4)==="data"&&s_.test(a)){if(a.charAt(4)==="-"){let n=a.slice(5).replace(lL,z_);e="data"+n.charAt(0).toUpperCase()+n.slice(1)}else{let n=a.slice(4);if(!lL.test(n)){let l=n.replace(g_,p_);l.charAt(0)!=="-"&&(l="-"+l),a="data"+l}}c=c8}return new c(e,a)}function p_(t){return"-"+t.toLowerCase()}function z_(t){return t.charAt(1).toUpperCase()}var $c={classId:"classID",dataType:"datatype",itemId:"itemID",strokeDashArray:"strokeDasharray",strokeDashOffset:"strokeDashoffset",strokeLineCap:"strokeLinecap",strokeLineJoin:"strokeLinejoin",strokeMiterLimit:"strokeMiterlimit",typeOf:"typeof",xLinkActuate:"xlinkActuate",xLinkArcRole:"xlinkArcrole",xLinkHref:"xlinkHref",xLinkRole:"xlinkRole",xLinkShow:"xlinkShow",xLinkTitle:"xlinkTitle",xLinkType:"xlinkType",xmlnsXLink:"xmlnsXlink"};var oL=Sd([kd,Od,Rd,Id,cL],"html"),iL=Sd([kd,Od,Rd,Id,nL],"svg");var Pd=function(t){if(t==null)return x_;if(typeof t=="string")return m_(t);if(typeof t=="object")return Array.isArray(t)?f_(t):M_(t);if(typeof t=="function")return Kc(t);throw new Error("Expected function, string, or object as test")};function f_(t){let a=[],r=-1;for(;++r":""))+")"})),u;function u(){let s=[],g,p,L;if((!a||c(o,i,h[h.length-1]||null))&&(s=L_(r(o,h)),s[0]===hL))return s;if(o.children&&s[0]!==V_)for(p=(e?o.children.length:-1)+n,L=h.concat(o);p>-1&&p{dL(a,"element",(r,e,c)=>{let n=c,l;if(t.allowedElements?l=!t.allowedElements.includes(r.tagName):t.disallowedElements&&(l=t.disallowedElements.includes(r.tagName)),!l&&t.allowElement&&typeof e=="number"&&(l=!t.allowElement(r,e,n)),l&&typeof e=="number")return t.unwrapDisallowed&&r.children?n.children.splice(e,1,...r.children):n.children.splice(e,1),e})}}var on=V(X(),1),yL=V(pL(),1);function zL(t){var a=t&&typeof t=="object"&&t.type==="text"?t.value||"":t;return typeof a=="string"&&a.replace(/[ \t\n\f\r]/g,"")===""}function fL(t){return t.join(" ").trim()}function ML(t,a){let r=a||{};return(t[t.length-1]===""?[...t,""]:t).join((r.padRight?" ":"")+","+(r.padLeft===!1?"":" ")).trim()}var AL=V(BL(),1),Zd={}.hasOwnProperty,T_=new Set(["table","thead","tbody","tfoot","tr"]);function Gd(t,a){let r=[],e=-1,c;for(;++e0?on.default.createElement(u,o,v):on.default.createElement(u,o)}function D_(t){let a=-1;for(;++aString(a)).join("")}var SL={}.hasOwnProperty,W_="https://github.com/remarkjs/react-markdown/blob/main/changelog.md",hn={plugins:{to:"plugins",id:"change-plugins-to-remarkplugins"},renderers:{to:"components",id:"change-renderers-to-components"},astPlugins:{id:"remove-buggy-html-in-markdown-parser"},allowDangerousHtml:{id:"remove-buggy-html-in-markdown-parser"},escapeHtml:{id:"remove-buggy-html-in-markdown-parser"},source:{to:"children",id:"change-source-to-children"},allowNode:{to:"allowElement",id:"replace-allownode-allowedtypes-and-disallowedtypes"},allowedTypes:{to:"allowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},disallowedTypes:{to:"disallowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},includeNodeIndex:{to:"includeElementIndex",id:"change-includenodeindex-to-includeelementindex"}};function oa(t){for(let n in hn)if(SL.call(hn,n)&&SL.call(t,n)){let l=hn[n];console.warn(`[react-markdown] Warning: please ${l.to?`use \`${l.to}\` instead of`:"remove"} \`${n}\` (see <${W_}#${l.id}> for more info)`),delete hn[n]}let a=od().use(CV).use(t.remarkPlugins||[]).use(Ad,{...t.remarkRehypeOptions,allowDangerousHtml:!0}).use(t.rehypePlugins||[]).use(Td,t),r=new $9;typeof t.children=="string"?r.value=t.children:t.children!==void 0&&t.children!==null&&console.warn(`[react-markdown] Warning: please pass a string as \`children\` (not: \`${t.children}\`)`);let e=a.runSync(a.parse(r),r);if(e.type!=="root")throw new TypeError("Expected a `root` node");let c=vn.default.createElement(vn.default.Fragment,{},Gd({options:t,schema:oL,listDepth:0},e));return t.className&&(c=vn.default.createElement("div",{className:t.className},c)),c}oa.defaultProps={transformLinkUri:xH};oa.propTypes={children:v1.default.string,className:v1.default.string,allowElement:v1.default.func,allowedElements:v1.default.arrayOf(v1.default.string),disallowedElements:v1.default.arrayOf(v1.default.string),unwrapDisallowed:v1.default.bool,remarkPlugins:v1.default.arrayOf(v1.default.oneOfType([v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.oneOfType([v1.default.bool,v1.default.string,v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.any)]))])),rehypePlugins:v1.default.arrayOf(v1.default.oneOfType([v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.oneOfType([v1.default.bool,v1.default.string,v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.any)]))])),sourcePos:v1.default.bool,rawSourcePos:v1.default.bool,skipHtml:v1.default.bool,includeElementIndex:v1.default.bool,transformLinkUri:v1.default.oneOfType([v1.default.func,v1.default.bool]),linkTarget:v1.default.oneOfType([v1.default.func,v1.default.string]),transformImageUri:v1.default.func,components:v1.default.object};var dn=V(X());var Ud=function(a){return a.reduce(function(r,e){var c=e[0],n=e[1];return r[c]=n,r},{})},Wd=typeof window<"u"&&window.document&&window.document.createElement?dn.useLayoutEffect:dn.useEffect;var u6=V(X()),JL=V(Z6());var L2="top",G2="bottom",R2="right",A2="left",un="auto",v6=[L2,G2,R2,A2],l3="start",l8="end",bL="clippingParents",sn="viewport",Ut="popper",FL="reference",jd=v6.reduce(function(t,a){return t.concat([a+"-"+l3,a+"-"+l8])},[]),gn=[].concat(v6,[un]).reduce(function(t,a){return t.concat([a,a+"-"+l3,a+"-"+l8])},[]),j_="beforeRead",q_="read",X_="afterRead",$_="beforeMain",K_="main",Q_="afterMain",Y_="beforeWrite",J_="write",tD="afterWrite",OL=[j_,q_,X_,$_,K_,Q_,Y_,J_,tD];function $2(t){return t?(t.nodeName||"").toLowerCase():null}function M2(t){if(t==null)return window;if(t.toString()!=="[object Window]"){var a=t.ownerDocument;return a&&a.defaultView||window}return t}function k4(t){var a=M2(t).Element;return t instanceof a||t instanceof Element}function U2(t){var a=M2(t).HTMLElement;return t instanceof a||t instanceof HTMLElement}function Wt(t){if(typeof ShadowRoot>"u")return!1;var a=M2(t).ShadowRoot;return t instanceof a||t instanceof ShadowRoot}function aD(t){var a=t.state;Object.keys(a.elements).forEach(function(r){var e=a.styles[r]||{},c=a.attributes[r]||{},n=a.elements[r];!U2(n)||!$2(n)||(Object.assign(n.style,e),Object.keys(c).forEach(function(l){var o=c[l];o===!1?n.removeAttribute(l):n.setAttribute(l,o===!0?"":o)}))})}function rD(t){var a=t.state,r={popper:{position:a.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(a.elements.popper.style,r.popper),a.styles=r,a.elements.arrow&&Object.assign(a.elements.arrow.style,r.arrow),function(){Object.keys(a.elements).forEach(function(e){var c=a.elements[e],n=a.attributes[e]||{},l=Object.keys(a.styles.hasOwnProperty(e)?a.styles[e]:r[e]),o=l.reduce(function(i,h){return i[h]="",i},{});!U2(c)||!$2(c)||(Object.assign(c.style,o),Object.keys(n).forEach(function(i){c.removeAttribute(i)}))})}}var kL={name:"applyStyles",enabled:!0,phase:"write",fn:aD,effect:rD,requires:["computeStyles"]};function K2(t){return t.split("-")[0]}var n5=Math.max,o8=Math.min,o3=Math.round;function jt(){var t=navigator.userAgentData;return t!=null&&t.brands?t.brands.map(function(a){return a.brand+"/"+a.version}).join(" "):navigator.userAgent}function ia(){return!/^((?!chrome|android).)*safari/i.test(jt())}function R4(t,a,r){a===void 0&&(a=!1),r===void 0&&(r=!1);var e=t.getBoundingClientRect(),c=1,n=1;a&&U2(t)&&(c=t.offsetWidth>0&&o3(e.width)/t.offsetWidth||1,n=t.offsetHeight>0&&o3(e.height)/t.offsetHeight||1);var l=k4(t)?M2(t):window,o=l.visualViewport,i=!ia()&&r,h=(e.left+(i&&o?o.offsetLeft:0))/c,v=(e.top+(i&&o?o.offsetTop:0))/n,d=e.width/c,u=e.height/n;return{width:d,height:u,top:v,right:h+d,bottom:v+u,left:h,x:h,y:v}}function i8(t){var a=R4(t),r=t.offsetWidth,e=t.offsetHeight;return Math.abs(a.width-r)<=1&&(r=a.width),Math.abs(a.height-e)<=1&&(e=a.height),{x:t.offsetLeft,y:t.offsetTop,width:r,height:e}}function ha(t,a){var r=a.getRootNode&&a.getRootNode();if(t.contains(a))return!0;if(r&&Wt(r)){var e=a;do{if(e&&t.isSameNode(e))return!0;e=e.parentNode||e.host}while(e)}return!1}function A0(t){return M2(t).getComputedStyle(t)}function qd(t){return["table","td","th"].indexOf($2(t))>=0}function e0(t){return((k4(t)?t.ownerDocument:t.document)||window.document).documentElement}function i3(t){return $2(t)==="html"?t:t.assignedSlot||t.parentNode||(Wt(t)?t.host:null)||e0(t)}function RL(t){return!U2(t)||A0(t).position==="fixed"?null:t.offsetParent}function eD(t){var a=/firefox/i.test(jt()),r=/Trident/i.test(jt());if(r&&U2(t)){var e=A0(t);if(e.position==="fixed")return null}var c=i3(t);for(Wt(c)&&(c=c.host);U2(c)&&["html","body"].indexOf($2(c))<0;){var n=A0(c);if(n.transform!=="none"||n.perspective!=="none"||n.contain==="paint"||["transform","perspective"].indexOf(n.willChange)!==-1||a&&n.willChange==="filter"||a&&n.filter&&n.filter!=="none")return c;c=c.parentNode}return null}function l5(t){for(var a=M2(t),r=RL(t);r&&qd(r)&&A0(r).position==="static";)r=RL(r);return r&&($2(r)==="html"||$2(r)==="body"&&A0(r).position==="static")?a:r||eD(t)||a}function h8(t){return["top","bottom"].indexOf(t)>=0?"x":"y"}function v8(t,a,r){return n5(t,o8(a,r))}function IL(t,a,r){var e=v8(t,a,r);return e>r?r:e}function va(){return{top:0,right:0,bottom:0,left:0}}function da(t){return Object.assign({},va(),t)}function ua(t,a){return a.reduce(function(r,e){return r[e]=t,r},{})}var cD=function(a,r){return a=typeof a=="function"?a(Object.assign({},r.rects,{placement:r.placement})):a,da(typeof a!="number"?a:ua(a,v6))};function nD(t){var a,r=t.state,e=t.name,c=t.options,n=r.elements.arrow,l=r.modifiersData.popperOffsets,o=K2(r.placement),i=h8(o),h=[A2,R2].indexOf(o)>=0,v=h?"height":"width";if(!(!n||!l)){var d=cD(c.padding,r),u=i8(n),s=i==="y"?L2:A2,g=i==="y"?G2:R2,p=r.rects.reference[v]+r.rects.reference[i]-l[i]-r.rects.popper[v],L=l[i]-r.rects.reference[i],f=l5(n),m=f?i==="y"?f.clientHeight||0:f.clientWidth||0:0,H=p/2-L/2,w=d[s],A=m-u[v]-d[g],C=m/2-u[v]/2+H,k=v8(w,C,A),E=i;r.modifiersData[e]=(a={},a[E]=k,a.centerOffset=k-C,a)}}function lD(t){var a=t.state,r=t.options,e=r.element,c=e===void 0?"[data-popper-arrow]":e;c!=null&&(typeof c=="string"&&(c=a.elements.popper.querySelector(c),!c)||!ha(a.elements.popper,c)||(a.elements.arrow=c))}var EL={name:"arrow",enabled:!0,phase:"main",fn:nD,effect:lD,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function I4(t){return t.split("-")[1]}var oD={top:"auto",right:"auto",bottom:"auto",left:"auto"};function iD(t){var a=t.x,r=t.y,e=window,c=e.devicePixelRatio||1;return{x:o3(a*c)/c||0,y:o3(r*c)/c||0}}function PL(t){var a,r=t.popper,e=t.popperRect,c=t.placement,n=t.variation,l=t.offsets,o=t.position,i=t.gpuAcceleration,h=t.adaptive,v=t.roundOffsets,d=t.isFixed,u=l.x,s=u===void 0?0:u,g=l.y,p=g===void 0?0:g,L=typeof v=="function"?v({x:s,y:p}):{x:s,y:p};s=L.x,p=L.y;var f=l.hasOwnProperty("x"),m=l.hasOwnProperty("y"),H=A2,w=L2,A=window;if(h){var C=l5(r),k="clientHeight",E="clientWidth";if(C===M2(r)&&(C=e0(r),A0(C).position!=="static"&&o==="absolute"&&(k="scrollHeight",E="scrollWidth")),C=C,c===L2||(c===A2||c===R2)&&n===l8){w=G2;var _=d&&C===A&&A.visualViewport?A.visualViewport.height:C[k];p-=_-e.height,p*=i?1:-1}if(c===A2||(c===L2||c===G2)&&n===l8){H=R2;var U=d&&C===A&&A.visualViewport?A.visualViewport.width:C[E];s-=U-e.width,s*=i?1:-1}}var j=Object.assign({position:o},h&&oD),Q=v===!0?iD({x:s,y:p}):{x:s,y:p};if(s=Q.x,p=Q.y,i){var T;return Object.assign({},j,(T={},T[w]=m?"0":"",T[H]=f?"0":"",T.transform=(A.devicePixelRatio||1)<=1?"translate("+s+"px, "+p+"px)":"translate3d("+s+"px, "+p+"px, 0)",T))}return Object.assign({},j,(a={},a[w]=m?p+"px":"",a[H]=f?s+"px":"",a.transform="",a))}function hD(t){var a=t.state,r=t.options,e=r.gpuAcceleration,c=e===void 0?!0:e,n=r.adaptive,l=n===void 0?!0:n,o=r.roundOffsets,i=o===void 0?!0:o;if(!1)var h;var v={placement:K2(a.placement),variation:I4(a.placement),popper:a.elements.popper,popperRect:a.rects.popper,gpuAcceleration:c,isFixed:a.options.strategy==="fixed"};a.modifiersData.popperOffsets!=null&&(a.styles.popper=Object.assign({},a.styles.popper,PL(Object.assign({},v,{offsets:a.modifiersData.popperOffsets,position:a.options.strategy,adaptive:l,roundOffsets:i})))),a.modifiersData.arrow!=null&&(a.styles.arrow=Object.assign({},a.styles.arrow,PL(Object.assign({},v,{offsets:a.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:i})))),a.attributes.popper=Object.assign({},a.attributes.popper,{"data-popper-placement":a.placement})}var TL={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:hD,data:{}};var pn={passive:!0};function vD(t){var a=t.state,r=t.instance,e=t.options,c=e.scroll,n=c===void 0?!0:c,l=e.resize,o=l===void 0?!0:l,i=M2(a.elements.popper),h=[].concat(a.scrollParents.reference,a.scrollParents.popper);return n&&h.forEach(function(v){v.addEventListener("scroll",r.update,pn)}),o&&i.addEventListener("resize",r.update,pn),function(){n&&h.forEach(function(v){v.removeEventListener("scroll",r.update,pn)}),o&&i.removeEventListener("resize",r.update,pn)}}var _L={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:vD,data:{}};var dD={left:"right",right:"left",bottom:"top",top:"bottom"};function qt(t){return t.replace(/left|right|bottom|top/g,function(a){return dD[a]})}var uD={start:"end",end:"start"};function zn(t){return t.replace(/start|end/g,function(a){return uD[a]})}function d8(t){var a=M2(t),r=a.pageXOffset,e=a.pageYOffset;return{scrollLeft:r,scrollTop:e}}function u8(t){return R4(e0(t)).left+d8(t).scrollLeft}function Xd(t,a){var r=M2(t),e=e0(t),c=r.visualViewport,n=e.clientWidth,l=e.clientHeight,o=0,i=0;if(c){n=c.width,l=c.height;var h=ia();(h||!h&&a==="fixed")&&(o=c.offsetLeft,i=c.offsetTop)}return{width:n,height:l,x:o+u8(t),y:i}}function $d(t){var a,r=e0(t),e=d8(t),c=(a=t.ownerDocument)==null?void 0:a.body,n=n5(r.scrollWidth,r.clientWidth,c?c.scrollWidth:0,c?c.clientWidth:0),l=n5(r.scrollHeight,r.clientHeight,c?c.scrollHeight:0,c?c.clientHeight:0),o=-e.scrollLeft+u8(t),i=-e.scrollTop;return A0(c||r).direction==="rtl"&&(o+=n5(r.clientWidth,c?c.clientWidth:0)-n),{width:n,height:l,x:o,y:i}}function s8(t){var a=A0(t),r=a.overflow,e=a.overflowX,c=a.overflowY;return/auto|scroll|overlay|hidden/.test(r+c+e)}function fn(t){return["html","body","#document"].indexOf($2(t))>=0?t.ownerDocument.body:U2(t)&&s8(t)?t:fn(i3(t))}function d6(t,a){var r;a===void 0&&(a=[]);var e=fn(t),c=e===((r=t.ownerDocument)==null?void 0:r.body),n=M2(e),l=c?[n].concat(n.visualViewport||[],s8(e)?e:[]):e,o=a.concat(l);return c?o:o.concat(d6(i3(l)))}function Xt(t){return Object.assign({},t,{left:t.x,top:t.y,right:t.x+t.width,bottom:t.y+t.height})}function sD(t,a){var r=R4(t,!1,a==="fixed");return r.top=r.top+t.clientTop,r.left=r.left+t.clientLeft,r.bottom=r.top+t.clientHeight,r.right=r.left+t.clientWidth,r.width=t.clientWidth,r.height=t.clientHeight,r.x=r.left,r.y=r.top,r}function DL(t,a,r){return a===sn?Xt(Xd(t,r)):k4(a)?sD(a,r):Xt($d(e0(t)))}function gD(t){var a=d6(i3(t)),r=["absolute","fixed"].indexOf(A0(t).position)>=0,e=r&&U2(t)?l5(t):t;return k4(e)?a.filter(function(c){return k4(c)&&ha(c,e)&&$2(c)!=="body"}):[]}function Kd(t,a,r,e){var c=a==="clippingParents"?gD(t):[].concat(a),n=[].concat(c,[r]),l=n[0],o=n.reduce(function(i,h){var v=DL(t,h,e);return i.top=n5(v.top,i.top),i.right=o8(v.right,i.right),i.bottom=o8(v.bottom,i.bottom),i.left=n5(v.left,i.left),i},DL(t,l,e));return o.width=o.right-o.left,o.height=o.bottom-o.top,o.x=o.left,o.y=o.top,o}function sa(t){var a=t.reference,r=t.element,e=t.placement,c=e?K2(e):null,n=e?I4(e):null,l=a.x+a.width/2-r.width/2,o=a.y+a.height/2-r.height/2,i;switch(c){case L2:i={x:l,y:a.y-r.height};break;case G2:i={x:l,y:a.y+a.height};break;case R2:i={x:a.x+a.width,y:o};break;case A2:i={x:a.x-r.width,y:o};break;default:i={x:a.x,y:a.y}}var h=c?h8(c):null;if(h!=null){var v=h==="y"?"height":"width";switch(n){case l3:i[h]=i[h]-(a[v]/2-r[v]/2);break;case l8:i[h]=i[h]+(a[v]/2-r[v]/2);break;default:}}return i}function o5(t,a){a===void 0&&(a={});var r=a,e=r.placement,c=e===void 0?t.placement:e,n=r.strategy,l=n===void 0?t.strategy:n,o=r.boundary,i=o===void 0?bL:o,h=r.rootBoundary,v=h===void 0?sn:h,d=r.elementContext,u=d===void 0?Ut:d,s=r.altBoundary,g=s===void 0?!1:s,p=r.padding,L=p===void 0?0:p,f=da(typeof L!="number"?L:ua(L,v6)),m=u===Ut?FL:Ut,H=t.rects.popper,w=t.elements[g?m:u],A=Kd(k4(w)?w:w.contextElement||e0(t.elements.popper),i,v,l),C=R4(t.elements.reference),k=sa({reference:C,element:H,strategy:"absolute",placement:c}),E=Xt(Object.assign({},H,k)),_=u===Ut?E:C,U={top:A.top-_.top+f.top,bottom:_.bottom-A.bottom+f.bottom,left:A.left-_.left+f.left,right:_.right-A.right+f.right},j=t.modifiersData.offset;if(u===Ut&&j){var Q=j[c];Object.keys(U).forEach(function(T){var c1=[R2,G2].indexOf(T)>=0?1:-1,H1=[L2,G2].indexOf(T)>=0?"y":"x";U[T]+=Q[H1]*c1})}return U}function Qd(t,a){a===void 0&&(a={});var r=a,e=r.placement,c=r.boundary,n=r.rootBoundary,l=r.padding,o=r.flipVariations,i=r.allowedAutoPlacements,h=i===void 0?gn:i,v=I4(e),d=v?o?jd:jd.filter(function(g){return I4(g)===v}):v6,u=d.filter(function(g){return h.indexOf(g)>=0});u.length===0&&(u=d);var s=u.reduce(function(g,p){return g[p]=o5(t,{placement:p,boundary:c,rootBoundary:n,padding:l})[K2(p)],g},{});return Object.keys(s).sort(function(g,p){return s[g]-s[p]})}function pD(t){if(K2(t)===un)return[];var a=qt(t);return[zn(t),a,zn(a)]}function zD(t){var a=t.state,r=t.options,e=t.name;if(!a.modifiersData[e]._skip){for(var c=r.mainAxis,n=c===void 0?!0:c,l=r.altAxis,o=l===void 0?!0:l,i=r.fallbackPlacements,h=r.padding,v=r.boundary,d=r.rootBoundary,u=r.altBoundary,s=r.flipVariations,g=s===void 0?!0:s,p=r.allowedAutoPlacements,L=a.options.placement,f=K2(L),m=f===L,H=i||(m||!g?[qt(L)]:pD(L)),w=[L].concat(H).reduce(function(C2,E2){return C2.concat(K2(E2)===un?Qd(a,{placement:E2,boundary:v,rootBoundary:d,padding:h,flipVariations:g,allowedAutoPlacements:p}):E2)},[]),A=a.rects.reference,C=a.rects.popper,k=new Map,E=!0,_=w[0],U=0;U=0,H1=c1?"width":"height",w1=o5(a,{placement:j,boundary:v,rootBoundary:d,altBoundary:u,padding:h}),W1=c1?T?R2:A2:T?G2:L2;A[H1]>C[H1]&&(W1=qt(W1));var P1=qt(W1),B1=[];if(n&&B1.push(w1[Q]<=0),o&&B1.push(w1[W1]<=0,w1[P1]<=0),B1.every(function(C2){return C2})){_=j,E=!1;break}k.set(j,B1)}if(E)for(var k1=g?3:1,F=function(E2){var Q2=w.find(function(S2){var p1=k.get(S2);if(p1)return p1.slice(0,E2).every(function(T4){return T4})});if(Q2)return _=Q2,"break"},S=k1;S>0;S--){var g4=F(S);if(g4==="break")break}a.placement!==_&&(a.modifiersData[e]._skip=!0,a.placement=_,a.reset=!0)}}var NL={name:"flip",enabled:!0,phase:"main",fn:zD,requiresIfExists:["offset"],data:{_skip:!1}};function ZL(t,a,r){return r===void 0&&(r={x:0,y:0}),{top:t.top-a.height-r.y,right:t.right-a.width+r.x,bottom:t.bottom-a.height+r.y,left:t.left-a.width-r.x}}function GL(t){return[L2,R2,G2,A2].some(function(a){return t[a]>=0})}function fD(t){var a=t.state,r=t.name,e=a.rects.reference,c=a.rects.popper,n=a.modifiersData.preventOverflow,l=o5(a,{elementContext:"reference"}),o=o5(a,{altBoundary:!0}),i=ZL(l,e),h=ZL(o,c,n),v=GL(i),d=GL(h);a.modifiersData[r]={referenceClippingOffsets:i,popperEscapeOffsets:h,isReferenceHidden:v,hasPopperEscaped:d},a.attributes.popper=Object.assign({},a.attributes.popper,{"data-popper-reference-hidden":v,"data-popper-escaped":d})}var UL={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:fD};function MD(t,a,r){var e=K2(t),c=[A2,L2].indexOf(e)>=0?-1:1,n=typeof r=="function"?r(Object.assign({},a,{placement:t})):r,l=n[0],o=n[1];return l=l||0,o=(o||0)*c,[A2,R2].indexOf(e)>=0?{x:o,y:l}:{x:l,y:o}}function mD(t){var a=t.state,r=t.options,e=t.name,c=r.offset,n=c===void 0?[0,0]:c,l=gn.reduce(function(v,d){return v[d]=MD(d,a.rects,n),v},{}),o=l[a.placement],i=o.x,h=o.y;a.modifiersData.popperOffsets!=null&&(a.modifiersData.popperOffsets.x+=i,a.modifiersData.popperOffsets.y+=h),a.modifiersData[e]=l}var WL={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:mD};function xD(t){var a=t.state,r=t.name;a.modifiersData[r]=sa({reference:a.rects.reference,element:a.rects.popper,strategy:"absolute",placement:a.placement})}var jL={name:"popperOffsets",enabled:!0,phase:"read",fn:xD,data:{}};function Yd(t){return t==="x"?"y":"x"}function HD(t){var a=t.state,r=t.options,e=t.name,c=r.mainAxis,n=c===void 0?!0:c,l=r.altAxis,o=l===void 0?!1:l,i=r.boundary,h=r.rootBoundary,v=r.altBoundary,d=r.padding,u=r.tether,s=u===void 0?!0:u,g=r.tetherOffset,p=g===void 0?0:g,L=o5(a,{boundary:i,rootBoundary:h,padding:d,altBoundary:v}),f=K2(a.placement),m=I4(a.placement),H=!m,w=h8(f),A=Yd(w),C=a.modifiersData.popperOffsets,k=a.rects.reference,E=a.rects.popper,_=typeof p=="function"?p(Object.assign({},a.rects,{placement:a.placement})):p,U=typeof _=="number"?{mainAxis:_,altAxis:_}:Object.assign({mainAxis:0,altAxis:0},_),j=a.modifiersData.offset?a.modifiersData.offset[a.placement]:null,Q={x:0,y:0};if(!!C){if(n){var T,c1=w==="y"?L2:A2,H1=w==="y"?G2:R2,w1=w==="y"?"height":"width",W1=C[w],P1=W1+L[c1],B1=W1-L[H1],k1=s?-E[w1]/2:0,F=m===l3?k[w1]:E[w1],S=m===l3?-E[w1]:-k[w1],g4=a.elements.arrow,C2=s&&g4?i8(g4):{width:0,height:0},E2=a.modifiersData["arrow#persistent"]?a.modifiersData["arrow#persistent"].padding:va(),Q2=E2[c1],S2=E2[H1],p1=v8(0,k[w1],C2[w1]),T4=H?k[w1]/2-k1-p1-Q2-U.mainAxis:F-p1-Q2-U.mainAxis,Q1=H?-k[w1]/2+k1+p1+S2+U.mainAxis:S+p1+S2+U.mainAxis,G=a.elements.arrow&&l5(a.elements.arrow),O1=G?w==="y"?G.clientTop||0:G.clientLeft||0:0,o1=(T=j?.[w])!=null?T:0,j1=W1+T4-o1-O1,_4=W1+Q1-o1,A5=v8(s?o8(P1,j1):P1,W1,s?n5(B1,_4):B1);C[w]=A5,Q[w]=A5-W1}if(o){var q1,X0=w==="x"?L2:A2,D4=w==="x"?G2:R2,h2=C[A],$0=A==="y"?"height":"width",b0=h2+L[X0],S5=h2-L[D4],w2=[L2,A2].indexOf(f)!==-1,p4=(q1=j?.[A])!=null?q1:0,l0=w2?b0:h2-k[$0]-E[$0]-p4+U.altAxis,m3=w2?h2+k[$0]+E[$0]-p4-U.altAxis:S5,P=s&&w2?IL(l0,h2,m3):v8(s?l0:b0,h2,s?m3:S5);C[A]=P,Q[A]=P-h2}a.modifiersData[e]=Q}}var qL={name:"preventOverflow",enabled:!0,phase:"main",fn:HD,requiresIfExists:["offset"]};function Jd(t){return{scrollLeft:t.scrollLeft,scrollTop:t.scrollTop}}function tu(t){return t===M2(t)||!U2(t)?d8(t):Jd(t)}function VD(t){var a=t.getBoundingClientRect(),r=o3(a.width)/t.offsetWidth||1,e=o3(a.height)/t.offsetHeight||1;return r!==1||e!==1}function au(t,a,r){r===void 0&&(r=!1);var e=U2(a),c=U2(a)&&VD(a),n=e0(a),l=R4(t,c,r),o={scrollLeft:0,scrollTop:0},i={x:0,y:0};return(e||!e&&!r)&&(($2(a)!=="body"||s8(n))&&(o=tu(a)),U2(a)?(i=R4(a,!0),i.x+=a.clientLeft,i.y+=a.clientTop):n&&(i.x=u8(n))),{x:l.left+o.scrollLeft-i.x,y:l.top+o.scrollTop-i.y,width:l.width,height:l.height}}function LD(t){var a=new Map,r=new Set,e=[];t.forEach(function(n){a.set(n.name,n)});function c(n){r.add(n.name);var l=[].concat(n.requires||[],n.requiresIfExists||[]);l.forEach(function(o){if(!r.has(o)){var i=a.get(o);i&&c(i)}}),e.push(n)}return t.forEach(function(n){r.has(n.name)||c(n)}),e}function ru(t){var a=LD(t);return OL.reduce(function(r,e){return r.concat(a.filter(function(c){return c.phase===e}))},[])}function eu(t){var a;return function(){return a||(a=new Promise(function(r){Promise.resolve().then(function(){a=void 0,r(t())})})),a}}function cu(t){var a=t.reduce(function(r,e){var c=r[e.name];return r[e.name]=c?Object.assign({},c,e,{options:Object.assign({},c.options,e.options),data:Object.assign({},c.data,e.data)}):e,r},{});return Object.keys(a).map(function(r){return a[r]})}var XL={placement:"bottom",modifiers:[],strategy:"absolute"};function $L(){for(var t=arguments.length,a=new Array(t),r=0;r1}function fL(t,a){let r={},e=a.ordered?"ol":"ul",c=I1(t,a),n=-1;for(typeof a.start=="number"&&a.start!==1&&(r.start=a.start);++n0,!0),e[0]),c=e.index+e[0].length,e=r.exec(a);return n.push(VL(a.slice(c),c>0,!1)),n.join("")}function VL(t,a,r){let e=0,c=t.length;if(a){let n=t.codePointAt(e);for(;n===9||n===32;)e++,n=t.codePointAt(e)}if(r){let n=t.codePointAt(c-1);for(;n===9||n===32;)c--,n=t.codePointAt(c-1)}return c>e?t.slice(e,c):""}function CL(t,a){return t.augment(a,F1("text",LL(String(a.value))))}function wL(t,a){return t(a,"hr")}var Zd={blockquote:rL,break:eL,code:cL,delete:nL,emphasis:lL,footnoteReference:Jc,footnote:oL,heading:iL,html:hL,imageReference:vL,image:dL,inlineCode:uL,linkReference:sL,link:gL,listItem:pL,list:fL,paragraph:ML,root:mL,strong:xL,table:HL,text:CL,thematicBreak:wL,toml:an,yaml:an,definition:an,footnoteDefinition:an};function an(){return null}var XT={}.hasOwnProperty;function KT(t,a){let r=a||{},e=r.allowDangerousHtml||!1,c={};return l.dangerous=e,l.clobberPrefix=r.clobberPrefix===void 0||r.clobberPrefix===null?"user-content-":r.clobberPrefix,l.footnoteLabel=r.footnoteLabel||"Footnotes",l.footnoteLabelTagName=r.footnoteLabelTagName||"h2",l.footnoteLabelProperties=r.footnoteLabelProperties||{className:["sr-only"]},l.footnoteBackLabel=r.footnoteBackLabel||"Back to content",l.definition=tL(t),l.footnoteById=c,l.footnoteOrder=[],l.footnoteCounts={},l.augment=n,l.handlers={...Zd,...r.handlers},l.unknownHandler=r.unknownHandler,l.passThrough=r.passThrough,Kc(t,"footnoteDefinition",o=>{let i=String(o.identifier).toUpperCase();XT.call(c,i)||(c[i]=o)}),l;function n(o,i){if(o&&"data"in o&&o.data){let h=o.data;h.hName&&(i.type!=="element"&&(i={type:"element",tagName:"",properties:{},children:[]}),i.tagName=h.hName),i.type==="element"&&h.hProperties&&(i.properties={...i.properties,...h.hProperties}),"children"in i&&i.children&&h.hChildren&&(i.children=h.hChildren)}if(o){let h="type"in o?o:{position:o};QV(h)||(i.position={start:Qc(h),end:Yc(h)})}return i}function l(o,i,h,v){return Array.isArray(h)&&(v=h,h={}),n(o,{type:"element",tagName:i,properties:h||{},children:v||[]})}}function rn(t,a){let r=KT(t,a),e=Nd(r,t,null),c=aL(r);return c&&e.children.push(F1("text",` +`),c),Array.isArray(e)?{type:"root",children:e}:e}var QT=function(t,a){return t&&"run"in t?YT(t,a):JT(t||a)},Gd=QT;function YT(t,a){return(r,e,c)=>{t.run(rn(r,a),e,n=>{c(n)})}}function JT(t){return a=>rn(a,t)}var v1=V(dh(),1);var u3=class{constructor(a,r,e){this.property=a,this.normal=r,e&&(this.space=e)}};u3.prototype.property={};u3.prototype.normal={};u3.prototype.space=null;function Ud(t,a){let r={},e={},c=-1;for(;++cg1,booleanish:()=>C2,commaOrSpaceSeparated:()=>U0,commaSeparated:()=>g6,number:()=>D,overloadedBoolean:()=>Wd,spaceSeparated:()=>K1});var tN=0,g1=i8(),C2=i8(),Wd=i8(),D=i8(),K1=i8(),g6=i8(),U0=i8();function i8(){return 2**++tN}var jd=Object.keys(pa),h8=class extends H0{constructor(a,r,e,c){let n=-1;if(super(a,r),BL(this,"space",c),typeof e=="number")for(;++n4&&r.slice(0,4)==="data"&&rN.test(a)){if(a.charAt(4)==="-"){let n=a.slice(5).replace(SL,nN);e="data"+n.charAt(0).toUpperCase()+n.slice(1)}else{let n=a.slice(4);if(!SL.test(n)){let l=n.replace(eN,cN);l.charAt(0)!=="-"&&(l="-"+l),a="data"+l}}c=h8}return new c(e,a)}function cN(t){return"-"+t.toLowerCase()}function nN(t){return t.charAt(1).toUpperCase()}var nn={classId:"classID",dataType:"datatype",itemId:"itemID",strokeDashArray:"strokeDasharray",strokeDashOffset:"strokeDashoffset",strokeLineCap:"strokeLinecap",strokeLineJoin:"strokeLinejoin",strokeMiterLimit:"strokeMiterlimit",typeOf:"typeof",xLinkActuate:"xlinkActuate",xLinkArcRole:"xlinkArcrole",xLinkHref:"xlinkHref",xLinkRole:"xlinkRole",xLinkShow:"xlinkShow",xLinkTitle:"xlinkTitle",xLinkType:"xlinkType",xmlnsXLink:"xmlnsXlink"};var bL=Ud([$d,qd,Xd,Kd,yL],"html"),FL=Ud([$d,qd,Xd,Kd,AL],"svg");var Yd=function(t){if(t==null)return hN;if(typeof t=="string")return iN(t);if(typeof t=="object")return Array.isArray(t)?lN(t):oN(t);if(typeof t=="function")return ln(t);throw new Error("Expected function, string, or object as test")};function lN(t){let a=[],r=-1;for(;++r":""))+")"})),u;function u(){let s=[],g,p,L;if((!a||c(o,i,h[h.length-1]||null))&&(s=uN(r(o,h)),s[0]===OL))return s;if(o.children&&s[0]!==dN)for(p=(e?o.children.length:-1)+n,L=h.concat(o);p>-1&&p{_L(a,"element",(r,e,c)=>{let n=c,l;if(t.allowedElements?l=!t.allowedElements.includes(r.tagName):t.disallowedElements&&(l=t.disallowedElements.includes(r.tagName)),!l&&t.allowElement&&typeof e=="number"&&(l=!t.allowElement(r,e,n)),l&&typeof e=="number")return t.unwrapDisallowed&&r.children?n.children.splice(e,1,...r.children):n.children.splice(e,1),e})}}var Mn=V($(),1),KL=V(PL(),1);function TL(t){var a=t&&typeof t=="object"&&t.type==="text"?t.value||"":t;return typeof a=="string"&&a.replace(/[ \t\n\f\r]/g,"")===""}function NL(t){return t.join(" ").trim()}function DL(t,a){let r=a||{};return(t[t.length-1]===""?[...t,""]:t).join((r.padRight?" ":"")+","+(r.padLeft===!1?"":" ")).trim()}var QL=V(XL(),1),eu={}.hasOwnProperty,yN=new Set(["table","thead","tbody","tfoot","tr"]);function cu(t,a){let r=[],e=-1,c;for(;++e0?Mn.default.createElement(u,o,v):Mn.default.createElement(u,o)}function SN(t){let a=-1;for(;++aString(a)).join("")}var YL={}.hasOwnProperty,_N="https://github.com/remarkjs/react-markdown/blob/main/changelog.md",mn={plugins:{to:"plugins",id:"change-plugins-to-remarkplugins"},renderers:{to:"components",id:"change-renderers-to-components"},astPlugins:{id:"remove-buggy-html-in-markdown-parser"},allowDangerousHtml:{id:"remove-buggy-html-in-markdown-parser"},escapeHtml:{id:"remove-buggy-html-in-markdown-parser"},source:{to:"children",id:"change-source-to-children"},allowNode:{to:"allowElement",id:"replace-allownode-allowedtypes-and-disallowedtypes"},allowedTypes:{to:"allowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},disallowedTypes:{to:"disallowedElements",id:"replace-allownode-allowedtypes-and-disallowedtypes"},includeNodeIndex:{to:"includeElementIndex",id:"change-includenodeindex-to-includeelementindex"}};function za(t){for(let n in mn)if(YL.call(mn,n)&&YL.call(t,n)){let l=mn[n];console.warn(`[react-markdown] Warning: please ${l.to?`use \`${l.to}\` instead of`:"remove"} \`${n}\` (see <${_N}#${l.id}> for more info)`),delete mn[n]}let a=Vd().use(qV).use(t.remarkPlugins||[]).use(Gd,{...t.remarkRehypeOptions,allowDangerousHtml:!0}).use(t.rehypePlugins||[]).use(Jd,t),r=new ca;typeof t.children=="string"?r.value=t.children:t.children!==void 0&&t.children!==null&&console.warn(`[react-markdown] Warning: please pass a string as \`children\` (not: \`${t.children}\`)`);let e=a.runSync(a.parse(r),r);if(e.type!=="root")throw new TypeError("Expected a `root` node");let c=xn.default.createElement(xn.default.Fragment,{},cu({options:t,schema:bL,listDepth:0},e));return t.className&&(c=xn.default.createElement("div",{className:t.className},c)),c}za.defaultProps={transformLinkUri:GH};za.propTypes={children:v1.default.string,className:v1.default.string,allowElement:v1.default.func,allowedElements:v1.default.arrayOf(v1.default.string),disallowedElements:v1.default.arrayOf(v1.default.string),unwrapDisallowed:v1.default.bool,remarkPlugins:v1.default.arrayOf(v1.default.oneOfType([v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.oneOfType([v1.default.bool,v1.default.string,v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.any)]))])),rehypePlugins:v1.default.arrayOf(v1.default.oneOfType([v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.oneOfType([v1.default.bool,v1.default.string,v1.default.object,v1.default.func,v1.default.arrayOf(v1.default.any)]))])),sourcePos:v1.default.bool,rawSourcePos:v1.default.bool,skipHtml:v1.default.bool,includeElementIndex:v1.default.bool,transformLinkUri:v1.default.oneOfType([v1.default.func,v1.default.bool]),linkTarget:v1.default.oneOfType([v1.default.func,v1.default.string]),transformImageUri:v1.default.func,components:v1.default.object};var Hn=V($());var nu=function(a){return a.reduce(function(r,e){var c=e[0],n=e[1];return r[c]=n,r},{})},lu=typeof window<"u"&&window.document&&window.document.createElement?Hn.useLayoutEffect:Hn.useEffect;var f6=V($()),VC=V(q6());var w2="top",U2="bottom",I2="right",b2="left",Vn="auto",p6=[w2,U2,I2,b2],s3="start",d8="end",JL="clippingParents",Ln="viewport",Qt="popper",tC="reference",ou=p6.reduce(function(t,a){return t.concat([a+"-"+s3,a+"-"+d8])},[]),Cn=[].concat(p6,[Vn]).reduce(function(t,a){return t.concat([a,a+"-"+s3,a+"-"+d8])},[]),RN="beforeRead",IN="read",EN="afterRead",PN="beforeMain",TN="main",NN="afterMain",DN="beforeWrite",ZN="write",GN="afterWrite",aC=[RN,IN,EN,PN,TN,NN,DN,ZN,GN];function Q2(t){return t?(t.nodeName||"").toLowerCase():null}function m2(t){if(t==null)return window;if(t.toString()!=="[object Window]"){var a=t.ownerDocument;return a&&a.defaultView||window}return t}function P4(t){var a=m2(t).Element;return t instanceof a||t instanceof Element}function W2(t){var a=m2(t).HTMLElement;return t instanceof a||t instanceof HTMLElement}function Yt(t){if(typeof ShadowRoot>"u")return!1;var a=m2(t).ShadowRoot;return t instanceof a||t instanceof ShadowRoot}function UN(t){var a=t.state;Object.keys(a.elements).forEach(function(r){var e=a.styles[r]||{},c=a.attributes[r]||{},n=a.elements[r];!W2(n)||!Q2(n)||(Object.assign(n.style,e),Object.keys(c).forEach(function(l){var o=c[l];o===!1?n.removeAttribute(l):n.setAttribute(l,o===!0?"":o)}))})}function WN(t){var a=t.state,r={popper:{position:a.options.strategy,left:"0",top:"0",margin:"0"},arrow:{position:"absolute"},reference:{}};return Object.assign(a.elements.popper.style,r.popper),a.styles=r,a.elements.arrow&&Object.assign(a.elements.arrow.style,r.arrow),function(){Object.keys(a.elements).forEach(function(e){var c=a.elements[e],n=a.attributes[e]||{},l=Object.keys(a.styles.hasOwnProperty(e)?a.styles[e]:r[e]),o=l.reduce(function(i,h){return i[h]="",i},{});!W2(c)||!Q2(c)||(Object.assign(c.style,o),Object.keys(n).forEach(function(i){c.removeAttribute(i)}))})}}var rC={name:"applyStyles",enabled:!0,phase:"write",fn:UN,effect:WN,requires:["computeStyles"]};function Y2(t){return t.split("-")[0]}var d5=Math.max,u8=Math.min,g3=Math.round;function Jt(){var t=navigator.userAgentData;return t!=null&&t.brands?t.brands.map(function(a){return a.brand+"/"+a.version}).join(" "):navigator.userAgent}function fa(){return!/^((?!chrome|android).)*safari/i.test(Jt())}function T4(t,a,r){a===void 0&&(a=!1),r===void 0&&(r=!1);var e=t.getBoundingClientRect(),c=1,n=1;a&&W2(t)&&(c=t.offsetWidth>0&&g3(e.width)/t.offsetWidth||1,n=t.offsetHeight>0&&g3(e.height)/t.offsetHeight||1);var l=P4(t)?m2(t):window,o=l.visualViewport,i=!fa()&&r,h=(e.left+(i&&o?o.offsetLeft:0))/c,v=(e.top+(i&&o?o.offsetTop:0))/n,d=e.width/c,u=e.height/n;return{width:d,height:u,top:v,right:h+d,bottom:v+u,left:h,x:h,y:v}}function s8(t){var a=T4(t),r=t.offsetWidth,e=t.offsetHeight;return Math.abs(a.width-r)<=1&&(r=a.width),Math.abs(a.height-e)<=1&&(e=a.height),{x:t.offsetLeft,y:t.offsetTop,width:r,height:e}}function Ma(t,a){var r=a.getRootNode&&a.getRootNode();if(t.contains(a))return!0;if(r&&Yt(r)){var e=a;do{if(e&&t.isSameNode(e))return!0;e=e.parentNode||e.host}while(e)}return!1}function b0(t){return m2(t).getComputedStyle(t)}function iu(t){return["table","td","th"].indexOf(Q2(t))>=0}function n0(t){return((P4(t)?t.ownerDocument:t.document)||window.document).documentElement}function p3(t){return Q2(t)==="html"?t:t.assignedSlot||t.parentNode||(Yt(t)?t.host:null)||n0(t)}function eC(t){return!W2(t)||b0(t).position==="fixed"?null:t.offsetParent}function jN(t){var a=/firefox/i.test(Jt()),r=/Trident/i.test(Jt());if(r&&W2(t)){var e=b0(t);if(e.position==="fixed")return null}var c=p3(t);for(Yt(c)&&(c=c.host);W2(c)&&["html","body"].indexOf(Q2(c))<0;){var n=b0(c);if(n.transform!=="none"||n.perspective!=="none"||n.contain==="paint"||["transform","perspective"].indexOf(n.willChange)!==-1||a&&n.willChange==="filter"||a&&n.filter&&n.filter!=="none")return c;c=c.parentNode}return null}function u5(t){for(var a=m2(t),r=eC(t);r&&iu(r)&&b0(r).position==="static";)r=eC(r);return r&&(Q2(r)==="html"||Q2(r)==="body"&&b0(r).position==="static")?a:r||jN(t)||a}function g8(t){return["top","bottom"].indexOf(t)>=0?"x":"y"}function p8(t,a,r){return d5(t,u8(a,r))}function cC(t,a,r){var e=p8(t,a,r);return e>r?r:e}function ma(){return{top:0,right:0,bottom:0,left:0}}function xa(t){return Object.assign({},ma(),t)}function Ha(t,a){return a.reduce(function(r,e){return r[e]=t,r},{})}var qN=function(a,r){return a=typeof a=="function"?a(Object.assign({},r.rects,{placement:r.placement})):a,xa(typeof a!="number"?a:Ha(a,p6))};function $N(t){var a,r=t.state,e=t.name,c=t.options,n=r.elements.arrow,l=r.modifiersData.popperOffsets,o=Y2(r.placement),i=g8(o),h=[b2,I2].indexOf(o)>=0,v=h?"height":"width";if(!(!n||!l)){var d=qN(c.padding,r),u=s8(n),s=i==="y"?w2:b2,g=i==="y"?U2:I2,p=r.rects.reference[v]+r.rects.reference[i]-l[i]-r.rects.popper[v],L=l[i]-r.rects.reference[i],f=u5(n),m=f?i==="y"?f.clientHeight||0:f.clientWidth||0:0,H=p/2-L/2,w=d[s],A=m-u[v]-d[g],C=m/2-u[v]/2+H,k=p8(w,C,A),I=i;r.modifiersData[e]=(a={},a[I]=k,a.centerOffset=k-C,a)}}function XN(t){var a=t.state,r=t.options,e=r.element,c=e===void 0?"[data-popper-arrow]":e;c!=null&&(typeof c=="string"&&(c=a.elements.popper.querySelector(c),!c)||!Ma(a.elements.popper,c)||(a.elements.arrow=c))}var nC={name:"arrow",enabled:!0,phase:"main",fn:$N,effect:XN,requires:["popperOffsets"],requiresIfExists:["preventOverflow"]};function N4(t){return t.split("-")[1]}var KN={top:"auto",right:"auto",bottom:"auto",left:"auto"};function QN(t){var a=t.x,r=t.y,e=window,c=e.devicePixelRatio||1;return{x:g3(a*c)/c||0,y:g3(r*c)/c||0}}function lC(t){var a,r=t.popper,e=t.popperRect,c=t.placement,n=t.variation,l=t.offsets,o=t.position,i=t.gpuAcceleration,h=t.adaptive,v=t.roundOffsets,d=t.isFixed,u=l.x,s=u===void 0?0:u,g=l.y,p=g===void 0?0:g,L=typeof v=="function"?v({x:s,y:p}):{x:s,y:p};s=L.x,p=L.y;var f=l.hasOwnProperty("x"),m=l.hasOwnProperty("y"),H=b2,w=w2,A=window;if(h){var C=u5(r),k="clientHeight",I="clientWidth";if(C===m2(r)&&(C=n0(r),b0(C).position!=="static"&&o==="absolute"&&(k="scrollHeight",I="scrollWidth")),C=C,c===w2||(c===b2||c===I2)&&n===d8){w=U2;var T=d&&C===A&&A.visualViewport?A.visualViewport.height:C[k];p-=T-e.height,p*=i?1:-1}if(c===b2||(c===w2||c===U2)&&n===d8){H=I2;var U=d&&C===A&&A.visualViewport?A.visualViewport.width:C[I];s-=U-e.width,s*=i?1:-1}}var j=Object.assign({position:o},h&&KN),Q=v===!0?QN({x:s,y:p}):{x:s,y:p};if(s=Q.x,p=Q.y,i){var P;return Object.assign({},j,(P={},P[w]=m?"0":"",P[H]=f?"0":"",P.transform=(A.devicePixelRatio||1)<=1?"translate("+s+"px, "+p+"px)":"translate3d("+s+"px, "+p+"px, 0)",P))}return Object.assign({},j,(a={},a[w]=m?p+"px":"",a[H]=f?s+"px":"",a.transform="",a))}function YN(t){var a=t.state,r=t.options,e=r.gpuAcceleration,c=e===void 0?!0:e,n=r.adaptive,l=n===void 0?!0:n,o=r.roundOffsets,i=o===void 0?!0:o;if(!1)var h;var v={placement:Y2(a.placement),variation:N4(a.placement),popper:a.elements.popper,popperRect:a.rects.popper,gpuAcceleration:c,isFixed:a.options.strategy==="fixed"};a.modifiersData.popperOffsets!=null&&(a.styles.popper=Object.assign({},a.styles.popper,lC(Object.assign({},v,{offsets:a.modifiersData.popperOffsets,position:a.options.strategy,adaptive:l,roundOffsets:i})))),a.modifiersData.arrow!=null&&(a.styles.arrow=Object.assign({},a.styles.arrow,lC(Object.assign({},v,{offsets:a.modifiersData.arrow,position:"absolute",adaptive:!1,roundOffsets:i})))),a.attributes.popper=Object.assign({},a.attributes.popper,{"data-popper-placement":a.placement})}var oC={name:"computeStyles",enabled:!0,phase:"beforeWrite",fn:YN,data:{}};var wn={passive:!0};function JN(t){var a=t.state,r=t.instance,e=t.options,c=e.scroll,n=c===void 0?!0:c,l=e.resize,o=l===void 0?!0:l,i=m2(a.elements.popper),h=[].concat(a.scrollParents.reference,a.scrollParents.popper);return n&&h.forEach(function(v){v.addEventListener("scroll",r.update,wn)}),o&&i.addEventListener("resize",r.update,wn),function(){n&&h.forEach(function(v){v.removeEventListener("scroll",r.update,wn)}),o&&i.removeEventListener("resize",r.update,wn)}}var iC={name:"eventListeners",enabled:!0,phase:"write",fn:function(){},effect:JN,data:{}};var tD={left:"right",right:"left",bottom:"top",top:"bottom"};function t7(t){return t.replace(/left|right|bottom|top/g,function(a){return tD[a]})}var aD={start:"end",end:"start"};function Bn(t){return t.replace(/start|end/g,function(a){return aD[a]})}function z8(t){var a=m2(t),r=a.pageXOffset,e=a.pageYOffset;return{scrollLeft:r,scrollTop:e}}function f8(t){return T4(n0(t)).left+z8(t).scrollLeft}function hu(t,a){var r=m2(t),e=n0(t),c=r.visualViewport,n=e.clientWidth,l=e.clientHeight,o=0,i=0;if(c){n=c.width,l=c.height;var h=fa();(h||!h&&a==="fixed")&&(o=c.offsetLeft,i=c.offsetTop)}return{width:n,height:l,x:o+f8(t),y:i}}function vu(t){var a,r=n0(t),e=z8(t),c=(a=t.ownerDocument)==null?void 0:a.body,n=d5(r.scrollWidth,r.clientWidth,c?c.scrollWidth:0,c?c.clientWidth:0),l=d5(r.scrollHeight,r.clientHeight,c?c.scrollHeight:0,c?c.clientHeight:0),o=-e.scrollLeft+f8(t),i=-e.scrollTop;return b0(c||r).direction==="rtl"&&(o+=d5(r.clientWidth,c?c.clientWidth:0)-n),{width:n,height:l,x:o,y:i}}function M8(t){var a=b0(t),r=a.overflow,e=a.overflowX,c=a.overflowY;return/auto|scroll|overlay|hidden/.test(r+c+e)}function yn(t){return["html","body","#document"].indexOf(Q2(t))>=0?t.ownerDocument.body:W2(t)&&M8(t)?t:yn(p3(t))}function z6(t,a){var r;a===void 0&&(a=[]);var e=yn(t),c=e===((r=t.ownerDocument)==null?void 0:r.body),n=m2(e),l=c?[n].concat(n.visualViewport||[],M8(e)?e:[]):e,o=a.concat(l);return c?o:o.concat(z6(p3(l)))}function a7(t){return Object.assign({},t,{left:t.x,top:t.y,right:t.x+t.width,bottom:t.y+t.height})}function rD(t,a){var r=T4(t,!1,a==="fixed");return r.top=r.top+t.clientTop,r.left=r.left+t.clientLeft,r.bottom=r.top+t.clientHeight,r.right=r.left+t.clientWidth,r.width=t.clientWidth,r.height=t.clientHeight,r.x=r.left,r.y=r.top,r}function hC(t,a,r){return a===Ln?a7(hu(t,r)):P4(a)?rD(a,r):a7(vu(n0(t)))}function eD(t){var a=z6(p3(t)),r=["absolute","fixed"].indexOf(b0(t).position)>=0,e=r&&W2(t)?u5(t):t;return P4(e)?a.filter(function(c){return P4(c)&&Ma(c,e)&&Q2(c)!=="body"}):[]}function du(t,a,r,e){var c=a==="clippingParents"?eD(t):[].concat(a),n=[].concat(c,[r]),l=n[0],o=n.reduce(function(i,h){var v=hC(t,h,e);return i.top=d5(v.top,i.top),i.right=u8(v.right,i.right),i.bottom=u8(v.bottom,i.bottom),i.left=d5(v.left,i.left),i},hC(t,l,e));return o.width=o.right-o.left,o.height=o.bottom-o.top,o.x=o.left,o.y=o.top,o}function Va(t){var a=t.reference,r=t.element,e=t.placement,c=e?Y2(e):null,n=e?N4(e):null,l=a.x+a.width/2-r.width/2,o=a.y+a.height/2-r.height/2,i;switch(c){case w2:i={x:l,y:a.y-r.height};break;case U2:i={x:l,y:a.y+a.height};break;case I2:i={x:a.x+a.width,y:o};break;case b2:i={x:a.x-r.width,y:o};break;default:i={x:a.x,y:a.y}}var h=c?g8(c):null;if(h!=null){var v=h==="y"?"height":"width";switch(n){case s3:i[h]=i[h]-(a[v]/2-r[v]/2);break;case d8:i[h]=i[h]+(a[v]/2-r[v]/2);break;default:}}return i}function s5(t,a){a===void 0&&(a={});var r=a,e=r.placement,c=e===void 0?t.placement:e,n=r.strategy,l=n===void 0?t.strategy:n,o=r.boundary,i=o===void 0?JL:o,h=r.rootBoundary,v=h===void 0?Ln:h,d=r.elementContext,u=d===void 0?Qt:d,s=r.altBoundary,g=s===void 0?!1:s,p=r.padding,L=p===void 0?0:p,f=xa(typeof L!="number"?L:Ha(L,p6)),m=u===Qt?tC:Qt,H=t.rects.popper,w=t.elements[g?m:u],A=du(P4(w)?w:w.contextElement||n0(t.elements.popper),i,v,l),C=T4(t.elements.reference),k=Va({reference:C,element:H,strategy:"absolute",placement:c}),I=a7(Object.assign({},H,k)),T=u===Qt?I:C,U={top:A.top-T.top+f.top,bottom:T.bottom-A.bottom+f.bottom,left:A.left-T.left+f.left,right:T.right-A.right+f.right},j=t.modifiersData.offset;if(u===Qt&&j){var Q=j[c];Object.keys(U).forEach(function(P){var c1=[I2,U2].indexOf(P)>=0?1:-1,H1=[w2,U2].indexOf(P)>=0?"y":"x";U[P]+=Q[H1]*c1})}return U}function uu(t,a){a===void 0&&(a={});var r=a,e=r.placement,c=r.boundary,n=r.rootBoundary,l=r.padding,o=r.flipVariations,i=r.allowedAutoPlacements,h=i===void 0?Cn:i,v=N4(e),d=v?o?ou:ou.filter(function(g){return N4(g)===v}):p6,u=d.filter(function(g){return h.indexOf(g)>=0});u.length===0&&(u=d);var s=u.reduce(function(g,p){return g[p]=s5(t,{placement:p,boundary:c,rootBoundary:n,padding:l})[Y2(p)],g},{});return Object.keys(s).sort(function(g,p){return s[g]-s[p]})}function cD(t){if(Y2(t)===Vn)return[];var a=t7(t);return[Bn(t),a,Bn(a)]}function nD(t){var a=t.state,r=t.options,e=t.name;if(!a.modifiersData[e]._skip){for(var c=r.mainAxis,n=c===void 0?!0:c,l=r.altAxis,o=l===void 0?!0:l,i=r.fallbackPlacements,h=r.padding,v=r.boundary,d=r.rootBoundary,u=r.altBoundary,s=r.flipVariations,g=s===void 0?!0:s,p=r.allowedAutoPlacements,L=a.options.placement,f=Y2(L),m=f===L,H=i||(m||!g?[t7(L)]:cD(L)),w=[L].concat(H).reduce(function(B2,P2){return B2.concat(Y2(P2)===Vn?uu(a,{placement:P2,boundary:v,rootBoundary:d,padding:h,flipVariations:g,allowedAutoPlacements:p}):P2)},[]),A=a.rects.reference,C=a.rects.popper,k=new Map,I=!0,T=w[0],U=0;U=0,H1=c1?"width":"height",w1=s5(a,{placement:j,boundary:v,rootBoundary:d,altBoundary:u,padding:h}),j1=c1?P?I2:b2:P?U2:w2;A[H1]>C[H1]&&(j1=t7(j1));var P1=t7(j1),B1=[];if(n&&B1.push(w1[Q]<=0),o&&B1.push(w1[j1]<=0,w1[P1]<=0),B1.every(function(B2){return B2})){T=j,I=!1;break}k.set(j,B1)}if(I)for(var _1=g?3:1,F=function(P2){var J2=w.find(function(F2){var p1=k.get(F2);if(p1)return p1.slice(0,P2).every(function(U4){return U4})});if(J2)return T=J2,"break"},S=_1;S>0;S--){var m4=F(S);if(m4==="break")break}a.placement!==T&&(a.modifiersData[e]._skip=!0,a.placement=T,a.reset=!0)}}var vC={name:"flip",enabled:!0,phase:"main",fn:nD,requiresIfExists:["offset"],data:{_skip:!1}};function dC(t,a,r){return r===void 0&&(r={x:0,y:0}),{top:t.top-a.height-r.y,right:t.right-a.width+r.x,bottom:t.bottom-a.height+r.y,left:t.left-a.width-r.x}}function uC(t){return[w2,I2,U2,b2].some(function(a){return t[a]>=0})}function lD(t){var a=t.state,r=t.name,e=a.rects.reference,c=a.rects.popper,n=a.modifiersData.preventOverflow,l=s5(a,{elementContext:"reference"}),o=s5(a,{altBoundary:!0}),i=dC(l,e),h=dC(o,c,n),v=uC(i),d=uC(h);a.modifiersData[r]={referenceClippingOffsets:i,popperEscapeOffsets:h,isReferenceHidden:v,hasPopperEscaped:d},a.attributes.popper=Object.assign({},a.attributes.popper,{"data-popper-reference-hidden":v,"data-popper-escaped":d})}var sC={name:"hide",enabled:!0,phase:"main",requiresIfExists:["preventOverflow"],fn:lD};function oD(t,a,r){var e=Y2(t),c=[b2,w2].indexOf(e)>=0?-1:1,n=typeof r=="function"?r(Object.assign({},a,{placement:t})):r,l=n[0],o=n[1];return l=l||0,o=(o||0)*c,[b2,I2].indexOf(e)>=0?{x:o,y:l}:{x:l,y:o}}function iD(t){var a=t.state,r=t.options,e=t.name,c=r.offset,n=c===void 0?[0,0]:c,l=Cn.reduce(function(v,d){return v[d]=oD(d,a.rects,n),v},{}),o=l[a.placement],i=o.x,h=o.y;a.modifiersData.popperOffsets!=null&&(a.modifiersData.popperOffsets.x+=i,a.modifiersData.popperOffsets.y+=h),a.modifiersData[e]=l}var gC={name:"offset",enabled:!0,phase:"main",requires:["popperOffsets"],fn:iD};function hD(t){var a=t.state,r=t.name;a.modifiersData[r]=Va({reference:a.rects.reference,element:a.rects.popper,strategy:"absolute",placement:a.placement})}var pC={name:"popperOffsets",enabled:!0,phase:"read",fn:hD,data:{}};function su(t){return t==="x"?"y":"x"}function vD(t){var a=t.state,r=t.options,e=t.name,c=r.mainAxis,n=c===void 0?!0:c,l=r.altAxis,o=l===void 0?!1:l,i=r.boundary,h=r.rootBoundary,v=r.altBoundary,d=r.padding,u=r.tether,s=u===void 0?!0:u,g=r.tetherOffset,p=g===void 0?0:g,L=s5(a,{boundary:i,rootBoundary:h,padding:d,altBoundary:v}),f=Y2(a.placement),m=N4(a.placement),H=!m,w=g8(f),A=su(w),C=a.modifiersData.popperOffsets,k=a.rects.reference,I=a.rects.popper,T=typeof p=="function"?p(Object.assign({},a.rects,{placement:a.placement})):p,U=typeof T=="number"?{mainAxis:T,altAxis:T}:Object.assign({mainAxis:0,altAxis:0},T),j=a.modifiersData.offset?a.modifiersData.offset[a.placement]:null,Q={x:0,y:0};if(!!C){if(n){var P,c1=w==="y"?w2:b2,H1=w==="y"?U2:I2,w1=w==="y"?"height":"width",j1=C[w],P1=j1+L[c1],B1=j1-L[H1],_1=s?-I[w1]/2:0,F=m===s3?k[w1]:I[w1],S=m===s3?-I[w1]:-k[w1],m4=a.elements.arrow,B2=s&&m4?s8(m4):{width:0,height:0},P2=a.modifiersData["arrow#persistent"]?a.modifiersData["arrow#persistent"].padding:ma(),J2=P2[c1],F2=P2[H1],p1=p8(0,k[w1],B2[w1]),U4=H?k[w1]/2-_1-p1-J2-U.mainAxis:F-p1-J2-U.mainAxis,Y1=H?-k[w1]/2+_1+p1+F2+U.mainAxis:S+p1+F2+U.mainAxis,G=a.elements.arrow&&u5(a.elements.arrow),k1=G?w==="y"?G.clientTop||0:G.clientLeft||0:0,o1=(P=j?.[w])!=null?P:0,q1=j1+U4-o1-k1,W4=j1+Y1-o1,R5=p8(s?u8(P1,q1):P1,j1,s?d5(B1,W4):B1);C[w]=R5,Q[w]=R5-j1}if(o){var $1,Y0=w==="x"?w2:b2,j4=w==="x"?U2:I2,v2=C[A],J0=A==="y"?"height":"width",k0=v2+L[Y0],I5=v2-L[j4],y2=[w2,b2].indexOf(f)!==-1,x4=($1=j?.[A])!=null?$1:0,i0=y2?k0:v2-k[J0]-I[J0]-x4+U.altAxis,w3=y2?v2+k[J0]+I[J0]-x4-U.altAxis:I5,E=s&&y2?cC(i0,v2,w3):p8(s?i0:k0,v2,s?w3:I5);C[A]=E,Q[A]=E-v2}a.modifiersData[e]=Q}}var zC={name:"preventOverflow",enabled:!0,phase:"main",fn:vD,requiresIfExists:["offset"]};function gu(t){return{scrollLeft:t.scrollLeft,scrollTop:t.scrollTop}}function pu(t){return t===m2(t)||!W2(t)?z8(t):gu(t)}function dD(t){var a=t.getBoundingClientRect(),r=g3(a.width)/t.offsetWidth||1,e=g3(a.height)/t.offsetHeight||1;return r!==1||e!==1}function zu(t,a,r){r===void 0&&(r=!1);var e=W2(a),c=W2(a)&&dD(a),n=n0(a),l=T4(t,c,r),o={scrollLeft:0,scrollTop:0},i={x:0,y:0};return(e||!e&&!r)&&((Q2(a)!=="body"||M8(n))&&(o=pu(a)),W2(a)?(i=T4(a,!0),i.x+=a.clientLeft,i.y+=a.clientTop):n&&(i.x=f8(n))),{x:l.left+o.scrollLeft-i.x,y:l.top+o.scrollTop-i.y,width:l.width,height:l.height}}function uD(t){var a=new Map,r=new Set,e=[];t.forEach(function(n){a.set(n.name,n)});function c(n){r.add(n.name);var l=[].concat(n.requires||[],n.requiresIfExists||[]);l.forEach(function(o){if(!r.has(o)){var i=a.get(o);i&&c(i)}}),e.push(n)}return t.forEach(function(n){r.has(n.name)||c(n)}),e}function fu(t){var a=uD(t);return aC.reduce(function(r,e){return r.concat(a.filter(function(c){return c.phase===e}))},[])}function Mu(t){var a;return function(){return a||(a=new Promise(function(r){Promise.resolve().then(function(){a=void 0,r(t())})})),a}}function mu(t){var a=t.reduce(function(r,e){var c=r[e.name];return r[e.name]=c?Object.assign({},c,e,{options:Object.assign({},c.options,e.options),data:Object.assign({},c.data,e.data)}):e,r},{});return Object.keys(a).map(function(r){return a[r]})}var fC={placement:"bottom",modifiers:[],strategy:"absolute"};function MC(){for(var t=arguments.length,a=new Array(t),r=0;r"u")&&!document.getElementById(aC)){var t=document.createElement("style");t.id=aC,t.textContent=bD,document.head.appendChild(t)}})();var ga={popover:"_popover_m2pq3_1",textContent:"_textContent_m2pq3_11",popperArrow:"_popperArrow_m2pq3_26",popoverMarkdown:"_popoverMarkdown_m2pq3_60"};var h3=V(b()),$t=({placement:t="right",showOn:a="hover",popoverContent:r,contentIsMd:e=!1,bgColor:c,openDelayMs:n=0,triggerEl:l})=>{let[o,i]=g8.default.useState(null),[h,v]=g8.default.useState(null),[d,u]=g8.default.useState(null),{styles:s,attributes:g,update:p}=lu(o,h,{placement:t,modifiers:[{name:"arrow",options:{element:d}},{name:"offset",options:{offset:[0,10]}}],strategy:"fixed"}),L=g8.default.useMemo(()=>({...s.popper,backgroundColor:c}),[c,s.popper]),f=g8.default.useMemo(()=>{let H;function w(){H=setTimeout(()=>{p?.(),h?.setAttribute("data-show","")},n)}function A(){clearTimeout(H),h?.removeAttribute("data-show")}return{[a==="hover"?"onMouseEnter":"onClick"]:()=>w(),onMouseLeave:()=>A(),onPointerDown:()=>A()}},[n,h,a,p]),m=typeof r!="string"?r:e?(0,h3.jsx)(oa,{className:ga.popoverMarkdown,children:r}):(0,h3.jsx)("div",{className:ga.textContent,children:r});return(0,h3.jsxs)(h3.Fragment,{children:[g8.default.cloneElement(l,{...f,ref:i}),(0,h3.jsxs)("div",{ref:v,className:ga.popover,style:L,...g.popper,children:[m,(0,h3.jsx)("div",{ref:u,className:ga.popperArrow,style:s.arrow})]})]})};var ou=V(b()),mn=({children:t,placement:a="right",showOn:r="hover",popoverContent:e,bgColor:c,openDelayMs:n=0,...l})=>(0,ou.jsx)($t,{placement:a,showOn:r,popoverContent:e,bgColor:c,openDelayMs:n,triggerEl:(0,ou.jsx)("button",{...l,children:t})});var rC="560ccc4ddd48948391ef33c0aade4c133ee964b31a0cb0c7e03488011dd090d2",FD=`._infoIcon_15ri6_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(CC)){var t=document.createElement("style");t.id=CC,t.textContent=mD,document.head.appendChild(t)}})();var La={popover:"_popover_m2pq3_1",textContent:"_textContent_m2pq3_11",popperArrow:"_popperArrow_m2pq3_26",popoverMarkdown:"_popoverMarkdown_m2pq3_60"};var z3=V(b()),r7=({placement:t="right",showOn:a="hover",popoverContent:r,contentIsMd:e=!1,bgColor:c,openDelayMs:n=0,triggerEl:l})=>{let[o,i]=m8.default.useState(null),[h,v]=m8.default.useState(null),[d,u]=m8.default.useState(null),{styles:s,attributes:g,update:p}=Hu(o,h,{placement:t,modifiers:[{name:"arrow",options:{element:d}},{name:"offset",options:{offset:[0,10]}}],strategy:"fixed"}),L=m8.default.useMemo(()=>({...s.popper,backgroundColor:c}),[c,s.popper]),f=m8.default.useMemo(()=>{let H;function w(){H=setTimeout(()=>{p?.(),h?.setAttribute("data-show","")},n)}function A(){clearTimeout(H),h?.removeAttribute("data-show")}return{[a==="hover"?"onMouseEnter":"onClick"]:()=>w(),onMouseLeave:()=>A(),onPointerDown:()=>A()}},[n,h,a,p]),m=typeof r!="string"?r:e?(0,z3.jsx)(za,{className:La.popoverMarkdown,children:r}):(0,z3.jsx)("div",{className:La.textContent,children:r});return(0,z3.jsxs)(z3.Fragment,{children:[m8.default.cloneElement(l,{...f,ref:i}),(0,z3.jsxs)("div",{ref:v,className:La.popover,style:L,...g.popper,children:[m,(0,z3.jsx)("div",{ref:u,className:La.popperArrow,style:s.arrow})]})]})};var Vu=V(b()),Sn=({children:t,placement:a="right",showOn:r="hover",popoverContent:e,bgColor:c,openDelayMs:n=0,...l})=>(0,Vu.jsx)(r7,{placement:a,showOn:r,popoverContent:e,bgColor:c,openDelayMs:n,triggerEl:(0,Vu.jsx)("button",{...l,children:t})});var wC="77f7c5d4d63100b95da8e96429a633d08ee87cd3e4f85ba8a1fa14ab2cbd311b",xD=`._infoIcon_15ri6_1 { width: 24px; color: var(--rstudio-blue); background-color: transparent; @@ -707,7 +722,7 @@ div#_size-detection-cell_i4cq9_1 { ._description_15ri6_31 { font-style: italic; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(rC)){var t=document.createElement("style");t.id=rC,t.textContent=FD,document.head.appendChild(t)}})();var p8={infoIcon:"_infoIcon_15ri6_1",container:"_container_15ri6_10",header:"_header_15ri6_15",info:"_info_15ri6_1",unit:"_unit_15ri6_27",description:"_description_15ri6_31"};var i5=V(b()),cC=({units:t})=>(0,i5.jsx)(mn,{className:p8.infoIcon,popoverContent:(0,i5.jsx)(OD,{units:t}),openDelayMs:500,placement:"auto",children:(0,i5.jsx)(Rh,{})});function OD({units:t}){return(0,i5.jsxs)("div",{className:p8.container,children:[(0,i5.jsx)("div",{className:p8.header,children:"CSS size options"}),(0,i5.jsx)("div",{className:p8.info,children:t.map(a=>(0,i5.jsxs)(eC.default.Fragment,{children:[(0,i5.jsx)("div",{className:p8.unit,children:a}),(0,i5.jsx)("div",{className:p8.description,children:kD[a]})]},a))})]})}var kD={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."};var nC="add487fbb1683657c9a55a4c14ef7f7dcb7899e80612ab4f25e072407c24088a",RD=`._wrapper_3jy8f_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(wC)){var t=document.createElement("style");t.id=wC,t.textContent=xD,document.head.appendChild(t)}})();var x8={infoIcon:"_infoIcon_15ri6_1",container:"_container_15ri6_10",header:"_header_15ri6_15",info:"_info_15ri6_1",unit:"_unit_15ri6_27",description:"_description_15ri6_31"};var g5=V(b()),yC=({units:t})=>(0,g5.jsx)(Sn,{className:x8.infoIcon,popoverContent:(0,g5.jsx)(HD,{units:t}),openDelayMs:500,placement:"auto",children:(0,g5.jsx)(Kh,{})});function HD({units:t}){return(0,g5.jsxs)("div",{className:x8.container,children:[(0,g5.jsx)("div",{className:x8.header,children:"CSS size options"}),(0,g5.jsx)("div",{className:x8.info,children:t.map(a=>(0,g5.jsxs)(BC.default.Fragment,{children:[(0,g5.jsx)("div",{className:x8.unit,children:a}),(0,g5.jsx)("div",{className:x8.description,children:VD[a]})]},a))})]})}var VD={"%":"Relative to percentage of container size",auto:"Let the content decide size",fr:"Relative unit. E.g. 2fr is twice the size of 1fr",px:"Screen pixels",rem:"Pixel size of app font. Typically 16 pixels."};var AC="590c8a5b13c37c956b608bc29ae5352cde0cc43e997a4700573156ea52c32bf9",LD=`._wrapper_3jy8f_1 { position: relative; display: flex; max-width: 135px; @@ -733,8 +748,8 @@ div#_size-detection-cell_i4cq9_1 { background-repeat: no-repeat; background-position: right; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(nC)){var t=document.createElement("style");t.id=nC,t.textContent=RD,document.head.appendChild(t)}})();var lC={wrapper:"_wrapper_3jy8f_1",unitSelector:"_unitSelector_3jy8f_9"};var s6=V(b());function xn({unit:t,availableUnits:a,onChange:r}){return(0,s6.jsxs)(s6.Fragment,{children:[(0,s6.jsx)("select",{className:lC.unitSelector,"aria-label":"value-unit",name:"value-unit",value:t,onChange:e=>r(e.target.value),children:a.map(e=>(0,s6.jsx)("option",{value:e,children:e},e))}),(0,s6.jsx)(cC,{units:a})]})}var g6=V(X());function c0(t){return t+"-label"}var L5=V(b());function oC({id:t,label:a,value:r,onChange:e}){return(0,L5.jsx)(z8,{id:t,"aria-label":a,"aria-labelledby":c0(t),value:r,onChange:e})}function z8({value:t,onChange:a,min:r=0,max:e,step:c,disabled:n,...l}){let{displayedVal:o,handleChange:i,handleBlur:h,incrementUp:v,incrementDown:d}=ID({min:r,max:e,step:c,value:t,onChange:a});return(0,L5.jsxs)("div",{className:"NumberInput SUE-Input","aria-disabled":n,onBlur:h,children:[(0,L5.jsx)("input",{...l,className:"input-field",type:"number",placeholder:"0",value:o,min:r,max:e,step:c,disabled:n,onChange:i}),(0,L5.jsxs)("div",{className:"incrementer-buttons",children:[(0,L5.jsx)("button",{className:"up-button","aria-label":"Increment number up",onClick:v,type:"button",children:(0,L5.jsx)(Zh,{})}),(0,L5.jsx)("button",{className:"down-button","aria-label":"Increment number down",onClick:d,type:"button",children:(0,L5.jsx)(Eh,{})})]})]})}function ID({min:t=-1/0,max:a=1/0,step:r=1,value:e,onChange:c}){let n=g6.default.useCallback(s=>g=>{if(g.preventDefault(),typeof e!="number"||typeof r!="number")return;let p=e+(s==="up"?1:-1)*r;typeof t=="number"&&t>p||typeof a=="number"&&an("up"),[n]),o=g6.default.useMemo(()=>n("down"),[n]),[i,h]=g6.default.useState(e);g6.default.useEffect(()=>h(e),[e]);let v=g6.default.useCallback(s=>{let g=s.target.value;h(p=>Number(p)===Number(g)?p:g),c(Number(g))},[c]),d=g6.default.useCallback(()=>{h(s=>Number(s).toString())},[]);return{incrementUp:l,incrementDown:o,handleChange:v,displayedVal:i===0||i===null?"":i,handleBlur:d}}var iu=V(b());function iC({text:t,position:a="down",size:r,children:e}){return(0,iu.jsx)("span",{"aria-label":t,"data-balloon-pos":a,"data-balloon-length":r,children:e})}function v3({text:t,position:a="down",size:r,children:e,...c}){return(0,iu.jsx)(Y1,{"aria-label":t,"data-balloon-pos":a,"data-balloon-length":r,variant:"icon",...c,children:e})}function hu(t,a){let r=Math.abs(a-t)+1,e=tt+n*e)}function vC({areas:t,row_sizes:a,col_sizes:r,gap_size:e}){return{gridTemplateAreas:t.map(c=>`"${c.join(" ")}"`).join(` - `),gridTemplateRows:a.join(" "),gridTemplateColumns:r.join(" "),"--grid-gap":e}}function hC(t){return t.split(" ")}function ED(t){let a=t.match(/"([.\w\s]+)"/g);if(!a)throw new Error("Can't parse area definition");return a.map(r=>r.replaceAll('"',"").split(" "))}function dC(t){let a=hC(t.style.gridTemplateRows),r=hC(t.style.gridTemplateColumns),e=ED(t.style.gridTemplateAreas),c=t.style.getPropertyValue("--grid-gap");return{row_sizes:a,col_sizes:r,areas:e,gap_size:c}}function Hn({container:t,dir:a}){return getComputedStyle(t).getPropertyValue(a==="rows"?"grid-template-rows":"grid-template-columns").split(" ").map(r=>Number(r.replaceAll("px","")))}var pa=t=>Number(t.toFixed(4));var Vn=40,PD=.15,uC=t=>a=>Math.round(a/t)*t,TD=5,za=uC(TD),_D=.01,vu=uC(_D);function sC(t,{pixelToFrRatio:a,beforeInfo:r,afterInfo:e}){let c=vu(t*a),n=r.count+c,l=e.count-c;return(c<0?n/l:l/n)=n.length?null:n[h];if(v==="auto"||d==="auto"){let g=getComputedStyle(e).getPropertyValue(a==="rows"?"grid-template-rows":"grid-template-columns").split(" ");v==="auto"&&(v=g[i],n[i]=v),d==="auto"&&(d=g[h],n[h]=d),e.style[c]=g.join(" ")}let u=DD(v,d);if(u.type==="unsupported")throw new Error("Unsupported drag type");e.classList.add("been-dragged");let s={dir:a,mouseStart:xC(t,a),originalSizes:n,currentSizes:[...n],beforeIndex:i,afterIndex:h,...u,pixelToFrRatio:1};return u.type==="both-relative"&&(s.pixelToFrRatio=ND({container:e,index:r,dir:a,frCounts:{before:u.beforeInfo.count,after:u.afterInfo.count}})),s}function MC({mousePosition:t,drag:a,container:r}){let c=xC(t,a.dir)-a.mouseStart,n=[...a.originalSizes],l;switch(a.type){case"before-pixel":l=pC(c,a);break;case"after-pixel":l=zC(c,a);break;case"both-pixel":l=gC(c,a);break;case"both-relative":l=sC(c,a);break}l!=="no-change"&&(l.beforeSize&&(n[a.beforeIndex]=l.beforeSize),l.afterSize&&(n[a.afterIndex]=l.afterSize),a.currentSizes=n,a.dir==="cols"?r.style.gridTemplateColumns=n.join(" "):r.style.gridTemplateRows=n.join(" "))}function ZD(t){return t.match(/[0-9|.]+px/)!==null}function mC(t){return t.match(/[0-9|.]+fr/)!==null}function Ln(t){if(mC(t))return{type:"fr",count:Number(t.replace("fr","")),value:t};if(ZD(t))return{type:"pixel",count:Number(t.replace("px","")),value:t};throw new Error("Unknown tract sizing unit: "+t)}function xC(t,a){return a==="rows"?t.clientY:t.clientX}function GD(t){return t.some(a=>mC(a))}function UD(t){return t.some(a=>a==="auto")}var HC="398f3eec9eaad13a90b11b0c3f5b3c8347d7c6da4e11d778ffe10c0509f4da83",WD=`._tractInfoDisplay_cvtwo_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(AC)){var t=document.createElement("style");t.id=AC,t.textContent=LD,document.head.appendChild(t)}})();var SC={wrapper:"_wrapper_3jy8f_1",unitSelector:"_unitSelector_3jy8f_9"};var M6=V(b());function bn({unit:t,availableUnits:a,onChange:r}){return(0,M6.jsxs)(M6.Fragment,{children:[(0,M6.jsx)("select",{className:SC.unitSelector,"aria-label":"value-unit",name:"value-unit",value:t,onChange:e=>r(e.target.value),children:a.map(e=>(0,M6.jsx)("option",{value:e,children:e},e))}),(0,M6.jsx)(yC,{units:a})]})}var m6=V($());function l0(t){return t+"-label"}var F5=V(b());function bC({id:t,label:a,value:r,onChange:e}){return(0,F5.jsx)(H8,{id:t,"aria-label":a,"aria-labelledby":l0(t),value:r,onChange:e})}function H8({value:t,onChange:a,min:r=0,max:e,step:c,disabled:n,...l}){let{displayedVal:o,handleChange:i,handleBlur:h,incrementUp:v,incrementDown:d}=CD({min:r,max:e,step:c,value:t,onChange:a});return(0,F5.jsxs)("div",{className:"NumberInput SUE-Input","aria-disabled":n,onBlur:h,children:[(0,F5.jsx)("input",{...l,className:"input-field",type:"number",placeholder:"0",value:o,min:r,max:e,step:c,disabled:n,onChange:i}),(0,F5.jsxs)("div",{className:"incrementer-buttons",children:[(0,F5.jsx)("button",{className:"up-button","aria-label":"Increment number up",onClick:v,type:"button",children:(0,F5.jsx)(cv,{})}),(0,F5.jsx)("button",{className:"down-button","aria-label":"Increment number down",onClick:d,type:"button",children:(0,F5.jsx)(Yh,{})})]})]})}function CD({min:t=-1/0,max:a=1/0,step:r=1,value:e,onChange:c}){let n=m6.default.useCallback(s=>g=>{if(g.preventDefault(),typeof e!="number"||typeof r!="number")return;let p=e+(s==="up"?1:-1)*r;typeof t=="number"&&t>p||typeof a=="number"&&an("up"),[n]),o=m6.default.useMemo(()=>n("down"),[n]),[i,h]=m6.default.useState(e);m6.default.useEffect(()=>h(e),[e]);let v=m6.default.useCallback(s=>{let g=s.target.value;h(p=>Number(p)===Number(g)?p:g),c(Number(g))},[c]),d=m6.default.useCallback(()=>{h(s=>Number(s).toString())},[]);return{incrementUp:l,incrementDown:o,handleChange:v,displayedVal:i===0||i===null?"":i,handleBlur:d}}var Lu=V(b());function FC({text:t,position:a="down",size:r,children:e}){return(0,Lu.jsx)("span",{"aria-label":t,"data-balloon-pos":a,"data-balloon-length":r,children:e})}function W0({text:t,position:a="down",size:r,children:e,variant:c="icon",...n}){return(0,Lu.jsx)(Z1,{"aria-label":t,"data-balloon-pos":a,"data-balloon-length":r,variant:c,...n,children:e})}function Cu(t,a){let r=Math.abs(a-t)+1,e=tt+n*e)}function kC({areas:t,row_sizes:a,col_sizes:r,gap_size:e}){return{gridTemplateAreas:t.map(c=>`"${c.join(" ")}"`).join(` + `),gridTemplateRows:a.join(" "),gridTemplateColumns:r.join(" "),"--grid-gap":e}}function OC(t){return t.split(" ")}function wD(t){let a=t.match(/"([.\w\s]+)"/g);if(!a)throw new Error("Can't parse area definition");return a.map(r=>r.replaceAll('"',"").split(" "))}function _C(t){let a=OC(t.style.gridTemplateRows),r=OC(t.style.gridTemplateColumns),e=wD(t.style.gridTemplateAreas),c=t.style.getPropertyValue("--grid-gap");return{row_sizes:a,col_sizes:r,areas:e,gap_size:c}}function Fn({container:t,dir:a}){return getComputedStyle(t).getPropertyValue(a==="rows"?"grid-template-rows":"grid-template-columns").split(" ").map(r=>Number(r.replaceAll("px","")))}var Ca=t=>Number(t.toFixed(4));var On=40,BD=.15,RC=t=>a=>Math.round(a/t)*t,yD=5,wa=RC(yD),AD=.01,wu=RC(AD);function IC(t,{pixelToFrRatio:a,beforeInfo:r,afterInfo:e}){let c=wu(t*a),n=r.count+c,l=e.count-c;return(c<0?n/l:l/n)=n.length?null:n[h];if(v==="auto"||d==="auto"){let g=getComputedStyle(e).getPropertyValue(a==="rows"?"grid-template-rows":"grid-template-columns").split(" ");v==="auto"&&(v=g[i],n[i]=v),d==="auto"&&(d=g[h],n[h]=d),e.style[c]=g.join(" ")}let u=SD(v,d);if(u.type==="unsupported")throw new Error("Unsupported drag type");e.classList.add("been-dragged");let s={dir:a,mouseStart:GC(t,a),originalSizes:n,currentSizes:[...n],beforeIndex:i,afterIndex:h,...u,pixelToFrRatio:1};return u.type==="both-relative"&&(s.pixelToFrRatio=bD({container:e,index:r,dir:a,frCounts:{before:u.beforeInfo.count,after:u.afterInfo.count}})),s}function DC({mousePosition:t,drag:a,container:r}){let c=GC(t,a.dir)-a.mouseStart,n=[...a.originalSizes],l;switch(a.type){case"before-pixel":l=PC(c,a);break;case"after-pixel":l=TC(c,a);break;case"both-pixel":l=EC(c,a);break;case"both-relative":l=IC(c,a);break}l!=="no-change"&&(l.beforeSize&&(n[a.beforeIndex]=l.beforeSize),l.afterSize&&(n[a.afterIndex]=l.afterSize),a.currentSizes=n,a.dir==="cols"?r.style.gridTemplateColumns=n.join(" "):r.style.gridTemplateRows=n.join(" "))}function FD(t){return t.match(/[0-9|.]+px/)!==null}function ZC(t){return t.match(/[0-9|.]+fr/)!==null}function kn(t){if(ZC(t))return{type:"fr",count:Number(t.replace("fr","")),value:t};if(FD(t))return{type:"pixel",count:Number(t.replace("px","")),value:t};throw new Error("Unknown tract sizing unit: "+t)}function GC(t,a){return a==="rows"?t.clientY:t.clientX}function OD(t){return t.some(a=>ZC(a))}function kD(t){return t.some(a=>a==="auto")}var UC="458f7f16bd2508a6be98e2f85dbb914ae3dc741ad08effc5b1a913dc5fd60226",_D=`._tractInfoDisplay_cvtwo_1 { --transition-delay: 0.1s; --transition-speed: 0.1s; --transition-ease: ease-in-out; @@ -890,7 +905,7 @@ user is typing in the input field but mouses off */ color: var(--disabled-color); cursor: not-allowed; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(HC)){var t=document.createElement("style");t.id=HC,t.textContent=WD,document.head.appendChild(t)}})();var d3={tractInfoDisplay:"_tractInfoDisplay_cvtwo_1",sizeWidget:"_sizeWidget_cvtwo_61",cssSizeInput:"_cssSizeInput_cvtwo_80",hoverListener:"_hoverListener_cvtwo_94",buttons:"_buttons_cvtwo_114",tractAddButton:"_tractAddButton_cvtwo_127",deleteButton:"_deleteButton_cvtwo_128"};var I2=V(b()),jD=["fr","px"];function qD({dir:t,index:a,size:r,deletionConflicts:e,addTract:c,deleteTract:n,changeUnit:l,changeCount:o}){let{unit:i,count:h}=Tt(r);return(0,I2.jsxs)("div",{className:d3.tractInfoDisplay,"data-drag-dir":t,style:{"--tract-index":a+1},children:[(0,I2.jsx)("div",{className:d3.hoverListener}),(0,I2.jsxs)("div",{className:d3.sizeWidget,onClick:KD,children:[(0,I2.jsxs)("div",{className:d3.buttons,children:[(0,I2.jsx)(VC,{dir:t,onClick:()=>c("before")}),(0,I2.jsx)(XD,{dir:t,onClick:n,deletionConflicts:e}),(0,I2.jsx)(VC,{dir:t,onClick:()=>c("after")})]}),(0,I2.jsxs)("div",{className:d3.cssSizeInput,children:[(0,I2.jsx)(z8,{name:"value-count","aria-label":"value-count",value:h,onChange:o,min:0}),(0,I2.jsx)(xn,{unit:i,availableUnits:jD,onChange:v=>l(v)})]})]})]})}function XD({dir:t,onClick:a,deletionConflicts:r}){let e=t==="rows"?"right":"down",c=r.length===0,n=c?"Delete tract":`Can't delete because the items ${r.join(",")} are entirely contained in tract`;return(0,I2.jsx)(v3,{className:d3.deleteButton,onClick:CC(c?a:void 0),"data-enabled":c,text:n,size:"medium",position:e,children:(0,I2.jsx)(Q5,{})})}function VC({dir:t,onClick:a}){let r=t==="rows"?"right":"down",e=t==="rows"?"Add row":"Add column";return(0,I2.jsx)(v3,{className:d3.tractAddButton,onClick:CC(a),position:r,text:e,children:(0,I2.jsx)(Pt,{})})}function CC(t){return function(a){a.currentTarget.blur(),t?.()}}function $D(t,a){let r=0,e=0;for(let c=0;cNv(e,{dir:v,index:d+1}),[e]),l=v=>d=>{let{unit:u}=Tt(a[v]);c({type:"RESIZE",index:v,dir:t,size:`${d}${u}`})},o=v=>d=>{let u=r(),{count:s}=Tt(a[v]),g=1;d==="px"&&(g=za(u[v]));let p=$D(u,a);d==="fr"&&p!=="NO_FR_UNITS"&&(g=pa(vu(s?s*p:1))),c({type:"RESIZE",index:v,dir:t,size:`${g}${d}`})},i=v=>d=>c({type:"ADD",dir:t,index:d==="before"?v:v+1}),h=v=>()=>{c({type:"DELETE",dir:t,index:v+1})};return(0,I2.jsx)(I2.Fragment,{children:a.map((v,d)=>(0,I2.jsx)(qD,{index:d,dir:t,addTract:i(d),deleteTract:h(d),changeUnit:o(d),changeCount:l(d),size:v,deletionConflicts:n({dir:t,index:d})},t+d))})}function KD(t){t.stopPropagation()}function uu(t,a){t.querySelectorAll(`.${d3.tractInfoDisplay}`).forEach(r=>{r.style.display=a==="hide"?"none":"block"})}var wC="4df0ed56e7737915ec866e1af0660c3da7c75910dfd7552e0c96687bde122a5c",QD=`div._columnSizer_9b32k_1, +`;(function(){if(!(typeof document>"u")&&!document.getElementById(UC)){var t=document.createElement("style");t.id=UC,t.textContent=_D,document.head.appendChild(t)}})();var f3={tractInfoDisplay:"_tractInfoDisplay_cvtwo_1",sizeWidget:"_sizeWidget_cvtwo_61",cssSizeInput:"_cssSizeInput_cvtwo_80",hoverListener:"_hoverListener_cvtwo_94",buttons:"_buttons_cvtwo_114",tractAddButton:"_tractAddButton_cvtwo_127",deleteButton:"_deleteButton_cvtwo_128"};var E2=V(b()),RD=["fr","px"];function ID({dir:t,index:a,size:r,deletionConflicts:e,addTract:c,deleteTract:n,changeUnit:l,changeCount:o}){let{unit:i,count:h}=Wt(r);return(0,E2.jsxs)("div",{className:f3.tractInfoDisplay,"data-drag-dir":t,style:{"--tract-index":a+1},children:[(0,E2.jsx)("div",{className:f3.hoverListener}),(0,E2.jsxs)("div",{className:f3.sizeWidget,onClick:TD,children:[(0,E2.jsxs)("div",{className:f3.buttons,children:[(0,E2.jsx)(WC,{dir:t,onClick:()=>c("before")}),(0,E2.jsx)(ED,{dir:t,onClick:n,deletionConflicts:e}),(0,E2.jsx)(WC,{dir:t,onClick:()=>c("after")})]}),(0,E2.jsxs)("div",{className:f3.cssSizeInput,children:[(0,E2.jsx)(H8,{name:"value-count","aria-label":"value-count",value:h,onChange:o,min:0}),(0,E2.jsx)(bn,{unit:i,availableUnits:RD,onChange:v=>l(v)})]})]})]})}function ED({dir:t,onClick:a,deletionConflicts:r}){let e=t==="rows"?"right":"down",c=r.length===0,n=c?"Delete tract":`Can't delete because the items ${r.join(",")} are entirely contained in tract`;return(0,E2.jsx)(W0,{className:f3.deleteButton,onClick:qC(c?a:void 0),"data-enabled":c,text:n,size:"medium",position:e,children:(0,E2.jsx)(c3,{})})}function WC({dir:t,onClick:a}){let r=t==="rows"?"right":"down",e=t==="rows"?"Add row":"Add column";return(0,E2.jsx)(W0,{className:f3.tractAddButton,onClick:qC(a),position:r,text:e,children:(0,E2.jsx)(Ut,{})})}function qC(t){return function(a){a.currentTarget.blur(),t?.()}}function PD(t,a){let r=0,e=0;for(let c=0;crd(e,{dir:v,index:d+1}),[e]),l=v=>d=>{let{unit:u}=Wt(a[v]);c({type:"RESIZE",index:v,dir:t,size:`${d}${u}`})},o=v=>d=>{let u=r(),{count:s}=Wt(a[v]),g=1;d==="px"&&(g=wa(u[v]));let p=PD(u,a);d==="fr"&&p!=="NO_FR_UNITS"&&(g=Ca(wu(s?s*p:1))),c({type:"RESIZE",index:v,dir:t,size:`${g}${d}`})},i=v=>d=>c({type:"ADD",dir:t,index:d==="before"?v:v+1}),h=v=>()=>{c({type:"DELETE",dir:t,index:v+1})};return(0,E2.jsx)(E2.Fragment,{children:a.map((v,d)=>(0,E2.jsx)(ID,{index:d,dir:t,addTract:i(d),deleteTract:h(d),changeUnit:o(d),changeCount:l(d),size:v,deletionConflicts:n({dir:t,index:d})},t+d))})}function TD(t){t.stopPropagation()}function yu(t,a){t.querySelectorAll(`.${f3.tractInfoDisplay}`).forEach(r=>{r.style.display=a==="hide"?"none":"block"})}var $C="dff625a526dc265ce6240786be9126629cd4f711a60a269f76ad8f1e8d86a7bd",ND=`div._columnSizer_9b32k_1, div._rowSizer_9b32k_2 { --sizer-color: #c9e2f3; @@ -967,7 +982,7 @@ div._rowSizer_9b32k_2::after { ._rowSizer_9b32k_2:hover { transform: scaleY(var(--sizer-expansion-amnt)); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(wC)){var t=document.createElement("style");t.id=wC,t.textContent=QD,document.head.appendChild(t)}})();var su={columnSizer:"_columnSizer_9b32k_1",rowSizer:"_rowSizer_9b32k_2"};var BC=V(b());function gu({dir:t,index:a,onStartDrag:r}){return(0,BC.jsx)("div",{className:t==="rows"?su.rowSizer:su.columnSizer,title:`resize ${t==="rows"?"rows":"columns"} ${a-1} and ${a}`,onMouseDown:e=>r({e,dir:t,index:a}),style:{[t==="rows"?"gridRow":"gridColumn"]:a}})}var SC=V(X());function yC(t,a="Ref is not yet initialized"){if(t.current===null)throw new Error(a);return t.current}function bC({containerRef:t,onDragEnd:a}){return SC.default.useCallback(({e,dir:c,index:n})=>{let l=yC(t,"How are you dragging on an element without a container?");e.preventDefault();let o=fC({mousePosition:e,dir:c,index:n,container:l}),{beforeIndex:i,afterIndex:h}=o,v=AC(l,{dir:c,index:i,size:o.currentSizes[i]}),d=AC(l,{dir:c,index:h,size:o.currentSizes[h]});YD(l,o.dir,{move:u=>{MC({mousePosition:u,drag:o,container:l}),v.update(o.currentSizes[i]),d.update(o.currentSizes[h])},end:()=>{v.remove(),d.remove(),a&&a(dC(l))}})},[t,a])}function AC(t,{dir:a,index:r,size:e}){let c=document.createElement("div"),n=a==="rows"?{gridRow:String(r+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(r+1),gridRow:"1",flexDirection:"column"};Object.assign(c.style,n,{zIndex:"1",display:"flex",alignItems:"center"});let l=document.createElement("div");return Object.assign(l.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),l.innerHTML=e,c.appendChild(l),t.appendChild(c),uu(t,"hide"),{remove:()=>{c.remove(),uu(t,"show")},update:o=>{l.innerHTML=o}}}function YD(t,a,r){let e=document.createElement("div");Object.assign(e.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:a==="rows"?"ns-resize":"ew-resize"}),t.appendChild(e);let c=()=>{n(),r.end()};e.addEventListener("mousemove",r.move),e.addEventListener("mouseup",c),e.addEventListener("mouseleave",c);function n(){e.removeEventListener("mousemove",r.move),e.removeEventListener("mouseup",c),e.removeEventListener("mouseleave",c),e.remove()}}var f8=V(b());function JD({areas:t,col_sizes:a,row_sizes:r,gap_size:e}){return{areas:t,gap_size:e,col_sizes:K6(a),row_sizes:K6(r)}}var tN="1fr";function aN({className:t,children:a,onNewLayout:r,...e}){e=JD(e);let{row_sizes:c,col_sizes:n}=e,l=Kt.useRef(null),o=vC(e),i=n.length<2?[]:hu(2,n.length),h=c.length<2?[]:hu(2,c.length),v=bC({containerRef:l,onDragEnd:r}),d=[fH.ResizableGrid];t&&d.push(t);let u=Kt.useCallback(p=>{switch(p.type){case"ADD":return Z9(e,{afterIndex:p.index,dir:p.dir,size:tN});case"RESIZE":return rN(e,p);case"DELETE":return G9(e,p)}},[e]),s=Kt.useCallback(p=>r(u(p)),[u,r]),g=Kt.useCallback(p=>{let L=l.current;return L?Hn({container:L,dir:p}):[]},[]);return(0,f8.jsxs)("div",{className:N1(...d),ref:l,style:o,children:[i.map(p=>(0,f8.jsx)(gu,{dir:"cols",index:p,onStartDrag:v},"cols"+p)),h.map(p=>(0,f8.jsx)(gu,{dir:"rows",index:p,onStartDrag:v},"rows"+p)),a,(0,f8.jsx)(du,{dir:"cols",sizes:n,getActualSizes:()=>g("cols"),areas:e.areas,onUpdate:s}),(0,f8.jsx)(du,{dir:"rows",sizes:c,getActualSizes:()=>g("rows"),areas:e.areas,onUpdate:s})]})}function rN(t,{dir:a,index:r,size:e}){return p0(t,c=>{c[a==="rows"?"row_sizes":"col_sizes"][r]=e})}var FC=aN;var OC=V(X());var RC=V(b());function kC({gridRow:t,gridColumn:a,onDroppedNode:r}){let e=OC.default.useRef(null);return n6({watcherRef:e,getCanAcceptDrop:c=>c.node.uiName!=="gridlayout::grid_container",onDrop:c=>{r({...c,pos:{rowStart:t,rowEnd:t,colStart:a,colEnd:a}})}}),(0,RC.jsx)("div",{className:"grid-cell",ref:e,"data-cell-pos":t+"-"+a,style:{gridRow:t,gridColumn:a,margin:"2px"}})}var Va=V(X());var Bn=V(X()),EC=V(Z6());var h5=V(b()),Cn=236;function wn({main:t,properties:a,preview:r,left:e}){return(0,h5.jsx)(h5.Fragment,{children:(0,h5.jsxs)("div",{className:"EditorSkeleton",children:[(0,h5.jsx)("div",{className:"elements-panel panel",children:e}),(0,h5.jsx)("div",{className:"app-view",children:t}),(0,h5.jsx)("div",{className:"properties-panel panel",children:a}),(0,h5.jsx)("div",{className:"app-preview panel",children:r})]})})}function C5({children:t,className:a=""}){return(0,h5.jsx)("h3",{className:a+" panel-title",children:t})}var IC="13f6af5e59e8ebc33477302381f7da21ea3317b2b22eeff877dda6aa750b7a6e",eN=`._portalHolder_18ua3_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById($C)){var t=document.createElement("style");t.id=$C,t.textContent=ND,document.head.appendChild(t)}})();var Au={columnSizer:"_columnSizer_9b32k_1",rowSizer:"_rowSizer_9b32k_2"};var XC=V(b());function Su({dir:t,index:a,onStartDrag:r}){return(0,XC.jsx)("div",{className:t==="rows"?Au.rowSizer:Au.columnSizer,title:`resize ${t==="rows"?"rows":"columns"} ${a-1} and ${a}`,onMouseDown:e=>r({e,dir:t,index:a}),style:{[t==="rows"?"gridRow":"gridColumn"]:a}})}var YC=V($());function KC(t,a="Ref is not yet initialized"){if(t.current===null)throw new Error(a);return t.current}function JC({containerRef:t,onDragEnd:a}){return YC.default.useCallback(({e,dir:c,index:n})=>{let l=KC(t,"How are you dragging on an element without a container?");e.preventDefault();let o=NC({mousePosition:e,dir:c,index:n,container:l}),{beforeIndex:i,afterIndex:h}=o,v=QC(l,{dir:c,index:i,size:o.currentSizes[i]}),d=QC(l,{dir:c,index:h,size:o.currentSizes[h]});DD(l,o.dir,{move:u=>{DC({mousePosition:u,drag:o,container:l}),v.update(o.currentSizes[i]),d.update(o.currentSizes[h])},end:()=>{v.remove(),d.remove(),a&&a(_C(l))}})},[t,a])}function QC(t,{dir:a,index:r,size:e}){let c=document.createElement("div"),n=a==="rows"?{gridRow:String(r+1),gridColumn:"1",flexDirection:"row"}:{gridColumn:String(r+1),gridRow:"1",flexDirection:"column"};Object.assign(c.style,n,{zIndex:"1",display:"flex",alignItems:"center"});let l=document.createElement("div");return Object.assign(l.style,{padding:"3px 7px",borderRadius:"var(--corner-radius)",backgroundColor:"var(--light-grey, pink)"}),l.innerHTML=e,c.appendChild(l),t.appendChild(c),yu(t,"hide"),{remove:()=>{c.remove(),yu(t,"show")},update:o=>{l.innerHTML=o}}}function DD(t,a,r){let e=document.createElement("div");Object.assign(e.style,{position:"fixed",inset:"0px",zIndex:"3",cursor:a==="rows"?"ns-resize":"ew-resize"}),t.appendChild(e);let c=()=>{n(),r.end()};e.addEventListener("mousemove",r.move),e.addEventListener("mouseup",c),e.addEventListener("mouseleave",c);function n(){e.removeEventListener("mousemove",r.move),e.removeEventListener("mouseup",c),e.removeEventListener("mouseleave",c),e.remove()}}var V8=V(b());function ZD({areas:t,col_sizes:a,row_sizes:r,gap_size:e}){return{areas:t,gap_size:e,col_sizes:a8(a),row_sizes:a8(r)}}var GD="1fr";function UD({className:t,children:a,onNewLayout:r,...e}){e=ZD(e);let{row_sizes:c,col_sizes:n}=e,l=e7.useRef(null),o=kC(e),i=n.length<2?[]:Cu(2,n.length),h=c.length<2?[]:Cu(2,c.length),v=JC({containerRef:l,onDragEnd:r}),d=[NH.ResizableGrid];t&&d.push(t);let u=e7.useCallback(p=>{switch(p.type){case"ADD":return Q9(e,{afterIndex:p.index,dir:p.dir,size:GD});case"RESIZE":return WD(e,p);case"DELETE":return Y9(e,p)}},[e]),s=e7.useCallback(p=>r(u(p)),[u,r]),g=e7.useCallback(p=>{let L=l.current;return L?Fn({container:L,dir:p}):[]},[]);return(0,V8.jsxs)("div",{className:J1(...d),ref:l,style:o,children:[i.map(p=>(0,V8.jsx)(Su,{dir:"cols",index:p,onStartDrag:v},"cols"+p)),h.map(p=>(0,V8.jsx)(Su,{dir:"rows",index:p,onStartDrag:v},"rows"+p)),a,(0,V8.jsx)(Bu,{dir:"cols",sizes:n,getActualSizes:()=>g("cols"),areas:e.areas,onUpdate:s}),(0,V8.jsx)(Bu,{dir:"rows",sizes:c,getActualSizes:()=>g("rows"),areas:e.areas,onUpdate:s})]})}function WD(t,{dir:a,index:r,size:e}){return f0(t,c=>{c[a==="rows"?"row_sizes":"col_sizes"][r]=e})}var tw=UD;var aw=V($());var ew=V(b());function rw({gridRow:t,gridColumn:a,onDroppedNode:r}){let e=aw.default.useRef(null);return v6({watcherRef:e,getCanAcceptDrop:c=>c.node.uiName!=="gridlayout::grid_container",onDrop:c=>{r({...c,pos:{rowStart:t,rowEnd:t,colStart:a,colEnd:a}})}}),(0,ew.jsx)("div",{className:"grid-cell",ref:e,"data-cell-pos":t+"-"+a,style:{gridRow:t,gridColumn:a,margin:"2px"}})}var Fa=V($());var In=V($()),nw=V(q6());var p5=V(b()),_n=236;function Rn({main:t,properties:a,preview:r,left:e}){return(0,p5.jsx)(p5.Fragment,{children:(0,p5.jsxs)("div",{className:"EditorSkeleton",children:[(0,p5.jsx)("div",{className:"elements-panel panel",children:e}),(0,p5.jsx)("div",{className:"app-view",children:t}),(0,p5.jsx)("div",{className:"properties-panel panel",children:a}),(0,p5.jsx)("div",{className:"app-preview panel",children:r})]})})}function D4({children:t,className:a=""}){return(0,p5.jsx)("h3",{className:a+" panel-title",children:t})}var cw="13f6af5e59e8ebc33477302381f7da21ea3317b2b22eeff877dda6aa750b7a6e",jD=`._portalHolder_18ua3_1 { background-color: rgba(255, 255, 255, 0.735); position: absolute; inset: 0; @@ -1022,7 +1037,7 @@ div._rowSizer_9b32k_2::after { ._infoText_18ua3_53 { font-style: italic; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(IC)){var t=document.createElement("style");t.id=IC,t.textContent=eN,document.head.appendChild(t)}})();var fa={portalHolder:"_portalHolder_18ua3_1",portalModal:"_portalModal_18ua3_11",title:"_title_18ua3_21",body:"_body_18ua3_25",portalForm:"_portalForm_18ua3_30",portalFormInputs:"_portalFormInputs_18ua3_35",portalFormFooter:"_portalFormFooter_18ua3_42",validationMsg:"_validationMsg_18ua3_48",infoText:"_infoText_18ua3_53"};var M8=V(b()),cN=({children:t,el:a="div"})=>{let[r]=Bn.useState(document.createElement(a));return Bn.useEffect(()=>(document.body.appendChild(r),()=>{document.body.removeChild(r)}),[r]),EC.createPortal(t,r)};function nN({children:t,title:a,label:r,onConfirm:e,onCancel:c}){return(0,M8.jsx)(cN,{children:(0,M8.jsx)("div",{className:fa.portalHolder,onClick:()=>c(),onKeyDown:n=>{n.key==="Escape"&&c()},children:(0,M8.jsxs)("div",{className:fa.portalModal,onClick:n=>n.stopPropagation(),"aria-label":r??"popup modal",children:[a?(0,M8.jsx)(C5,{className:fa.title,children:a}):null,(0,M8.jsx)("div",{className:fa.body,children:t})]})})})}var yn=nN;var PC="5f70ff5ff3278e66fd597121e236de92c64d252f32525b9537fbd9a8a40cb9b8",lN=`._portalHolder_18ua3_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(cw)){var t=document.createElement("style");t.id=cw,t.textContent=jD,document.head.appendChild(t)}})();var Ba={portalHolder:"_portalHolder_18ua3_1",portalModal:"_portalModal_18ua3_11",title:"_title_18ua3_21",body:"_body_18ua3_25",portalForm:"_portalForm_18ua3_30",portalFormInputs:"_portalFormInputs_18ua3_35",portalFormFooter:"_portalFormFooter_18ua3_42",validationMsg:"_validationMsg_18ua3_48",infoText:"_infoText_18ua3_53"};var L8=V(b()),qD=({children:t,el:a="div"})=>{let[r]=In.useState(document.createElement(a));return In.useEffect(()=>(document.body.appendChild(r),()=>{document.body.removeChild(r)}),[r]),nw.createPortal(t,r)};function $D({children:t,title:a,label:r,onConfirm:e,onCancel:c}){return(0,L8.jsx)(qD,{children:(0,L8.jsx)("div",{className:Ba.portalHolder,onClick:()=>c(),onKeyDown:n=>{n.key==="Escape"&&c()},children:(0,L8.jsxs)("div",{className:Ba.portalModal,onClick:n=>n.stopPropagation(),"aria-label":r??"popup modal",children:[a?(0,L8.jsx)(D4,{className:Ba.title,children:a}):null,(0,L8.jsx)("div",{className:Ba.body,children:t})]})})})}var En=$D;var lw="3714628d805b25d8e52998623555b1d2cc8ad185cea3a56b0e26a746b13719ae",XD=`._portalHolder_18ua3_1 { background-color: rgba(255, 255, 255, 0.735); position: absolute; inset: 0; @@ -1077,7 +1092,7 @@ div._rowSizer_9b32k_2::after { ._infoText_18ua3_53 { font-style: italic; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(PC)){var t=document.createElement("style");t.id=PC,t.textContent=lN,document.head.appendChild(t)}})();var Qt={portalHolder:"_portalHolder_18ua3_1",portalModal:"_portalModal_18ua3_11",title:"_title_18ua3_21",body:"_body_18ua3_25",portalForm:"_portalForm_18ua3_30",portalFormInputs:"_portalFormInputs_18ua3_35",portalFormFooter:"_portalFormFooter_18ua3_42",validationMsg:"_validationMsg_18ua3_48",infoText:"_infoText_18ua3_53"};var An=Symbol("@ts-pattern/matcher"),TC="@ts-pattern/anonymous-select-key",_C=t=>Boolean(t&&typeof t=="object"),pu=t=>t&&!!t[An],Ma=(t,a,r)=>{if(_C(t)){if(pu(t)){let e=t[An](),{matched:c,selections:n}=e.match(a);return c&&n&&Object.keys(n).forEach(l=>r(l,n[l])),c}if(!_C(a))return!1;if(Array.isArray(t))return!!Array.isArray(a)&&t.length===a.length&&t.every((e,c)=>Ma(e,a[c],r));if(t instanceof Map)return a instanceof Map&&Array.from(t.keys()).every(e=>Ma(t.get(e),a.get(e),r));if(t instanceof Set){if(!(a instanceof Set))return!1;if(t.size===0)return a.size===0;if(t.size===1){let[e]=Array.from(t.values());return pu(e)?Array.from(a.values()).every(c=>Ma(e,c,r)):a.has(e)}return Array.from(t.values()).every(e=>a.has(e))}return Object.keys(t).every(e=>{let c=t[e];return(e in a||pu(n=c)&&n[An]().matcherType==="optional")&&Ma(c,a[e],r);var n})}return Object.is(a,t)};function x8(t){return{[An]:()=>({match:a=>({matched:Boolean(t(a))})})}}var Ja1=x8(function(t){return!0});var tr1=x8(function(t){return typeof t=="string"}),ar1=x8(function(t){return typeof t=="number"}),rr1=x8(function(t){return typeof t=="boolean"}),er1=x8(function(t){return typeof t=="bigint"}),cr1=x8(function(t){return typeof t=="symbol"}),nr1=x8(function(t){return t==null});var DC=t=>new m8(t,[]),m8=class{constructor(a,r){this.value=void 0,this.cases=void 0,this.value=a,this.cases=r}with(...a){let r=a[a.length-1],e=[a[0]],c=[];return a.length===3&&typeof a[1]=="function"?(e.push(a[0]),c.push(a[1])):a.length>2&&e.push(...a.slice(1,a.length-1)),new m8(this.value,this.cases.concat([{match:n=>{let l={},o=Boolean(e.some(i=>Ma(i,n,(h,v)=>{l[h]=v}))&&c.every(i=>i(n)));return{matched:o,value:o&&Object.keys(l).length?TC in l?l[TC]:l:n}},handler:r}]))}when(a,r){return new m8(this.value,this.cases.concat([{match:e=>({matched:Boolean(a(e)),value:e}),handler:r}]))}otherwise(a){return new m8(this.value,this.cases.concat([{match:r=>({matched:!0,value:r}),handler:a}])).run()}exhaustive(){return this.run()}run(){let a,r=this.value;for(let e=0;e"u")&&!document.getElementById(lw)){var t=document.createElement("style");t.id=lw,t.textContent=XD,document.head.appendChild(t)}})();var c7={portalHolder:"_portalHolder_18ua3_1",portalModal:"_portalModal_18ua3_11",title:"_title_18ua3_21",body:"_body_18ua3_25",portalForm:"_portalForm_18ua3_30",portalFormInputs:"_portalFormInputs_18ua3_35",portalFormFooter:"_portalFormFooter_18ua3_42",validationMsg:"_validationMsg_18ua3_48",infoText:"_infoText_18ua3_53"};var Pn=Symbol("@ts-pattern/matcher"),ow="@ts-pattern/anonymous-select-key",iw=t=>Boolean(t&&typeof t=="object"),bu=t=>t&&!!t[Pn],ya=(t,a,r)=>{if(iw(t)){if(bu(t)){let e=t[Pn](),{matched:c,selections:n}=e.match(a);return c&&n&&Object.keys(n).forEach(l=>r(l,n[l])),c}if(!iw(a))return!1;if(Array.isArray(t))return!!Array.isArray(a)&&t.length===a.length&&t.every((e,c)=>ya(e,a[c],r));if(t instanceof Map)return a instanceof Map&&Array.from(t.keys()).every(e=>ya(t.get(e),a.get(e),r));if(t instanceof Set){if(!(a instanceof Set))return!1;if(t.size===0)return a.size===0;if(t.size===1){let[e]=Array.from(t.values());return bu(e)?Array.from(a.values()).every(c=>ya(e,c,r)):a.has(e)}return Array.from(t.values()).every(e=>a.has(e))}return Object.keys(t).every(e=>{let c=t[e];return(e in a||bu(n=c)&&n[Pn]().matcherType==="optional")&&ya(c,a[e],r);var n})}return Object.is(a,t)};function w8(t){return{[Pn]:()=>({match:a=>({matched:Boolean(t(a))})})}}var de1=w8(function(t){return!0});var ue1=w8(function(t){return typeof t=="string"}),se1=w8(function(t){return typeof t=="number"}),ge1=w8(function(t){return typeof t=="boolean"}),pe1=w8(function(t){return typeof t=="bigint"}),ze1=w8(function(t){return typeof t=="symbol"}),fe1=w8(function(t){return t==null});var hw=t=>new C8(t,[]),C8=class{constructor(a,r){this.value=void 0,this.cases=void 0,this.value=a,this.cases=r}with(...a){let r=a[a.length-1],e=[a[0]],c=[];return a.length===3&&typeof a[1]=="function"?(e.push(a[0]),c.push(a[1])):a.length>2&&e.push(...a.slice(1,a.length-1)),new C8(this.value,this.cases.concat([{match:n=>{let l={},o=Boolean(e.some(i=>ya(i,n,(h,v)=>{l[h]=v}))&&c.every(i=>i(n)));return{matched:o,value:o&&Object.keys(l).length?ow in l?l[ow]:l:n}},handler:r}]))}when(a,r){return new C8(this.value,this.cases.concat([{match:e=>({matched:Boolean(a(e)),value:e}),handler:r}]))}otherwise(a){return new C8(this.value,this.cases.concat([{match:r=>({matched:!0,value:r}),handler:a}])).run()}exhaustive(){return this.run()}run(){let a,r=this.value;for(let e=0;e"u")&&!document.getElementById(NC)){var t=document.createElement("style");t.id=NC,t.textContent=oN,document.head.appendChild(t)}})();var zu={checkboxInput:"_checkboxInput_7ym3w_1",checkboxLabel:"_checkboxLabel_7ym3w_10"};var H8=V(b());function ZC({id:t,label:a,value:r,onChange:e}){let c=`${t}-checkbox-input`,n=l=>e(l.target.checked);return(0,H8.jsxs)(H8.Fragment,{children:[(0,H8.jsx)("input",{className:N1("SUE-Input",zu.checkboxInput),id:c,"aria-labelledby":c0(t),"aria-label":a,type:"checkbox",checked:r,onChange:n}),(0,H8.jsx)("label",{className:zu.checkboxLabel,htmlFor:c,"data-value":r?"TRUE":"FALSE",children:"Toggle"})]})}var fu=V(X());var GC="8676d74c7bdab00efc891cde561ebe30f5e1dce06a130e080f4f264d6c800929",iN=`._wrapper_3jy8f_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(vw)){var t=document.createElement("style");t.id=vw,t.textContent=KD,document.head.appendChild(t)}})();var Fu={checkboxInput:"_checkboxInput_7ym3w_1",checkboxLabel:"_checkboxLabel_7ym3w_10"};var B8=V(b());function dw({id:t,label:a,value:r,onChange:e}){let c=`${t}-checkbox-input`,n=l=>e(l.target.checked);return(0,B8.jsxs)(B8.Fragment,{children:[(0,B8.jsx)("input",{className:J1("SUE-Input",Fu.checkboxInput),id:c,"aria-labelledby":l0(t),"aria-label":a,type:"checkbox",checked:r,onChange:n}),(0,B8.jsx)("label",{className:Fu.checkboxLabel,htmlFor:c,"data-value":r?"TRUE":"FALSE",children:"Toggle"})]})}var Ou=V($());var uw="57c9d858b555b8a6cef39e77ee7a381fed1c56d826a50f02e01700c9925f9c4f",QD=`._wrapper_3jy8f_1 { position: relative; display: flex; max-width: 135px; @@ -1162,7 +1177,7 @@ label._checkboxLabel_7ym3w_10:after { background-repeat: no-repeat; background-position: right; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(GC)){var t=document.createElement("style");t.id=GC,t.textContent=iN,document.head.appendChild(t)}})();var UC={wrapper:"_wrapper_3jy8f_1",unitSelector:"_unitSelector_3jy8f_9"};var ma=V(b()),hN={fr:1,px:10,rem:1,"%":100};function WC({id:t,label:a,value:r,onChange:e,units:c=["px","rem","%"]}){let{count:n,unit:l}=Tt(r),o=fu.default.useCallback(v=>{if(v===void 0){if(l!=="auto")throw new Error("Undefined count with auto units");e(_t({unit:l,count:null}));return}if(l==="auto"){console.error("How did you change the count of an auto unit?");return}e(_t({unit:l,count:v}))},[e,l]),i=fu.default.useCallback(v=>{if(v==="auto"){e(_t({unit:v,count:null}));return}if(l==="auto"){e(_t({unit:v,count:hN[v]}));return}e(_t({unit:v,count:n}))},[n,e,l]);c.includes(l)||c.push(l);let h=n===null;return(0,ma.jsxs)("div",{className:N1("SUE-Input",UC.wrapper),"aria-label":a,"aria-labelledby":c0(t),children:[(0,ma.jsx)(z8,{name:"value-count","aria-label":"value-count",value:n,disabled:h,onChange:o,min:0}),(0,ma.jsx)(xn,{unit:l,availableUnits:c,onChange:i})]})}var Ha=V(X());function jC(t){return f2({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",d:"M0 0h24v24H0z"}},{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(t)}var nw=V(ew());var cw="87faaedf9137a81d8413248d42cefbfe336badfd714b0ce511b81a274dcc17b4",xN=`._container_xt7ji_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(uw)){var t=document.createElement("style");t.id=uw,t.textContent=QD,document.head.appendChild(t)}})();var sw={wrapper:"_wrapper_3jy8f_1",unitSelector:"_unitSelector_3jy8f_9"};var Aa=V(b()),YD={fr:1,px:10,rem:1,"%":100};function gw({id:t,label:a,value:r,onChange:e,units:c=["px","rem","%"]}){let{count:n,unit:l}=Wt(r),o=Ou.default.useCallback(v=>{if(v===void 0){if(l!=="auto")throw new Error("Undefined count with auto units");e(jt({unit:l,count:null}));return}if(l==="auto"){console.error("How did you change the count of an auto unit?");return}e(jt({unit:l,count:v}))},[e,l]),i=Ou.default.useCallback(v=>{if(v==="auto"){e(jt({unit:v,count:null}));return}if(l==="auto"){e(jt({unit:v,count:YD[v]}));return}e(jt({unit:v,count:n}))},[n,e,l]);c.includes(l)||c.push(l);let h=n===null;return(0,Aa.jsxs)("div",{className:J1("SUE-Input",sw.wrapper),"aria-label":a,"aria-labelledby":l0(t),children:[(0,Aa.jsx)(H8,{name:"value-count","aria-label":"value-count",value:n,disabled:h,onChange:o,min:0}),(0,Aa.jsx)(bn,{unit:l,availableUnits:c,onChange:i})]})}var ba=V($());function pw(t){return M2({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",d:"M0 0h24v24H0z"}},{tag:"path",attr:{d:"M20 9H4v2h16V9zM4 15h16v-2H4v2z"}}]})(t)}var Aw=V(Bw());var yw="112101a7e9b53d716692ac46155564b0d231b2e9c8f6f8ad620a3e843b108c73",hZ=`._container_xt7ji_1 { --gap-size: 4px; margin-top: 21px; } @@ -1240,7 +1255,7 @@ label._checkboxLabel_7ym3w_10:after { ._deleteButton_xt7ji_55:hover > svg { stroke-width: 3; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(cw)){var t=document.createElement("style");t.id=cw,t.textContent=xN,document.head.appendChild(t)}})();var G0={container:"_container_xt7ji_1",list:"_list_xt7ji_6",item:"_item_xt7ji_15",keyField:"_keyField_xt7ji_29",valueField:"_valueField_xt7ji_34",header:"_header_xt7ji_39",dragHandle:"_dragHandle_xt7ji_45",deleteButton:"_deleteButton_xt7ji_55",addItemButton:"_addItemButton_xt7ji_65",separator:"_separator_xt7ji_72"};var n0=V(b());function lw(t){return!(typeof t!="object"||Object.values(t).find(r=>typeof r!="string"))}function ow({id:t,label:a,value:r,onChange:e,newItemValue:c={key:"myKey",value:"myValue"}}){let{state:n,setState:l,addItem:o,deleteItem:i}=HN({value:r,onChange:e,newItemValue:c});return(0,n0.jsxs)("div",{className:G0.list,"aria-labelledby":c0(t),"aria-label":a,children:[(0,n0.jsxs)("div",{className:G0.item+" "+G0.header,"aria-label":"Columns field labels",children:[(0,n0.jsx)("span",{className:G0.keyField,children:"Key"}),(0,n0.jsx)("span",{className:G0.valueField,children:"Value"})]}),(0,n0.jsx)(nw.ReactSortable,{list:n,setList:l,handle:`.${G0.dragHandle}`,children:n.map((h,v)=>(0,n0.jsxs)("div",{className:G0.item,children:[(0,n0.jsx)("div",{className:G0.dragHandle,title:"Reorder list",children:(0,n0.jsx)(jC,{})}),(0,n0.jsx)("input",{title:"Key Field",className:G0.keyField,type:"text",value:h.key,onChange:d=>{let u=[...n];u[v]={...h,key:d.target.value},l(u)}}),(0,n0.jsx)("span",{className:G0.separator,children:":"}),(0,n0.jsx)("input",{title:"Value Field",className:G0.valueField,type:"text",value:h.value,onChange:d=>{let u=[...n];u[v]={...h,value:d.target.value},l(u)}}),(0,n0.jsx)(Y1,{className:G0.deleteButton,onClick:()=>i(h.id),variant:["icon","transparent"],title:`Delete ${h.value}`,children:(0,n0.jsx)(Q5,{})})]},h.id))}),(0,n0.jsx)(Y1,{className:G0.addItemButton,onClick:()=>o(),variant:["icon","transparent"],title:"Add new item","aria-label":"Add new item to list",children:(0,n0.jsx)(Pt,{})})]})}function HN({value:t,onChange:a,newItemValue:r}){let[e,c]=Ha.default.useState(t!==void 0?Object.keys(t).map((o,i)=>({id:i,key:o,value:t[o]})):[]);Ha.default.useEffect(()=>{let o=VN(e);zx(o,t??{})||a(o)},[a,e,t]);let n=Ha.default.useCallback(o=>{c(i=>i.filter(({id:h})=>h!==o))},[]),l=Ha.default.useCallback(()=>{c(o=>[...o,{id:-1,...r}].map((i,h)=>({...i,id:h})))},[r]);return{state:e,setState:c,deleteItem:n,addItem:l}}function VN(t){return t.reduce((r,{key:e,value:c})=>(r[e]=c,r),{})}var iw=V(X());var On=V(b()),LN="__DEFAULT-DROPDOWN-CHOICE__";function hw({id:t,label:a,choices:r,onChange:e,value:c}){iw.default.useEffect(()=>{c===LN&&e(r[0]),r.length>0&&!r.includes(c)&&e(r[0])},[e,r,c]);let n=o=>{let i=o.target.selectedIndex;e(r[i])},l=tx(r);return l.length===0?(0,On.jsx)("select",{title:`${a} selector`,"aria-labelledby":c0(t),"aria-label":a,className:"OptionsDropdown SUE-Input",placeholder:"No available options"}):(0,On.jsx)("select",{title:`${a} selector`,"aria-labelledby":c0(t),className:"OptionsDropdown SUE-Input",onChange:n,value:c,children:l.map(o=>(0,On.jsx)("option",{value:o,children:o},o))})}var kn=V(X());var vw="e722f264bb9e8213d69a9ee5967824dd267624a47680907abaf83bd3f6f5a4e7",CN=`._radioContainer_1regb_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(yw)){var t=document.createElement("style");t.id=yw,t.textContent=hZ,document.head.appendChild(t)}})();var q0={container:"_container_xt7ji_1",list:"_list_xt7ji_6",item:"_item_xt7ji_15",keyField:"_keyField_xt7ji_29",valueField:"_valueField_xt7ji_34",header:"_header_xt7ji_39",dragHandle:"_dragHandle_xt7ji_45",deleteButton:"_deleteButton_xt7ji_55",addItemButton:"_addItemButton_xt7ji_65",separator:"_separator_xt7ji_72"};var o0=V(b());function Sw(t){return!(typeof t!="object"||Object.values(t).find(r=>typeof r!="string"))}function bw({id:t,label:a,value:r,onChange:e,newItemValue:c={key:"myKey",value:"myValue"}}){let{state:n,setState:l,addItem:o,deleteItem:i}=vZ({value:r,onChange:e,newItemValue:c});return(0,o0.jsxs)("div",{className:q0.list,"aria-labelledby":l0(t),"aria-label":a,children:[(0,o0.jsxs)("div",{className:q0.item+" "+q0.header,"aria-label":"Columns field labels",children:[(0,o0.jsx)("span",{className:q0.keyField,children:"Key"}),(0,o0.jsx)("span",{className:q0.valueField,children:"Value"})]}),(0,o0.jsx)(Aw.ReactSortable,{list:n,setList:l,handle:`.${q0.dragHandle}`,children:n.map((h,v)=>(0,o0.jsxs)("div",{className:q0.item,children:[(0,o0.jsx)("div",{className:q0.dragHandle,title:"Reorder list",children:(0,o0.jsx)(pw,{})}),(0,o0.jsx)("input",{title:"Key Field",className:q0.keyField,type:"text",value:h.key,onChange:d=>{let u=[...n];u[v]={...h,key:d.target.value},l(u)}}),(0,o0.jsx)("span",{className:q0.separator,children:":"}),(0,o0.jsx)("input",{title:"Value Field",className:q0.valueField,type:"text",value:h.value,onChange:d=>{let u=[...n];u[v]={...h,value:d.target.value},l(u)}}),(0,o0.jsx)(Z1,{className:q0.deleteButton,onClick:()=>i(h.id),variant:["icon","transparent"],title:`Delete ${h.value}`,children:(0,o0.jsx)(c3,{})})]},h.id))}),(0,o0.jsx)(Z1,{className:q0.addItemButton,onClick:()=>o(),variant:["icon","transparent"],title:"Add new item","aria-label":"Add new item to list",children:(0,o0.jsx)(Ut,{})})]})}function vZ({value:t,onChange:a,newItemValue:r}){let[e,c]=ba.default.useState(t!==void 0?Object.keys(t).map((o,i)=>({id:i,key:o,value:t[o]})):[]);ba.default.useEffect(()=>{let o=dZ(e);Tx(o,t??{})||a(o)},[a,e,t]);let n=ba.default.useCallback(o=>{c(i=>i.filter(({id:h})=>h!==o))},[]),l=ba.default.useCallback(()=>{c(o=>[...o,{id:-1,...r}].map((i,h)=>({...i,id:h})))},[r]);return{state:e,setState:c,deleteItem:n,addItem:l}}function dZ(t){return t.reduce((r,{key:e,value:c})=>(r[e]=c,r),{})}var Fw=V($());var Zn=V(b()),uZ="__DEFAULT-DROPDOWN-CHOICE__";function Ow({id:t,label:a,choices:r,onChange:e,value:c}){Fw.default.useEffect(()=>{c===uZ&&e(r[0]),r.length>0&&!r.includes(c)&&e(r[0])},[e,r,c]);let n=o=>{let i=o.target.selectedIndex;e(r[i])},l=Lx(r);return l.length===0?(0,Zn.jsx)("select",{title:`${a} selector`,"aria-labelledby":l0(t),"aria-label":a,className:"OptionsDropdown SUE-Input",placeholder:"No available options"}):(0,Zn.jsx)("select",{title:`${a} selector`,"aria-labelledby":l0(t),className:"OptionsDropdown SUE-Input",onChange:n,value:c,children:l.map(o=>(0,Zn.jsx)("option",{value:o,children:o},o))})}var Gn=V($());var kw="ad5e9d262c7c4f5c66333247d4b1dab42f04839b6668eb89d2c4d4fbd27d4c94",sZ=`._radioContainer_1regb_1 { display: grid; gap: 5px; justify-content: space-around; @@ -1325,8 +1340,8 @@ the label */ transition-timing-function: ease-out; opacity: 0; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(vw)){var t=document.createElement("style");t.id=vw,t.textContent=CN,document.head.appendChild(t)}})();var Yt={radioContainer:"_radioContainer_1regb_1",option:"_option_1regb_15",radioInput:"_radioInput_1regb_22",radioLabel:"_radioLabel_1regb_26",icon:"_icon_1regb_41"};var V8=V(b()),wN="__DEFAULT-RADIO-CHOICE__";function dw({id:t,label:a,choices:r,value:e,onChange:c,optionsPerColumn:n}){let l=Object.keys(r);kn.useEffect(()=>{e===wN&&c(l[0])},[l,e,c]);let o=kn.useMemo(()=>({gridTemplateColumns:n?`repeat(${n}, 1fr)`:void 0}),[n]);return(0,V8.jsx)("fieldset",{className:Yt.radioContainer,"aria-labelledby":c0(t),"aria-label":a,style:o,children:l.map(i=>{let{icon:h,label:v=i}=r[i]??{},d=t+i;return(0,V8.jsxs)("div",{className:Yt.option,children:[(0,V8.jsx)("input",{className:Yt.radioInput,name:t,id:d,type:"radio",value:i,onChange:()=>c(i),checked:i===e}),(0,V8.jsx)("label",{className:Yt.radioLabel,htmlFor:d,"data-name":v,children:typeof h=="string"?(0,V8.jsx)("img",{src:h,alt:v,className:Yt.icon}):h})]},i)})})}var sw=V(b());function uw({id:t,label:a,value:r,onChange:e}){return(0,sw.jsx)("input",{className:"SUE-Input","aria-label":a,"aria-labelledby":c0(t),id:t,type:"text",value:r,onChange:c=>{let n=c.target.value;e(n)}})}var w5=V(b());function gw(t){return DC(t).with({inputType:"string"},a=>(0,w5.jsx)(uw,{...a})).with({inputType:"number"},a=>(0,w5.jsx)(oC,{...a})).with({inputType:"cssMeasure"},a=>(0,w5.jsx)(WC,{...a})).with({inputType:"boolean"},a=>(0,w5.jsx)(ZC,{...a})).with({inputType:"list"},a=>(0,w5.jsx)(ow,{...a})).with({inputType:"dropdown"},a=>(0,w5.jsx)(hw,{...a})).with({inputType:"radio"},a=>(0,w5.jsx)(dw,{...a})).otherwise(({inputType:a})=>(0,w5.jsxs)("div",{children:["I don't know how to render the input of type ",a," yet! Sorry."]}))}function pw(t,a){if(t===void 0)return!0;if(a==="number")return typeof t=="number";if(a==="string")return typeof t=="string";if(a==="cssMeasure")return MH(t);if(a==="boolean")return typeof t=="boolean";if(a==="list")return lw(t);if(a==="dropdown"||a==="radio")return typeof t=="string";throw new Error("Unimplemented argument type check",a)}var S0=V(b());function Rn({onUpdate:t,...a}){let r=a.value===void 0,e=a.optional,c=c0(a.name),n=a.label??a.name,l=()=>t({type:"UPDATE",value:a.defaultValue}),o=v=>t({type:"UPDATE",value:v}),i=()=>t({type:"REMOVE"}),h;return a.value===void 0?a.optional?h=(0,S0.jsx)(AN,{labelledBy:c}):h=(0,S0.jsx)(yN,{name:a.name,onReset:l}):pw(a.value,a.inputType)?h=(0,S0.jsx)(gw,{label:n,id:a.name,onChange:o,...a}):h=(0,S0.jsx)(BN,{name:a.name,onReset:l}),(0,S0.jsxs)("div",{className:"SUE-SettingsInput",children:[(0,S0.jsxs)("div",{className:"info","data-unset":r,children:[e?(0,S0.jsx)("input",{type:"checkbox",checked:!r,title:`Use ${a.name} argument`,"aria-label":`Use ${a.name} argument`,onChange:r?l:i}):null,(0,S0.jsx)("label",{id:c,children:n})]}),h]})}function BN({name:t,onReset:a}){return(0,S0.jsxs)("div",{className:"mismatched-argument-types",children:["Argument for ",t," of unsupported type.",(0,S0.jsx)(Y1,{style:{padding:"0.25rem 0.5rem",marginInline:"0.25rem"},onClick:a,children:"Reset"})]})}function yN({name:t,onReset:a}){return(0,S0.jsxs)("div",{className:"missing-required-argument-message",children:['Required argument "',t,'" not provided.',(0,S0.jsx)(Y1,{style:{padding:"0.25rem 0.5rem",marginInline:"0.25rem"},onClick:a,children:"Reset"})]})}function AN({labelledBy:t}){return(0,S0.jsx)("input",{className:"unset-argument SUE-Input","aria-labelledby":t,placeholder:"Default",disabled:!0})}var v5=V(b());function zw({onCancel:t,onDone:a,existingAreaNames:r}){let e=`area${r.length}`,[c,n]=Va.default.useState(e),[l,o]=Va.default.useState(null),i=Va.default.useCallback(v=>{v&&v.preventDefault();let d=SN({name:c,existingAreaNames:r});if(d){o(d);return}a(c)},[r,c,a]),h=Va.default.useCallback(v=>{v.type!=="REMOVE"&&(o(null),n(v.value))},[]);return(0,v5.jsxs)(yn,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>a(c),onCancel:t,children:[(0,v5.jsx)("form",{className:Qt.portalForm,onSubmit:i,children:(0,v5.jsxs)("div",{className:Qt.portalFormInputs,children:[(0,v5.jsx)("span",{className:Qt.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),(0,v5.jsx)(Rn,{label:"Name of new grid area",name:"New-Item-Name",inputType:"string",onUpdate:h,value:c,defaultValue:e}),l?(0,v5.jsx)("div",{className:Qt.validationMsg,children:l}):null]})}),(0,v5.jsxs)("div",{className:Qt.portalFormFooter,children:[(0,v5.jsx)(Y1,{variant:"delete",onClick:t,children:"Cancel"}),(0,v5.jsx)(Y1,{onClick:()=>i(),children:"Done"})]})]})}function SN({name:t,existingAreaNames:a}){return t===""?"A name is needed for the grid area":a.includes(t)?`You already have an item with the name "${t}", all names - need to be unique.`:t.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":t.match(/\s/g)?"Spaces not allowed in grid area names":t.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}var fw=V(X());function Mw(t){let a=g0();return fw.default.useCallback(e=>{a(In({path:t,node:{uiArguments:e}}))},[a,t])}function mw({layout:t,row_sizes:a,col_sizes:r,gap_size:e}){return t=K6(t),a=K6(a),r=K6(r),{layout:t,row_sizes:a,col_sizes:r,gap_size:e}}var xw="460df9678385f992e0aa0ebbbdd99f973170473e3042460de7a8ccd0248f5eb7",bN=`._container_1hvsg_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(kw)){var t=document.createElement("style");t.id=kw,t.textContent=sZ,document.head.appendChild(t)}})();var n7={radioContainer:"_radioContainer_1regb_1",option:"_option_1regb_15",radioInput:"_radioInput_1regb_22",radioLabel:"_radioLabel_1regb_26",icon:"_icon_1regb_41"};var y8=V(b()),gZ="__DEFAULT-RADIO-CHOICE__";function _w({id:t,label:a,choices:r,value:e,onChange:c,optionsPerColumn:n}){let l=Object.keys(r);Gn.useEffect(()=>{e===gZ&&c(l[0])},[l,e,c]);let o=Gn.useMemo(()=>({gridTemplateColumns:n?`repeat(${n}, 1fr)`:void 0}),[n]);return(0,y8.jsx)("fieldset",{className:n7.radioContainer,"aria-labelledby":l0(t),"aria-label":a,style:o,children:l.map(i=>{let{icon:h,label:v=i}=r[i]??{},d=t+i;return(0,y8.jsxs)("div",{className:n7.option,children:[(0,y8.jsx)("input",{className:n7.radioInput,name:t,id:d,type:"radio",value:i,onChange:()=>c(i),checked:i===e}),(0,y8.jsx)("label",{className:n7.radioLabel,htmlFor:d,"data-name":v,children:typeof h=="string"?(0,y8.jsx)("img",{src:h,alt:v,className:n7.icon}):h})]},i)})})}var Iw=V(b());function Rw({id:t,label:a,value:r,onChange:e}){return(0,Iw.jsx)("input",{className:"SUE-Input","aria-label":a,"aria-labelledby":l0(t),id:t,type:"text",value:r,onChange:c=>{let n=c.target.value;e(n)}})}var O5=V(b());function Ew(t){return hw(t).with({inputType:"string"},a=>(0,O5.jsx)(Rw,{...a})).with({inputType:"number"},a=>(0,O5.jsx)(bC,{...a})).with({inputType:"cssMeasure"},a=>(0,O5.jsx)(gw,{...a})).with({inputType:"boolean"},a=>(0,O5.jsx)(dw,{...a})).with({inputType:"list"},a=>(0,O5.jsx)(bw,{...a})).with({inputType:"dropdown"},a=>(0,O5.jsx)(Ow,{...a})).with({inputType:"radio"},a=>(0,O5.jsx)(_w,{...a})).otherwise(({inputType:a})=>(0,O5.jsxs)("div",{children:["I don't know how to render the input of type ",a," yet! Sorry."]}))}function Pw(t,a){if(t===void 0)return!0;if(a==="number")return typeof t=="number";if(a==="string")return typeof t=="string";if(a==="cssMeasure")return DH(t);if(a==="boolean")return typeof t=="boolean";if(a==="list")return Sw(t);if(a==="dropdown"||a==="radio")return typeof t=="string";throw new Error("Unimplemented argument type check",a)}var F0=V(b());function Un({onUpdate:t,...a}){let r=a.value===void 0,e=a.optional,c=l0(a.name),n=a.label??a.name,l=()=>t({type:"UPDATE",value:a.defaultValue}),o=v=>t({type:"UPDATE",value:v}),i=()=>t({type:"REMOVE"}),h;return a.value===void 0?a.optional?h=(0,F0.jsx)(fZ,{labelledBy:c}):h=(0,F0.jsx)(zZ,{name:a.name,onReset:l}):Pw(a.value,a.inputType)?h=(0,F0.jsx)(Ew,{label:n,id:a.name,onChange:o,...a}):h=(0,F0.jsx)(pZ,{name:a.name,onReset:l}),(0,F0.jsxs)("div",{className:"SUE-SettingsInput",children:[(0,F0.jsxs)("div",{className:"info","data-unset":r,children:[e?(0,F0.jsx)("input",{type:"checkbox",checked:!r,title:`Use ${a.name} argument`,"aria-label":`Use ${a.name} argument`,onChange:r?l:i}):null,(0,F0.jsx)("label",{id:c,children:n})]}),h]})}function pZ({name:t,onReset:a}){return(0,F0.jsxs)("div",{className:"mismatched-argument-types",children:["Argument for ",t," of unsupported type.",(0,F0.jsx)(Z1,{style:{padding:"0.25rem 0.5rem",marginInline:"0.25rem"},onClick:a,children:"Reset"})]})}function zZ({name:t,onReset:a}){return(0,F0.jsxs)("div",{className:"missing-required-argument-message",children:['Required argument "',t,'" not provided.',(0,F0.jsx)(Z1,{style:{padding:"0.25rem 0.5rem",marginInline:"0.25rem"},onClick:a,children:"Reset"})]})}function fZ({labelledBy:t}){return(0,F0.jsx)("input",{className:"unset-argument SUE-Input","aria-labelledby":t,placeholder:"Default",disabled:!0})}var z5=V(b());function Tw({onCancel:t,onDone:a,existingAreaNames:r}){let e=`area${r.length}`,[c,n]=Fa.default.useState(e),[l,o]=Fa.default.useState(null),i=Fa.default.useCallback(v=>{v&&v.preventDefault();let d=MZ({name:c,existingAreaNames:r});if(d){o(d);return}a(c)},[r,c,a]),h=Fa.default.useCallback(v=>{v.type!=="REMOVE"&&(o(null),n(v.value))},[]);return(0,z5.jsxs)(En,{title:"Name new grid area",label:"New grid area naming modal",onConfirm:()=>a(c),onCancel:t,children:[(0,z5.jsx)("form",{className:c7.portalForm,onSubmit:i,children:(0,z5.jsxs)("div",{className:c7.portalFormInputs,children:[(0,z5.jsx)("span",{className:c7.infoText,children:"Name for grid area needs to be unique, start with a letter, and contain only letters and numbers."}),(0,z5.jsx)(Un,{label:"Name of new grid area",name:"New-Item-Name",inputType:"string",onUpdate:h,value:c,defaultValue:e}),l?(0,z5.jsx)("div",{className:c7.validationMsg,children:l}):null]})}),(0,z5.jsxs)("div",{className:c7.portalFormFooter,children:[(0,z5.jsx)(Z1,{variant:"delete",onClick:t,children:"Cancel"}),(0,z5.jsx)(Z1,{onClick:()=>i(),children:"Done"})]})]})}function MZ({name:t,existingAreaNames:a}){return t===""?"A name is needed for the grid area":a.includes(t)?`You already have an item with the name "${t}", all names + need to be unique.`:t.match(/^[^a-zA-Z]/g)?"Valid item names need to start with a character.":t.match(/\s/g)?"Spaces not allowed in grid area names":t.match(/[^\w]/g)?"Only letters and numbers allowed in area names":null}var Nw=V($());function Dw(t){let a=z0();return Nw.default.useCallback(e=>{a(Wn({path:t,node:{uiArguments:e}}))},[a,t])}function Zw({layout:t,row_sizes:a,col_sizes:r,gap_size:e}){return t=a8(t),a=a8(a),r=a8(r),{layout:t,row_sizes:a,col_sizes:r,gap_size:e}}var Gw="c03f0e020521f8ffed2e40ac4471dc09be23f7977fc1062e384023fe71735ef0",mZ=`._container_1hvsg_1 { display: grid; /* background-color: var(--bg-color); */ outline: var(--outline); @@ -1334,7 +1349,9 @@ the label */ height: 100%; width: 100%; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(xw)){var t=document.createElement("style");t.id=xw,t.textContent=bN,document.head.appendChild(t)}})();var Hw={container:"_container_1hvsg_1"};var u3=V(b()),Pn=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>{let c=mw(t),n=l6(),{uniqueAreas:l,...o}=$x(c),{areas:i}=o,h=Mw(r),v=En.default.useMemo(()=>Et(i),[i]),[d,u]=En.default.useState(null),s=H=>{let{node:w,currentPath:A,pos:C}=H,k=A!==void 0,E=T9(w);if(k&&E&&"area"in w.uiArguments&&w.uiArguments.area){let _=w.uiArguments.area;g({type:"MOVE_ITEM",name:_,pos:C});return}u(H)},g=H=>{h(U9(c,H))},p=En.default.useCallback(H=>{h(Vc(H))},[h]),L=l.map(H=>(0,u3.jsx)(pH,{area:H,areas:i,gridLocation:v.get(H),onNewPos:w=>g({type:"MOVE_ITEM",name:H,pos:w})},H)),f={"--gap":c.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},m=(H,{node:w,currentPath:A,pos:C})=>{if(T9(w)){let k={...w.uiArguments,area:H};w.uiArguments=k}else w={uiName:"gridlayout::grid_card",uiArguments:{area:H},uiChildren:[w]};n({path:D2(r,a?.length??0),node:w,currentPath:A}),g({type:"ADD_ITEM",name:H,pos:C}),u(null)};return(0,u3.jsxs)(kv.Provider,{value:g,children:[(0,u3.jsx)("div",{style:f,className:Hw.container,...e,draggable:!1,onDragStart:()=>{},children:(0,u3.jsxs)(FC,{...o,onNewLayout:p,children:[aH(i).map(({row:H,col:w})=>(0,u3.jsx)(kC,{gridRow:H,gridColumn:w,onDroppedNode:s},hH({row:H,col:w}))),a?.map((H,w)=>(0,u3.jsx)(T0,{path:[...r,w],node:H},r.join(".")+w)),L]})}),d?(0,u3.jsx)(zw,{info:d,onCancel:()=>u(null),onDone:H=>m(H,d),existingAreaNames:l}):null]})};var Lw=V(b()),FN=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>(0,Lw.jsx)(Pn,{uiArguments:t,uiChildren:a,path:r,wrapperProps:e}),Vw=FN;var Cw={title:"Grid Container",UiComponent:Vw,settingsInfo:{gap_size:{label:"Width",inputType:"cssMeasure",defaultValue:"10px",units:["px","rem"]},layout:{inputType:"omitted",defaultValue:[". .",". ."]},row_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]},col_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]}},acceptsChildren:!0,iconSrc:Hc,category:"Tabs",stateUpdateSubscribers:{UPDATE_NODE:Cc,DELETE_NODE:wc},description:"A general container for arranging items using `gridlayout`"};var Bw=V(b()),ww=t=>(0,Bw.jsx)(Pn,{...t});var yw={title:"Grid Page",UiComponent:ww,acceptsChildren:!0,settingsInfo:{gap_size:{label:"Width",inputType:"cssMeasure",defaultValue:"10px",units:["px","rem"]},layout:{inputType:"omitted",defaultValue:[". .",". ."]},row_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]},col_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]}},stateUpdateSubscribers:{UPDATE_NODE:Cc,DELETE_NODE:wc},category:"gridlayout"};var p6=V(b()),ON=11,kN=RN($6(ON).map(t=>g7?t+1:Math.random())).map(t=>`${Math.round(t*100)}%`);function Aw({title:t=(0,p6.jsx)("span",{children:"My Plot"})}){return(0,p6.jsx)("div",{className:"PlotPlaceholder",children:(0,p6.jsxs)("div",{className:"plot",children:[(0,p6.jsx)("div",{className:"title",children:t}),(0,p6.jsx)("div",{className:"plot-body",children:kN.map((a,r)=>(0,p6.jsx)("div",{className:"bar",style:{"--value":a}},`${r}-${a}`))})]})})}function RN(t){let c=-1/0,n=1/0;for(let i of t)c=Math.max(c,i),n=Math.min(n,i);let l=c-n;return t.map(i=>((i-n)/l+.1)*.85)}var L8=V(b()),IN=({uiArguments:{outputId:t,width:a="100%",height:r="400px"},wrapperProps:e})=>(0,L8.jsx)("div",{className:"plotlyPlotlyOutput",style:{height:r,width:a},...e,children:(0,L8.jsx)(Aw,{title:(0,L8.jsxs)("span",{className:"title-bar",children:[(0,L8.jsx)(r6,{type:"output",name:t}),(0,L8.jsx)("span",{className:"plotly-name",children:"Plotly"})]})})}),Sw=IN;var bw={title:"Plotly Plot",UiComponent:Sw,settingsInfo:{outputId:{inputType:"string",label:"Output ID for plot",defaultValue:"plot"},width:{label:"Width",inputType:"cssMeasure",defaultValue:"100%"},height:{label:"Height",inputType:"cssMeasure",defaultValue:"400px"}},acceptsChildren:!1,iconSrc:Rt,category:"Plotting",description:"Output for interactive `plotly` plots."};var Fw="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=";function Ow(t,a){return{label:t,inputType:"string",defaultValue:a}}function U0(t){return Ow("Input ID",t)}function W0(t){return Ow("Label text",t)}var kw="efcd2a754d7870264062aed6a7f442c57625178fcc0769eadb1b32435cf052a9",PN=`._container_tyghz_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(Gw)){var t=document.createElement("style");t.id=Gw,t.textContent=mZ,document.head.appendChild(t)}})();var Uw={container:"_container_1hvsg_1"};var M3=V(b()),qn=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>{let c=Zw(t),n=d6(),{uniqueAreas:l,...o}=MH(c),{areas:i}=o,h=Dw(r),v=jn.default.useMemo(()=>Gt(i),[i]),[d,u]=jn.default.useState(null),s=H=>{let{node:w,currentPath:A,pos:C}=H,k=A!==void 0,I=q9(w);if(k&&I&&"area"in w.uiArguments&&w.uiArguments.area){let T=w.uiArguments.area;g({type:"MOVE_ITEM",name:T,pos:C});return}u(H)},g=H=>{h(J9(c,H))},p=jn.default.useCallback(H=>{h(Oc(H))},[h]),L=l.map(H=>(0,M3.jsx)(PH,{area:H,areas:i,gridLocation:v.get(H),onNewPos:w=>g({type:"MOVE_ITEM",name:H,pos:w})},H)),f={"--gap":c.gap_size,"--row-gutter":"150px","--col-gutter":"100px","--pad":"8px"},m=(H,{node:w,currentPath:A,pos:C})=>{if(q9(w)){let k={...w.uiArguments,area:H};w.uiArguments=k}else w={uiName:"gridlayout::grid_card",uiArguments:{area:H},uiChildren:[w]};n({path:Z2(r,a?.length??0),node:w,currentPath:A}),g({type:"ADD_ITEM",name:H,pos:C}),u(null)};return(0,M3.jsxs)($v.Provider,{value:g,children:[(0,M3.jsx)("div",{style:f,className:Uw.container,...e,draggable:!1,onDragStart:()=>{},children:(0,M3.jsxs)(tw,{...o,onNewLayout:p,children:[CH(i).map(({row:H,col:w})=>(0,M3.jsx)(rw,{gridRow:H,gridColumn:w,onDroppedNode:s},OH({row:H,col:w}))),a?.map((H,w)=>(0,M3.jsx)(D0,{path:[...r,w],node:H},r.join(".")+w)),L]})}),d?(0,M3.jsx)(Tw,{info:d,onCancel:()=>u(null),onDone:H=>m(H,d),existingAreaNames:l}):null]})};var jw=V(b()),xZ=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>(0,jw.jsx)(qn,{uiArguments:t,uiChildren:a,path:r,wrapperProps:e}),Ww=xZ;var qw={title:"Grid Container",UiComponent:Ww,settingsInfo:{gap_size:{label:"Width",inputType:"cssMeasure",defaultValue:"10px",units:["px","rem"]},layout:{inputType:"omitted",defaultValue:[". .",". ."]},row_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]},col_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]}},acceptsChildren:!0,iconSrc:Fc,category:"Tabs",stateUpdateSubscribers:{UPDATE_NODE:_c,DELETE_NODE:Rc},description:"A general container for arranging items using `gridlayout`"};var Xw=V(b()),$w=t=>(0,Xw.jsx)(qn,{...t});var Kw={title:"Grid Page",UiComponent:$w,acceptsChildren:!0,settingsInfo:{gap_size:{label:"Width",inputType:"cssMeasure",defaultValue:"10px",units:["px","rem"]},layout:{inputType:"omitted",defaultValue:[". .",". ."]},row_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]},col_sizes:{inputType:"omitted",defaultValue:["1fr","1fr"]}},stateUpdateSubscribers:{UPDATE_NODE:_c,DELETE_NODE:Rc},category:"gridlayout"};var Pu=!1;try{Pu=!1}catch{}var x6=V(b()),HZ=11,VZ=LZ(t8(HZ).map(t=>Pu?t+1:Math.random())).map(t=>`${Math.round(t*100)}%`);function Qw({title:t=(0,x6.jsx)("span",{children:"My Plot"})}){return(0,x6.jsx)("div",{className:"PlotPlaceholder",children:(0,x6.jsxs)("div",{className:"plot",children:[(0,x6.jsx)("div",{className:"title",children:t}),(0,x6.jsx)("div",{className:"plot-body",children:VZ.map((a,r)=>(0,x6.jsx)("div",{className:"bar",style:{"--value":a}},`${r}-${a}`))})]})})}function LZ(t){let c=-1/0,n=1/0;for(let i of t)c=Math.max(c,i),n=Math.min(n,i);let l=c-n;return t.map(i=>((i-n)/l+.1)*.85)}var A8=V(b()),CZ=({uiArguments:{outputId:t,width:a="100%",height:r="400px"},wrapperProps:e})=>(0,A8.jsx)("div",{className:"plotlyPlotlyOutput",style:{height:r,width:a},...e,children:(0,A8.jsx)(Qw,{title:(0,A8.jsxs)("span",{className:"title-bar",children:[(0,A8.jsx)(o6,{type:"output",name:t}),(0,A8.jsx)("span",{className:"plotly-name",children:"Plotly"})]})})}),Yw=CZ;var Jw={title:"Plotly Plot",UiComponent:Yw,settingsInfo:{outputId:{inputType:"string",label:"Output ID for plot",defaultValue:"plot"},width:{label:"Width",inputType:"cssMeasure",defaultValue:"100%"},height:{label:"Height",inputType:"cssMeasure",defaultValue:"400px"}},serverBindings:{outputs:{outputIdKey:"outputId",renderScaffold:`renderPlotly({ + plot_ly(z = ~volcano, type = "surface") +})`}},acceptsChildren:!1,iconSrc:Dt,category:"Plotting",description:"Output for interactive `plotly` plots."};var tB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADKUlEQVR4nO3cMY5VVQDG8Q8QaFyACiWFvVqwiyERjHuQAoohbsAEKLTARRiCYtgGxsR6So0LgAYIeRR3bmKGZ0Hi5zl3+P2S17xM8eXkP/e9meKc2e12gf/a2dEDOJ2ERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUCIsKYVEhLCqERYWwqBAWFcKiQlhUfDB6wD8d/nS07+0LSQ6OX1eTfHL83vvmeZI/k/ye5JckvyZ5efKH7n115X+etd9UYe1xLcm9JHOc1lgfJvn0+PV1kqMkd5L8PHLUv5n1o/BckrtZDk1U+11J8ijLOZ0bvOUtsz6xvktyOHrERqzndGfoihNmfGJ9GVG9q8Ms5zaN2cK6kOT70SM26odM9EfNbGFdT3J59IiNupTkxugRq9nCOhg9YOMORg9YzRbWF6MHbNznowesZgvro9EDNu7j0QNWs4V1cfSAjfPlndNNWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4rZwno2esDGvXX7zCizhfX36AEbN835zRbWH6MHbNzT0QNWs4X1ePSAjXs8esBqtrAeZrm1jnf3V5bzm8JsYb1Mcnv0iI26leTF6BGr2cJKlt+6+6NHbMz9TPS0SuYMK0m+TfJg9IiN+DHLeU1l1rBeJ7mZ5Za6vVcpk6Ms94l9k+W8pjLrHaSrR0meZDnAa0k+y3LB2PmRowZ5leUL+m9ZruN+mIn+IXrSmd1uN3oDp9CsH4VsnLCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIiwphUSEsKoRFhbCoEBYVwqJCWFQIi4o3LCE7MROKhbQAAAAASUVORK5CYII=";function aB(t,a){return{label:t,inputType:"string",defaultValue:a}}function $0(t){return aB("Input ID",t)}function X0(t){return aB("Label text",t)}var rB="c069751a104dc442406c9ca6a66564b08ae691736e1c17ec70de8e8fc45a5542",BZ=`._container_tyghz_1 { display: grid; grid-template-rows: 1fr; grid-template-columns: 1fr; @@ -1342,7 +1359,7 @@ the label */ padding: 5px; max-height: 100%; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(kw)){var t=document.createElement("style");t.id=kw,t.textContent=PN,document.head.appendChild(t)}})();var Rw={container:"_container_tyghz_1"};var Lu=V(b()),TN=({uiArguments:t,wrapperProps:a})=>{let{label:r="My Action Button",width:e}=t;return(0,Lu.jsx)("div",{className:Rw.container,...a,children:(0,Lu.jsx)(Y1,{style:e?{width:e}:void 0,children:r})})},Iw=TN;var Ew={title:"Action Button",UiComponent:Iw,settingsInfo:{inputId:U0("myButton"),label:W0("My Button"),width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"]}},acceptsChildren:!1,iconSrc:Fw,category:"Inputs",description:"Creates an action button whose value is initially zero, and increments by one each time it is pressed."};var Pw="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=";var Tw="98e21e4a7dd490c47fe309cad3bd3bbedafd7e09f5d5baea7ff3be2e1499a5ef",DN=`._container_162lp_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(rB)){var t=document.createElement("style");t.id=rB,t.textContent=BZ,document.head.appendChild(t)}})();var eB={container:"_container_tyghz_1"};var Tu=V(b()),yZ=({uiArguments:t,wrapperProps:a})=>{let{label:r="My Action Button",width:e}=t;return(0,Tu.jsx)("div",{className:eB.container,...a,children:(0,Tu.jsx)(Z1,{style:e?{width:e}:void 0,children:r})})},cB=yZ;var nB={title:"Action Button",UiComponent:cB,settingsInfo:{inputId:$0("myButton"),label:X0("My Button"),width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"]}},serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:tB,category:"Inputs",description:"Creates an action button whose value is initially zero, and increments by one each time it is pressed."};var lB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAFS0lEQVR4nO3cz2vTdxzH8Vfb9VeIa7ta1FW2FqQ6pqLbEERhm0OGFzcPY0dhl+LFo4cd9gfsuIs77LDbkAljDqEiCoKszMMEcbqFsjm2OaW6ptClP2zNDvkms2n6I99vXqTp5/mAQJKmn3wPT76fJCTvpnw+L6DWmut9ANiYCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFs/V+wDq5cy5seX+1BNd4piILkt8+uGOmEs2pmDDKrNL0ilJ70h6NeFaP0m6IumspJ8TrtWw2AqlYUl3JJ1W8qgUrXE6WnO4Bus1pNDPWCclff7sHZ1tzepsa4m12PTcgqbnnhZvNkVrz0r6Mv4hNqaQw+pTYbuSJA1s7tB7r/Wpv6c90aJ/Tczq2x/Hde/RTPGus5IuShpPtHCDCXkrPCWpU5K297Rr+O3+xFFJUn+01vYXSmt1RM8VlJDDOly8cmxvr1qam2q2cEtzk47t6a34XKEIeSs8VLwy0NeZaKHRTFaX7xQ+ZRh+60Vt6W4vX/NQxX/cwEIOK1W80toS/2x18ea4rmUmlW5vKUVVYc1UxX/ewELeChMbzWR1LTMpSTp5aGspKhBWbJO5J/rm5iNJ0on9m/Vywu10oyGsmL76/oEk6cBAWgeHuut7MOsQYcUwmsnq18ezSre36Ojid3+IEFaVJnNPSu8Aj+/rVVeqtc5HtD4RVpWu/5LV1OyCdm9Lad/A8/U+nHWLsKrwMDtbehf47l62wJUQVhUu3XosSXpzqIuPFlZBWBWMZrI6c25M5394ULrv9/Fp3f47J0k6vLO7TkfWOAirzMyTp6XPp27cmyrFdfvPKUmFsxUv2FdHWGU6Wpv10eGtpds37k0t+oT9jUFesK8FYVWwqz+tE/s3l24Xz2C7t6V4bbVGhLWMg0PdOjCQXnTf3pfSyzwa5UIO65/ildzcQsUHHN3Tq3R74WvKWza1VvW51TNfUZaW+eXORhby12auSzouSXfv5/T6wKYlD+hKteqT9wdjLX7n/r/lzxWUkM9Y3xWvjNx6rGxuvmYLZ3PzGok+84pcqNniDSLkM9YXkj6WNDg5Pa/PLv+hI6/0aMeWlNpifvFvbiGvsYc5Xb07oamZ0vb6W/RcQQk5LKnwI4cRSZqaWdCF6N2f4TmCE/JWKEmXVPj1c8awdiZa+5Jh7XUv9DOWJF2VtFPSB5KOqPCLmrjfUc+p8EL9iqTzNTm6BkVY//s6uqAGQt8KYUJYsCAsWBAWLHjxvpRlol9oCKuAiX41xlbIRD+L0M9YTPQzCTksJvoZhbwVMtHPKOSwmOhnFPJWyEQ/o5DDYqKfUchbYWJM9FseYcXERL+VEVZMTPRbGWHFwES/1RFWlZjotzaEVSUm+q0NYVWBiX5rR1hVYKLf2hFWBUz0S46wyjDRrzYIqwwT/WqDsCpgol9yhLUMJvolE3JYTPQzCvlrM0z0Mwr5jMVEP6OQz1hM9DMKOSyJiX42IW+FEhP9bEI/Y0lM9LNoyufz9T4GbEChb4UwISxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLAgLFoQFC8KCBWHBgrBgQViwICxYEBYsCAsWhAULwoIFYcGCsGBBWLAgLFgQFiwICxaEBQvCggVhwYKwYEFYsCAsWBAWLP4DpWmTqmVmpDwAAAAASUVORK5CYII=";var oB="b5b8676ca0351dc48fda4947af60e9e121978122e5274a5218233a988a70075f",SZ=`._container_162lp_1 { position: relative; padding: 4px; } @@ -1361,7 +1378,7 @@ the label */ align-items: center; gap: 4px; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Tw)){var t=document.createElement("style");t.id=Tw,t.textContent=DN,document.head.appendChild(t)}})();var Tn={container:"_container_162lp_1",checkbox:"_checkbox_162lp_14"};var s3=V(b()),NN=({uiArguments:t,wrapperProps:a})=>{let r=t.choices;return(0,s3.jsxs)("div",{className:Tn.container,style:{width:t.width},...a,children:[(0,s3.jsx)("label",{children:t.label}),(0,s3.jsx)("div",{children:Object.keys(r).map((e,c)=>(0,s3.jsx)("div",{className:Tn.radio,children:(0,s3.jsxs)("label",{className:Tn.checkbox,children:[(0,s3.jsx)("input",{type:"checkbox",name:r[e],value:r[e],defaultChecked:c===0}),(0,s3.jsx)("span",{children:e})]})},e))})]})},_w=NN;var Dw={title:"Checkbox Group",UiComponent:_w,settingsInfo:{inputId:U0("myCheckboxGroup"),label:W0("Checkbox Group"),choices:{label:"Choices",inputType:"list",defaultValue:{"choice a":"a","choice b":"b"}}},acceptsChildren:!1,iconSrc:Pw,category:"Inputs",description:"Create a group of checkboxes that can be used to toggle multiple choices independently. The server will receive the input as a character vector of the selected values."};var Nw="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=";var _n=V(X());var Zw="8f838927e64cc782544544d9bc65b5b8225416bf61157cdb84978f9ba963a62a",GN=`._container_1x0tz_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(oB)){var t=document.createElement("style");t.id=oB,t.textContent=SZ,document.head.appendChild(t)}})();var $n={container:"_container_162lp_1",checkbox:"_checkbox_162lp_14"};var m3=V(b()),bZ=({uiArguments:t,wrapperProps:a})=>{let r=t.choices;return(0,m3.jsxs)("div",{className:$n.container,style:{width:t.width},...a,children:[(0,m3.jsx)("label",{children:t.label}),(0,m3.jsx)("div",{children:Object.keys(r).map((e,c)=>(0,m3.jsx)("div",{className:$n.radio,children:(0,m3.jsxs)("label",{className:$n.checkbox,children:[(0,m3.jsx)("input",{type:"checkbox",name:r[e],value:r[e],defaultChecked:c===0}),(0,m3.jsx)("span",{children:e})]})},e))})]})},iB=bZ;var hB={title:"Checkbox Group",UiComponent:iB,settingsInfo:{inputId:$0("myCheckboxGroup"),label:X0("Checkbox Group"),choices:{label:"Choices",inputType:"list",defaultValue:{"choice a":"a","choice b":"b"}}},serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:lB,category:"Inputs",description:"Create a group of checkboxes that can be used to toggle multiple choices independently. The server will receive the input as a character vector of the selected values."};var vB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAG+ElEQVR4nO3c228UZRyH8aeFCqULtW6lxW5FTWMqlNbKKZwC0RusxqRqrBrhRmNCNHphQuK/0CtjNEQDN5CYcFUSVGK8gUAgIlKtFRXRSFoKLW26pSeWbbte7HaZPfRk99fDu99P0oSZvrszLU9mZqe7b04kEkEk03LnewfETQpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0wsne8dsHTw+LXpDKsGdgK7gG3AI0DeDDc1CLQBPwNngXNAy1QPamyomOFmFg+nw5rC28C7wJYMPFcBUBn7ej227iLwJXAkA8+/6GRjWMXAIeBV4+1siX09DxwAbhtvb0HJmmus2GlnH9CMfVRerwCXgX2NDRVOn/68suaIdfD4tX3A0eT1S3JzqCorYH2ggLX+5azKX8qS3JwZPfe9kTGCQyN0BEO0tg/y241BRsci3iEB4OjB49dobKg4NqsfZJHIiUQiU49apDwX7yXAJaL/wXFVgQJeqCnG75vptfrkegbCfPNLD63tA8nfagc2AZ3g9sV7tpwKD+GJKjcH6mr87N+xJuNRAfh9eezfUUpdjZ+kg18gti/Oy4aw3gPqvSv2VvvZU1lkvuE9lUXsrfYnr64H3jff+DzLhrD2exc2lPvmJKpxeyqL2FDuS169b852YJ64HtZGPPepluTm8NLTxXO+Ey/VFie/INhC9FrLWa6/KtzpXagu91G4IrM/ct9QmCvtg5y/1kdnf5j62mK2PflgwpjC/KXUlPu4fL0/ed8uZXRnFhDXj1i7vAtVZQUZffK+oTCHT3fQ1Nw9YVTj1gdStr0r3ThXuB7WZu9C4KHlGXviu+ExDp/uoLM/DMDe9UUTRgUQKErZttOnQtfDKvUurMxfkrEn/vpyVzyqLY/5eLYq5dVfglWp216TsZ1ZgFwP6wHvwtIZ3lGfyIWrQS7+G735WbIyjxefWT3lY9Lczc/8DbQFxPWwMq4zGKKpuTu+/Nb2Upbn6deYTL+RGWq61BX/d31tMSUPLpvHvVm4FNYMXLga5J+eEABP+JdNerGe7RTWNPUNhfn+Sm98+Y3tpZOMFoU1Tef+DDIQGgWip8DCFU5fe8+awpqG67eHOXO1D4i+CtQpcGoKaxrO/H7/FPjcurn7A/Zi5vrfCqelMxii6VIX//SEeHPrap5+bFX8e9dvD9N6cwiAqjUrEr4nE1NYwBenO+LXT1/90MXwvbH46c57tNr9lI5W06VTIbBuTX7CclNzN53BUMrRau3D+ekeLmnoiAW8urWU7v62+D0qgO9aehLGVD+a8mY9mYTrR6yETzOERsYmHPjG9lJ8y+7/obj15lD8aFWyMm/W11ZJn9oBCM/qCRc418O66V24Mzw64cDCFXm8tvnhtN/bXlE46x1Js+2b6ca5wvWwEuZPuBUMTTQOgMoyH7ufTI2o9vHZvxJs772bvMrZd4+C+2Gd9S603hic8gHPVfkpWXn/rnp9bXFG3r3wW3vKts+mG+cK1y/ez3kXWtoGqKv2T/q+9+V5uXxUtzajO9E3PEJLW8qHV8+lG+sK149YPxGd9QWIXkCf/Ll7kuE2TjZ3M5J48f4jOhUuegnzNbS0DXDmj96JxmbcmT960x2tUuaQcE02hPU5cMK74lRLD+f/6jPf8Pm/+jiVdD8sti+fmW98nrl+jTXuANFP7JQBjEXgxOXb/N01TF2N32RSkG9bevg19Uh1I7YvzsuWsG4BH5N0Cvq1fYArHYNUl/uoChQQKFr2v6YxGh2LcGd4hPbe6DRGLW0D6W6IAnzc2FBxa5pTWC5q2RIWjQ0Vx2L/oZ8AD42vHx2L0Hy9n+bETylnWi/wYbbMjQXZMz+WVxnwKfDyHO1GE/AB0bmxEmh+LLfcIDp94zt4bkUYuBjbxsukicp1WXMqTONI7GsT96fj3sj/m447DHQQvW82Ph230/eppuL0qVDmTzaeCmUOKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMfEfzGeLdlIh8u4AAAAASUVORK5CYII=";var Xn=V($());var dB="c5617154ce4bad5a3cd5edfe279d8cf5974edfb508e3fd430bf29dd24ab7c687",OZ=`._container_1x0tz_1 { position: relative; padding: 4px; } @@ -1373,10 +1390,10 @@ the label */ ._label_1x0tz_10 { margin-left: 5px; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Zw)){var t=document.createElement("style");t.id=Zw,t.textContent=GN,document.head.appendChild(t)}})();var Cu={container:"_container_1x0tz_1",label:"_label_1x0tz_10"};var Jt=V(b()),UN=({uiArguments:t,wrapperProps:a})=>{let r=t.width??"auto",e={...t},[c,n]=_n.useState(e.value);return _n.useEffect(()=>{n(e.value)},[e.value]),(0,Jt.jsx)("div",{className:Cu.container+" shiny::checkbox",style:{width:r},...a,children:(0,Jt.jsxs)("label",{htmlFor:e.inputId,children:[(0,Jt.jsx)("input",{id:e.inputId,type:"checkbox",checked:c,onChange:l=>n(l.target.checked)}),(0,Jt.jsx)("span",{className:Cu.label,children:e.label})]})})},Gw=UN;var Uw={title:"Checkbox Input",UiComponent:Gw,settingsInfo:{inputId:U0("myCheckboxInput"),label:W0("Checkbox Input"),value:{inputType:"boolean",label:"Starting value",defaultValue:!1},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"]}},acceptsChildren:!1,iconSrc:Nw,category:"Inputs",description:"Create a checkbox that can be used to specify logical values."};var WN=["shiny::tabPanel"];function t7(t){return WN.includes(t.uiName)}function Dn(t){return t7(t)?t.uiArguments.title:null}function Nn({uiChildren:t}){let a=[];return t?.forEach(r=>{let e=Dn(r);e&&a.push(e)}),a}function Zn({uiChildren:t}){let a=t?.[0];return a?Dn(a)??"First Tab":"First Tab"}var Ww="291b6a520d8a6c542446a89f1dfee882f3b8c323c7ca29408ac21de970837b6d",jN=`._container_10z2l_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(dB)){var t=document.createElement("style");t.id=dB,t.textContent=OZ,document.head.appendChild(t)}})();var Nu={container:"_container_1x0tz_1",label:"_label_1x0tz_10"};var l7=V(b()),kZ=({uiArguments:t,wrapperProps:a})=>{let r=t.width??"auto",e={...t},[c,n]=Xn.useState(e.value);return Xn.useEffect(()=>{n(e.value)},[e.value]),(0,l7.jsx)("div",{className:Nu.container+" shiny::checkbox",style:{width:r},...a,children:(0,l7.jsxs)("label",{htmlFor:e.inputId,children:[(0,l7.jsx)("input",{id:e.inputId,type:"checkbox",checked:c,onChange:l=>n(l.target.checked)}),(0,l7.jsx)("span",{className:Nu.label,children:e.label})]})})},uB=kZ;var sB={title:"Checkbox Input",UiComponent:uB,settingsInfo:{inputId:$0("myCheckboxInput"),label:X0("Checkbox Input"),value:{inputType:"boolean",label:"Starting value",defaultValue:!1},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"]}},serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:vB,category:"Inputs",description:"Create a checkbox that can be used to specify logical values."};var _Z=["shiny::tabPanel"];function o7(t){return _Z.includes(t.uiName)}function Kn(t){return o7(t)?t.uiArguments.title:null}function Qn({uiChildren:t}){let a=[];return t?.forEach(r=>{let e=Kn(r);e&&a.push(e)}),a}function Yn({uiChildren:t}){let a=t?.[0];return a?Kn(a)??"First Tab":"First Tab"}var gB="ce5641ff863bd8b41a77c2a5e04692c328d346f77fd5bec35985da71529da17a",RZ=`._container_10z2l_1 { height: 100%; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Ww)){var t=document.createElement("style");t.id=Ww,t.textContent=jN,document.head.appendChild(t)}})();var jw={container:"_container_10z2l_1"};var qw=V(b());function qN({title:t,children:a,...r}){return(0,qw.jsx)("div",{className:jw.container,"data-tab-id":t,"aria-label":`tab panel ${t}`,...r,children:a})}var Gn=qN;var a7=V(X());var Xw="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADSklEQVR4nO3cv0vUYQDH8c/pmWfpmV1G0uAPjAqiyYqWoK1oDKq5PdqE9qaG/ozAKWjpL4jWoKayrcWtIgqiuAYd9LQo8u3zfO39ghvux/C54y3PV9Br9fv9SLttqPQA7U+GJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlRLv0gF9ZXlkdfGg6yf0k15PMJhnd6007+JrkXZInSR4l+bD5yYe3FgtMqkO1YQ1YSvIsydHSQwaMJTm7cbuT5FqSV0UXVaIJR2EvydPUF9WgE1nfOVl6SA2aENa9JDOlR/yhuSR3S4+oQROOwhs7PTjb6+TS4mTmp8cy0RlOe7iFD/n+o5+PX7/n7dqXPH/zMWufvu30sttJHuBjKteEsLZdAV85M5Vr53p7PqQ93EpvfCS98ckszXfz+MVaXr//PPiy//eKfZMmHIUHNt+ZO9rJ1QJRDWoPtXLzwrF0x7b9bNbw22pxTQhri/ML3fCH3p/pjAzl4kK39IwqNS6s2V6n9IQtTh4/WHpClRoX1pHxkdITtpieqGtPLRoXVnuoloNw3ehI4z7CPeGn8o9qC70WhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCVHFP6zu8M0y+0Lp91Xy226qCCtJv/SAXVbL+yn2B/kehUIYlhCGJUQt11i/uxaYunzqcPf0zKGFjfuf9mLQ39i4SP6xvLL6svCUarT6/VquM7WfeBQKYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQvwEAzs9K42yqRkAAAAASUVORK5CYII=";var Kw=V(X());var wu=V(X());function $w(t,{dropFilters:a={rejectedNodes:[]},positionInChildren:r,parentPath:e,onDrop:c,processDropped:n=l=>l}){let l=l6(),o=wu.default.useCallback(({node:h,currentPath:v})=>$N(a,h)&&Mc({fromPath:v,toPath:[...e,r]}),[a,e,r]),i=wu.default.useCallback(h=>{if(c==="add-node"){let{node:v,currentPath:d}=h;l({node:n(v),currentPath:d,path:D2(e,r)})}else c(h)},[c,e,l,r,n]);n6({watcherRef:t,getCanAcceptDrop:o,onDrop:i})}function $N(t,a){if(a===void 0)return!1;if("getCanAcceptDrop"in t)return t.getCanAcceptDrop(a);if("acceptedNodes"in t)return t.acceptedNodes.includes(a.uiName);if("rejectedNodes"in t)return!t.rejectedNodes.includes(a.uiName);throw new Error("Unexpected drop filter setup. Check accepted and rejected node types.")}var Qw=V(b());function KN({children:t,dropArgs:a,...r}){let e=Kw.default.useRef(null);return $w(e,a),(0,Qw.jsx)("div",{ref:e,...r,children:t})}var Un=KN;var La=V(b());function Yw({uiChildren:t,parentPath:a}){return(0,La.jsx)(La.Fragment,{children:t.map((r,e)=>{let c=D2(a,e);return(0,La.jsx)(T0,{path:c,node:r},e6(c))})})}var Jw="e820cac59034df0301f7ea0feac123c00c73e124297ce89bf2e797bb70820276",QN=`._container_fe3r8_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(gB)){var t=document.createElement("style");t.id=gB,t.textContent=RZ,document.head.appendChild(t)}})();var pB={container:"_container_10z2l_1"};var zB=V(b());function IZ({title:t,children:a,...r}){return(0,zB.jsx)("div",{className:pB.container,"data-tab-id":t,"aria-label":`tab panel ${t}`,...r,children:a})}var Jn=IZ;var h7=V($());function EZ(t){return typeof t=="function"}function PZ(t,a){return EZ(t)?t(a):t}function fB(t,a){let r={};for(let e in t){let c=t[e];r[e]=PZ(c,a)}return r}function MB(t,a){let r={};for(let e in t){let c=t[e];r[e]=fB(c,a)}return r}function tl(t,a){let r={};for(let e in t){let c=t[e],n="optional"in c,l="useDefaultIfOptional"in c&&c.useDefaultIfOptional;n&&!l||"defaultValue"in c&&(r[e]=fB(t[e],a).defaultValue)}return r}var mB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAADSklEQVR4nO3cv0vUYQDH8c/pmWfpmV1G0uAPjAqiyYqWoK1oDKq5PdqE9qaG/ozAKWjpL4jWoKayrcWtIgqiuAYd9LQo8u3zfO39ghvux/C54y3PV9Br9fv9SLttqPQA7U+GJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlRLv0gF9ZXlkdfGg6yf0k15PMJhnd6007+JrkXZInSR4l+bD5yYe3FgtMqkO1YQ1YSvIsydHSQwaMJTm7cbuT5FqSV0UXVaIJR2EvydPUF9WgE1nfOVl6SA2aENa9JDOlR/yhuSR3S4+oQROOwhs7PTjb6+TS4mTmp8cy0RlOe7iFD/n+o5+PX7/n7dqXPH/zMWufvu30sttJHuBjKteEsLZdAV85M5Vr53p7PqQ93EpvfCS98ckszXfz+MVaXr//PPiy//eKfZMmHIUHNt+ZO9rJ1QJRDWoPtXLzwrF0x7b9bNbw22pxTQhri/ML3fCH3p/pjAzl4kK39IwqNS6s2V6n9IQtTh4/WHpClRoX1pHxkdITtpieqGtPLRoXVnuoloNw3ehI4z7CPeGn8o9qC70WhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCVHFP6zu8M0y+0Lp91Xy226qCCtJv/SAXVbL+yn2B/kehUIYlhCGJUQt11i/uxaYunzqcPf0zKGFjfuf9mLQ39i4SP6xvLL6svCUarT6/VquM7WfeBQKYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQhiWEIYlhGEJYVhCGJYQhiWEYQlhWEIYlhCGJYRhCWFYQvwEAzs9K42yqRkAAAAASUVORK5CYII=";var HB=V($());var Du=V($());function xB(t,{dropFilters:a={rejectedNodes:[]},positionInChildren:r,parentPath:e,onDrop:c,processDropped:n=l=>l}){let l=d6(),o=Du.default.useCallback(({node:h,currentPath:v})=>NZ(a,h)&&Ac({fromPath:v,toPath:[...e,r]}),[a,e,r]),i=Du.default.useCallback(h=>{if(c==="add-node"){let{node:v,currentPath:d}=h;l({node:n(v),currentPath:d,path:Z2(e,r)})}else c(h)},[c,e,l,r,n]);v6({watcherRef:t,getCanAcceptDrop:o,onDrop:i})}function NZ(t,a){if(a===void 0)return!1;if("getCanAcceptDrop"in t)return t.getCanAcceptDrop(a);if("acceptedNodes"in t)return t.acceptedNodes.includes(a.uiName);if("rejectedNodes"in t)return!t.rejectedNodes.includes(a.uiName);throw new Error("Unexpected drop filter setup. Check accepted and rejected node types.")}var VB=V(b());function DZ({children:t,dropArgs:a,...r}){let e=HB.default.useRef(null);return xB(e,a),(0,VB.jsx)("div",{ref:e,...r,children:t})}var al=DZ;var Oa=V(b());function LB({uiChildren:t,parentPath:a}){return(0,Oa.jsx)(Oa.Fragment,{children:t.map((r,e)=>{let c=Z2(a,e);return(0,Oa.jsx)(D0,{path:c,node:r},i6(c))})})}var CB="e7f899dc7de3c75d644b1f0700bcebf2e034bfacfa63269d8af9a26b0f94dc56",ZZ=`._container_fe3r8_1 { position: relative; height: 100%; width: 100%; @@ -1387,7 +1404,7 @@ the label */ width: 100%; height: 100%; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Jw)){var t=document.createElement("style");t.id=Jw,t.textContent=QN,document.head.appendChild(t)}})();var Bu={container:"_container_fe3r8_1",emptyTabPanelDropDetector:"_emptyTabPanelDropDetector_fe3r8_8"};var Wn=V(b()),yu=["shiny::navbarPage","shiny::tabPanel","gridlayout::grid_card","gridlayout::grid_card_plot","gridlayout::grid_card_text"],YN={rejectedNodes:yu},JN=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>{let c=a&&a.length>0;return(0,Wn.jsx)("div",{className:Bu.container,...e,children:c?(0,Wn.jsx)(Yw,{uiChildren:a,parentPath:r}):(0,Wn.jsx)(Un,{className:Bu.emptyTabPanelDropDetector,dropArgs:{dropFilters:YN,positionInChildren:0,parentPath:r,onDrop:"add-node"}})})},tB=JN;var jn={title:"Tab Panel",UiComponent:tB,settingsInfo:{title:{label:"Title of panel",inputType:"string",defaultValue:"My Shiny App"}},acceptsChildren:!0,iconSrc:Xw,category:"Tabs",description:"Panel containing content for tab-based interfaces like navbar pages"};function qn(t){return t7(t)?t:{...Au,uiChildren:[t]}}var Au={uiName:"shiny::tabPanel",uiArguments:R9(jn.settingsInfo),uiChildren:[]};var cB=V(X());function Ca(t){return"uiName"!=null&&t!=null&&typeof t=="object"&&"uiName"in t}function aB(t,a){return!t||!a?!1:r5(t,a)}var rB="4e87cb0509a9c44d2c61858ff42fbf19dd96e6a18e97805b22c71ee800a8f069",tZ=`._container_qbb7e_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(CB)){var t=document.createElement("style");t.id=CB,t.textContent=ZZ,document.head.appendChild(t)}})();var Zu={container:"_container_fe3r8_1",emptyTabPanelDropDetector:"_emptyTabPanelDropDetector_fe3r8_8"};var rl=V(b()),Gu=["shiny::navbarPage","shiny::tabPanel","gridlayout::grid_card","gridlayout::grid_card_plot","gridlayout::grid_card_text"],GZ={rejectedNodes:Gu},UZ=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>{let c=a&&a.length>0;return(0,rl.jsx)("div",{className:Zu.container,...e,children:c?(0,rl.jsx)(LB,{uiChildren:a,parentPath:r}):(0,rl.jsx)(al,{className:Zu.emptyTabPanelDropDetector,dropArgs:{dropFilters:GZ,positionInChildren:0,parentPath:r,onDrop:"add-node"}})})},wB=UZ;var el={title:"Tab Panel",UiComponent:wB,settingsInfo:{title:{label:"Title of panel",inputType:"string",defaultValue:"My Shiny App"}},acceptsChildren:!0,iconSrc:mB,category:"Tabs",description:"Panel containing content for tab-based interfaces like navbar pages"};function cl(t){return o7(t)?t:{...Uu,uiChildren:[t]}}var Uu={uiName:"shiny::tabPanel",uiArguments:tl(el.settingsInfo),uiChildren:[]};var SB=V($());function i7(t){return"uiName"!=null&&t!=null&&typeof t=="object"&&"uiName"in t}function BB(t,a){return!t||!a?!1:i5(t,a)}var yB="12c5c92d759f390295ea024a9510668d8656e1e0b573749c0afe1db301f81189",WZ=`._container_qbb7e_1 { position: relative; height: 100%; width: 100%; @@ -1508,7 +1525,7 @@ illusion of the selected panel and tab being one entity */ ._tabDropDetector_qbb7e_112.can-accept-drop { width: calc(var(--baseWidth) * 2); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(rB)){var t=document.createElement("style");t.id=rB,t.textContent=tZ,document.head.appendChild(t)}})();var eB={container:"_container_qbb7e_1",header:"_header_qbb7e_13",tabContents:"_tabContents_qbb7e_21",pageTitle:"_pageTitle_qbb7e_26",tabHolder:"_tabHolder_qbb7e_39",tab:"_tab_qbb7e_21",newTabDropDetector:"_newTabDropDetector_qbb7e_99",addTabButton:"_addTabButton_qbb7e_104",tabDropDetector:"_tabDropDetector_qbb7e_112"};var lB=V(b()),aZ={uiName:"unknownUiFunction",uiArguments:{text:"Dummy ui node for app previews"}};function rZ(t){let a=w4(e=>e.uiTree);return cB.default.useMemo(()=>Ca(a)?f0(a,t):aZ,[t,a])}var nB=({name:t,isActive:a,index:r,parentPath:e})=>{let c=D2(e,r),[n]=Ft(),l=rZ(c),o=zc(l,c),i=aB(c,n);return(0,lB.jsx)("div",{className:eB.tab,"data-active-tab":a,"data-selected-tab":i,...o,style:{order:r},"aria-label":a?`Active tab ${t}`:`Select ${t} tab`,children:t})};var oB="041c022241c0a9ac5e2dcb0e99e4cb12378ac58ffc383d5d0399ac825f53eb28",eZ=`._container_qbb7e_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(yB)){var t=document.createElement("style");t.id=yB,t.textContent=WZ,document.head.appendChild(t)}})();var AB={container:"_container_qbb7e_1",header:"_header_qbb7e_13",tabContents:"_tabContents_qbb7e_21",pageTitle:"_pageTitle_qbb7e_26",tabHolder:"_tabHolder_qbb7e_39",tab:"_tab_qbb7e_21",newTabDropDetector:"_newTabDropDetector_qbb7e_99",addTabButton:"_addTabButton_qbb7e_104",tabDropDetector:"_tabDropDetector_qbb7e_112"};var FB=V(b()),jZ={uiName:"unknownUiFunction",uiArguments:{text:"Dummy ui node for app previews"}};function qZ(t){let a=b4(e=>e.app_info);return SB.default.useMemo(()=>i7(a)?m0(a,t):jZ,[t,a])}var bB=({name:t,isActive:a,index:r,parentPath:e})=>{let c=Z2(e,r),[n]=Pt(),l=qZ(c),o=Bc(l,c),i=BB(c,n);return(0,FB.jsx)("div",{className:AB.tab,"data-active-tab":a,"data-selected-tab":i,...o,style:{order:r},"aria-label":a?`Active tab ${t}`:`Select ${t} tab`,children:t})};var OB="9a1ffd80fd32a2d08e4d768961af01725fd6ea7cb22be3be58e00826a1c5383f",$Z=`._container_qbb7e_1 { position: relative; height: 100%; width: 100%; @@ -1629,7 +1646,7 @@ illusion of the selected panel and tab being one entity */ ._tabDropDetector_qbb7e_112.can-accept-drop { width: calc(var(--baseWidth) * 2); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(oB)){var t=document.createElement("style");t.id=oB,t.textContent=eZ,document.head.appendChild(t)}})();var iB={container:"_container_qbb7e_1",header:"_header_qbb7e_13",tabContents:"_tabContents_qbb7e_21",pageTitle:"_pageTitle_qbb7e_26",tabHolder:"_tabHolder_qbb7e_39",tab:"_tab_qbb7e_21",newTabDropDetector:"_newTabDropDetector_qbb7e_99",addTabButton:"_addTabButton_qbb7e_104",tabDropDetector:"_tabDropDetector_qbb7e_112"};var hB=V(b()),cZ={rejectedNodes:yu.filter(t=>t!=="shiny::tabPanel")};function Su({index:t,parentPath:a,children:r,baseWidth:e}){return(0,hB.jsx)(Un,{className:iB.tabDropDetector,"aria-label":"tab drop detector",dropArgs:{parentPath:a,onDrop:"add-node",positionInChildren:t,processDropped:qn,dropFilters:cZ},style:{"--baseWidth":e,order:t-1},children:r})}var vB="7b612b4c08eb2396c68c978469cd0f63a5ddbb32fec29d5b943d99c7fe117b5c",nZ=`._container_qbb7e_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(OB)){var t=document.createElement("style");t.id=OB,t.textContent=$Z,document.head.appendChild(t)}})();var kB={container:"_container_qbb7e_1",header:"_header_qbb7e_13",tabContents:"_tabContents_qbb7e_21",pageTitle:"_pageTitle_qbb7e_26",tabHolder:"_tabHolder_qbb7e_39",tab:"_tab_qbb7e_21",newTabDropDetector:"_newTabDropDetector_qbb7e_99",addTabButton:"_addTabButton_qbb7e_104",tabDropDetector:"_tabDropDetector_qbb7e_112"};var _B=V(b()),XZ={rejectedNodes:Gu.filter(t=>t!=="shiny::tabPanel")};function Wu({index:t,parentPath:a,children:r,baseWidth:e}){return(0,_B.jsx)(al,{className:kB.tabDropDetector,"aria-label":"tab drop detector",dropArgs:{parentPath:a,onDrop:"add-node",positionInChildren:t,processDropped:cl,dropFilters:XZ},style:{"--baseWidth":e,order:t-1},children:r})}var RB="3d4349131721b6b2cb53572cef50ad715f8b79bca78ee5c9edb92eadadc317e1",KZ=`._container_qbb7e_1 { position: relative; height: 100%; width: 100%; @@ -1750,10 +1767,10 @@ illusion of the selected panel and tab being one entity */ ._tabDropDetector_qbb7e_112.can-accept-drop { width: calc(var(--baseWidth) * 2); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(vB)){var t=document.createElement("style");t.id=vB,t.textContent=nZ,document.head.appendChild(t)}})();var z6={container:"_container_qbb7e_1",header:"_header_qbb7e_13",tabContents:"_tabContents_qbb7e_21",pageTitle:"_pageTitle_qbb7e_26",tabHolder:"_tabHolder_qbb7e_39",tab:"_tab_qbb7e_21",newTabDropDetector:"_newTabDropDetector_qbb7e_99",addTabButton:"_addTabButton_qbb7e_104",tabDropDetector:"_tabDropDetector_qbb7e_112"};var bu=V(X());function dB(t,a=0){let[r,e]=bu.default.useState(a);return bu.default.useEffect(()=>{t<=r&&e(t-1)},[r,t]),{activeTab:r,setActiveTab:n=>{e(n)}}}var j0=V(b());function lZ({path:t,title:a,children:r,className:e="",...c}){let n=oZ(r),l=n.length,o=px(),{activeTab:i,setActiveTab:h}=dB(n.length),v=l6(),d=u=>{v({node:u?qn(u):Au,path:D2(t,l)})};return a7.default.useEffect(()=>{let u=D2(t,i);if(!o)return;V5(o)>=V5(u)&&h(o[V5(u)-1])},[i,t,o,h]),(0,j0.jsxs)("div",{className:N1(e,z6.container),...c,children:[(0,j0.jsxs)("div",{className:z6.header,children:[(0,j0.jsx)("h1",{className:z6.pageTitle,children:a}),(0,j0.jsxs)("div",{className:z6.tabHolder,"aria-label":"tabs container",children:[n.map((u,s)=>(0,j0.jsx)(nB,{name:u,parentPath:t,isActive:s===i,index:s},u+s)),$6(l).map(u=>(0,j0.jsx)(Su,{parentPath:t,index:u,baseWidth:"10px"},u)),(0,j0.jsx)(Su,{parentPath:t,index:l,baseWidth:"25px",children:(0,j0.jsx)(vZ,{className:z6.addTabButton,label:"Add new tab",onClick:u=>{u.stopPropagation(),d()}})})]})]}),(0,j0.jsx)("div",{className:z6.tabContents,children:iZ(r,i)})]})}var Xn=lZ;function oZ(t){let a=[];return a7.default.Children.forEach(t,r=>{if(!a7.default.isValidElement(r))return null;let e=r.props.title;typeof e=="string"&&a.push(e)}),a}function iZ(t,a){return a7.default.Children.map(t,(r,e)=>a7.default.isValidElement(r)&&typeof r.props.title=="string"?(0,j0.jsx)("div",{className:z6.tabContents,"data-active-tab":e===a,children:r}):r)}var hZ={display:"block"};function vZ({label:t,onClick:a,className:r}){return(0,j0.jsx)(mn,{className:r,placement:"bottom","aria-label":t,popoverContent:t,onClick:a,openDelayMs:0,children:(0,j0.jsx)(Pt,{style:hZ})})}var uB="0d88da9501dc974bb6ab3873db36eb670786c75efcc95e316621ca89a0fee139",dZ=`._noTabsMessage_130qz_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(RB)){var t=document.createElement("style");t.id=RB,t.textContent=KZ,document.head.appendChild(t)}})();var H6={container:"_container_qbb7e_1",header:"_header_qbb7e_13",tabContents:"_tabContents_qbb7e_21",pageTitle:"_pageTitle_qbb7e_26",tabHolder:"_tabHolder_qbb7e_39",tab:"_tab_qbb7e_21",newTabDropDetector:"_newTabDropDetector_qbb7e_99",addTabButton:"_addTabButton_qbb7e_104",tabDropDetector:"_tabDropDetector_qbb7e_112"};var ju=V($());function IB(t,a=0){let[r,e]=ju.default.useState(a);return ju.default.useEffect(()=>{t<=r&&e(t-1)},[r,t]),{activeTab:r,setActiveTab:n=>{e(n)}}}var K0=V(b());function QZ({path:t,title:a,children:r,className:e="",...c}){let n=YZ(r),l=n.length,o=Px(),{activeTab:i,setActiveTab:h}=IB(n.length),v=d6(),d=u=>{v({node:u?cl(u):Uu,path:Z2(t,l)})};return h7.default.useEffect(()=>{let u=Z2(t,i);if(!o)return;b5(o)>=b5(u)&&h(o[b5(u)-1])},[i,t,o,h]),(0,K0.jsxs)("div",{className:J1(e,H6.container),...c,children:[(0,K0.jsxs)("div",{className:H6.header,children:[(0,K0.jsx)("h1",{className:H6.pageTitle,children:a}),(0,K0.jsxs)("div",{className:H6.tabHolder,"aria-label":"tabs container",children:[n.map((u,s)=>(0,K0.jsx)(bB,{name:u,parentPath:t,isActive:s===i,index:s},u+s)),t8(l).map(u=>(0,K0.jsx)(Wu,{parentPath:t,index:u,baseWidth:"10px"},u)),(0,K0.jsx)(Wu,{parentPath:t,index:l,baseWidth:"25px",children:(0,K0.jsx)(aG,{className:H6.addTabButton,label:"Add new tab",onClick:u=>{u.stopPropagation(),d()}})})]})]}),(0,K0.jsx)("div",{className:H6.tabContents,children:JZ(r,i)})]})}var nl=QZ;function YZ(t){let a=[];return h7.default.Children.forEach(t,r=>{if(!h7.default.isValidElement(r))return null;let e=r.props.title;typeof e=="string"&&a.push(e)}),a}function JZ(t,a){return h7.default.Children.map(t,(r,e)=>h7.default.isValidElement(r)&&typeof r.props.title=="string"?(0,K0.jsx)("div",{className:H6.tabContents,"data-active-tab":e===a,children:r}):r)}var tG={display:"block"};function aG({label:t,onClick:a,className:r}){return(0,K0.jsx)(Sn,{className:r,placement:"bottom","aria-label":t,popoverContent:t,onClick:a,openDelayMs:0,children:(0,K0.jsx)(Ut,{style:tG})})}var EB="55facb3cc0b11c0e9cc5dbb3aafe3b7ff48280ebe95514af9bfea31f9ed37298",rG=`._noTabsMessage_130qz_1 { padding: 5px; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(uB)){var t=document.createElement("style");t.id=uB,t.textContent=dZ,document.head.appendChild(t)}})();var Fu={noTabsMessage:"_noTabsMessage_130qz_1"};var C8=V(b()),uZ=({uiArguments:{title:t},uiChildren:a,path:r,wrapperProps:e})=>{let n=(a?.length??0)>0;return(0,C8.jsx)(Xn,{path:r,title:t,className:Fu.container,...e,children:a?a.map((l,o)=>{let i=D2(r,o),h=t7(l)?l.uiArguments.title:"unknown tab";return(0,C8.jsx)(Gn,{title:h,children:(0,C8.jsx)(T0,{path:i,node:l})},e6(i))}):(0,C8.jsx)(sZ,{hasChildren:n})})};function sZ({hasChildren:t}){return t?null:(0,C8.jsx)("div",{className:Fu.noTabsMessage,children:(0,C8.jsx)("span",{children:"Empty page. Drag elements or Tab Panel on to add content"})})}var sB=uZ;var gB={title:"Navbar Page",UiComponent:sB,settingsInfo:{title:{inputType:"string",label:"Page title",defaultValue:"navbar-page"},collapsible:{label:"Collapse navigation on mobile",inputType:"boolean",defaultValue:!1},id:{inputType:"string",label:"Id for tabset",defaultValue:"tabset-default-id",optional:!0},selected:{inputType:"dropdown",optional:!0,label:"Selected tab on load",defaultValue:t=>t?Zn(t):"First Tab",choices:t=>t?Nn(t):["First Tab"]}},acceptsChildren:!0,category:"layouts",description:"Layout an app with tab-based navigation"};var pB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==";var w8=V(b());function $n({label:t,children:a}){return(0,w8.jsxs)("div",{className:"LabeledInputCategory",children:[(0,w8.jsx)("div",{className:"divider-line",children:(0,w8.jsx)("label",{children:t})}),(0,w8.jsx)("section",{className:"grouped-inputs",children:a}),(0,w8.jsx)("div",{className:"divider-line"})]})}var Kn=V(X());var zB="ad0270b1be37b2d482ada984879784ad6978066e4a005c10d97144e81fffc03b",pZ=`._container_yicbr_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(EB)){var t=document.createElement("style");t.id=EB,t.textContent=rG,document.head.appendChild(t)}})();var qu={noTabsMessage:"_noTabsMessage_130qz_1"};var S8=V(b()),eG=({uiArguments:{title:t},uiChildren:a,path:r,wrapperProps:e})=>{let n=(a?.length??0)>0;return(0,S8.jsx)(nl,{path:r,title:t,className:qu.container,...e,children:a?a.map((l,o)=>{let i=Z2(r,o),h=o7(l)?l.uiArguments.title:"unknown tab";return(0,S8.jsx)(Jn,{title:h,children:(0,S8.jsx)(D0,{path:i,node:l})},i6(i))}):(0,S8.jsx)(cG,{hasChildren:n})})};function cG({hasChildren:t}){return t?null:(0,S8.jsx)("div",{className:qu.noTabsMessage,children:(0,S8.jsx)("span",{children:"Empty page. Drag elements or Tab Panel on to add content"})})}var PB=eG;var TB={title:"Navbar Page",UiComponent:PB,settingsInfo:{title:{inputType:"string",label:"Page title",defaultValue:"navbar-page"},collapsible:{label:"Collapse navigation on mobile",inputType:"boolean",defaultValue:!1},id:{inputType:"string",label:"Id for tabset",defaultValue:"tabset-default-id",optional:!0},selected:{inputType:"dropdown",optional:!0,label:"Selected tab on load",defaultValue:t=>t?Yn(t):"First Tab",choices:t=>t?Qn(t):["First Tab"]}},acceptsChildren:!0,category:"layouts",description:"Layout an app with tab-based navigation"};var NB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHvUlEQVR4nO3bXWxUaR3H8W9fpqWlMCXdbl+gCyvNRtkmLrAuFKQa3FUTEyuJ2iwhGKmJJmq80PTKeGdMmnij7h3UhOzS1Kgb8IYNWaIFW3aVLtGCbFMbWNvOlG7pDC1T5qUzXkxn6Htnuv0zZ4bfJ+GC01P65PCd5zx95kxeLBZDZKPlZ3oAkpsUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYqIw0wMAaOsaXHxoH/A6cAR4ESh70mNyuGngJnAF6AT65n+xvaU+E2NawBFhweOL0dY1eBpozexoHK8MODD352fAmfaW+u/Bsi/SjHBMWABtXYPnga8X5OfRWO/mpefKqHYXUVSoO/Z8oUgUrz/EjY+m6R30MxuNtbZ1DVa2t9Q3Z3psCXmxWCzTY0i8yk4Dre6SQr7bVENteXGGR5UdRn1Bft/twT8TAegAWp1wK3TKVLAXaC3Iz1NUaaotL+ZUUw2F+XkAp4hfy4xzSljHAQ7u3qqo1qGmvJgDu7cm/no8k2NJcEpYRwD27tyS6XFkrXnX7kgmx5HglMX7PoDt29KbrW7cecC59+5x6vPVfHr70h2J2yPTvP/fB/R7AsljX3jBzZcaKtjkWvia8gfCXPr3BO/fmU4e++qL2zjaUJHWmDZC76AfgMZ6d8rfU/v42jniVuiUsFwABfF1Qsquzf0HLCcR3WJ/G/Bz2xPgh6/VJePyB8Kc/usoY1PhBedevDnJgDfAD16tS2tcn8StkYec7xsHwF1SyJ7tm1P6vsLH167IZmTpcUpYaRnzBXnnXxMMTQRXPOfdW5PAwllnzBfkzR4vY1Nhej6cTB6/+qGPsakwDTWlfLuxmk2u/OS5QxNBbtx5wEu7tq74szaK1x/i3LUxonO/qJ+7NsaPXt1BtdsRraTFKWuslDwKR2nrGuTX7/xvwe1tsbvjM8lQ5t/KqsqL+dpn438f8D7+/ut347e/5pcrk7NYVXkxh+ZuRfenF85kFvyBCGe6RwlFosljoUiUM92j+AMR85+/0bJyxoL4WmliKrxsYDsrS1Z8W2PbZteSY7/4xvOr/qySooL1DTJF4dkYHVeWDygR3I9fq8NVkN5SIZOyKqxNrvwFwfzxPW/a/8ajcHxGqKvYtOp5t0em6Rn0U1ZcwJ4dqa1z1iMag7d6vXh8oRXP8fpDvNXr5eThGtJchmZMVoW1Ef4xFF/wv/z88mumy/0TXLwZX599qqKYE4eqcZcuneU2yvm+cW6NPFzzvMSi/tj+SrOxbKSnKqzL/fHthGN7n6EqhY3YoYkgb//zHq8bxnVsf2XWxJKOpyasxEx0bO8zNL5QvuJ5RxsqONpQwaNwlD/0eun3BOjs8T7RLYdckFW/Fa7X2e5RLt6c5PiBZ1eNar5NrnxONtVStcXF0ESQu+MztoPMMTk9Y/kDYTp7vNybjqy4O7+WyjIXY1NhZkKzBiOEt6+PJ3fa19JY786a22bOhpXYTX8YivL9L9auuKbyB8L88i93KSsuWHbbYXxuD8tqy6F5XyX+mciaC/g92zfTvC87ooIcvhV2zu2wf+dw9aoLdXepi6otLqaDs5ztHk1uRzwKRznbHX+bp2qLi52VJSbjzM+D4werVt1dr3YXcfxgVdZsNUCOzli9A77k2z1vXB5Z9pz5M9Q3P/csb1weod8ToP/PQ0vOO3Go2nS8RYX5tDbV8rt3h5dskrpLC2ltqs26p2iza7QpGpl8lNb5OytL+OlX6nhl18I12Cu7yvjJl3ektDXxSSUCmr+77irI49SRWtyl2ff6d8qjySHA9atv7U77CYdcc2vkIWf/7gHg5OGalJ9uCEWi/PxPQwDT7S31GX+wzSkvhT7gwMhkkOfWeKsl181fpKcaFcTf9plzc+NHlT6n3AqvANz4aHqt854KjfXutB7ygwXX7sqGD2gdnBJWJ8Qf3PP4Vn7GSpbn8YXmP/TYmcmxJDglrD6gIxKN0dHtYVRxpczjC9LRPUok/nRgB4s+FZ0pTgmL9pb6VuCCfybCby8Nc+GDjxm+H1zw4JvEhSJRhu8HufDBx/zm0nDiM4UX5q6hIzhl8Q5Ae0t9c1vX4OnZaKz16oCPqwO+TA8pWyQ/Yu8UTtluWHxoP3CC+EeZPgOUPukxOVwA+A/xhfqbwPX5X3TCJ6EdEZbkHsessSS3KCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMTE/wELMTAByexCJAAAAABJRU5ErkJggg==";var b8=V(b());function ll({label:t,children:a}){return(0,b8.jsxs)("div",{className:"LabeledInputCategory",children:[(0,b8.jsx)("div",{className:"divider-line",children:(0,b8.jsx)("label",{children:t})}),(0,b8.jsx)("section",{className:"grouped-inputs",children:a}),(0,b8.jsx)("div",{className:"divider-line"})]})}var ol=V($());var DB="dc86bcb37f6ea834286ba9d75333da4748327f8696c99fb99ac717962ca8a13c",lG=`._container_yicbr_1 { position: relative; padding: 4px; } @@ -1761,7 +1778,7 @@ illusion of the selected panel and tab being one entity */ ._container_yicbr_1 > input { width: 100%; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(zB)){var t=document.createElement("style");t.id=zB,t.textContent=pZ,document.head.appendChild(t)}})();var fB={container:"_container_yicbr_1"};var wa=V(b()),zZ=({uiArguments:t,wrapperProps:a})=>{let r={...t},e=r.width??"200px",[c,n]=Kn.useState(r.value);return Kn.useEffect(()=>{n(r.value)},[r.value]),(0,wa.jsxs)("div",{className:N1(fB.container,"shiny::numericInput"),style:{width:e},...a,children:[(0,wa.jsx)("span",{children:r.label}),(0,wa.jsx)(z8,{type:"number",value:c,onChange:n,min:r.min,max:r.max,step:r.step})]})},MB=zZ;var Ba=V(b()),mB={title:"Numeric Input",UiComponent:MB,settingsInfo:{inputId:U0("myNumericInput"),label:W0("Numeric Input"),min:{label:"Min",inputType:"number",defaultValue:0,optional:!0},max:{label:"Max",inputType:"number",defaultValue:10,optional:!0},value:{label:"Start value",inputType:"number",defaultValue:5},step:{inputType:"number",label:"Step size",defaultValue:1,optional:!0},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0}},settingsFormRender:({inputs:t})=>(0,Ba.jsxs)(Ba.Fragment,{children:[t.inputId,t.label,(0,Ba.jsxs)($n,{label:"Values",children:[t.min,t.max,t.value,t.step]}),t.width]}),acceptsChildren:!1,iconSrc:pB,category:"Inputs",description:"An input control for entry of numeric values"};var xB="5910525b873bad1fbdc1e4207b0b8002df0a9363474621df376d6ffaaa3d7fa2",fZ=`._container_1rlbk_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(DB)){var t=document.createElement("style");t.id=DB,t.textContent=lG,document.head.appendChild(t)}})();var ZB={container:"_container_yicbr_1"};var ka=V(b()),oG=({uiArguments:t,wrapperProps:a})=>{let r={...t},e=r.width??"200px",[c,n]=ol.useState(r.value);return ol.useEffect(()=>{n(r.value)},[r.value]),(0,ka.jsxs)("div",{className:J1(ZB.container,"shiny::numericInput"),style:{width:e},...a,children:[(0,ka.jsx)("span",{children:r.label}),(0,ka.jsx)(H8,{type:"number",value:c,onChange:n,min:r.min,max:r.max,step:r.step})]})},GB=oG;var _a=V(b()),UB={title:"Numeric Input",UiComponent:GB,settingsInfo:{inputId:$0("myNumericInput"),label:X0("Numeric Input"),min:{label:"Min",inputType:"number",defaultValue:0,optional:!0},max:{label:"Max",inputType:"number",defaultValue:10,optional:!0},value:{label:"Start value",inputType:"number",defaultValue:5},step:{inputType:"number",label:"Step size",defaultValue:1,optional:!0},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0}},settingsFormRender:({inputs:t})=>(0,_a.jsxs)(_a.Fragment,{children:[t.inputId,t.label,(0,_a.jsxs)(ll,{label:"Values",children:[t.min,t.max,t.value,t.step]}),t.width]}),serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:NB,category:"Inputs",description:"An input control for entry of numeric values"};var WB="ed617a7b29906d07f86dfcfa858fa8da89d1ee923f3d71cc3d8df944818f640d",iG=`._container_1rlbk_1 { max-height: 100%; } @@ -1787,7 +1804,10 @@ illusion of the selected panel and tab being one entity */ ._plotPlaceholder_1rlbk_5 > svg { margin-inline: auto; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(xB)){var t=document.createElement("style");t.id=xB,t.textContent=fZ,document.head.appendChild(t)}})();var HB={container:"_container_1rlbk_1",plotPlaceholder:"_plotPlaceholder_1rlbk_5",label:"_label_1rlbk_19"};var Ou=V(b()),MZ=({uiArguments:{outputId:t,width:a="300px",height:r="200px"},wrapperProps:e})=>(0,Ou.jsx)("div",{className:HB.container,style:{height:r,width:a},...e,children:(0,Ou.jsx)(xc,{outputId:t})}),VB=MZ;var LB={title:"Plot Output",UiComponent:VB,settingsInfo:{outputId:{inputType:"string",label:"Output ID for plot",defaultValue:"plot"},width:{label:"Width",inputType:"cssMeasure",defaultValue:"100%"},height:{label:"Height",inputType:"cssMeasure",defaultValue:"400px"}},acceptsChildren:!1,iconSrc:Rt,category:"Outputs",description:"Render a `renderPlot()` within an application page."};var CB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==";var Ru=V(X());var wB="6eca47f1777a8d770d7756450f2569350312641d81c24a6a5dd7a63f1a0ddeca",xZ=`._container_sgn7c_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(WB)){var t=document.createElement("style");t.id=WB,t.textContent=iG,document.head.appendChild(t)}})();var jB={container:"_container_1rlbk_1",plotPlaceholder:"_plotPlaceholder_1rlbk_5",label:"_label_1rlbk_19"};var $u=V(b()),hG=({uiArguments:{outputId:t,width:a="300px",height:r="200px"},wrapperProps:e})=>(0,$u.jsx)("div",{className:jB.container,style:{height:r,width:a},...e,children:(0,$u.jsx)(bc,{outputId:t})}),qB=hG;var $B={title:"Plot Output",UiComponent:qB,settingsInfo:{outputId:{inputType:"string",label:"Output ID for plot",defaultValue:"plot"},width:{label:"Width",inputType:"cssMeasure",defaultValue:"100%"},height:{label:"Height",inputType:"cssMeasure",defaultValue:"400px"}},serverBindings:{outputs:{outputIdKey:"outputId",renderScaffold:`renderPlot({ + #Plot code goes here + $0plot(rnorm(100)) +})`}},acceptsChildren:!1,iconSrc:Dt,category:"Outputs",description:"Render a `renderPlot()` within an application page."};var XB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHz0lEQVR4nO3dT2yTBRjH8V+7UsbW/TGwMhyrQSsSEAcHTGDjwEkx6o00JCQm/jmY6ElTInIzojZ6UuJBD5oYtdGLEsbFOKMsGj1Ig7iANboNcIzKimvHtnath/d967v37boW+8C25/dJyLr+ebsuX/q2fd/3madYLIKo3ry3+weglYlhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCTCd7t/gNshGk9We9U+APvMr1sBdADIAbgIYBjAaQDfmF8XFYuEa/xJly+VYS3CA+BZAIcBhMpcvhrAFvPfQ+Z5lwAcA/AuAP4NGSgPy/kMEo0nHwPwDsoHVUkXgOMwYnw+Fgl/6bxCDc+SK4LqsOyi8eQRAK/az2tv8mHnXS24J7gG61v9aG5sQKFQRHoqj/RUHr+P30BiJINr2Zx1kxCAL6Lx5LFYJPzyrX4MSwnDAhCNJ98D8LT1fXuTD4/0rMUD3S3wehxX9noQbPUj2OrH5s4mPLx9LRKjk+hP/I30VN661pFoPNkZi4SfulWPYalR/64wGk++AltUW7ua8cL+EHaEykRVhscD7Ai14EXzNjZPmstWSXVY0XjycQBHre/7Nrfjid4NWO2r/dfi93lxcPd67L2v3X72UfM+1FEdFoC3rRM9oQAe27kOniqepRbiAfDojnXoCQXm3Uc0nlT3e9b8GutZmO/+2pt8OLAriHJNZWfm8O35NIYuZ5GaNF6kd7T6sa2rGb33tqF5dcO863sAHNgVxHBq2nrNFTLv67jgY1ly1P1PsnnJOrH/gbXwl1n9nb2YwRsnhzEwNIGx67PIF4rIF4r4Kz2Dr85dwxsnh3H2YsZ1O7/Pi0d61tnPOizxAJYyrWH1AugGgDuafc4X3QCMqD4aHMN0rrDgQqZzBXw0OFY2rp7uAO5oLq0Qus37VENrWPusEz2hFtfrquzMHD77cbyqj9CLAD77cRyZ6bl553s8xrLL3acGWsPqs06Eg2tcFw7+dr3iM5XTdK6A7y6kXec7lt3nusIKpjWs+60T69v8rgvPXcrWvMChy+7bOJZ9v+sKK5jWsEqvrJ3v6gDg6j+zNS/w6mTOdV5g/rI7al7oMqY1rLprqOZjekW0hpWyTmRn5lwXdrS6V4+LWRtwfySYmb/sqzUvdBnTGtY568SV6+7V3rau5poXuGWD+zaOZf9S80KXMa1hlfb4TI7fcF24J9yGxlXV/2oaV3mxd3O763zHsqvay3Sl0BrW19aJxEgGRccHVoHGBhx4sPwmHicPgAMPBhFonP8moFg0lm0zcNM/7TKkNaxBGPutYyKbQ2LU/cn59o0BHNrTWXFPh9U+Lw71dmL7xoDrssRoBhP/7QB40bxPNTRvhH4dxm7I6E+ksPXOJtf2wu3dAdwdXFPaCH11MocGrwcdLauwZUMz+ja7N0IDwGy+gP5Eyn7W64KPY0nyFJ3rAQXM/c+9AP6AuYfDjlAAB3d3VrX6q6QI4JPvx3Dmv9XgCIBNAAqajtLRuioEgAKA561vzoxkcOLnlOv1Vi2KAE6eSdmjAoyDK6rfPrRCaA4L5tE0pQMoTl9I48PBvzCTr72D2XwBn/5wBd+eT9vPfrXcETsaqA4LAGKR8FEA71vf/3opi7dOjeBMmXeL5RSLxrPdm6dG8PPwpP2iD8xlq6T5xXtJLBJ+JhpP/gHz2Ss9lcfH34+hP2E7/KvNX9r2l5mZw5Xrs8bhX6MZXMu4thO+FouEj9zaR7G0MCxTLBI+Fo0nz8J2wGp6Ko+BoQkMDE1Uu5gRLHDAqjbqV4V2sUj4BIx3cM/BiKRal83bbGJUBj5jOZjv4I4DOB6NJ+1DQbYBCJpXG4exvfE0gIFYJKxqc001GFYFZjCM5iZwVUgiGBaJYFgkgmGRCIZFIviusALHxw0LziDlxw1uDMshGk/WPIM0Gk+WZpDGImF9+yGVwVWhjTmD9E8YH5DWMofUmkH6p9Z5WE58xjJxBml9MSxwBqkE9atCziCVoTosziCVozoscAapGHUP2KaqGaS1smaQtjeVXr5aM0hV0RzWojNIbxZnkOoNa9EZpP8XZ5DqVHEGaT1wBqlOFWeQ1gtnkOpTcQZpvXAGqT4VZ5DWC2eQEtWZ1rAqziCtF84g1afiDNJ64QxSfSrOIK0XziDVp+IM0nrgDFKdFp1B+n9pn0GqNSzANhe0P5HC7E0MW1sIZ5DqDutdmBNl0lN5fP5TdX9GbjFFAJ//NG7fm3TEvC9VNIfFGaSCNIfFGaSCVIcFcAapFB6lA84glcCwTJxBWl+a/zLFQrww9lGPovqjoS/DPMQexpuCsjT9ZQo+Y7mVZpDC2Dlv0RmkULa5phoqn7FInvp3hSSDYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgkgmGRCIZFIhgWiWBYJIJhkQiGRSIYFolgWCSCYZEIhkUiGBaJYFgk4l83+MTmnohKqwAAAABJRU5ErkJggg==";var Ku=V($());var KB="e46dd56bf9f716e19fa9809477728d73aa764fbfaef393ce0998b57358423c7a",dG=`._container_sgn7c_1 { position: relative; padding: 4px; } @@ -1799,7 +1819,7 @@ illusion of the selected panel and tab being one entity */ ._container_sgn7c_1 > label { font-weight: 700; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(wB)){var t=document.createElement("style");t.id=wB,t.textContent=xZ,document.head.appendChild(t)}})();var ku={container:"_container_sgn7c_1"};var g3=V(b()),HZ=({uiArguments:t,wrapperProps:a})=>{let r=t.choices,e=Object.keys(r),c=Object.values(r),[n,l]=Ru.default.useState(c[0]);return Ru.default.useEffect(()=>{c.includes(n)||l(c[0])},[n,c]),(0,g3.jsxs)("div",{className:ku.container,style:{width:t.width},...a,children:[(0,g3.jsx)("label",{children:t.label}),(0,g3.jsx)("div",{children:c.map((o,i)=>(0,g3.jsx)("div",{className:ku.radio,children:(0,g3.jsxs)("label",{children:[(0,g3.jsx)("input",{type:"radio",name:t.inputId,value:o,onChange:h=>l(h.target.value),checked:o===n}),(0,g3.jsx)("span",{children:e[i]})]})},o))})]})},BB=HZ;var yB={title:"Radio Buttons",UiComponent:BB,settingsInfo:{inputId:U0("myRadioButtons"),label:W0("Radio Buttons"),choices:{label:"Choices",inputType:"list",defaultValue:{"choice a":"a","choice b":"b"}},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0,useDefaultIfOptional:!0}},acceptsChildren:!1,iconSrc:CB,category:"Inputs",description:"Create a set of radio buttons used to select an item from a list."};var AB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==";var SB="ff29abd868b1e4488c6adda17ee2be4ab93606a736873274d061f302a63351f8",LZ=`._container_1e5dd_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(KB)){var t=document.createElement("style");t.id=KB,t.textContent=dG,document.head.appendChild(t)}})();var Xu={container:"_container_sgn7c_1"};var x3=V(b()),uG=({uiArguments:t,wrapperProps:a})=>{let r=t.choices,e=Object.keys(r),c=Object.values(r),[n,l]=Ku.default.useState(c[0]);return Ku.default.useEffect(()=>{c.includes(n)||l(c[0])},[n,c]),(0,x3.jsxs)("div",{className:Xu.container,style:{width:t.width},...a,children:[(0,x3.jsx)("label",{children:t.label}),(0,x3.jsx)("div",{children:c.map((o,i)=>(0,x3.jsx)("div",{className:Xu.radio,children:(0,x3.jsxs)("label",{children:[(0,x3.jsx)("input",{type:"radio",name:t.inputId,value:o,onChange:h=>l(h.target.value),checked:o===n}),(0,x3.jsx)("span",{children:e[i]})]})},o))})]})},QB=uG;var YB={title:"Radio Buttons",UiComponent:QB,settingsInfo:{inputId:$0("myRadioButtons"),label:X0("Radio Buttons"),choices:{label:"Choices",inputType:"list",defaultValue:{"choice a":"a","choice b":"b"}},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0,useDefaultIfOptional:!0}},serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:XB,category:"Inputs",description:"Create a set of radio buttons used to select an item from a list."};var JB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAHmUlEQVR4nO3b329T5x3H8Xec2Akm4GRZlB+sbbZ6rVboRKACwgattKFVqtQIaVo0Wk1bM6kX6+WUP2CXuVy3CyTIpGotCprGoJo0KVtFA1rY1CZoM5mUWSu0wXYWQmxIHPwj9i5MEpskrTPyzTmGz0viwvbx0ZPD2+d5fGxX5fN5RDabx+kByKNJYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSZqnB7Akr7B8IN37QN+CBwBdgP1Wz0ml5sDrgGXgDPAaPGD/T1BJ8a0zDVhwcrB6BsMnwJ6nR2N69UDB+//+zlwur8n+FNY80W65VwVFkDfYPg88Gq1p4quYIC9T9bTGvDhq9GsXSydzRFLpLn66Rwj4QSLuXxv32C4ub8n2O302ACq8vm802MAll9lp4DewLYafnK0jfaGWodHVRki8RS/GY6SWMgCDAC9Tk+FbjoNdAK91Z4qRbVB7Q21vHG0jRpPFcAbFI6lo9wU1gmAQ0/vVFT/h7aGWg4+vXPp5gknxwLuCusIQOdTOzZth7/4wyf0DYa5l8lt2j7drOjYHXFyHOCusPYB7GrU2QpgJJxgJJzY0HPaV46d41Ohm94VegGqC+uEx9r4zXnOj04DENhWw3O7tpf1vJqVY+ezGVn53HTGEiCWSPPelSlyecjl4b0rU8QSaaeHtWFuOmOV7YPQDJfDd5hLLS7fd6CjniPPNtKyxsI/MZ/h7D9mCEWTAOxp8/O9bzat2vZeJsdfQjN8OLEyBX3efjdbIpnl9HCEdHZlTZjO5jg9HOGt73yFgL9y/rsq7oz1znCEP12bLYkK4O/X5zh5MbLmQv3kxchyVAChaJKTFyMkkpnl+xLJDL8e+qwkquL9Fm9rIbOYZ+BShEQyu+qxpeAyi+645liOynkJADemFwhFk7Ts8PL64daSs8g7w4V4xj65Q9czDSXP2+7z8OreJvZ27OReJsfZkRihaJKhf87w/YOtAJz/aJqpuxn2tPnpfqGZgN8LwB/HpvlwIlGy7WbL5eHdkRjR+PpTXiyR5t2RGD/6VhuVsAytqLCeat627oerX2/1E4omWUgvrnqsOMI6r4fuF5oJvX+D8egCUDhbhaJJ6mur+UFXK3XelRP5K53NvNLZbPDXrDg/Os34zfkv3G5pUX98v+14NkNFhbVkZCLOX8MJpu6WNz0FtntLb/u9tOzwMnU3w1Q8xex8YT8dX6otiWqrHN/fXBGxbETFhbU05T2s7b7VAflrK27J6VoVFdbV63fWXWONTMQ5N3ar7H3NpwuL/DqfB+7PQsnU43GFfitUVFi35wpT1uFg4KHe/k/FU0zdzVBfW728SAe4fjvFvUxuy6fDcx9Pl32VvSsYqIhps6LO/dt81QD8O5YsuazwQWiGofHZdZ93diS2fLkgkcxw7qP/AvDtYOFD24Dfy4GOeuZSiyXbQuFdYd9gmN/9Lbbpf8+S7n3NZV1df27Xdrr3uT8qqLAzVudXdzI0PksomiT0+/+U/bxQNEno/Rsl932tqZbDzzYu3z72fBM3ZlJrbltfW82x55sebvCfw1MFJw618Ks/T657lb014OPEoZaKuNQAFXbGqvN6ePOldva0+Uvuf3l3I8c7v7zu817e3Vhy+0BHPT9+cVfJlBfwe/nZsSd48ZnAqm3ffKm9ZMq04Kvx0Hu0fc2r6wF/Db1H2yvqW7Ru+gZpHpz/EYDTYok0bw99tnyV3VtdxVvffYK2hvI+V176vnt/T9DRc5ubXgIZgMWcO0J3SmvAx2tdrXiqClPka12tZUdV9BnjnNkAy+SmNdYocPDmbIonm+qcHoujihfp5X5lBihen13b/FFtjJvOWJcArn7q+IvNFbqCAbqCgS/esEjRsbu06QPaIDeFdQbgSjhBNJ5yeiwVJxpPc2XlWtgZJ8cC7gprFBjI5vIMDEeJKK6yReMpBoYjZAvr0wEe+FW0E9wUFv09wV7gQmIhy9tDk1wYu8Xk7VTJF9+kIJ3NMXk7xYWxW/xyaHLpN4UX7h9Dx7lp8Q5Af0+wu28wfGoxl++9PBHn8kTc6SFViuWf2LuBm65jPXjXfuB1Cj9l+gbgf3CDx1wS+BeFhfpvgY+LH3T6eqBrwpJHi6vWWPLoUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYmJ/wEXIDDKviZ6oQAAAABJRU5ErkJggg==";var ty="01134df6cf3ed5620b277cc0da8e1e6fa8dbf838cc873d2daa6f597486e7937b",gG=`._container_1e5dd_1 { position: relative; padding: 4px; } @@ -1817,7 +1837,7 @@ illusion of the selected panel and tab being one entity */ width: 100%; height: 40px; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(SB)){var t=document.createElement("style");t.id=SB,t.textContent=LZ,document.head.appendChild(t)}})();var bB={container:"_container_1e5dd_1"};var r7=V(b()),CZ=({uiArguments:t,wrapperProps:a})=>{let r=t.choices,e=t.inputId;return(0,r7.jsxs)("div",{className:bB.container,...a,children:[(0,r7.jsx)("label",{htmlFor:e,children:t.label}),(0,r7.jsx)("select",{id:e,children:Object.keys(r).map((c,n)=>(0,r7.jsx)("option",{value:r[c],children:c},c))})]})},FB=CZ;var OB={title:"Select Input",UiComponent:FB,settingsInfo:{inputId:U0("mySelectInput"),label:W0("Select Input"),choices:{label:"Choices",inputType:"list",defaultValue:{"choice a":"a","choice b":"b"}}},acceptsChildren:!1,iconSrc:AB,category:"Inputs",description:"Create a select list that can be used to choose a single or multiple items from a list of values."};var kB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==";var IB=V(X());var RB="e842f441aeb7ee57d173dc388429929dfe50a3870c48606cf0de63c9b1e7aa30",BZ=`._container_1f2js_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(ty)){var t=document.createElement("style");t.id=ty,t.textContent=gG,document.head.appendChild(t)}})();var ay={container:"_container_1e5dd_1"};var v7=V(b()),pG=({uiArguments:t,wrapperProps:a})=>{let r=t.choices,e=t.inputId;return(0,v7.jsxs)("div",{className:ay.container,...a,children:[(0,v7.jsx)("label",{htmlFor:e,children:t.label}),(0,v7.jsx)("select",{id:e,children:Object.keys(r).map((c,n)=>(0,v7.jsx)("option",{value:r[c],children:c},c))})]})},ry=pG;var ey={title:"Select Input",UiComponent:ry,settingsInfo:{inputId:$0("mySelectInput"),label:X0("Select Input"),choices:{label:"Choices",inputType:"list",defaultValue:{"choice a":"a","choice b":"b"}}},serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:JB,category:"Inputs",description:"Create a select list that can be used to choose a single or multiple items from a list of values."};var cy="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAEEklEQVR4nO3bT4iUdRzH8behaBI7ZiB1WLokemkvUVk3Ye2ShwjKS6cu1amTIXTpFKUEBR30FnSyQATrUAreDOwf5CEhL1vBhkGsGrK20nT4PQdZpnXn8fnM7PM87xd4cn/f+c3Dm2dmnnlm03A4RGrafdPegLrJsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEZunvYGkt05eudufbAX2Ay8AzwCPAgPgGrAAfAOcBs4Dt+427Oihx2rvtWs6HdYaNgOvAu8Aj4z4/wEwV/17DbgKvA98DPwzmS22Wx9fCvcA3wMnGB3VKLuAD4Bvgb2hfXVK38J6ErhAORPVMVetf7qxHXVUn8LaC5wFdt7jnAeBr/DMtaa+hLUFOEl579SEAfBZNVcj9CWsN6n/8vd/Hq/maoQ+hLUNOByafbiar1U2DYfDae9hHLuB94B5YGY9Cy799jefXvgjtqFXnn2YudkHYvMr14FzwBHgl/SDNaFNZ6w9wEXgRdYZFcDPizdjGwK4HJ5fmaE874uU47DhtSmsd4Ed4y76/a/l5ncywfmr7KAchw2vTWHN11m0dPN20/uY6PwRnpv0A9bRprBqWV75t9Xz26pNYZ2rs2jbluxTTM8f4etJP2AdbQrrbWBp3EWD7dnv2Qf3T/R7/CXKcdjw2hTWZWAfcAq4sd5Fszuzl5lmH5rIZawblOe9j3IcNry2XccaS3U/1kuUr19SXgY+B+/HulObzlh1naHcT5XwZzVfq/QhrGXgWGj2sWq+VulDWAAfAT81PPMS8GHDMzujL2GtAIco97I34RrlvdVKQ/M6py9hQfk0Nc+9v9+6ChygJZ/OpqVPYQF8R7k9+Yea638EnqLc+6419C0sgF8p96y/ASyuc80i8DolqoXQvjqlrz//ug0cBz4BDgLPA09Qflc4Q7n/aYHya54vgS/w099YOn2BVNPTx5dCTYBhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxFGJYiDEsRhqUIw1KEYSnCsBRhWIowLEUYliIMSxGGpQjDUoRhKcKwFGFYijAsRRiWIgxLEYalCMNShGEpwrAUYViKMCxF/Aek7Hy8USK+/wAAAABJRU5ErkJggg==";var ly=V($());var ny="773134eaee4aaef1ca7e735c8390ae03b085b3f812813b5d625aafeef36957ea",fG=`._container_1f2js_1 { padding: 6px; --tract-thickness: 12px; @@ -1874,7 +1894,7 @@ input[type="range"]._sliderInput_1f2js_16::-webkit-slider-thumb { content: attr(data-max); right: 0; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(RB)){var t=document.createElement("style");t.id=RB,t.textContent=BZ,document.head.appendChild(t)}})();var Qn={container:"_container_1f2js_1",sliderWrapper:"_sliderWrapper_1f2js_11",sliderInput:"_sliderInput_1f2js_16"};var f6=V(b()),yZ=({uiArguments:t,wrapperProps:a})=>{let r={...t},{width:e="200px"}=r,[c,n]=IB.useState(r.value);return(0,f6.jsxs)("div",{className:N1(Qn.container,"shiny::sliderInput"),style:{width:e},...a,children:[(0,f6.jsx)("div",{children:r.label}),(0,f6.jsx)("div",{className:Qn.sliderWrapper,children:(0,f6.jsx)("input",{type:"range",min:r.min,max:r.max,value:c,onChange:l=>n(Number(l.target.value)),className:"slider "+Qn.sliderInput,"aria-label":"slider input","data-min":r.min,"data-max":r.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),(0,f6.jsxs)("div",{children:[(0,f6.jsx)(r6,{type:"input",name:r.inputId})," = ",c]})]})},EB=yZ;var ya=V(b()),PB={title:"Slider Input",UiComponent:EB,settingsInfo:{inputId:{label:"Input ID",inputType:"string",defaultValue:"inputId"},label:{label:"Label text",inputType:"string",defaultValue:"Slider Input"},min:{label:"Min",inputType:"number",defaultValue:0},max:{label:"Max",inputType:"number",defaultValue:10},value:{label:"Start",inputType:"number",defaultValue:5},step:{inputType:"number",label:"Step size",defaultValue:1,optional:!0},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0,useDefaultIfOptional:!0}},settingsFormRender:({inputs:t})=>(0,ya.jsxs)(ya.Fragment,{children:[t.inputId,t.label,(0,ya.jsxs)($n,{label:"Values",children:[t.min,t.max,t.value,t.step]}),t.width]}),acceptsChildren:!1,iconSrc:kB,category:"Inputs",description:"Constructs a slider widget to select a number from a range. _(Dates and date-times not currently supported.)_"};var Yn="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGBElEQVR4nO3dW4hVVRzH8e/cdMyZ8TIamZEXFA1CozQTougtqUBJLYkgeumlGAoa6TUqSKFE6qEeInoQRUwrqncjtCia0pepeSjSYKLwkpiOTtPDOsKZfc5c9JzfWmfv8/vAedh7z/BfZ81v9l5n7ctpGRsbw6zeWlM3wIrJwTIJB8skHCyTcLBMwsEyCQfLJBwsk3CwTMLBMgkHyyQcLJNwsEzCwTIJB8skHCyTcLBMwsEyCQfLJBwsk3CwTMLBMgkHyyQcLJNwsEzCwTIJB8skHCyTcLBMwsEyCQfLJBwsk3CwTMLBMgkHyyQcLJNwsEyiPVah/gND1VbPADaXXhuBW0vrWjI/l320s7dXbr8AnAJ+AA4DnwAjmZ9j1xMrsqskogWrii3ALiDOOy2+LmB16bUDGAJ2Ah+naEyKQ2Eb8CbhDTtUOiuAQ4S+botdPMUe6w2gP0HdZnWtr3fGLBp7j7WVylCNAHsJY6xuKscPlNaVv7y9cns3oQ/3Ujm26if0fTQxgzUDeDuz7jSwAegDjhMGoHZjLhD6sI/Qp6cz2/cQ/gZRxAzWNuC2suUR4FFgIGIbmsUA8AhwuWzdYmB7rAbEDNbmzPJ7OFRKPwLvZ9ZtjlU8ZrDWZ5b3RazdrLJ9vC5W4ZifCpdmlqMd75vYcaoP9uVSntKpmBW24vC5QpNwsEwi5hhrqhOpppGk373HMgkHyyQcLJOIOcbymCqNppvHsgLLU7AWAm8Bg8AlwqedWK+LwAngVWCu+H0WQspLk6/HOuBLYEGi+rOAO0uvZ4FNhKDZBGLusbJ7genqBT4lXaiyFhPaMyd1Q6bpRvu9Jnk4FPYBi1I3ImMp8ELqRjSyPBwKH6+2cklvJxtXzGHZwll0d7bR3la/Dz9XR8c49+9Vfhm+yNc/n2P4fNXz5U8Cr9WtaMHkIVgVd/I8dMc8Nq3plRVsb2uht6uD3q45rFvWw75jw5w8VXHV9CpgP3A7+kuA/gKOAR8Cv4lr1UXMQ+FUNwRMZNwfbemCTh4WhiqrvbWF7ffeTM+siv/BdkLoY1xXtgB4jHDh3oPX+bs32u81ycMYa5z1y3uiz/h1drSyYXlP5KpVzQReJ+wlG1rugrWktzNJ3ZW33JSkbhWdwDOpGzGVPIyxxpnf1ZGk7sLuCesOAx8Rbl4YBkbrVLILWAk8DdyV2XZ/nWrI5O56rPbWNKccZ3ZU3bn/CTwFnBWUPA/8AXwFfECYnL1mPmFsN53Lu309ViObIND70YSq3H/AwSrrG/pmFAerNgOR6pyMVKduHKza/B6pzt+R6tSNr8eqzZVIdS7V8Lu+HiuHYj3E5GqkOnXjYJmEg2USuZvHsuvmeSwrDgfLJBwsk/A8VvF5HsuKo1Eum4l290idpWz3P5NsS3508B7LJDyPVXyex7LiaJQx1mT/RfMeWDW3Z/Wi2ctLy+djNKia0leyjfYfGBpI1Ya8aJRgTebM0cGzZ44Ons3F/XQWeB6r+DyPZcXhYJmEg2USnscqPs9jWXE4WCbhYJmE57GKz/NYVhwOlkmkDFZDPy3FahMzWIOMf9743RFrN6v7GN/nv8YqHDNYP2WWd0Ss3ayyffxdrMIxg3Uks/wcsDZi/WazhtDH5Y7EKh4zWAeBU2XLM4HPqXy+ptVuLfAFoY+vOU31JwNKxAzWCPBSZt1i4BtgD+GLmGZHbE/RzCb04R7gW0LflnsRuByrMbGvID0I7AZeLls3g/B9OX1l67KTelOdSPX2ye0m4t4K0kw3vAK8k6Bus3qX0OdRpQjWKOGbs7YCQwnqN4shYBvwPPV79vy0pbyZ4hDwGeHNbwHuIYwL0nxDQP5dIQzQvwcOEw5903kOvETL2Fhe7263RuZzhSbhYJmEg2USDpZJOFgm4WCZhINlEg6WSThYJuFgmYSDZRIOlkk4WCbhYJmEg2USDpZJOFgm4WCZhINlEg6WSThYJuFgmYSDZRIOlkk4WCbhYJmEg2USDpZJOFgm4WCZhINlEg6WSThYJuFgmYSDZRIOlkk4WCbhYJmEg2USDpZJOFgm8T/aaPEMWSCgvwAAAABJRU5ErkJggg==";var e7=V(b()),SZ=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>{let c=a?.length??0;return(0,e7.jsx)(Xn,{path:r,...e,children:c>0?a?.map((n,l)=>{let o=D2(r,l),i=Dn(n)??"unknown tab";return(0,e7.jsx)(Gn,{title:i,children:(0,e7.jsx)(T0,{path:o,node:n})},e6(o))}):(0,e7.jsx)("div",{style:{padding:"5px"},children:(0,e7.jsx)("span",{children:"Empty tabset. Drag elements or Tab Panel on to add content"})})})},TB=SZ;var _B={title:"Tabset Panel",UiComponent:TB,settingsInfo:{id:{inputType:"string",label:"Id for tabset",defaultValue:"tabset-default-id",optional:!0},selected:{inputType:"dropdown",optional:!0,label:"Selected tab on load",defaultValue:t=>t?Zn(t):"First Tab",choices:t=>t?Nn(t):["First Tab"]}},acceptsChildren:!0,iconSrc:Yn,category:"Tabs",description:"A container filled with tabs"};var DB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==";var Jn=V(X());var NB="1a9f56bd60cc271785be3feb6e97630a23256387c7329fc6fac5bbd09e2a010a",FZ=`._container_yicbr_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(ny)){var t=document.createElement("style");t.id=ny,t.textContent=fG,document.head.appendChild(t)}})();var il={container:"_container_1f2js_1",sliderWrapper:"_sliderWrapper_1f2js_11",sliderInput:"_sliderInput_1f2js_16"};var V6=V(b()),MG=({uiArguments:t,wrapperProps:a})=>{let r={...t},{width:e="200px"}=r,[c,n]=ly.useState(r.value);return(0,V6.jsxs)("div",{className:J1(il.container,"shiny::sliderInput"),style:{width:e},...a,children:[(0,V6.jsx)("div",{children:r.label}),(0,V6.jsx)("div",{className:il.sliderWrapper,children:(0,V6.jsx)("input",{type:"range",min:r.min,max:r.max,value:c,onChange:l=>n(Number(l.target.value)),className:"slider "+il.sliderInput,"aria-label":"slider input","data-min":r.min,"data-max":r.max,draggable:!0,onDragStartCapture:l=>{l.stopPropagation(),l.preventDefault()}})}),(0,V6.jsxs)("div",{children:[(0,V6.jsx)(o6,{type:"input",name:r.inputId})," = ",c]})]})},oy=MG;var Ra=V(b()),iy={title:"Slider Input",UiComponent:oy,settingsInfo:{inputId:{label:"Input ID",inputType:"string",defaultValue:"inputId"},label:{label:"Label text",inputType:"string",defaultValue:"Slider Input"},min:{label:"Min",inputType:"number",defaultValue:0},max:{label:"Max",inputType:"number",defaultValue:10},value:{label:"Start",inputType:"number",defaultValue:5},step:{inputType:"number",label:"Step size",defaultValue:1,optional:!0},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0,useDefaultIfOptional:!0}},settingsFormRender:({inputs:t})=>(0,Ra.jsxs)(Ra.Fragment,{children:[t.inputId,t.label,(0,Ra.jsxs)(ll,{label:"Values",children:[t.min,t.max,t.value,t.step]}),t.width]}),serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:cy,category:"Inputs",description:"Constructs a slider widget to select a number from a range. _(Dates and date-times not currently supported.)_"};var hl="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGBElEQVR4nO3dW4hVVRzH8e/cdMyZ8TIamZEXFA1CozQTougtqUBJLYkgeumlGAoa6TUqSKFE6qEeInoQRUwrqncjtCia0pepeSjSYKLwkpiOTtPDOsKZfc5c9JzfWmfv8/vAedh7z/BfZ81v9l5n7ctpGRsbw6zeWlM3wIrJwTIJB8skHCyTcLBMwsEyCQfLJBwsk3CwTMLBMgkHyyQcLJNwsEzCwTIJB8skHCyTcLBMwsEyCQfLJBwsk3CwTMLBMgkHyyQcLJNwsEzCwTIJB8skHCyTcLBMwsEyCQfLJBwsk3CwTMLBMgkHyyQcLJNwsEyiPVah/gND1VbPADaXXhuBW0vrWjI/l320s7dXbr8AnAJ+AA4DnwAjmZ9j1xMrsqskogWrii3ALiDOOy2+LmB16bUDGAJ2Ah+naEyKQ2Eb8CbhDTtUOiuAQ4S+botdPMUe6w2gP0HdZnWtr3fGLBp7j7WVylCNAHsJY6xuKscPlNaVv7y9cns3oQ/3Ujm26if0fTQxgzUDeDuz7jSwAegDjhMGoHZjLhD6sI/Qp6cz2/cQ/gZRxAzWNuC2suUR4FFgIGIbmsUA8AhwuWzdYmB7rAbEDNbmzPJ7OFRKPwLvZ9ZtjlU8ZrDWZ5b3RazdrLJ9vC5W4ZifCpdmlqMd75vYcaoP9uVSntKpmBW24vC5QpNwsEwi5hhrqhOpppGk373HMgkHyyQcLJOIOcbymCqNppvHsgLLU7AWAm8Bg8AlwqedWK+LwAngVWCu+H0WQspLk6/HOuBLYEGi+rOAO0uvZ4FNhKDZBGLusbJ7genqBT4lXaiyFhPaMyd1Q6bpRvu9Jnk4FPYBi1I3ImMp8ELqRjSyPBwKH6+2cklvJxtXzGHZwll0d7bR3la/Dz9XR8c49+9Vfhm+yNc/n2P4fNXz5U8Cr9WtaMHkIVgVd/I8dMc8Nq3plRVsb2uht6uD3q45rFvWw75jw5w8VXHV9CpgP3A7+kuA/gKOAR8Cv4lr1UXMQ+FUNwRMZNwfbemCTh4WhiqrvbWF7ffeTM+siv/BdkLoY1xXtgB4jHDh3oPX+bs32u81ycMYa5z1y3uiz/h1drSyYXlP5KpVzQReJ+wlG1rugrWktzNJ3ZW33JSkbhWdwDOpGzGVPIyxxpnf1ZGk7sLuCesOAx8Rbl4YBkbrVLILWAk8DdyV2XZ/nWrI5O56rPbWNKccZ3ZU3bn/CTwFnBWUPA/8AXwFfECYnL1mPmFsN53Lu309ViObIND70YSq3H/AwSrrG/pmFAerNgOR6pyMVKduHKza/B6pzt+R6tSNr8eqzZVIdS7V8Lu+HiuHYj3E5GqkOnXjYJmEg2USuZvHsuvmeSwrDgfLJBwsk/A8VvF5HsuKo1Eum4l290idpWz3P5NsS3508B7LJDyPVXyex7LiaJQx1mT/RfMeWDW3Z/Wi2ctLy+djNKia0leyjfYfGBpI1Ya8aJRgTebM0cGzZ44Ons3F/XQWeB6r+DyPZcXhYJmEg2USnscqPs9jWXE4WCbhYJmE57GKz/NYVhwOlkmkDFZDPy3FahMzWIOMf9743RFrN6v7GN/nv8YqHDNYP2WWd0Ss3ayyffxdrMIxg3Uks/wcsDZi/WazhtDH5Y7EKh4zWAeBU2XLM4HPqXy+ptVuLfAFoY+vOU31JwNKxAzWCPBSZt1i4BtgD+GLmGZHbE/RzCb04R7gW0LflnsRuByrMbGvID0I7AZeLls3g/B9OX1l67KTelOdSPX2ye0m4t4K0kw3vAK8k6Bus3qX0OdRpQjWKOGbs7YCQwnqN4shYBvwPPV79vy0pbyZ4hDwGeHNbwHuIYwL0nxDQP5dIQzQvwcOEw5903kOvETL2Fhe7263RuZzhSbhYJmEg2USDpZJOFgm4WCZhINlEg6WSThYJuFgmYSDZRIOlkk4WCbhYJmEg2USDpZJOFgm4WCZhINlEg6WSThYJuFgmYSDZRIOlkk4WCbhYJmEg2USDpZJOFgm4WCZhINlEg6WSThYJuFgmYSDZRIOlkk4WCbhYJmEg2USDpZJOFgm8T/aaPEMWSCgvwAAAABJRU5ErkJggg==";var d7=V(b()),xG=({uiArguments:t,uiChildren:a,path:r,wrapperProps:e})=>{let c=a?.length??0;return(0,d7.jsx)(nl,{path:r,...e,children:c>0?a?.map((n,l)=>{let o=Z2(r,l),i=Kn(n)??"unknown tab";return(0,d7.jsx)(Jn,{title:i,children:(0,d7.jsx)(D0,{path:o,node:n})},i6(o))}):(0,d7.jsx)("div",{style:{padding:"5px"},children:(0,d7.jsx)("span",{children:"Empty tabset. Drag elements or Tab Panel on to add content"})})})},hy=xG;var vy={title:"Tabset Panel",UiComponent:hy,settingsInfo:{id:{inputType:"string",label:"Id for tabset",defaultValue:"tabset-default-id",optional:!0},selected:{inputType:"dropdown",optional:!0,label:"Selected tab on load",defaultValue:t=>t?Yn(t):"First Tab",choices:t=>t?Qn(t):["First Tab"]}},acceptsChildren:!0,iconSrc:hl,category:"Tabs",description:"A container filled with tabs"};var dy="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGaklEQVR4nO3c309TZxzH8TeFUqzVwhgRMJtsdppFXcQZnWb+uDEzMdEsWUZmvNh0iRe7NfwBu+Ryyy5MHEvMEoNZ5sQsWUJmFJfhFhWzVZewZv6YozBFqEKhLbS7KNRWIaLy3TnFz+uKltOTh5M3z3k47aEkk8kgMtc8Tg9A5ieFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmChzegBTmtsitDSF8h+vAz4AtgCrgIBDQ3OrYeAKcA441tIUuuTweAq4csZqboscAS4Ch4CNKKrpBMgem0PAxclj5hqumbGmNLdFTgK7Sz0lbAoFWftygNpgOeVlrvwdcExyPE1fLMnlm8N0RWJMpDMHmtsiNS1NoT1Ojw2gJJPJOD0GIHsqBI4AB4ILyvhoax31lT6HR1UceocSfNUZJTY6DtDa0hQ64PSY3DQNNAIHSj0liuoJ1Vf62L+1jjJPCcD+5rZIo9NjclNYewHeWr5YUT2FukofG5cvnnq418mxgLvC2gLQuGzRnO3w0++u0dwWYSyVnrN9ulnesdvi5DjAXWGtA1hapdnqadU/OHY6FebxApRm1wnyFMoeHLtyJ8cB7gpL5hHXXceajdPhAX6K3GM4MZF7bkNDgC0rq1gyzcI/NpLi+G8DhKNxAFbX+XnnjepHth1LpfkxPMDZntis9iszK7oZ62hnLz9cGSyICuDX68McPtM77UL98JneXFQA4Wicw2d6icVTuedi8RRfdPxdEFX+fvO3lccrqhnrxu1RwtE4SxZ52be5tmAWOdqZjaf72j02ragseN3Ccg+711aztmExY6k0x7v6CEfjdPw+wHsbawE4eeE2/fdTrK7zs2d9DUG/F4Dvu29ztidWsK08XlGFtaxmQcEb1fleq/UTjsYZTU488r38CCu8HvasryF86gZXo6NAdrYKR+MEfKW8v6mWCu+DiXxXYw27GmsMfpr5rajCmtLVM8TPkRj992d3egou9BY+9ntZsshL//0U/UMJBkey+2l4wVcQlTy9ogtr6pT3rBaWPxqQ36eo5kpRhXX5+r0Z11hdPUOc6L4z632NJLOL/IpyD4xkn4snno8r9P+Hogrr7nD2lLU5FHymP//7hxL0308R8JXmFukA1+8mGEuldTqcA0V1BBeUlwLwZ1+84LLC6fAAHVcHZ3zd8a6+3OWCWDzFiQv/AvB2KPumbdDvZUNDgOHERMG2kP2rsLktwje/9M35zzOfFdWM1fjKYjquDhKOxgl/+9esXxeOxgmfulHw3KvVPjavrMo93rGmmhsDiWm3DfhK2bGm+tkG/5wpqhmrwuvh4PZ6Vtf5C57fuaqKdxtfnPF1O1dVFTze0BDgw21LC055Qb+XT3a8xLYVwUe2Pbi9vuCUKY/npk+QZoAZr1PJ7Ex+EpeWppCj7+a7acZKAUyk3RF6MUqO59adw06OA9wV1iWAfwYTTo+jaPXFklNfXnFyHOCusM4BXL7p+C9b0co7duecHAe4K6xjAOcjMaJDmrWeVHQoyflI7pMZx5wcC7grrEtA63g6Q2tnlF7FNWvRoQStnb2MZ9enrW64K9pNYTF5P1x7bHSczztu0d59h1t3E/mLUpmUHE9z626C9u47fNZxa+qewnY33FMI7rrckLvUMHm7uCsOUBH5sqUp9LHTg5jiqrAe8iawj+ytTK8D/oc3eM7FgT/ILtS/Jvu/LnKcvh7omrBkfnHVGkvmD4UlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaY+A/iJMS/OUnuYwAAAABJRU5ErkJggg==";var vl=V($());var uy="d1655bacce61c7dd2d8c1a9ed49845fbcbf6ebb417f0970b2988b163000bef7f",VG=`._container_yicbr_1 { position: relative; padding: 4px; } @@ -1882,16 +1902,18 @@ input[type="range"]._sliderInput_1f2js_16::-webkit-slider-thumb { ._container_yicbr_1 > input { width: 100%; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(NB)){var t=document.createElement("style");t.id=NB,t.textContent=FZ,document.head.appendChild(t)}})();var ZB={container:"_container_yicbr_1"};var Aa=V(b()),OZ=({uiArguments:t,wrapperProps:a})=>{let r="200px",e="auto",c={...t},[n,l]=Jn.useState(c.value);return Jn.useEffect(()=>{l(c.value)},[c.value]),(0,Aa.jsxs)("div",{className:N1(ZB.container,"shiny::textInput"),style:{height:e,width:r},...a,children:[(0,Aa.jsx)("label",{htmlFor:c.inputId,children:c.label}),(0,Aa.jsx)("input",{id:c.inputId,type:"text",value:n,onChange:o=>l(o.target.value),placeholder:c.placeholder})]})},GB=OZ;var UB={title:"Text Input",UiComponent:GB,settingsInfo:{inputId:U0("myTextInput"),label:W0("Text Input"),value:{inputType:"string",label:"Starting text",defaultValue:""},placeholder:{inputType:"string",label:"Empty input placeholder",defaultValue:"placeholder text",optional:!0},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0}},acceptsChildren:!1,iconSrc:DB,category:"Inputs",description:"Create an input control for entry of unstructured text values."};var WB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC";var jB="520dbeb7edf4ba92669d631043557a74c19943bb1af4d62296cf836b8d8496ed",RZ=`._container_1i6yi_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(uy)){var t=document.createElement("style");t.id=uy,t.textContent=VG,document.head.appendChild(t)}})();var sy={container:"_container_yicbr_1"};var Ia=V(b()),LG=({uiArguments:t,wrapperProps:a})=>{let r="200px",e="auto",c={...t},[n,l]=vl.useState(c.value);return vl.useEffect(()=>{l(c.value)},[c.value]),(0,Ia.jsxs)("div",{className:J1(sy.container,"shiny::textInput"),style:{height:e,width:r},...a,children:[(0,Ia.jsx)("label",{htmlFor:c.inputId,children:c.label}),(0,Ia.jsx)("input",{id:c.inputId,type:"text",value:n,onChange:o=>l(o.target.value),placeholder:c.placeholder})]})},gy=LG;var py={title:"Text Input",UiComponent:gy,settingsInfo:{inputId:$0("myTextInput"),label:X0("Text Input"),value:{inputType:"string",label:"Starting text",defaultValue:""},placeholder:{inputType:"string",label:"Empty input placeholder",defaultValue:"placeholder text",optional:!0},width:{inputType:"cssMeasure",label:"Width",defaultValue:"100%",units:["%","px","rem"],optional:!0}},serverBindings:{inputs:{inputIdKey:"inputId"}},acceptsChildren:!1,iconSrc:dy,category:"Inputs",description:"Create an input control for entry of unstructured text values."};var zy="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGh0lEQVR4nO3bv2skZQDG8W/8haBNIhbaqHu72Jv0olyw1CbZRfTsktJqk4CNgkVuF+wviIKNm2xz14kJ+AecsROUDWkE7W4LrQ4lFvNOMjOZ/ZXdJ/tGnw8cuezOvTNcvsw78+5k4ezsDLNZe2LeB2D/TQ7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbx1LwPIGthYWGm4zU7vXvARvj2qN2orc50BwVnZ2cjt9naP1EeQqlWvXrt+4wqLCv1CvBR+PuXwO9zPJaxOay4vQw8BF4M338MrAI/ze2IxuRrrLi9x0VUAEvAEfDGXI5mAg4rbn+XvLbIDYjLYcXtW+CXktejj8thxe1P4G3g15L3oo4r6ov3Zqd3G1gGtkn+I7NOgT2SZYTjCcfdJlmGqGRe3gO67UbtaIIxloG19LWwlLAHHLfq1b1JjmmIP4C3gB+A1wvvpXHdJrIL+oVx1l6uS7qO1ez0FoEDkv+wcey1G7XN4ovFdSxgJ4xbKW6b0W03auuD3gyxH3A59KJjYLNVr+ain2Id6yXK4wLoMySueaxjxToVHjJ+VAAbzU5vd8Q2lTDusKgA1pqd3kHZG81ObyOMMSoqSM5mh1v7J6P2N670zHUjpsXowspMMakjYL3dqC1k/wCbJGeF1HY40w1S4SKIu8CtzFjrJFNrai1ElD2uCnCvMGZxnFvhtdRiyb+Zxo2JK7qwyFyzED6GaTdq3eJG7UZtj2SxMGvUWe4UWGk3ajvtRu08pDD+Cvm4tgv/thjIanGcVr162qpXd0hCPT+mrf2TZWbnRsQVY1jZH8LQC+B2o9Ynf9YaNu30SWIovdAPY+1kx2p2estwfrbKRrsz7CK/Va92w/5Sk0zr44g+rujuCsOUMon+6E0AOM6eXQbsu9vs9PpcTJm3ScJdK2w68o6vVa8ujXlcVxX13WJ0YRU1O701kjNRhYs7vEFmcaF8zMUZJh0ve+12HM5u03ie5APld4FnpxxrkEXge+BN4GfRPgaKNqxwET/qTk8he1ZbLHyF/NR7VZ8C9RmMM8oLwBfAO9ewr5zowgrXMwfkr7XmJQ1qVksGqZUZjzfMa9e4r3PRhUVy95WNKl1hPy27O2x2epOueU3itPB1Vh6STFHX4cE17ScnqrDCqnY2krvtRm1n0PYi2aj7ha/F96/qM5KV9HXg6RmMN8gD4BPh+APFttyQO1Ndd1RhgTU77aXXU7mwRizEjuMv4APgGWBhij93gH8G7OMBSbiPpzzWK4nqjEX+hzru9DPtDzlrrTBeulbVJX8jsUF+hf2Srf2TR5mxdlr16tDtr+BD4GvgyZL35hoVxHfGmujMED7TG3dquh3uNAeNVSEfTzddVgjrX9kF0d0wbZfa2j8ZFOisRB0VxBdW9gewCByWfGa33Oz0tpud3iMuL1yOstvs9A6LgYV9/Eg+huI0XHx64rDZ6e2GIAHY2j+pbO2f7JLc1aaOik84TCn6qCDCx2bCWWjSYFK5x2cKj81MYjN8FpkTApzkQ+U+sNKqV8+n9Sl//esO8BUTRuXHZhKbjD917E2w7bjXbOtlUUHug+9xVt6PgdVsVFO6UlTzEl1Y7UatH36xdJ3kormoSzJNLZU93DfEafgccofLMaYfQC+VrZUVju+o3agthe3Ltt0jecBvZYZT4LCo7hNZVBDZVPh/cIWp8H3gGwZHVWdEVJ4Kreg5kjPglaOaF4cVt1dJ4iq6T8RRgcOKXQ/4rfDafSKPChxW7B6TPPLyHckzVZ9zA6ICX7ybiM9YJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJNwWCbhsEzCYZmEwzIJh2USDsskHJZJOCyTcFgm4bBMwmGZhMMyCYdlEg7LJByWSTgsk3BYJuGwTMJhmYTDMgmHZRIOyyQclkk4LJP4F7bdmR9UysBAAAAAAElFTkSuQmCC";var fy="d067731bd85b0a509144609f5ce061b30b2a29e8ec3aeb1a7c8ced25d2d04051",wG=`._container_1i6yi_1 { padding: 1rem; max-height: 100%; background-color: var(--light-grey); border-radius: var(--corner-radius); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(jB)){var t=document.createElement("style");t.id=jB,t.textContent=RZ,document.head.appendChild(t)}})();var qB={container:"_container_1i6yi_1"};var Iu=V(b()),IZ=({uiArguments:t,wrapperProps:a})=>(0,Iu.jsxs)("div",{className:qB.container,...a,children:["Dynamic text from ",(0,Iu.jsxs)("code",{children:["output$",t.outputId]})]}),XB=IZ;var $B={title:"Text Output",UiComponent:XB,settingsInfo:{outputId:{label:"Output ID",inputType:"string",defaultValue:"textOutput"}},acceptsChildren:!1,iconSrc:WB,category:"Outputs",description:` +`;(function(){if(!(typeof document>"u")&&!document.getElementById(fy)){var t=document.createElement("style");t.id=fy,t.textContent=wG,document.head.appendChild(t)}})();var My={container:"_container_1i6yi_1"};var Qu=V(b()),BG=({uiArguments:t,wrapperProps:a})=>(0,Qu.jsxs)("div",{className:My.container,...a,children:["Dynamic text from ",(0,Qu.jsxs)("code",{children:["output$",t.outputId]})]}),my=BG;var xy={title:"Text Output",UiComponent:my,settingsInfo:{outputId:{label:"Output ID",inputType:"string",defaultValue:"textOutput"}},serverBindings:{outputs:{outputIdKey:"outputId",renderScaffold:`renderText({ + "Hello, World" +})`}},acceptsChildren:!1,iconSrc:zy,category:"Outputs",description:` Render a reactive output variable as text within an application page. Usually paired with \`renderText()\`. - `};var KB="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==";var QB="45be4b5f8dcaf6b50113dcff38a7fe42a73b5aed48b53f0dbe7b3d6adb3128a1",PZ=`._container_1xnzo_1 { + `};var Hy="data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAJYAAACWCAYAAAA8AXHiAAAACXBIWXMAABYlAAAWJQFJUiTwAAAGT0lEQVR4nO3cy29UZRjH8e902tIbVFouNQpEQKLGCsEYUGJcGFHiQk2MxsTg0rgwulH/AmPiyoUoEdTgLdG4MJpoCJY7VTCgAQQpBVGm9+u0c+vcjosySENpC5ynp33n91k105PmafvNe86c87Yhz/MQ8VtJ0AOImxSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlphQWGJCYYkJhSUmFJaYUFhiQmGJCYUlJhSWmFBYYkJhiQmFJSYUlpgoDXoAv7z5dWvhw/XAK8CDwG1AVVAzTWIE6AQOA9uAnwHefX5lkDP5xrUV6y3gELAZuJOZGxXAHGAZ8BywC3g32HH85cyKBTwCvAOE5lWWeo/dWxe6q6GKuZWllISCHm0sD4incrR2J9l5oi/fF8uUAG8wGtiuYKfzh0sr1qtAaH51af71jUtC65bPo7Zq5kUFEAJqKsKsWVrDaxuXlCyYW5a79KmXg5zLTy6FtQHg8cb6kpqKcNCzTFlFWQmbGusLAz8U6DA+cimsxQCrFs/ky6rxLV9UWfiwPsg5/OTSNVYIRk8xQfOAU21xTrfHiY/kqKsuY/XSGpbWV4x7fPWcyzOXT9eM1lwKa0ZIpHPsONjJ3z3JMa8faBlk/Ypanr5/4Yy87vObS6fCwHnAF81XR1Xw67koO0/0Te9QAVFYPjrTkaC1a/yoCvafGWQomZ2miYKjsHzU0pmY9Jhc3qO1e+L4XKCwfJQYyU1+0HUcN5spLB/Nr57ae6G66jLjSYKnsHy0eulcQpO846upCLNyceXEBzlAYfmoobach1fdcs3Ph4Cn1y6kvNT9H7vuY/nsyTULqCwPs/tUP5mcd/n1eZWlPLV2AY231wQ43fRRWD4LAY/eM58HV87jXHeSRDpPXVUpdyyspDRcBHdGL1FYRqrKw0WzOo1HYQFDySyHzw1xsT9FuCTEikWVrFtRS1kRrTB+K/qwTkZifHOkm1Qmf/m1P9viNLdGeWnDrSyudea58LRy/+3JBA6cGeTzQ51joiroHc7wwe4I56/x3E8mVpRhecAPf/Tywx+9eBMcl0zn2b6vnROR2HSN5oyiCyuX9/jql04OnBmc0vHZnMeXzZ00n43aDuaYorrGSmXy7DjYwbnrfAic9+C7Yz1Ek1meuK+eyS7pPQ+OR2K0diUoD5ewZlkNS+rG3+TnqqIJK5rM8sn+djoG0zf8NfacHmAomeXZBxYRvsZuvfhIjs8Ojd2TdbBlkEfuns+mxvpJH/m4oijC6hpK8/G+dgYTN78P6uiFYYZTOTZvaLjq0cxAPMv2fe30DI+N1wP2nh6gdzjNC+sbiuI2hvPXWBd6U3zY1OZLVAUtnQm27mkjlvp/+0vXUJoPmiJXRXWlk5E4W3e3MZzStplZ7WQkxkd720ik/f9FRvpH2NIUoS+W4d++0XijU9gZerE/xfs/X6QreuOn5NnA2VNh89ko3//eQ36i+wk3qS+WYUtThHTWI529+l7YtQzEs2xpivDiQw2saph9f642Fc6tWB7w0/E+vjtmG1VBLJW7rqgKUpk8nx7o4Mj5IYOpgufcivXN4S6OXhgOeowpyeU9vv2tm97hTNCj+M65FWu2RHWlvX8NBD2C75wLa5a7/nPqDOVSWC48cxkMegC/uBTW8aAH8MHJoAfwi0thfR/0AD74MegB/OJSWNuAf4Ie4ib0Mvo9OMGlsKLAM4z+w9jZJgo8C/QHPYhfXAoL4HegEXib0Wuumbz9cwRoAd5jdOZ9gU7js5DnTcPtaSk6rq1YMkMoLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDEhMISEwpLTCgsMaGwxITCEhMKS0woLDGhsMSEwhITCktMKCwxobDExH/tpJ306UTa3AAAAABJRU5ErkJggg==";var Vy="0b5d95e17c08bf444aaed285900389dbe184ef70135396cc210f9c68ec06d2e4",AG=`._container_1xnzo_1 { display: grid; grid-template-rows: 1fr; grid-template-columns: 1fr; @@ -1902,11 +1924,13 @@ input[type="range"]._sliderInput_1f2js_16::-webkit-slider-thumb { background-color: var(--light-grey); border-radius: var(--corner-radius); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(QB)){var t=document.createElement("style");t.id=QB,t.textContent=PZ,document.head.appendChild(t)}})();var YB={container:"_container_1xnzo_1"};var tl=V(b()),TZ=({uiArguments:t,wrapperProps:a})=>{let{outputId:r="shiny-ui-output"}=t;return(0,tl.jsx)("div",{className:YB.container,...a,children:(0,tl.jsxs)("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",r,"!"]})})},JB=TZ;var ty={title:"Dynamic UI Output",UiComponent:JB,settingsInfo:{outputId:{label:"Output ID",inputType:"string",defaultValue:"dynamicUiOutput"}},acceptsChildren:!1,iconSrc:KB,category:"Outputs",description:` +`;(function(){if(!(typeof document>"u")&&!document.getElementById(Vy)){var t=document.createElement("style");t.id=Vy,t.textContent=AG,document.head.appendChild(t)}})();var Ly={container:"_container_1xnzo_1"};var dl=V(b()),SG=({uiArguments:t,wrapperProps:a})=>{let{outputId:r="shiny-ui-output"}=t;return(0,dl.jsx)("div",{className:Ly.container,...a,children:(0,dl.jsxs)("div",{style:{gridArea:"1/1",placeSelf:"center"},children:["This is a a dynamic UI Output ",r,"!"]})})},Cy=SG;var wy={title:"Dynamic UI Output",UiComponent:Cy,settingsInfo:{outputId:{label:"Output ID",inputType:"string",defaultValue:"dynamicUiOutput"}},serverBindings:{outputs:{outputIdKey:"outputId",renderScaffold:`renderUI({ + h1("Hello, World") +})`}},acceptsChildren:!1,iconSrc:Hy,category:"Outputs",description:` Render a reactive output variable as HTML within an application page. The text will be included within an HTML \`div\` tag, and is presumed to contain HTML content which should not be escaped. - `};function ay(t){return f2({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(t)}function ry(t){return f2({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(t)}var ey="f815fd746ca9f7b4c492df115231d9130a7f5e92f36287e3d41f77c81ae1beca",_Z=`._categoryDivider_bdwku_1 { + `};function By(t){return M2({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M512 64C264.6 64 64 264.6 64 512s200.6 448 448 448 448-200.6 448-448S759.4 64 512 64zm0 820c-205.4 0-372-166.6-372-372s166.6-372 372-372 372 166.6 372 372-166.6 372-372 372z"}},{tag:"path",attr:{d:"M623.6 316.7C593.6 290.4 554 276 512 276s-81.6 14.5-111.6 40.7C369.2 344 352 380.7 352 420v7.6c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8V420c0-44.1 43.1-80 96-80s96 35.9 96 80c0 31.1-22 59.6-56.1 72.7-21.2 8.1-39.2 22.3-52.1 40.9-13.1 19-19.9 41.8-19.9 64.9V620c0 4.4 3.6 8 8 8h48c4.4 0 8-3.6 8-8v-22.7a48.3 48.3 0 0 1 30.9-44.8c59-22.7 97.1-74.7 97.1-132.5.1-39.3-17.1-76-48.3-103.3zM472 732a40 40 0 1 0 80 0 40 40 0 1 0-80 0z"}}]})(t)}function yy(t){return M2({tag:"svg",attr:{viewBox:"0 0 1024 1024"},child:[{tag:"path",attr:{d:"M881.7 187.4l-45.1-45.1a8.03 8.03 0 0 0-11.3 0L667.8 299.9l-54.7-54.7a7.94 7.94 0 0 0-13.5 4.7L576.1 439c-.6 5.2 3.7 9.5 8.9 8.9l189.2-23.5c6.6-.8 9.3-8.8 4.7-13.5l-54.7-54.7 157.6-157.6c3-3 3-8.1-.1-11.2zM439 576.1l-189.2 23.5c-6.6.8-9.3 8.9-4.7 13.5l54.7 54.7-157.5 157.5a8.03 8.03 0 0 0 0 11.3l45.1 45.1c3.1 3.1 8.2 3.1 11.3 0l157.6-157.6 54.7 54.7a7.94 7.94 0 0 0 13.5-4.7L447.9 585a7.9 7.9 0 0 0-8.9-8.9z"}}]})(t)}var Ay="b3057bf449234bfd852c2111754236245944266dfa5d9d787dcf097d18fae302",bG=`._categoryDivider_bdwku_1 { display: block; position: relative; isolation: isolate; @@ -1931,10 +1955,22 @@ input[type="range"]._sliderInput_1f2js_16::-webkit-slider-thumb { z-index: -1; opacity: 0.5; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(ey)){var t=document.createElement("style");t.id=ey,t.textContent=_Z,document.head.appendChild(t)}})();var cy={categoryDivider:"_categoryDivider_bdwku_1"};var ly=V(b());function DZ({children:t}){return(0,ly.jsx)("div",{className:cy.categoryDivider,children:t})}var ny=DZ;function oy(t){return t.replaceAll(/\(/g,`( +`;(function(){if(!(typeof document>"u")&&!document.getElementById(Ay)){var t=document.createElement("style");t.id=Ay,t.textContent=bG,document.head.appendChild(t)}})();var Sy={categoryDivider:"_categoryDivider_bdwku_1"};var Fy=V(b());function FG({children:t}){return(0,Fy.jsx)("div",{className:Sy.categoryDivider,children:t})}var by=FG;function Oy(t){return t.replaceAll(/\(/g,`( `).replaceAll(/\)/g,` )`).replaceAll(/\(\s+\)/g,"()").replaceAll(/,/g,`, - `).replaceAll(/(\s+)$/g,"")}var Sa=V(b()),NZ=20,ZZ=({uiArguments:t,wrapperProps:a})=>{let r=t.text.slice(0,NZ).replaceAll(/\s$/g,"")+"...";return(0,Sa.jsx)("div",{className:"unknown-ui-function-display",...a,children:(0,Sa.jsxs)("div",{children:["unknown ui output: ",(0,Sa.jsx)("code",{children:r})]})})},iy=ZZ;var B5=V(b()),hy={title:"Unknown UI Function",UiComponent:iy,settingsInfo:{text:{inputType:"omitted",defaultValue:"Unknown Ui Function"}},settingsFormRender:({settings:t})=>(0,B5.jsxs)("div",{className:"unknown-ui-function-settings",children:[(0,B5.jsx)("div",{className:"SUE-SettingsInput",children:(0,B5.jsxs)("span",{className:"info-msg",children:[(0,B5.jsx)(ay,{}),"Unknown function call. Can't modify with visual editor."]})}),(0,B5.jsx)(ny,{children:(0,B5.jsx)("span",{children:"Code"})}),(0,B5.jsx)("div",{className:"SUE-SettingsInput",children:(0,B5.jsx)("pre",{className:"code-holder",children:oy(t.text)})})]}),acceptsChildren:!1};var N2={"shiny::actionButton":Ew,"shiny::numericInput":mB,"shiny::sliderInput":PB,"shiny::textInput":UB,"shiny::checkboxInput":Uw,"shiny::checkboxGroupInput":Dw,"shiny::selectInput":OB,"shiny::radioButtons":yB,"shiny::plotOutput":LB,"shiny::textOutput":$B,"shiny::uiOutput":ty,"shiny::navbarPage":gB,"shiny::tabPanel":jn,"shiny::tabsetPanel":_B,"gridlayout::grid_page":yw,"gridlayout::grid_card":Ax,"gridlayout::grid_card_text":Nx,"gridlayout::grid_card_plot":Ix,"gridlayout::grid_container":Cw,"DT::DTOutput":rx,"plotly::plotlyOutput":bw,unknownUiFunction:hy};function vy(t,{path:a,node:r}){let e=Lc(a),c=a[a.length-1],n=f0(t,e);if(!N2[n.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(n.uiChildren)||(n.uiChildren=[]),n.uiChildren=H5(n.uiChildren,c,r)}function al(t,{path:a}){let{parentNode:r,indexToNode:e}=GZ(t,a);if(!W9(r))throw new Error("Somehow trying to enter a leaf node");r.uiChildren.splice(e,1)}function GZ(t,a){let r=[...a],e=r.pop();if(typeof e>"u")throw new Error("Path to node must have at least one element");let c=r.length===0?t:f0(t,r);if(!W9(c))throw new Error("Somehow trying to enter a leaf node");return{parentNode:c,indexToNode:e}}function dy(t,{path:a,currentPath:r,node:e}){let c=Lc(a),n=a[a.length-1],l=f0(t,c);if(!N2[l.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(l.uiChildren)||(l.uiChildren=[]);let o=[...c,n];if(Ot(r,o)){let i=r[r.length-1];l.uiChildren=Ym(l.uiChildren,i,n);return}al(t,{path:r}),l.uiChildren=H5(l.uiChildren,n,e)}function Eu(t){return"currentPath"in t&&t.currentPath!==void 0}function uy(t,a){let{path:r,node:e}=a;if(Eu(a)){dy(t,{path:r,currentPath:a.currentPath,node:e});return}vy(t,{path:r,node:a.node})}function sy(t,{path:a,node:r}){let e=f0(t,a);Object.assign(e,r)}function gy(t){let a=new Set;try{for(let r of Object.values(N2)){let e=r?.stateUpdateSubscribers?.[t];e&&a.add(e)}return a}catch{return a}}var py=gy("DELETE_NODE"),zy=gy("UPDATE_NODE");var My=yt({name:"state",initialState:{mode:"LOADING"},reducers:{SET_FULL_STATE:(t,a)=>a.payload.state,SET_UI_TREE:(t,a)=>({mode:"MAIN",uiTree:a.payload.uiTree}),SHOW_TEMPLATE_CHOOSER:(t,{payload:a})=>({mode:"TEMPLATE_CHOOSER",options:a}),SET_LOADING:t=>({mode:"LOADING"}),UPDATE_NODE:(t,a)=>{if(t.mode!=="MAIN")throw new Error("Tried to update a node when in template chooser mode");for(let r of zy)r(t.uiTree,a.payload);sy(t.uiTree,a.payload)},PLACE_NODE:(t,a)=>{if(t.mode!=="MAIN")throw new Error("Tried to move a node when in template chooser mode");uy(t.uiTree,a.payload)},DELETE_NODE:(t,a)=>{if(t.mode!=="MAIN")throw new Error("Tried to delete a node when in template chooser mode");for(let r of py)r(t.uiTree,{path:a.payload.path});al(t.uiTree,a.payload)}}});var{UPDATE_NODE:In,PLACE_NODE:Pu,DELETE_NODE:rl,SET_UI_TREE:my,SET_FULL_STATE:el,SHOW_TEMPLATE_CHOOSER:xy,SET_LOADING:Qi1}=My.actions;function l6(){let t=g0();return fy.default.useCallback(r=>{t(Pu(r))},[t])}function Hy(){return w4(t=>t.uiTree)}var Vy=My.reducer;function uc(t){let a=g0();return Ly.useCallback(()=>{t!==null&&a(rl({path:t}))},[a,t])}var M6=V(X());var ba=class{constructor({comparisonFn:a}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=a}isEntryFromHistory(a){return this.lastRequested?this.isSameFn(a,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(a){return this.isSameFn(a,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(a){this.isEntryFromHistory(a)||this.isDuplicateOfLastEntry(a)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,a])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(a){this.stepsBack-=a;let r=this.stack.length,e=r-this.stepsBack-1;if(e<0)throw new Error("Requested history entry too far backwards.");if(e>r)throw new Error(`Not enough entries in history to go ${a} steps forward`);return this.lastRequested=this.stack[e],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}};function Cy(t){let a=g0(),[r,e]=M6.default.useState(!1),[c,n]=M6.default.useState(!1),l=M6.default.useRef(new ba({comparisonFn:UZ}));M6.default.useEffect(()=>{if(!t||t.mode==="LOADING")return;let v=l.current;v.addEntry(t),n(v.canGoBackwards()),e(v.canGoForwards())},[t]);let o=M6.default.useCallback(v=>{a(el({state:v}))},[a]),i=M6.default.useCallback(()=>{try{o(l.current.goBackwards())}catch{}},[o]),h=M6.default.useCallback(()=>{try{o(l.current.goForwards())}catch{}},[o]);return{goBackward:i,goForward:h,canGoBackward:c,canGoForward:r}}function UZ(t,a){return typeof a>"u"?!1:a.mode==="LOADING"&&t.mode==="LOADING"?!0:a.mode==="TEMPLATE_CHOOSER"&&t.mode==="TEMPLATE_CHOOSER"?JSON.stringify(a.options)===JSON.stringify(t.options):t.mode==="MAIN"&&a.mode==="MAIN"?a.uiTree===t.uiTree:!1}function cl(t,a){let r=t.length,e=[];for(let c=0;c<=r;c++){let n=f0(a,t.slice(0,c));if(n===void 0)break;e.push(N2[n.uiName].title)}return e}var ll=V(X());function nl(){return/mac/i.test(window.navigator.platform)}function wy(t){let a=ll.useCallback(r=>{!(r.target instanceof Element)||r.target.tagName!=="BODY"||(t.filter(e=>WZ(r,e)).forEach(({onPress:e})=>e()),r.defaultPrevented||r.stopPropagation())},[t]);ll.useEffect(()=>(document.addEventListener("keydown",a),()=>{document.removeEventListener("keydown",a)}),[a])}function WZ(t,a){return t.key===a.key&&a.withCmdCtrl===(nl()?t.metaKey:t.ctrlKey)&&a.withShift===t.shiftKey}function By(){let{sendMsg:t,incomingMsgs:a,mode:r}=G3(),e=Hy(),c=ux(),n=g0(),l=Cy(e),o=uc(c),[i,h]=y5.useState(null),v=y5.useRef(null);wy([{key:"z",withCmdCtrl:!0,withShift:!1,onPress:l.goBackward},{key:"z",withCmdCtrl:!0,withShift:!0,onPress:l.goForward},{key:"Backspace",onPress:o,withCmdCtrl:!1,withShift:!1}]),y5.useEffect(()=>{let u=a.subscribe("UPDATED-TREE",p=>{n(my({uiTree:p})),v.current={mode:"MAIN",uiTree:p}}),s=a.subscribe("TEMPLATE_CHOOSER",p=>{n(xy({outputChoices:p})),v.current={mode:"TEMPLATE_CHOOSER",options:{outputChoices:p}}}),g=a.subscribe("BACKEND-ERROR",h);return t({path:"READY-FOR-STATE"}),()=>{u.unsubscribe(),s.unsubscribe(),g.unsubscribe()}},[a,n,t]);let d=y5.useMemo(()=>_e(t,500,!0),[t]);return y5.useEffect(()=>{if(r!=="VSCODE"||!c||e.mode!=="MAIN")return;let u=cl(c,e.uiTree);t({path:"NODE-SELECTION",payload:u})},[c,r,t,e]),y5.useEffect(()=>{if(!(e.mode==="LOADING"||e===v.current)){if(e.mode==="TEMPLATE_CHOOSER"){t({path:"ENTERED-TEMPLATE-SELECTOR"});return}d({path:"UPDATED-TREE",payload:e.uiTree})}},[e,d,t]),{state:e,errorInfo:i,history:l}}var Fa=V(X());function Tu(t){return f2({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(t)}var yy="716971ec0375a8d3a6b39922a7c423901cd7876c62aa2fb98460aea9cf89c0a4",jZ=`div._appViewerHolder_zkojo_1 { + `).replaceAll(/(\s+)$/g,"")}var Ea=V(b()),OG=20,kG=({uiArguments:t,wrapperProps:a})=>{let r=t.text.slice(0,OG).replaceAll(/\s$/g,"")+"...";return(0,Ea.jsx)("div",{className:"unknown-ui-function-display",...a,children:(0,Ea.jsxs)("div",{children:["unknown ui output: ",(0,Ea.jsx)("code",{children:r})]})})},ky=kG;var k5=V(b()),_y={title:"Unknown UI Function",UiComponent:ky,settingsInfo:{text:{inputType:"omitted",defaultValue:"Unknown Ui Function"}},settingsFormRender:({settings:t})=>(0,k5.jsxs)("div",{className:"unknown-ui-function-settings",children:[(0,k5.jsx)("div",{className:"SUE-SettingsInput",children:(0,k5.jsxs)("span",{className:"info-msg",children:[(0,k5.jsx)(By,{}),"Unknown function call. Can't modify with visual editor."]})}),(0,k5.jsx)(by,{children:(0,k5.jsx)("span",{children:"Code"})}),(0,k5.jsx)("div",{className:"SUE-SettingsInput",children:(0,k5.jsx)("pre",{className:"code-holder",children:Oy(t.text)})})]}),acceptsChildren:!1};var L2={"shiny::actionButton":nB,"shiny::numericInput":UB,"shiny::sliderInput":iy,"shiny::textInput":py,"shiny::checkboxInput":sB,"shiny::checkboxGroupInput":hB,"shiny::selectInput":ey,"shiny::radioButtons":YB,"shiny::plotOutput":$B,"shiny::textOutput":xy,"shiny::uiOutput":wy,"shiny::navbarPage":TB,"shiny::tabPanel":el,"shiny::tabsetPanel":vy,"gridlayout::grid_page":Kw,"gridlayout::grid_card":Qx,"gridlayout::grid_card_text":vH,"gridlayout::grid_card_plot":cH,"gridlayout::grid_container":qw,"DT::DTOutput":wx,"plotly::plotlyOutput":Jw,unknownUiFunction:_y};function Ry(t,{path:a,node:r}){let e=kc(a),c=a[a.length-1],n=m0(t,e);if(!L2[n.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(n.uiChildren)||(n.uiChildren=[]),n.uiChildren=S5(n.uiChildren,c,r)}function ul(t,{path:a}){let{parentNode:r,indexToNode:e}=_G(t,a);if(!ta(r))throw new Error("Somehow trying to enter a leaf node");r.uiChildren.splice(e,1)}function _G(t,a){let r=[...a],e=r.pop();if(typeof e>"u")throw new Error("Path to node must have at least one element");let c=r.length===0?t:m0(t,r);if(!ta(c))throw new Error("Somehow trying to enter a leaf node");return{parentNode:c,indexToNode:e}}function Iy(t,{path:a,currentPath:r,node:e}){let c=kc(a),n=a[a.length-1],l=m0(t,c);if(!L2[l.uiName].acceptsChildren)throw new Error("Can't add a child to a non-container node. Check the path");Array.isArray(l.uiChildren)||(l.uiChildren=[]);let o=[...c,n];if(Tt(r,o)){let i=r[r.length-1];l.uiChildren=Hx(l.uiChildren,i,n);return}ul(t,{path:r}),l.uiChildren=S5(l.uiChildren,n,e)}function Yu(t){return"currentPath"in t&&t.currentPath!==void 0}function Ey(t,a){let{path:r,node:e}=a;if(Yu(a)){Iy(t,{path:r,currentPath:a.currentPath,node:e});return}Ry(t,{path:r,node:a.node})}function Py(t,{path:a,node:r}){let e=m0(t,a);Object.assign(e,r)}var z4={ui:"",libraries:""};var RG=/^\w+::/;function Ty(t){if(RG.test(t))return t;let a=new RegExp(`^\\w+::${t}$`);for(let r in L2)if(a.test(r))return r;throw new Error(`Unknown function ${t} made it passed the unknown function filter`)}function u7(t){return typeof t=="object"&&t!==null}function Ju(t){return typeof t=="string"||typeof t=="number"||typeof t=="boolean"}function Ny(t){return u7(t)&&"val"in t&&["string","boolean","number"].includes(typeof t.val)}function Q0(t){return u7(t)&&"val"in t&&Array.isArray(t.val)}function Dy(t){return u7(t)&&"name"in t}var j2=class extends Error{constructor({message:r,cause:e}){super();this.name="AST_PARSING_ERROR",this.message=r,this.cause=e}};function IG(t){return t[0].val==="c"}function Zy(t){let a=t[0].val;return a==="c"||a==="list"}function Gy(t){return Q0(t)&&IG(t.val)}function Uy(t){return Q0(t)&&t.val[0].val==="list"}function Wy(t){try{return jy(t)}catch(a){if(!(a instanceof j2))throw a;return s7({node:t,explanation:a.message})}}function jy(t){if(!Q0(t))throw new j2({message:"Tried to flatten a leaf/primative node"});let[a,...r]=t.val;if(a.val!=="c")throw new j2({message:"Tried to flatten non array as array"});return r.map(e=>Ju(e.val)?e.val:jy(e))}function qy(t){if(!Q0(t))throw new j2({message:"Tried to flatten a leaf/primative node"});try{let[a,...r]=t.val;if(a.val!=="list")throw new j2({message:"Tried to flatten non array as array",cause:t});let e={};return r.forEach(({name:c,val:n})=>{if(typeof c!="string")throw new j2({message:"All elements in list must have a name",cause:t});if(!Ju(n))throw new j2({message:"Nested lists are not supported",cause:t});e[c]=n}),e}catch(a){if(!(a instanceof j2))throw a;return s7({node:t,explanation:a.message})}}function $y(t,a){let r=" ".repeat(a);return t.replaceAll(/\n/g,` +${r}`)}var Xy=2,EG=" ".repeat(Xy),sl=60,H3=` +${EG}`;function ts(t){let[a,...r]=t;if(typeof a.val!="string")return"Unknown Ui Code";let e=r.map(l=>`${l.name?`${l.name} = `:""}${PG(l)}`),c=as({fn_name:a.val,fn_args_list:e,max_line_length_for_multi_args:Zy(t)?sl:0}),n=`,${c?H3:" "}`;return`${a.val}(${c?H3:""}${e.join(n)}${c?` +`:""})`}function as({fn_name:t,fn_args_list:a,max_line_length_for_multi_args:r}){if(a.some(l=>l.includes(` +`)))return!0;if(r===0)return a.length>1;let c=a.reduce((l,o)=>l+o.length+2,0),n=t.length+2;return c+n>r}function PG({val:t,type:a}){switch(a){case"b":return t?"TRUE":"FALSE";case"c":return`"${t}"`;case"m":return"";case"n":return String(t);case"s":return t;case"e":return F8(ts(t));case"u":return"<...>"}}function F8(t){return $y(t,Xy)}function s7({node:t,explanation:a}){return{uiName:"unknownUiFunction",uiArguments:{text:Q0(t)?ts(t.val):t.val,explanation:a}}}function gl(t){let[a,...r]=t.val;if(typeof a.val!="string")throw new j2({message:"Invalid ui node, name is not a primative"});let e={},c=[];r.forEach(l=>{Dy(l)?e[l.name]=TG(l):c.push(NG(l))});let n={uiName:Ty(a.val),uiArguments:e};return c.length>0&&(n.uiChildren=c),i7(n)?n:s7({node:t})}function TG(t){return Ny(t)?t.val:Gy(t)?Wy(t):Uy(t)?qy(t):s7({node:t})}function NG(t,a){if(!Q0(t))throw new j2({message:"Primative found in ui children of ui node."});return gl(t)}function DG(t,a){if(!Q0(t))return!1;let{val:r}=t;return r[0].val==="<-"||r[0].val==="="?a?r[1].val===a:!0:!1}function Ky(t){return t.val[1]}function ZG(t){return t.val[2]}function Pa(t){let a=[];return t.forEach(r=>{if(DG(r)){let e=Ky(r);GG(e)?a.push({name:e.val[2].val,is_output:!0,node:r}):e.type==="s"&&a.push({name:e.val,is_output:!1,node:r})}if(Q0(r)){let e=Pa(r.val);a.push(...e)}}),a}function GG(t){if(!Q0(t))return!1;let{val:a}=t;return a.length===3&&a[1].val==="output"&&typeof a[2].val=="string"}function rs(t){return t.filter(({is_output:a})=>a).reduce((a,{name:r,node:e})=>{let{pos:c}=e;return c&&(a[r]=[...a[r]??[],c]),a},{})}function UG(t){return!Boolean(t.pos)||!(Ky(t).val==="ui")?!1:Q0(ZG(t))}function es(t){let a=t.find(({name:e,is_output:c})=>e==="ui"&&!c);if(!a)throw new j2({message:"No ui assignment node was found in provided ast"});let{node:r}=a;if(!UG(r))throw new j2({message:"No position info attached to the ui assignment node",cause:r});return r}function cs(t){let a=t.find(({name:e,is_output:c})=>e==="server"&&!c);if(!a)throw new j2({message:"No server assignment node was found in provided ast"});let{node:r}=a;if(!r.pos)throw new j2({message:"No position info attached to the ui assignment node",cause:r});return r}function ns(t){return t.app_type==="SINGLE-FILE"?WG(t):jG(t)}function WG({app:{ast:t}}){let a=Pa(t),r=es(a),e=cs(a),c=rs(a);return{app_type:"SINGLE-FILE",app:{ui_tree:gl(r.val[2]),ui_pos:r.pos,ui_assignment_operator:r.val[0].val,server_pos:e.pos,server_node:e,output_positions:c}}}function jG({ui:t,server:a}){let r=Pa(t.ast),e=es(r),c=Pa(a.ast),n=cs(c),l=rs(c);return{app_type:"MULTI-FILE",ui:{ui_tree:gl(e.val[2]),ui_pos:e.pos,ui_assignment_operator:e.val[0].val},server:{server_node:n,output_positions:l,server_pos:n.pos}}}function pl(t){return t.app_type==="SINGLE-FILE"?qG(t):XG(t)}function qG(t){let a=ns(t),{app:{ui_pos:r,ui_assignment_operator:e,ui_tree:c,output_positions:n,server_pos:l}}=a,i=t.app.script.split(` +`),h=["shiny"],v=[],d;return i.forEach((u,s)=>{let g=Qy({line:u,line_number:s,ui_pos:r});if(g==="Other"){v.push(u);return}if(g==="Library"){let p=ls.exec(u)?.groups?.library;p&&p!=="shiny"&&h.push(p)}if(g!==d)if(d=g,g==="UI")v.push(`ui ${e} ${z4.ui}`);else if(g==="Library")v.push(z4.libraries);else throw new Error("Unknown line type")}),{app_type:"SINGLE-FILE",ui_tree:c,output_positions:n,server_pos:l,app:{code:v.join(` +`),libraries:h}}}function $G({ui_pos:t,ui_assignment_operator:a},r){let e=r.split(` +`),c=["shiny"],n=[],l;return e.forEach((o,i)=>{let h=Qy({line:o,line_number:i,ui_pos:t});if(h==="Other"){n.push(o);return}if(h==="Library"){let v=ls.exec(o)?.groups?.library;v&&v!=="shiny"&&c.push(v)}if(h!==l)if(l=h,h==="UI")n.push(`ui ${a} ${z4.ui}`);else if(h==="Library")n.push(z4.libraries);else throw new Error("Unknown line type")}),{code:n.join(` +`),libraries:c}}function XG(t){let{ui:a,server:{output_positions:r,server_pos:e}}=ns(t);return{app_type:"MULTI-FILE",ui_tree:a.ui_tree,output_positions:r,server_pos:e,ui:$G(a,t.ui.script),server:{code:t.server.script}}}function KG(t,[a,r,e,c]){return t>=a-1&&t<=e-1}function Qy({line:t,line_number:a,ui_pos:r}){return KG(a,r)?"UI":ls.test(t)?"Library":"Other"}var ls=/^\s*library\((?\w+)\)/;function Yy(t){let a=new Set;try{for(let r of Object.values(L2)){let e=r?.stateUpdateSubscribers?.[t];e&&a.add(e)}return a}catch{return a}}var Jy=Yy("DELETE_NODE"),tA=Yy("UPDATE_NODE");var rA=_t({name:"state",initialState:{mode:"LOADING"},reducers:{SET_FULL_STATE:(t,a)=>a.payload.state,SET_APP_INFO:(t,a)=>({mode:"MAIN",..."ui_tree"in a.payload?a.payload:pl(a.payload)}),SHOW_TEMPLATE_CHOOSER:(t,{payload:a})=>({mode:"TEMPLATE_CHOOSER",options:a}),SET_LOADING:t=>({mode:"LOADING"}),UPDATE_NODE:(t,a)=>{if(t.mode!=="MAIN")throw new Error("Tried to update a node when in template chooser mode");for(let r of tA)r(t.ui_tree,a.payload);Py(t.ui_tree,a.payload)},PLACE_NODE:(t,a)=>{if(t.mode!=="MAIN")throw new Error("Tried to move a node when in template chooser mode");Ey(t.ui_tree,a.payload)},DELETE_NODE:(t,a)=>{if(t.mode!=="MAIN")throw new Error("Tried to delete a node when in template chooser mode");for(let r of Jy)r(t.ui_tree,{path:a.payload.path});ul(t.ui_tree,a.payload)}}}),{UPDATE_NODE:Wn,PLACE_NODE:os,DELETE_NODE:zl,SET_APP_INFO:eA,SET_FULL_STATE:fl,SHOW_TEMPLATE_CHOOSER:cA,SET_LOADING:Dv1}=rA.actions;function d6(){let t=z0();return aA.default.useCallback(r=>{t(os(r))},[t])}function Ml(){return b4(t=>t.app_info)}var nA=rA.reducer;function Vc(t){let a=z0();return lA.useCallback(()=>{t!==null&&a(zl({path:t}))},[a,t])}var L6=V($());var Ta=class{constructor({comparisonFn:a}){this.stack=[],this.stepsBack=0,this.lastRequested=null,this.isSameFn=a}isEntryFromHistory(a){return this.lastRequested?this.isSameFn(a,this.lastRequested):!1}lastEntry(){return this.stack[this.stack.length-1]}isDuplicateOfLastEntry(a){return this.isSameFn(a,this.lastEntry())}startNewHistoryBranch(){this.stack=this.stack.slice(0,-this.stepsBack),this.stepsBack=0}addEntry(a){this.isEntryFromHistory(a)||this.isDuplicateOfLastEntry(a)||(this.stepsBack>0&&this.startNewHistoryBranch(),this.stack=[...this.stack,a])}canGoBackwards(){return this.stack.length===1?!1:this.stack.length-this.stepsBack>1}canGoForwards(){return this.stepsBack>0}getEntryFromHistory(a){this.stepsBack-=a;let r=this.stack.length,e=r-this.stepsBack-1;if(e<0)throw new Error("Requested history entry too far backwards.");if(e>r)throw new Error(`Not enough entries in history to go ${a} steps forward`);return this.lastRequested=this.stack[e],this.lastRequested}goBackwards(){if(!this.canGoBackwards())throw new Error("Can't go backwards. At first entry in history");return this.getEntryFromHistory(-1)}goForwards(){if(!this.canGoForwards())throw new Error("Can't go forwards. At latest entry in history");return this.getEntryFromHistory(1)}};function oA(t){let a=z0(),[r,e]=L6.default.useState(!1),[c,n]=L6.default.useState(!1),l=L6.default.useRef(new Ta({comparisonFn:QG}));L6.default.useEffect(()=>{if(!t||t.mode==="LOADING")return;let v=l.current;v.addEntry(t),n(v.canGoBackwards()),e(v.canGoForwards())},[t]);let o=L6.default.useCallback(v=>{a(fl({state:v}))},[a]),i=L6.default.useCallback(()=>{try{o(l.current.goBackwards())}catch{}},[o]),h=L6.default.useCallback(()=>{try{o(l.current.goForwards())}catch{}},[o]);return{goBackward:i,goForward:h,canGoBackward:c,canGoForward:r}}function QG(t,a){return typeof a>"u"?!1:a.mode==="LOADING"&&t.mode==="LOADING"?!0:a.mode==="TEMPLATE_CHOOSER"&&t.mode==="TEMPLATE_CHOOSER"?JSON.stringify(a.options)===JSON.stringify(t.options):t.mode==="MAIN"&&a.mode==="MAIN"?a.ui_tree===t.ui_tree:!1}function ml(t,a){let{ui_code:r,removed_namespaces:e}=iA(t,a);return{ui_code:r,library_calls:Array.from(e)}}function iA(t,a){let{uiName:r,uiArguments:e,uiChildren:c}=t,n=new Set;if(hA(t))return{ui_code:vA(t),removed_namespaces:n};let l=r;if(a.remove_namespace){let v=l.match(/\w+(?=::)/)?.[0];v&&n.add(v),l=l.replace(/\w+::/,"")}let o=Object.keys(e).map(v=>F8(`${v} = ${rU(e[v])}`));c?.forEach(v=>{let d=iA(v,a);d.removed_namespaces.forEach(u=>n.add(u)),o.push(F8(d.ui_code))});let i=as({fn_name:r,fn_args_list:o,max_line_length_for_multi_args:sl}),h=`,${i?H3:" "}`;return{removed_namespaces:n,ui_code:`${l}(${i?H3:""}${o.join(h)}${i?` +`:""})`}}function hA(t){return u7(t)&&"uiName"in t&&t.uiName==="unknownUiFunction"}function vA({uiArguments:t}){return t.text}function YG(t){return!(typeof t!="object"||Object.values(t).find(r=>typeof r!="string"))}function JG(t){let a=Object.keys(t).map(n=>`"${n}" = "${t[n]}"`),e=a.reduce((n,l)=>n+l.length,0)+6>sl,c=e?`,${H3}`:", ";return`list(${e?H3:""}${a.join(c)}${e?` +`:""})`}function tU(t){let a=t.map(aU);return`c(${H3}${a.join(`,${H3}`)} +)`}function aU(t){switch(typeof t){case"string":return`"${t}"`;default:return String(t)}}function rU(t){return Array.isArray(t)?tU(t):YG(t)?JG(t):typeof t=="boolean"?t?"TRUE":"FALSE":hA(t)?vA(t):JSON.stringify(t)}function is({ui_tree:t,libraries:a,code:r}){let{ui_code:e,library_calls:c}=ml(t,{remove_namespace:!0}),n=[...a];return c.forEach(l=>{a.includes(l)||n.push(l)}),r.replace(z4.ui,e).replace(z4.libraries,hs(n))}function hs(t){return t.map(a=>`library(${a})`).join(` +`)}function g7(t,{include_info:a}){let{app_type:r,ui_tree:e}=t;switch(r){case"SINGLE-FILE":return{app_type:r,app:is({ui_tree:e,...t.app}),...a&&{info:t}};case"MULTI-FILE":return{app_type:r,ui:is({ui_tree:e,...t.ui}),server:t.server.code,...a&&{info:t}}}}function xl(t,a){let r=t.length,e=[];for(let c=0;c<=r;c++){let n=m0(a,t.slice(0,c));if(n===void 0)break;e.push(L2[n.uiName].title)}return e}var Vl=V($());function Hl(){return/mac/i.test(window.navigator.platform)}function dA(t){let a=Vl.useCallback(r=>{!(r.target instanceof Element)||r.target.tagName!=="BODY"||(t.filter(e=>eU(r,e)).forEach(({onPress:e})=>e()),r.defaultPrevented||r.stopPropagation())},[t]);Vl.useEffect(()=>(document.addEventListener("keydown",a),()=>{document.removeEventListener("keydown",a)}),[a])}function eU(t,a){return t.key===a.key&&a.withCmdCtrl===(Hl()?t.metaKey:t.ctrlKey)&&a.withShift===t.shiftKey}function uA(){let{sendMsg:t,incomingMsgs:a,mode:r}=y5(),e=Ml(),c=Rx(),n=z0(),l=oA(e),o=Vc(c),[i,h]=_5.useState(null),v=_5.useRef(null);dA([{key:"z",withCmdCtrl:!0,withShift:!1,onPress:l.goBackward},{key:"z",withCmdCtrl:!0,withShift:!0,onPress:l.goForward},{key:"Backspace",onPress:o,withCmdCtrl:!1,withShift:!1}]),_5.useEffect(()=>{let u=a.subscribe("APP-INFO",p=>{let L="ui_tree"in p?p:pl(p);n(eA(L)),v.current={mode:"MAIN",...L},console.log("Full app info",L)}),s=a.subscribe("TEMPLATE_CHOOSER",p=>{n(cA({outputChoices:p})),v.current={mode:"TEMPLATE_CHOOSER",options:{outputChoices:p}}}),g=a.subscribe("BACKEND-ERROR",h);return t({path:"READY-FOR-STATE"}),()=>{u.unsubscribe(),s.unsubscribe(),g.unsubscribe()}},[a,n,t]);let d=_5.useMemo(()=>Xe(t,500,!0),[t]);return _5.useEffect(()=>{if(r!=="VSCODE"||!c||e.mode!=="MAIN")return;let u=xl(c,e.ui_tree);t({path:"NODE-SELECTION",payload:u})},[c,r,t,e]),_5.useEffect(()=>{if(!(e.mode==="LOADING"||e===v.current)){if(e.mode==="TEMPLATE_CHOOSER"){t({path:"ENTERED-TEMPLATE-SELECTOR"});return}d({path:"UPDATED-APP",payload:g7(e,{include_info:!1})})}},[e,d,t]),{state:e,errorInfo:i,history:l}}var Da=V($());function vs(t){return M2({tag:"svg",attr:{viewBox:"0 0 16 16",fill:"currentColor"},child:[{tag:"path",attr:{fillRule:"evenodd",clipRule:"evenodd",d:"M12.75 8a4.5 4.5 0 0 1-8.61 1.834l-1.391.565A6.001 6.001 0 0 0 14.25 8 6 6 0 0 0 3.5 4.334V2.5H2v4l.75.75h3.5v-1.5H4.352A4.5 4.5 0 0 1 12.75 8z"}}]})(t)}var sA="7d27702f5d9be94f45b7fe2ce3758a0042ad8cc57b869179c03ab4fc26e5c777",cU=`div._appViewerHolder_zkojo_1 { /* This is over-ridden by an inline style but we just have it here in case */ --app-scale-amnt: 0.24; @@ -2185,7 +2221,142 @@ around, showing the user that their click actually did something */ h2._error_zkojo_249 { color: var(--red); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(yy)){var t=document.createElement("style");t.id=yy,t.textContent=jZ,document.head.appendChild(t)}})();var u4={appViewerHolder:"_appViewerHolder_zkojo_1",title:"_title_zkojo_55",appContainer:"_appContainer_zkojo_89",previewFrame:"_previewFrame_zkojo_109",expandButton:"_expandButton_zkojo_134",reloadButtonContainer:"_reloadButtonContainer_zkojo_135",reloadButton:"_reloadButton_zkojo_135",spin:"_spin_zkojo_174",restartButton:"_restartButton_zkojo_211",loadingMessage:"_loadingMessage_zkojo_238",error:"_error_zkojo_249"};var Ay="18b02d5fe7bcd123d33572a41504e76225da9a9d6886b2e313a711ea445b5cc7",qZ=`div._appViewerHolder_zkojo_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(sA)){var t=document.createElement("style");t.id=sA,t.textContent=cU,document.head.appendChild(t)}})();var f4={appViewerHolder:"_appViewerHolder_zkojo_1",title:"_title_zkojo_55",appContainer:"_appContainer_zkojo_89",previewFrame:"_previewFrame_zkojo_109",expandButton:"_expandButton_zkojo_134",reloadButtonContainer:"_reloadButtonContainer_zkojo_135",reloadButton:"_reloadButton_zkojo_135",spin:"_spin_zkojo_174",restartButton:"_restartButton_zkojo_211",loadingMessage:"_loadingMessage_zkojo_238",error:"_error_zkojo_249"};var w6=V($());function gA(t){return M2({tag:"svg",attr:{fill:"currentColor",viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z"}}]})(t)}function pA(t){return M2({tag:"svg",attr:{fill:"currentColor",viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 0 1 .708 0l6 6a.5.5 0 0 1-.708.708L8 5.707l-5.646 5.647a.5.5 0 0 1-.708-.708l6-6z"}}]})(t)}function zA(t){return M2({tag:"svg",attr:{fill:"currentColor",viewBox:"0 0 16 16"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(t)}function fA(t){return M2({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(t)}var MA="4f526f16866cb84c818d0565038b504089c98c35ab0b097dbe8e95bf90617ba3",nU=`/* Logs section */ +._logs_xjp5l_2 { + --tab-height: var(--logs-button-h, 20px); + --background-color: var(--rstudio-white); + --outline-color: var(--rstudio-grey, red); + --side-offset: 8px; + position: absolute; + bottom: 0; + left: var(--side-offset); + right: var(--side-offset); + top: 0; + grid-area: logs; + /* Enable stacking context so z-indices work */ + isolation: isolate; + transform: translateY( + calc(100% - var(--tab-height) - var(--logs-offset, 0px)) + ); + transition: transform var(--animation-speed, 0.25s) ease-in; +} + +._logs_xjp5l_2[data-expanded="true"] { + transform: translateY(5px); +} + +._logs_xjp5l_2[data-expanded="true"] ._logsContents_xjp5l_25 { + overflow: auto; +} + +button._expandTab_xjp5l_29, +._logsContents_xjp5l_25 { + background-color: var(--background-color); +} + +button._expandTab_xjp5l_29 { + z-index: 2; + border-radius: var(--corner-radius) var(--corner-radius) 0 0 !important; + width: fit-content; + height: var(--tab-height); + margin-inline: auto; + display: flex; + gap: 5px; + padding-inline: 10px; + justify-content: center; + background-color: var(--background-color); + outline: var(--outline); + display: flex; + align-items: center; + position: relative; +} + +/* Cover up the bottom border to make tab appear to pop out of the contents */ +button._expandTab_xjp5l_29::after { + position: absolute; + content: ""; + width: 100%; + height: 3px; + bottom: -2px; + background-color: var(--background-color); +} + +._logsContents_xjp5l_25 { + z-index: 1; + border: var(--outline); + height: calc(100% - var(--tab-height)); + padding: var(--logs-padding); + position: relative; +} + +._clearLogsButton_xjp5l_69 { + outline: none; + position: absolute; + top: 0; + right: 0; +} +p._logLine_xjp5l_75 { + font-family: var(--mono-fonts); + font-size: var(--logs-font-size); + margin: 0; +} + +._noLogsMsg_xjp5l_81 { + opacity: 0.8; + height: 100%; + text-align: center; + font-size: 1rem; +} +/* +.clearLogsButton { + display: none; + height: 100%; +} */ + +/* .expandedLogs .clearLogsButton { + display: block; +} */ + +._expandedLogs_xjp5l_93 ._logsContents_xjp5l_25 { + overflow: auto; +} + +._expandLogsButton_xjp5l_101 { + flex-grow: 1; + text-align: center; + font-size: calc(var(--logs-font-size) * 1.3); + height: 100%; +} + +._unseenLogsNotification_xjp5l_108 { + color: var(--red); + right: 0; + opacity: 0; + font-size: 9px; +} +._unseenLogsNotification_xjp5l_108[data-show="true"] { + opacity: 1; + animation-duration: 2s; + animation-name: _slidein_xjp5l_1; + animation-iteration-count: 3; + animation-timing-function: ease-in-out; + transition: opacity 1s; +} + +@keyframes _slidein_xjp5l_1 { + from { + transform: scale(1); + } + + 50% { + transform: scale(1.5); + } + + to { + transform: scale(1); + } +} +`;(function(){if(!(typeof document>"u")&&!document.getElementById(MA)){var t=document.createElement("style");t.id=MA,t.textContent=nU,document.head.appendChild(t)}})();var C6={logs:"_logs_xjp5l_2",logsContents:"_logsContents_xjp5l_25",expandTab:"_expandTab_xjp5l_29",clearLogsButton:"_clearLogsButton_xjp5l_69",logLine:"_logLine_xjp5l_75",noLogsMsg:"_noLogsMsg_xjp5l_81",expandedLogs:"_expandedLogs_xjp5l_93",expandLogsButton:"_expandLogsButton_xjp5l_101",unseenLogsNotification:"_unseenLogsNotification_xjp5l_108",slidein:"_slidein_xjp5l_1"};var G4=V(b());function mA({appLogs:t,clearLogs:a}){let{logsExpanded:r,toggleLogExpansion:e,unseenLogs:c}=lU(t),n=t.length===0;return(0,G4.jsxs)("div",{className:C6.logs,"data-expanded":r,children:[(0,G4.jsxs)("button",{className:C6.expandTab,title:r?"hide logs":"show logs",onClick:e,children:[(0,G4.jsx)(zA,{className:C6.unseenLogsNotification,"data-show":c}),"App Logs",r?(0,G4.jsx)(gA,{}):(0,G4.jsx)(pA,{})]}),(0,G4.jsxs)("div",{className:C6.logsContents,children:[n?(0,G4.jsx)("p",{className:C6.noLogsMsg,children:"No recent logs"}):t.map((l,o)=>(0,G4.jsx)("p",{className:C6.logLine,children:l},o)),n?null:(0,G4.jsx)(Z1,{variant:"icon",title:"clear logs",className:C6.clearLogsButton,onClick:a,children:(0,G4.jsx)(fA,{})})]})]})}function lU(t){let[a,r]=w6.default.useState(!1),[e,c]=w6.default.useState(!1),[n,l]=w6.default.useState(null),[o,i]=w6.default.useState(new Date),h=w6.default.useCallback(()=>{if(a){r(!1),l(new Date);return}r(!0),c(!1)},[a]);return w6.default.useEffect(()=>{i(new Date)},[t]),w6.default.useEffect(()=>{if(a||t.length===0){c(!1);return}if(n===null||n{if(!e.current||typeof a>"u")return;let c=e.current;function n(l){l.target===c&&a?.()}c.addEventListener("click",n);try{c.showModal()}catch{}return()=>{c.removeEventListener("click",n)}},[a]),(0,xA.jsx)("dialog",{...r,ref:e,onClose:a,children:t})}var HA="662e28a8bf13a95d41041c976f683e955cbf3c284eb6012718f68f9b05ad72df",oU=`div._appViewerHolder_zkojo_1 { /* This is over-ridden by an inline style but we just have it here in case */ --app-scale-amnt: 0.24; @@ -2436,253 +2607,145 @@ around, showing the user that their click actually did something */ h2._error_zkojo_249 { color: var(--red); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Ay)){var t=document.createElement("style");t.id=Ay,t.textContent=qZ,document.head.appendChild(t)}})();var _u={appViewerHolder:"_appViewerHolder_zkojo_1",title:"_title_zkojo_55",appContainer:"_appContainer_zkojo_89",previewFrame:"_previewFrame_zkojo_109",expandButton:"_expandButton_zkojo_134",reloadButtonContainer:"_reloadButtonContainer_zkojo_135",reloadButton:"_reloadButton_zkojo_135",spin:"_spin_zkojo_174",restartButton:"_restartButton_zkojo_211",loadingMessage:"_loadingMessage_zkojo_238",error:"_error_zkojo_249"};var Sy="22a35a336e90bffa473e39f4dd90ca8ffbb44d6af088dd2852397e61b6502eaa",XZ=`._fakeApp_t3dh1_1 { - display: grid; - place-content: center; - font-size: 4rem; +`;(function(){if(!(typeof document>"u")&&!document.getElementById(HA)){var t=document.createElement("style");t.id=HA,t.textContent=oU,document.head.appendChild(t)}})();var VA={appViewerHolder:"_appViewerHolder_zkojo_1",title:"_title_zkojo_55",appContainer:"_appContainer_zkojo_89",previewFrame:"_previewFrame_zkojo_109",expandButton:"_expandButton_zkojo_134",reloadButtonContainer:"_reloadButtonContainer_zkojo_135",reloadButton:"_reloadButton_zkojo_135",spin:"_spin_zkojo_174",restartButton:"_restartButton_zkojo_211",loadingMessage:"_loadingMessage_zkojo_238",error:"_error_zkojo_249"};var LA="cc7c6d7786562024749150aac45b67a4ddc144ba89a460c2a34c60c5c8b995c4",iU=`._show_btn_83j0t_1 { + margin: var(--size-md); } -._fakeDashboard_t3dh1_7 { - display: grid; - gap: 5px; - grid: - "header header" 100px - "sidebar top " 2fr - "sidebar bottom" 1fr - / 150px 1fr; -} - -._fakeDashboard_t3dh1_7 > div { - width: 100%; - height: 100%; -} - -._fakeDashboard_t3dh1_7 > ._header_t3dh1_22 { - grid-area: header; - background-color: hsl(288 59% 58% / 0.7); - display: grid; - place-content: center; -} -._header_t3dh1_22 > h1 { - color: white; -} -._fakeDashboard_t3dh1_7 > ._sidebar_t3dh1_31 { - grid-area: sidebar; - background-color: hsl(30 59% 53% / 0.7); -} -._fakeDashboard_t3dh1_7 > ._top_t3dh1_35 { - grid-area: top; - background-color: hsl(120 61% 34% / 0.7); -} -._fakeDashboard_t3dh1_7 > ._bottom_t3dh1_39 { - grid-area: bottom; - background-color: hsl(207 44% 49% / 0.7); -} -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Sy)){var t=document.createElement("style");t.id=Sy,t.textContent=XZ,document.head.appendChild(t)}})();var c7={fakeApp:"_fakeApp_t3dh1_1",fakeDashboard:"_fakeDashboard_t3dh1_7",header:"_header_t3dh1_22",sidebar:"_sidebar_t3dh1_31",top:"_top_t3dh1_35",bottom:"_bottom_t3dh1_39"};var p3=V(b()),$Z=()=>(0,p3.jsx)("div",{className:_u.appContainer,children:(0,p3.jsxs)("div",{className:N1(c7.fakeDashboard,_u.previewFrame),children:[(0,p3.jsx)("div",{className:c7.header,children:(0,p3.jsx)("h1",{children:"App preview not available"})}),(0,p3.jsx)("div",{className:c7.sidebar}),(0,p3.jsx)("div",{className:c7.top}),(0,p3.jsx)("div",{className:c7.bottom})]})}),by=$Z;var x6=V(X());function Fy(t){return f2({tag:"svg",attr:{fill:"currentColor",viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M1.646 4.646a.5.5 0 0 1 .708 0L8 10.293l5.646-5.647a.5.5 0 0 1 .708.708l-6 6a.5.5 0 0 1-.708 0l-6-6a.5.5 0 0 1 0-.708z"}}]})(t)}function Oy(t){return f2({tag:"svg",attr:{fill:"currentColor",viewBox:"0 0 16 16"},child:[{tag:"path",attr:{fillRule:"evenodd",d:"M7.646 4.646a.5.5 0 0 1 .708 0l6 6a.5.5 0 0 1-.708.708L8 5.707l-5.646 5.647a.5.5 0 0 1-.708-.708l6-6z"}}]})(t)}function ky(t){return f2({tag:"svg",attr:{fill:"currentColor",viewBox:"0 0 16 16"},child:[{tag:"circle",attr:{cx:"8",cy:"8",r:"8"}}]})(t)}function Ry(t){return f2({tag:"svg",attr:{viewBox:"0 0 24 24"},child:[{tag:"path",attr:{fill:"none",stroke:"#000",strokeWidth:"2",d:"M12,22 C17.5228475,22 22,17.5228475 22,12 C22,6.4771525 17.5228475,2 12,2 C6.4771525,2 2,6.4771525 2,12 C2,17.5228475 6.4771525,22 12,22 Z M5,5 L19,19"}}]})(t)}var Iy="a8336589762dfe96871bdeaf1102351066dc72c3d6e8607701b5087fb77a8bb5",KZ=`/* Logs section */ -._logs_xjp5l_2 { - --tab-height: var(--logs-button-h, 20px); - --background-color: var(--rstudio-white); - --outline-color: var(--rstudio-grey, red); - --side-offset: 8px; - position: absolute; - bottom: 0; - left: var(--side-offset); - right: var(--side-offset); - top: 0; - grid-area: logs; - /* Enable stacking context so z-indices work */ - isolation: isolate; - transform: translateY( - calc(100% - var(--tab-height) - var(--logs-offset, 0px)) - ); - transition: transform var(--animation-speed, 0.25s) ease-in; -} - -._logs_xjp5l_2[data-expanded="true"] { - transform: translateY(5px); -} - -._logs_xjp5l_2[data-expanded="true"] ._logsContents_xjp5l_25 { - overflow: auto; -} - -button._expandTab_xjp5l_29, -._logsContents_xjp5l_25 { - background-color: var(--background-color); -} - -button._expandTab_xjp5l_29 { - z-index: 2; - border-radius: var(--corner-radius) var(--corner-radius) 0 0 !important; - width: fit-content; - height: var(--tab-height); - margin-inline: auto; - display: flex; - gap: 5px; - padding-inline: 10px; - justify-content: center; - background-color: var(--background-color); - outline: var(--outline); +._modal_83j0t_5 { + border: 1px solid grey; + background-color: var(--rstudio-white); display: flex; - align-items: center; - position: relative; -} - -/* Cover up the bottom border to make tab appear to pop out of the contents */ -button._expandTab_xjp5l_29::after { - position: absolute; - content: ""; - width: 100%; - height: 3px; - bottom: -2px; - background-color: var(--background-color); -} - -._logsContents_xjp5l_25 { - z-index: 1; - border: var(--outline); - height: calc(100% - var(--tab-height)); - padding: var(--logs-padding); - position: relative; + flex-direction: column; + border-radius: var(--corner-radius); + overflow: scroll; + padding-block: var(--size-lg); + padding-inline: var(--size-xl); + max-width: 800px; + width: 99%; } -._clearLogsButton_xjp5l_69 { - outline: none; - position: absolute; - top: 0; - right: 0; -} -p._logLine_xjp5l_75 { - font-family: var(--mono-fonts); - font-size: var(--logs-font-size); - margin: 0; +._title_83j0t_18 { + margin-block-end: var(--size-md); } -._noLogsMsg_xjp5l_81 { - opacity: 0.8; - height: 100%; - text-align: center; - font-size: 1rem; +._description_83j0t_22 { + padding-inline-start: var(--size-md); } -/* -.clearLogsButton { - display: none; - height: 100%; -} */ - -/* .expandedLogs .clearLogsButton { - display: block; -} */ -._expandedLogs_xjp5l_93 ._logsContents_xjp5l_25 { - overflow: auto; +._code_holder_83j0t_26 { + max-height: 70vh; + overflow-y: scroll; + margin-block: var(--size-sm); } -._expandLogsButton_xjp5l_101 { - flex-grow: 1; - text-align: center; - font-size: calc(var(--logs-font-size) * 1.3); - height: 100%; +._code_holder_83j0t_26 > * { + padding: var(--size-md); + background-color: var(--light-grey); } -._unseenLogsNotification_xjp5l_108 { - color: var(--red); - right: 0; - opacity: 0; - font-size: 9px; -} -._unseenLogsNotification_xjp5l_108[data-show="true"] { - opacity: 1; - animation-duration: 2s; - animation-name: _slidein_xjp5l_1; - animation-iteration-count: 3; - animation-timing-function: ease-in-out; - transition: opacity 1s; +._code_holder_83j0t_26 > label { + padding-block: var(--size-sm) 0; + border-radius: var(--corner-radius) var(--corner-radius) 0 0; + color: var(--rstudio-blue); } -@keyframes _slidein_xjp5l_1 { - from { - transform: scale(1); - } +._footer_83j0t_43 { + display: flex; + flex-direction: row; + justify-content: flex-end; + margin-block-start: var(--size-md); +} +`;(function(){if(!(typeof document>"u")&&!document.getElementById(LA)){var t=document.createElement("style");t.id=LA,t.textContent=iU,document.head.appendChild(t)}})();var f5={show_btn:"_show_btn_83j0t_1",showBtn:"_show_btn_83j0t_1",modal:"_modal_83j0t_5",title:"_title_83j0t_18",description:"_description_83j0t_22",code_holder:"_code_holder_83j0t_26",codeHolder:"_code_holder_83j0t_26",footer:"_footer_83j0t_43"};var O1=V(b());function hU({info:t}){let a=g7(t,{include_info:!1});return a.app_type==="SINGLE-FILE"?(0,O1.jsxs)(O1.Fragment,{children:[(0,O1.jsx)("h2",{className:f5.title,children:"App script"}),(0,O1.jsxs)("p",{className:f5.description,children:["The following code defines the currently being edited app. Copy and paste it to an ",(0,O1.jsx)("code",{children:"app.R"})," file to use."]}),(0,O1.jsxs)("div",{className:f5.code_holder,children:[(0,O1.jsx)("label",{children:"app.R"}),(0,O1.jsx)("pre",{children:a.app})]})]}):(0,O1.jsxs)(O1.Fragment,{children:[(0,O1.jsx)("h2",{className:f5.title,children:"App scripts"}),(0,O1.jsxs)("p",{className:f5.description,children:["The following code defines the currently being edited app. Copy and paste the ui and server scripts into ",(0,O1.jsx)("code",{children:"ui.R"})," and"," ",(0,O1.jsx)("code",{children:"server.R"})," files to use."]}),(0,O1.jsxs)("div",{className:f5.code_holder,children:[(0,O1.jsx)("label",{children:"ui.R"}),(0,O1.jsx)("pre",{children:a.ui})]}),(0,O1.jsxs)("div",{className:f5.code_holder,children:[(0,O1.jsx)("label",{children:"server.R"}),(0,O1.jsx)("pre",{children:a.server})]})]})}function wA(){let[t,a]=CA.default.useState(!1),e=I9().getState().app_info;return e.mode!=="MAIN"?null:(0,O1.jsxs)(O1.Fragment,{children:[(0,O1.jsx)(D4,{className:VA.title,children:"Code"}),(0,O1.jsx)(W0,{className:f5.show_btn,text:"See current application code",position:"left",onClick:()=>a(c=>!c),variant:"regular",children:"Get app script"}),t?(0,O1.jsx)(Na,{className:f5.modal,title:"App Script",onClose:()=>a(!1),children:(0,O1.jsxs)("form",{method:"dialog",children:[(0,O1.jsx)(hU,{info:e}),(0,O1.jsx)("div",{className:f5.footer,children:(0,O1.jsx)(Z1,{type:"submit",children:"Okay"})})]})}):null]})}var B6=V($());function BA(){let{sendMsg:t,incomingMsgs:a}=y5(),[r,e]=B6.default.useState("HIDDEN"),[c,n]=B6.default.useState([]),[l,o]=B6.default.useState(null);B6.default.useEffect(()=>{let s=a.subscribe("APP-PREVIEW-STATUS",L=>{o(null),e(L)}),g=a.subscribe("APP-PREVIEW-LOGS",L=>{n(vU(L))}),p=a.subscribe("APP-PREVIEW-CRASH",L=>{o(L)});return t({path:"APP-PREVIEW-REQUEST"}),h(()=>()=>t({path:"APP-PREVIEW-RESTART"})),d(()=>()=>t({path:"APP-PREVIEW-STOP"})),()=>{s.unsubscribe(),g.unsubscribe(),p.unsubscribe()}},[a,t]);let[i,h]=B6.default.useState(()=>()=>console.warn("No app running to reset")),[v,d]=B6.default.useState(()=>()=>console.warn("No app running to stop")),u=B6.default.useCallback(()=>{n([])},[]);return{appLogs:c,clearLogs:u,restartApp:i,stopApp:v,appLoc:r,errors:l}}function vU(t){return Array.isArray(t)?t:[t]}var Ll=V($());function AA(){let t=dU();return uU(t.width)}function dU(){let[t,a]=Ll.default.useState(yA()),r=Ll.default.useMemo(()=>Xe(()=>{a(yA())},500),[]);return Ll.default.useEffect(()=>(window.addEventListener("resize",r),()=>window.removeEventListener("resize",r)),[r]),t}function uU(t){let a=_n-us*2,r=t-ss*2;return a/r}function yA(){let{innerWidth:t,innerHeight:a}=window;return{width:t,height:a}}var E1=V(b()),us=16,ss=55;function gs(){let t=Da.default.useRef(null),[a,r]=Da.default.useState(!1),e=Da.default.useCallback(()=>{r(u=>!u)},[]),{appLoc:c,errors:n,appLogs:l,clearLogs:o,restartApp:i}=BA(),h=AA(),v=Da.default.useCallback(u=>{pU(u.currentTarget),!(!t.current||typeof c=="string")&&(u.metaKey?i():t.current.src=c.url)},[c,i]);if(c==="HIDDEN")return(0,E1.jsx)(wA,{});let d=({isExpandedMode:u})=>(0,E1.jsx)("div",{className:f4.reloadButtonContainer,children:(0,E1.jsx)(W0,{text:`Reload app session (hold ${zU()} to restart app server also)`,className:f4.reloadButton,onClick:v,position:u?"right":"up-right",children:(0,E1.jsx)(vs,{})})});return(0,E1.jsxs)(E1.Fragment,{children:[(0,E1.jsxs)(D4,{className:f4.title,children:[(0,E1.jsx)(d,{isExpandedMode:!1}),"App Preview"]}),(0,E1.jsx)("div",{className:f4.appViewerHolder,"data-expanded":a,style:{"--app-scale-amnt":h,"--preview-inset-horizontal":`${us}px`,"--expanded-inset-horizontal":`${ss}px`},children:n!==null?(0,E1.jsx)(sU,{onClick:i}):(0,E1.jsxs)(E1.Fragment,{children:[(0,E1.jsx)(d,{isExpandedMode:!0}),(0,E1.jsxs)("div",{className:f4.appContainer,children:[c==="LOADING"?(0,E1.jsx)(gU,{}):(0,E1.jsx)("iframe",{className:f4.previewFrame,src:c.url,title:"Application Preview",ref:t}),(0,E1.jsx)(Z1,{variant:"icon",className:f4.expandButton,title:a?"Shrink app preview":"Expand app preview",onClick:e,children:a?(0,E1.jsx)(yy,{}):(0,E1.jsx)(BH,{})})]}),(0,E1.jsx)(mA,{appLogs:l,clearLogs:o})]})})]})}function sU({onClick:t}){return(0,E1.jsxs)("div",{className:f4.appContainer,children:[(0,E1.jsxs)("p",{children:["App preview crashed.",(0,E1.jsx)("br",{})," Try and restart?"]}),(0,E1.jsxs)(Z1,{className:f4.restartButton,title:"Restart app preview",onClick:t,children:["Restart app preview ",(0,E1.jsx)(vs,{})]})]})}function gU(){return(0,E1.jsx)("div",{className:f4.loadingMessage,children:(0,E1.jsx)("h2",{children:"Loading app preview..."})})}function pU(t){let a=t.querySelector("svg");a?.classList.add(f4.spin),t.addEventListener("animationend",()=>a?.classList.remove(f4.spin),!1)}function zU(){return Hl()?"\u2318":"Alt"}var ps=V(b()),fU=t=>(0,ps.jsx)("svg",{viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo",...t,children:(0,ps.jsx)("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}),SA=fU;var p7=V($());var MU={uiName:"gridlayout::grid_page",uiArguments:{row_sizes:["70px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem",layout:["header header","sidebar linePlots","dists dists"]},uiChildren:[{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar",title:"Settings",item_gap:"12px"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"numChicks",label:"Number of Chicks",min:1,max:15,value:5,width:"100%",step:1}},{uiName:"shiny::radioButtons",uiArguments:{inputId:"distFacet",label:"Facet Distribution By",choices:{"Diet Type":"Diet","Measure Time":"Time"}}}]},{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"Chick Weights",alignment:"center",is_title:!1}},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"dists"}},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"linePlots"}}]},bA={title:"Chick Weights Grid",description:"Plots investigating the ChickWeights built-in dataset",uiTree:MU,otherCode:{serverLibraries:["ggplot2"],serverFunctionBody:` +output$linePlots <- renderPlot({ + obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks + chicks <- ChickWeight[obs_to_include, ] + + ggplot( + chicks, + aes( + x = Time, + y = weight, + group = Chick + ) + ) + + geom_line(alpha = 0.5) + + ggtitle("Chick weights over time") +}) + +output$dists <- renderPlot({ + ggplot( + ChickWeight, + aes(x = weight) + ) + + facet_wrap(input$distFacet) + + geom_density(fill = "#fa551b", color = "#ee6331") + + ggtitle("Distribution of weights by diet") +})`}};var mU={uiName:"shiny::navbarPage",uiArguments:{title:"Chick Weights",selected:"Line Plots",collapsible:!0,theme:{uiName:"unknownUiFunction",uiArguments:{text:"bslib::bs_theme()"}}},uiChildren:[{uiName:"shiny::tabPanel",uiArguments:{title:"Line Plots"},uiChildren:[{uiName:"gridlayout::grid_container",uiArguments:{row_sizes:["1fr"],col_sizes:["250px","1fr"],gap_size:"10px",layout:["num_chicks linePlots"]},uiChildren:[{uiName:"gridlayout::grid_card",uiArguments:{area:"num_chicks"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"numChicks",label:"Number of chicks",min:1,max:15,value:5,step:1,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"linePlots"}}]}]},{uiName:"shiny::tabPanel",uiArguments:{title:"Distributions"},uiChildren:[{uiName:"gridlayout::grid_container",uiArguments:{row_sizes:["165px","1fr"],col_sizes:["1fr"],gap_size:"10px",layout:["facetOption","dists"]},uiChildren:[{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"dists"}},{uiName:"gridlayout::grid_card",uiArguments:{area:"facetOption",title:"Distribution Plot Options"},uiChildren:[{uiName:"shiny::radioButtons",uiArguments:{inputId:"distFacet",label:"Facet distribution by",choices:{"Diet Option":"Diet","Measure Time":"Time"}}}]}]}]}]},FA={title:"Chick Weights navbar",description:"Plots investigating the ChickWeights built-in dataset in a `navbarPage()` view",uiTree:mU,otherCode:{serverLibraries:["ggplot2"],serverFunctionBody:` +output$linePlots <- renderPlot({ + obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks + chicks <- ChickWeight[obs_to_include, ] + + ggplot( + chicks, + aes( + x = Time, + y = weight, + group = Chick + ) + ) + + geom_line(alpha = 0.5) + + ggtitle("Chick weights over time") +}) + +output$dists <- renderPlot({ + ggplot( + ChickWeight, + aes(x = weight) + ) + + facet_wrap(input$distFacet) + + geom_density(fill = "#fa551b", color = "#ee6331") + + ggtitle("Distribution of weights by diet") +}) +`}};var xU={uiName:"gridlayout::grid_page",uiArguments:{layout:["header header header","sidebar bluePlot bluePlot","table table plotly","table table plotly"],row_sizes:["100px","1fr","1fr","1fr"],col_sizes:["250px","0.59fr","1.41fr"],gap_size:"1rem"},uiChildren:[{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar",title:"Settings",item_gap:"12px"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"bins",label:"Number of Bins",min:12,max:100,value:30,width:"100%"}},{uiName:"shiny::numericInput",uiArguments:{inputId:"numRows",label:"Number of table rows",value:10,min:1,step:1,width:"100%"}}]},{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"Geysers!",alignment:"start",is_title:!1}},{uiName:"gridlayout::grid_card",uiArguments:{area:"table",title:"Table",item_gap:"12px"},uiChildren:[{uiName:"DT::DTOutput",uiArguments:{outputId:"myTable",width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"bluePlot"}},{uiName:"gridlayout::grid_card",uiArguments:{area:"plotly",title:"Interactive Plot"},uiChildren:[{uiName:"plotly::plotlyOutput",uiArguments:{outputId:"distPlot",width:"100%",height:"100%"}}]}]},OA={title:"Grid Geyser",description:"The classic geyser app in a gridlayout grid page",uiTree:xU,otherCode:{serverLibraries:["plotly"],serverFunctionBody:` +output$distPlot <- renderPlotly({ + # generate bins based on input$bins from ui.R + plot_ly(x = ~ faithful[, 2], type = "histogram") +}) + +output$bluePlot <- renderPlot({ + # generate bins based on input$bins from ui.R + x <- faithful[, 2] + bins <- seq(min(x), max(x), length.out = input$bins + 1) + + # draw the histogram with the specified number of bins + hist(x, breaks = bins, col = "steelblue", border = "white") +}) + +output$myTable <- renderDT({ + head(faithful, input$numRows) +})`}};var Cl=[OA,FA,bA];function kA(t){let a=t.outputType==="SINGLE-FILE"?HU(t):VU(t);return g7(a,{include_info:!0})}function HU({uiTree:t,otherCode:{uiExtra:a="",serverExtra:r="",serverFunctionBody:e="",serverLibraries:c=[]}}){let n=`${z4.libraries} + +${a} +ui <- ${z4.ui} + +${r} +server <- function(input, output) { + ${F8(e)} +} + +shinyApp(ui, server) + +`;return{app_type:"SINGLE-FILE",ui_tree:t,app:{code:n,libraries:["shiny",...c]}}}function VU({uiTree:t,otherCode:{uiExtra:a="",serverExtra:r="",serverFunctionBody:e="",serverLibraries:c=[]}}){let n=`${z4.libraries} - 50% { - transform: scale(1.5); - } +${a} +ui <- ${z4.ui} +`,l=`${hs(c)} - to { - transform: scale(1); - } +${r} +server <- function(input, output) { + ${F8(e)} } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(Iy)){var t=document.createElement("style");t.id=Iy,t.textContent=KZ,document.head.appendChild(t)}})();var m6={logs:"_logs_xjp5l_2",logsContents:"_logsContents_xjp5l_25",expandTab:"_expandTab_xjp5l_29",clearLogsButton:"_clearLogsButton_xjp5l_69",logLine:"_logLine_xjp5l_75",noLogsMsg:"_noLogsMsg_xjp5l_81",expandedLogs:"_expandedLogs_xjp5l_93",expandLogsButton:"_expandLogsButton_xjp5l_101",unseenLogsNotification:"_unseenLogsNotification_xjp5l_108",slidein:"_slidein_xjp5l_1"};var P4=V(b());function Ey({appLogs:t,clearLogs:a}){let{logsExpanded:r,toggleLogExpansion:e,unseenLogs:c}=QZ(t),n=t.length===0;return(0,P4.jsxs)("div",{className:m6.logs,"data-expanded":r,children:[(0,P4.jsxs)("button",{className:m6.expandTab,title:r?"hide logs":"show logs",onClick:e,children:[(0,P4.jsx)(ky,{className:m6.unseenLogsNotification,"data-show":c}),"App Logs",r?(0,P4.jsx)(Fy,{}):(0,P4.jsx)(Oy,{})]}),(0,P4.jsxs)("div",{className:m6.logsContents,children:[n?(0,P4.jsx)("p",{className:m6.noLogsMsg,children:"No recent logs"}):t.map((l,o)=>(0,P4.jsx)("p",{className:m6.logLine,children:l},o)),n?null:(0,P4.jsx)(Y1,{variant:"icon",title:"clear logs",className:m6.clearLogsButton,onClick:a,children:(0,P4.jsx)(Ry,{})})]})]})}function QZ(t){let[a,r]=x6.default.useState(!1),[e,c]=x6.default.useState(!1),[n,l]=x6.default.useState(null),[o,i]=x6.default.useState(new Date),h=x6.default.useCallback(()=>{if(a){r(!1),l(new Date);return}r(!0),c(!1)},[a]);return x6.default.useEffect(()=>{i(new Date)},[t]),x6.default.useEffect(()=>{if(a||t.length===0){c(!1);return}if(n===null||n{let s=a.subscribe("APP-PREVIEW-STATUS",L=>{o(null),e(L)}),g=a.subscribe("APP-PREVIEW-LOGS",L=>{n(YZ(L))}),p=a.subscribe("APP-PREVIEW-CRASH",L=>{o(L)});return t({path:"APP-PREVIEW-REQUEST"}),h(()=>()=>t({path:"APP-PREVIEW-RESTART"})),d(()=>()=>t({path:"APP-PREVIEW-STOP"})),()=>{s.unsubscribe(),g.unsubscribe(),p.unsubscribe()}},[a,t]);let[i,h]=H6.default.useState(()=>()=>console.warn("No app running to reset")),[v,d]=H6.default.useState(()=>()=>console.warn("No app running to stop")),u=H6.default.useCallback(()=>{n([])},[]);return{appLogs:c,clearLogs:u,restartApp:i,stopApp:v,appLoc:r,errors:l}}function YZ(t){return Array.isArray(t)?t:[t]}var ol=V(X());function _y(){let t=JZ();return tG(t.width)}function JZ(){let[t,a]=ol.default.useState(Ty()),r=ol.default.useMemo(()=>_e(()=>{a(Ty())},500),[]);return ol.default.useEffect(()=>(window.addEventListener("resize",r),()=>window.removeEventListener("resize",r)),[r]),t}function tG(t){let a=Cn-Du*2,r=t-Nu*2;return a/r}function Ty(){let{innerWidth:t,innerHeight:a}=window;return{width:t,height:a}}var E1=V(b()),Du=16,Nu=55;function Zu(){let t=Fa.default.useRef(null),[a,r]=Fa.default.useState(!1),e=Fa.default.useCallback(()=>{r(u=>!u)},[]),{appLoc:c,errors:n,appLogs:l,clearLogs:o,restartApp:i}=Py(),h=_y(),v=Fa.default.useCallback(u=>{eG(u.currentTarget),!(!t.current||typeof c=="string")&&(u.metaKey?i():t.current.src=c.url)},[c,i]);if(c==="HIDDEN")return null;let d=({isExpandedMode:u})=>(0,E1.jsx)("div",{className:u4.reloadButtonContainer,children:(0,E1.jsx)(v3,{text:`Reload app session (hold ${cG()} to restart app server also)`,className:u4.reloadButton,onClick:v,position:u?"right":"up-right",children:(0,E1.jsx)(Tu,{})})});return(0,E1.jsxs)(E1.Fragment,{children:[(0,E1.jsxs)(C5,{className:u4.title,children:[(0,E1.jsx)(d,{isExpandedMode:!1}),"App Preview"]}),(0,E1.jsx)("div",{className:u4.appViewerHolder,"data-expanded":a,style:{"--app-scale-amnt":h,"--preview-inset-horizontal":`${Du}px`,"--expanded-inset-horizontal":`${Nu}px`},children:n!==null?(0,E1.jsx)(aG,{onClick:i}):(0,E1.jsxs)(E1.Fragment,{children:[(0,E1.jsx)(d,{isExpandedMode:!0}),(0,E1.jsxs)("div",{className:u4.appContainer,children:[c==="FAKE-PREVIEW"?(0,E1.jsx)(by,{}):c==="LOADING"?(0,E1.jsx)(rG,{}):(0,E1.jsx)("iframe",{className:u4.previewFrame,src:c.url,title:"Application Preview",ref:t}),(0,E1.jsx)(Y1,{variant:"icon",className:u4.expandButton,title:a?"Shrink app preview":"Expand app preview",onClick:e,children:a?(0,E1.jsx)(ry,{}):(0,E1.jsx)(eH,{})})]}),(0,E1.jsx)(Ey,{appLogs:l,clearLogs:o})]})})]})}function aG({onClick:t}){return(0,E1.jsxs)("div",{className:u4.appContainer,children:[(0,E1.jsxs)("p",{children:["App preview crashed.",(0,E1.jsx)("br",{})," Try and restart?"]}),(0,E1.jsxs)(Y1,{className:u4.restartButton,title:"Restart app preview",onClick:t,children:["Restart app preview ",(0,E1.jsx)(Tu,{})]})]})}function rG(){return(0,E1.jsx)("div",{className:u4.loadingMessage,children:(0,E1.jsx)("h2",{children:"Loading app preview..."})})}function eG(t){let a=t.querySelector("svg");a?.classList.add(u4.spin),t.addEventListener("animationend",()=>a?.classList.remove(u4.spin),!1)}function cG(){return nl()?"\u2318":"Alt"}var Gu=V(b()),nG=t=>(0,Gu.jsx)("svg",{viewBox:"0 0 168 114",fill:"none",xmlns:"http://www.w3.org/2000/svg","aria-label":"Shiny Logo",...t,children:(0,Gu.jsx)("path",{opacity:.9,d:"M17.524 62.626c-.898-.027-.3 0 0 0Zm-.027 0c-.871-.027-.49 0-.19 0h.462-.272c.272.027.19 0 0 0Zm.244 0c9.497.218 19.43-1.986 22.313-13.279 1.878-7.293-2.802-12.599-6.938-17.932-.028-.027-.055-.054-.055-.109-.163-.68-4.653-4.816-5.904-6.367 0-.027-.028-.027-.055-.055-.599-.435-1.224-2.64-1.524-3.864a3.323 3.323 0 0 1-.027-1.55c1.089-5.552 1.687-9.606 9.061-8.409 5.306.871 2.558 8.653 5.415 9.415h.055c1.714.164 5.06-3.945 5.55-5.333 1.905-5.388-9.088-8.68-12.435-8.463-6.72.408-11.129 4.055-13.823 10.068-4.952 11.075 4.3 18.45 9.905 26.041 4.245 5.742 4.054 10.857-1.143 15.782-5.714 5.415-12.354-2.04-13.116-7.292-.68-4.816-.625-8.163-4.653-2.04-3.728 5.686.11 13.088 7.374 13.387ZM167.266 36.34v.055a13.555 13.555 0 0 1-.762 3.428 27.79 27.79 0 0 1-2.693 5.306c-1.334 2.041-2.041 2.857-3.429 4.653-2.612 3.402-4.626 5.932-7.674 9.17-4.244 4.49-8.979 9.633-14.149 13.306-7.374 5.28-16.68 6.722-25.497 7.538-25.796 2.34-63.755 5.823-71.755 33.741-.054.164-.19.245-.354.191-.081-.027-.136-.055-.163-.136-7.837-13.388-24.68-23.211-40.3-22.748-.162.027-.299-.055-.326-.218-.027-.163.055-.3.218-.327 40.218-19.972 81.306-10.394 124.735-18.15 10.857-1.931 19.972-9.06 26.53-17.632 2.504-3.238 5.715-5.986 7.919-9.442.353-.572 2.176-5.116-.653-3.184-4.381 2.966-8.082 6.64-12.844 8.953a5.605 5.605 0 0 1-.707.299c-.082.027-.137.109-.164.19a27.286 27.286 0 0 1-2.857 6.368 18.325 18.325 0 0 1-5.66 5.632c-2.122 1.415-4.598 2.232-7.129 2.422-.354.027-.68.027-1.034.027-2.014 0-3.32-.163-4.871-.952-1.986-1.034-2.612-2.721-2.748-4.762-.082-1.224.68-2.558 1.306-3.565.626-1.006 1.633-2.122 2.34-2.421l.055-.028c3.537-2.612 9.551-2.802 13.632-3.918.109-.027.191-.109.191-.19l2.041-7.456c.054-.163-.055-.3-.191-.354a.301.301 0 0 0-.299.109 40.263 40.263 0 0 1-3.402 4.326c-1.605 1.688-2.857 2.721-3.809 3.102a11.152 11.152 0 0 1-3.374.708c-1.361.082-2.531-.463-3.429-1.605-.898-1.143-1.388-2.83-1.496-5.062a8.521 8.521 0 0 1 0-1.197.312.312 0 0 0-.191-.354.313.313 0 0 0-.354.19c-.435.844-.87 1.633-1.306 2.34-1.279 2.232-2.884 4.273-4.707 6.096-1.796 1.796-3.538 2.748-5.143 2.857-3.021.19-4.653-1.523-4.871-5.115-.218-3.429 1.143-10.477 4.082-20.98.163-.462.217-.952.19-1.415-.054-.952-.598-1.333-1.714-1.252a6.312 6.312 0 0 0-3.51 1.47 12.19 12.19 0 0 0-3.021 3.837c-.898 1.632-1.687 3.32-2.421 5.034a42.75 42.75 0 0 0-1.878 5.823c-.544 2.204-1.007 4.054-1.306 5.496a144.944 144.944 0 0 0-.925 4.708c-.218 1.143-.463 2.557-.517 2.775l-.055.218-7.483.49-.027-.272c-.054-.654.49-2.966 1.578-7.02l-.653 1.142a29.066 29.066 0 0 1-4.68 6.095c-1.796 1.796-3.537 2.749-5.143 2.857h-.326c-2.64 0-4.136-2.068-4.381-6.15-.055-.816-.082-1.632-.055-2.475a.312.312 0 0 0-.19-.354.312.312 0 0 0-.354.19c-4.109 7.538-7.81 11.347-11.238 11.565-3.02.19-4.653-1.605-4.898-5.36-.272-4.164.87-10.26 3.401-18.096.545-1.932.79-3.265.735-3.973-.082-1.088-.571-1.224-.98-1.224h-.108c-.354.027-1.116.245-2.722 1.252a14.477 14.477 0 0 0-3.646 3.4c-1.17 1.525-2.095 3.239-2.775 5.035-.708 1.905-1.28 3.565-1.687 4.952-.408 1.388-.817 3.102-1.225 5.062-.408 1.959-.762 3.646-1.088 4.898a73.777 73.777 0 0 0-.98 4.353l-.054.218-7.184.462c-.163 0-.3-.108-.3-.272v-.108c1.062-3.674 2.559-9.633 4.463-17.688 1.905-8.054 3.647-14.503 5.061-19.129 1.225-4.027 2.667-8 4.354-11.836a32.438 32.438 0 0 1 5.225-8.273c2.04-2.285 4.326-3.51 6.748-3.673 2.558-.163 3.919 1.116 4.109 3.755.109 1.769-.408 4.136-1.524 7.102-2.04 5.252-5.442 11.374-10.15 18.204a.296.296 0 0 0 0 .408c.11.11.3.11.409 0a16.315 16.315 0 0 1 2.612-1.66c1.36-.707 2.857-1.115 4.408-1.251 2.912-.19 4.463 1.143 4.653 3.945a8.216 8.216 0 0 1-.326 3.048c-.273.898-.572 1.96-.926 3.13-.326 1.17-.598 2.149-.816 2.884-.218.761-.49 1.768-.844 3.047-.353 1.28-.625 2.395-.789 3.266-.49 2.204-.68 3.972-.598 5.251.109 1.633.762 1.633.98 1.633h.081c2.748-.163 5.986-4.953 9.66-14.204.027-.055.027-.082.054-.136a64.454 64.454 0 0 1 3.184-8.925c1.524-3.347 3.374-5.116 5.551-5.252l4.354-.218c.163 0 .299.109.299.272a.31.31 0 0 1-.082.218c-.68.653-1.578 2.395-2.666 5.197-1.143 3.02-1.932 5.089-2.45 6.476-.516 1.443-1.115 3.402-1.74 5.85-.627 2.45-.899 4.409-.79 5.878.136 1.932.87 1.932 1.116 1.932h.081c.381-.027 1.089-.299 2.368-1.47a14.924 14.924 0 0 0 2.53-3.02c.653-1.06 1.36-2.394 2.15-4.027.79-1.632 1.47-3.047 2.04-4.245.627-1.279.872-1.714 1.035-1.877l.354-.653c1.333-5.388 1.959-9.17 1.823-11.266a2.31 2.31 0 0 0-.245-1.034c-.082-.108-.082-.299.054-.38a.387.387 0 0 1 .163-.055l3.02-.19c1.77-.11 2.885 0 3.457.38.571.381.925 1.007.952 1.66a9.83 9.83 0 0 1-.19 1.987c-.028.163.081.3.245.326.081.028.19-.027.244-.081 3.402-3.538 6.939-5.442 10.585-5.66 2.912-.19 4.49 1.197 4.654 4.109.054.925 0 1.85-.191 2.775-.19.925-.653 2.721-1.469 5.497-1.715 5.959-2.531 9.959-2.395 11.918.082 1.388.626 1.551 1.034 1.551h.082c.381-.027 1.088-.3 2.34-1.496a17.296 17.296 0 0 0 2.558-3.075 43.208 43.208 0 0 0 2.177-3.973c.789-1.578 1.442-2.993 2.013-4.19.191-.436.354-.762.49-1.035 0-.027.027-.027.027-.054.789-3.32 1.714-6.068 2.776-8.19 1.224-2.504 2.612-4.164 4.081-4.98 1.47-.816 3.483-1.279 6.068-1.442a.58.58 0 0 1 .626.517v.054c.027.3-.136.626-.462 1.034-1.824 1.987-3.592 5.497-5.307 10.45-1.714 4.952-2.448 9.115-2.258 12.435.109 1.523.49 2.313 1.143 2.313h.054c1.606-.11 3.647-2.096 6.014-5.932a50.108 50.108 0 0 0 5.442-11.674c.163-.544.381-1.306.68-2.34.3-1.034.517-1.714.626-2.095.109-.381.327-.925.599-1.606.19-.544.462-1.034.789-1.496.218-.245.544-.572.925-.98.381-.408.816-.707 1.333-.87a19.15 19.15 0 0 1 3.919-.735l3.02-.19c.136-.055.3.026.354.162.054.137-.027.3-.163.354l-.055.055c-1.36 1.06-2.694 3.591-3.945 7.537-1.034 3.347-1.905 6.449-2.585 9.197a295.694 295.694 0 0 1-1.279 5.034c-.164.599-.517 2.068-1.061 4.3a177.514 177.514 0 0 1-1.062 4.19c-.054.136 0 .3.136.354.082.027.191.027.272-.055a43.638 43.638 0 0 0 8.164-6.313c1.387-1.387 11.918-13.088 12.408-5.66l.054.327ZM66.503 2.708c-1.06.054-2.938 1.687-5.768 8.98-1.96 5.033-3.864 10.775-5.687 17.087-.055.164.054.3.19.354.109.027.245 0 .327-.109 4.898-7.483 8.299-13.714 10.095-18.585 1.115-3.32 1.633-5.523 1.578-6.503-.082-1.197-.544-1.197-.68-1.197l-.055-.027ZM137.17 54c.054-.136-.027-.3-.163-.354a.173.173 0 0 0-.163 0c-1.47.3-2.939.544-4.381.898-2.041.49-5.143.98-6.722 2.694-.027.027-.027.054-.054.082-.272.598-.326 1.55-.272 2.748.054.844.871 1.633 1.578 2.204a3.24 3.24 0 0 0 2.313.68c3.211-.244 5.85-3.238 7.864-8.952ZM88.517 18.98c1.742-.082 3.918-.735 4.435-3.32.245-1.17-.462-2.504-.898-2.885-.435-.38-1.034-.544-1.823-.49-.789.055-1.741.545-2.64 1.389-1.196 1.115-1.142 2.72-.761 3.782.354.898.98 1.496 1.687 1.524Z",fill:"#fff"})}),Dy=nG;var n7=V(X());var lG={uiName:"gridlayout::grid_page",uiArguments:{row_sizes:["70px","1fr","1fr"],col_sizes:["250px","1fr"],gap_size:"1rem",layout:["header header","sidebar linePlots","dists dists"]},uiChildren:[{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar",title:"Settings",item_gap:"12px"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"numChicks",label:"Number of Chicks",min:1,max:15,value:5,width:"100%",step:1}},{uiName:"shiny::radioButtons",uiArguments:{inputId:"distFacet",label:"Facet Distribution By",choices:{"Diet Type":"Diet","Measure Time":"Time"}}}]},{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"Chick Weights",alignment:"center",is_title:!1}},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"dists"}},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"linePlots"}}]},Ny={title:"Chick Weights Grid",description:"Plots investigating the ChickWeights built-in dataset",uiTree:lG,otherCode:{serverLibraries:["ggplot2"],serverFunctionBody:` - output$linePlots <- renderPlot({ - obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks - chicks <- ChickWeight[obs_to_include, ] - - ggplot( - chicks, - aes( - x = Time, - y = weight, - group = Chick - ) - ) + - geom_line(alpha = 0.5) + - ggtitle("Chick weights over time") - }) - - output$dists <- renderPlot({ - ggplot( - ChickWeight, - aes(x = weight) - ) + - facet_wrap(input$distFacet) + - geom_density(fill = "#fa551b", color = "#ee6331") + - ggtitle("Distribution of weights by diet") - })`}};var oG={uiName:"shiny::navbarPage",uiArguments:{title:"Chick Weights",selected:"Line Plots",collapsible:!0,theme:{uiName:"unknownUiFunction",uiArguments:{text:"bslib::bs_theme()"}}},uiChildren:[{uiName:"shiny::tabPanel",uiArguments:{title:"Line Plots"},uiChildren:[{uiName:"gridlayout::grid_container",uiArguments:{row_sizes:["1fr"],col_sizes:["250px","1fr"],gap_size:"10px",layout:["num_chicks linePlots"]},uiChildren:[{uiName:"gridlayout::grid_card",uiArguments:{area:"num_chicks"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"numChicks",label:"Number of chicks",min:1,max:15,value:5,step:1,width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"linePlots"}}]}]},{uiName:"shiny::tabPanel",uiArguments:{title:"Distributions"},uiChildren:[{uiName:"gridlayout::grid_container",uiArguments:{row_sizes:["165px","1fr"],col_sizes:["1fr"],gap_size:"10px",layout:["facetOption","dists"]},uiChildren:[{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"dists"}},{uiName:"gridlayout::grid_card",uiArguments:{area:"facetOption",title:"Distribution Plot Options"},uiChildren:[{uiName:"shiny::radioButtons",uiArguments:{inputId:"distFacet",label:"Facet distribution by",choices:{"Diet Option":"Diet","Measure Time":"Time"}}}]}]}]}]},Zy={title:"Chick Weights navbar",description:"Plots investigating the ChickWeights built-in dataset in a `navbarPage()` view",uiTree:oG,otherCode:{serverLibraries:["ggplot2"],serverFunctionBody:` - output$linePlots <- renderPlot({ - obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks - chicks <- ChickWeight[obs_to_include, ] - - ggplot( - chicks, - aes( - x = Time, - y = weight, - group = Chick - ) - ) + - geom_line(alpha = 0.5) + - ggtitle("Chick weights over time") - }) - - output$dists <- renderPlot({ - ggplot( - ChickWeight, - aes(x = weight) - ) + - facet_wrap(input$distFacet) + - geom_density(fill = "#fa551b", color = "#ee6331") + - ggtitle("Distribution of weights by diet") - }) - `}};var iG={uiName:"gridlayout::grid_page",uiArguments:{row_sizes:["100px","1fr","1fr","1fr"],col_sizes:["250px","0.59fr","1.41fr"],gap_size:"1rem",layout:["header header header","sidebar bluePlot bluePlot","table table plotly","table table plotly"]},uiChildren:[{uiName:"gridlayout::grid_card",uiArguments:{area:"sidebar",title:"Settings",item_gap:"12px"},uiChildren:[{uiName:"shiny::sliderInput",uiArguments:{inputId:"bins",label:"Number of Bins",min:12,max:100,value:30,width:"100%"}},{uiName:"shiny::numericInput",uiArguments:{inputId:"numRows",label:"Number of table rows",value:10,min:1,step:1,width:"100%"}}]},{uiName:"gridlayout::grid_card_text",uiArguments:{area:"header",content:"Geysers!",alignment:"start",is_title:!1}},{uiName:"gridlayout::grid_card",uiArguments:{area:"table",title:"Table",item_gap:"12px"},uiChildren:[{uiName:"DT::DTOutput",uiArguments:{outputId:"myTable",width:"100%"}}]},{uiName:"gridlayout::grid_card_plot",uiArguments:{area:"bluePlot"}},{uiName:"gridlayout::grid_card",uiArguments:{area:"plotly",title:"Interactive Plot"},uiChildren:[{uiName:"plotly::plotlyOutput",uiArguments:{outputId:"distPlot",width:"100%",height:"100%"}}]}]},Gy={title:"Grid Geyser",description:"The classic geyser app in a gridlayout grid page",uiTree:iG,otherCode:{serverLibraries:["plotly"],serverFunctionBody:` - output$distPlot <- renderPlotly({ - # generate bins based on input$bins from ui.R - plot_ly(x = ~ faithful[, 2], type = "histogram") - }) - - output$bluePlot <- renderPlot({ - # generate bins based on input$bins from ui.R - x <- faithful[, 2] - bins <- seq(min(x), max(x), length.out = input$bins + 1) - - # draw the histogram with the specified number of bins - hist(x, breaks = bins, col = "steelblue", border = "white") - }) - - - output$myTable <- renderDT({ - head(faithful, input$numRows) - })`}};var il=[Gy,Zy,Ny];var hl=V(b()),Uu=1260,Uy=800;function Wy({uiTree:t,width_px:a}){let r=Uy*(a/Uu),e=a/Uu;return(0,hl.jsx)("div",{className:"AppTemplatePreview",style:{width:`${a}px`,height:`${r}px`,"--full-w":`${Uu}px`,"--full-h":`${Uy}px`,"--shrink-ratio":e},children:(0,hl.jsx)("div",{className:"template-container",children:(0,hl.jsx)(T0,{path:[],node:t})})})}var z3=V(b());function Wu(t){return t.uiName==="gridlayout::grid_page"?"grid":"navbarPage"}var hG={grid:Hc,navbarPage:Yn},jy=5,vG={"--card-pad":`${jy}px`};function qy({info:{title:t,uiTree:a,description:r},onSelect:e,width_px:c,selected:n}){let l=Wu(a),o=hG[l],i=c-2*jy;return(0,z3.jsx)($t,{placement:"bottom",popoverContent:r,openDelayMs:400,triggerEl:(0,z3.jsxs)("article",{className:"AppTemplateCard","aria-label":"App template preview card",onClick:e,style:vG,"data-selected":n,children:[(0,z3.jsx)("div",{className:"preview-container",children:(0,z3.jsx)(Wy,{uiTree:a,width_px:i})}),(0,z3.jsxs)("footer",{children:[(0,z3.jsx)("span",{children:t}),(0,z3.jsx)("img",{src:o,alt:`${l} layout icon`,title:`${l} layout app`,className:"layout-icon"})]})]})})}var Xy=V(X());function $y(){let{sendMsg:t}=G3();return Xy.default.useCallback(r=>{t({path:"TEMPLATE-SELECTION",payload:r})},[t])}var ju=["grid","navbarPage"];function dG(t){return il.filter(({uiTree:a})=>{let r=Wu(a);return!!t.layoutTypes.includes(r)})}function Ky({outputChoices:t}){let a=$y(),[r,e]=n7.default.useState({layoutTypes:ju}),[c,n]=n7.default.useState(null),[l,o]=n7.default.useState(t==="USER-CHOICE"?"SINGLE-FILE":t),i=d=>{n(u=>u===d?null:d)},h=n7.default.useMemo(()=>dG(r),[r]);return n7.default.useEffect(()=>{c&&!h.map(d=>d.title).includes(c)&&n(null)},[c,h]),{filterState:r,setFilterState:e,shownTemplates:h,selectedTemplate:c,setSelectedTemplate:i,selectedOutput:l,setSelectedOutput:o,finishSelection:()=>{let d=h.find(({title:u})=>u===c);!d||a({...d,outputType:l})}}}var B8=V(b()),uG=["SINGLE-FILE","MULTI-FILE"],sG={"SINGLE-FILE":"Single file mode","MULTI-FILE":"Multi file mode"};function Qy({selectedOutput:t,setSelectedOutput:a}){return(0,B8.jsxs)("form",{className:"OutputTypeForm",children:[(0,B8.jsx)("legend",{children:"Generate app in:"}),uG.map(r=>{let e=sG[r];return(0,B8.jsxs)("div",{className:"labeled-form-option",children:[(0,B8.jsx)("input",{type:"radio",id:`${r}-choice`,name:e,value:r,checked:r===t,onChange:c=>a(r)}),(0,B8.jsx)("label",{htmlFor:`${r}-choice`,children:e})]},r)})]})}var f3=V(b()),gG={grid:"Grid",navbarPage:"Tabs"};function Yy({filterState:t,setFilterState:a}){let{layoutTypes:r}=t;return(0,f3.jsx)("form",{className:"TemplateFiltersForm",onSubmit:e=>{e.preventDefault()},children:(0,f3.jsxs)("fieldset",{"aria-label":"App layout type filters",children:[(0,f3.jsx)("legend",{children:"Show templates based on selected layouts:"}),(0,f3.jsx)("div",{className:"layout-options",children:ju.map(e=>{let c=gG[e],n=r.includes(e);return(0,f3.jsxs)("div",{className:"labeled-form-option",children:[(0,f3.jsx)("input",{type:"checkbox",id:`${e}-choice`,name:c,value:e,checked:n,onChange:()=>{a({...t,layoutTypes:n?r.filter(l=>l!==e):[...r,e]})}}),(0,f3.jsx)("label",{htmlFor:`${e}-choice`,children:c})]},e)})})]})})}var vl=V(b()),Jy=294,pG={"--card-w":`${Jy}px`};function tA({selectedTemplate:t,setSelectedTemplate:a,templates:r=il}){return r.length===0?(0,vl.jsx)("div",{className:"TemplatePreviewGrid empty-results",children:"No app templates fit current filters. Try broadening your search."}):(0,vl.jsx)("div",{className:"TemplatePreviewGrid",style:pG,children:r.map(e=>(0,vl.jsx)(qy,{info:e,selected:e.title===t,onSelect:()=>{a(e.title)},width_px:Jy},e.title))})}var s4=V(b());function aA(t){let{filterState:a,setFilterState:r,shownTemplates:e,selectedTemplate:c,setSelectedTemplate:n,finishSelection:l,selectedOutput:o,setSelectedOutput:i}=Ky(t),h=c!==null,v=h?"Next":"Select a template";return(0,s4.jsx)(wn,{main:(0,s4.jsx)(tA,{templates:e,selectedTemplate:c,setSelectedTemplate:n}),left:(0,s4.jsxs)(s4.Fragment,{children:[(0,s4.jsx)(C5,{children:"Choose App Template"}),(0,s4.jsxs)("div",{className:"TemplateChooserSidebar",children:[(0,s4.jsx)("section",{className:"instructions",children:"Hover over a template to see a description and what elements are used. Select the desired template and click next to edit."}),(0,s4.jsx)(Yy,{filterState:a,setFilterState:r}),t.outputChoices==="USER-CHOICE"?(0,s4.jsx)(Qy,{selectedOutput:o,setSelectedOutput:i}):null,(0,s4.jsx)(Y1,{disabled:!h,onClick:l,"aria-label":h?"Start editor with selected template":"Need to select a template to proceed","data-balloon-pos":"right",children:v})]})]})})}var rA="932467a0dc45a212eb644179451f2014331df64f6501fd8fc4a135ad92a9aa1b",zG=`._container_1d7pe_1 { +`;return{app_type:"MULTI-FILE",ui_tree:t,ui:{code:n,libraries:["shiny",...c]},server:{code:l}}}var wl=V(b()),zs=1260,_A=800;function RA({uiTree:t,width_px:a}){let r=_A*(a/zs),e=a/zs;return(0,wl.jsx)("div",{className:"AppTemplatePreview",style:{width:`${a}px`,height:`${r}px`,"--full-w":`${zs}px`,"--full-h":`${_A}px`,"--shrink-ratio":e},children:(0,wl.jsx)("div",{className:"template-container",children:(0,wl.jsx)(D0,{path:[],node:t})})})}var V3=V(b());function fs(t){return t.uiName==="gridlayout::grid_page"?"grid":"navbarPage"}var LU={grid:Fc,navbarPage:hl},IA=5,CU={"--card-pad":`${IA}px`};function EA({info:{title:t,uiTree:a,description:r},onSelect:e,width_px:c,selected:n}){let l=fs(a),o=LU[l],i=c-2*IA;return(0,V3.jsx)(r7,{placement:"bottom",popoverContent:r,openDelayMs:400,triggerEl:(0,V3.jsxs)("article",{className:"AppTemplateCard","aria-label":"App template preview card",onClick:e,style:CU,"data-selected":n,children:[(0,V3.jsx)("div",{className:"preview-container",children:(0,V3.jsx)(RA,{uiTree:a,width_px:i})}),(0,V3.jsxs)("footer",{children:[(0,V3.jsx)("span",{children:t}),(0,V3.jsx)("img",{src:o,alt:`${l} layout icon`,title:`${l} layout app`,className:"layout-icon"})]})]})})}var PA=V($());function TA(){let{sendMsg:t}=y5();return PA.default.useCallback(r=>{t({path:"UPDATED-APP",payload:kA(r)})},[t])}var Ms=["grid","navbarPage"];function wU(t){return Cl.filter(({uiTree:a})=>{let r=fs(a);return!!t.layoutTypes.includes(r)})}function NA({outputChoices:t}){let a=TA(),[r,e]=p7.default.useState({layoutTypes:Ms}),[c,n]=p7.default.useState(null),[l,o]=p7.default.useState(t==="USER-CHOICE"?"SINGLE-FILE":t),i=d=>{n(u=>u===d?null:d)},h=p7.default.useMemo(()=>wU(r),[r]);return p7.default.useEffect(()=>{c&&!h.map(d=>d.title).includes(c)&&n(null)},[c,h]),{filterState:r,setFilterState:e,shownTemplates:h,selectedTemplate:c,setSelectedTemplate:i,selectedOutput:l,setSelectedOutput:o,finishSelection:()=>{let d=h.find(({title:s})=>s===c);if(!d)return;let u=ml(d.uiTree,{remove_namespace:!0});a({...d,...u,outputType:l})}}}var O8=V(b()),BU=["SINGLE-FILE","MULTI-FILE"],yU={"SINGLE-FILE":"Single file mode","MULTI-FILE":"Multi file mode"};function DA({selectedOutput:t,setSelectedOutput:a}){return(0,O8.jsxs)("form",{className:"App_TypeForm",children:[(0,O8.jsx)("legend",{children:"Generate app in:"}),BU.map(r=>{let e=yU[r];return(0,O8.jsxs)("div",{className:"labeled-form-option",children:[(0,O8.jsx)("input",{type:"radio",id:`${r}-choice`,name:e,value:r,checked:r===t,onChange:c=>a(r)}),(0,O8.jsx)("label",{htmlFor:`${r}-choice`,children:e})]},r)})]})}var L3=V(b()),AU={grid:"Grid",navbarPage:"Tabs"};function ZA({filterState:t,setFilterState:a}){let{layoutTypes:r}=t;return(0,L3.jsx)("form",{className:"TemplateFiltersForm",onSubmit:e=>{e.preventDefault()},children:(0,L3.jsxs)("fieldset",{"aria-label":"App layout type filters",children:[(0,L3.jsx)("legend",{children:"Show templates based on selected layouts:"}),(0,L3.jsx)("div",{className:"layout-options",children:Ms.map(e=>{let c=AU[e],n=r.includes(e);return(0,L3.jsxs)("div",{className:"labeled-form-option",children:[(0,L3.jsx)("input",{type:"checkbox",id:`${e}-choice`,name:c,value:e,checked:n,onChange:()=>{a({...t,layoutTypes:n?r.filter(l=>l!==e):[...r,e]})}}),(0,L3.jsx)("label",{htmlFor:`${e}-choice`,children:c})]},e)})})]})})}var Bl=V(b()),GA=294,SU={"--card-w":`${GA}px`};function UA({selectedTemplate:t,setSelectedTemplate:a,templates:r=Cl}){return r.length===0?(0,Bl.jsx)("div",{className:"TemplatePreviewGrid empty-results",children:"No app templates fit current filters. Try broadening your search."}):(0,Bl.jsx)("div",{className:"TemplatePreviewGrid",style:SU,children:r.map(e=>(0,Bl.jsx)(EA,{info:e,selected:e.title===t,onSelect:()=>{a(e.title)},width_px:GA},e.title))})}var M4=V(b());function WA(t){let{filterState:a,setFilterState:r,shownTemplates:e,selectedTemplate:c,setSelectedTemplate:n,finishSelection:l,selectedOutput:o,setSelectedOutput:i}=NA(t),h=c!==null,v=h?"Next":"Select a template";return(0,M4.jsx)(Rn,{main:(0,M4.jsx)(UA,{templates:e,selectedTemplate:c,setSelectedTemplate:n}),left:(0,M4.jsxs)(M4.Fragment,{children:[(0,M4.jsx)(D4,{children:"Choose App Template"}),(0,M4.jsxs)("div",{className:"TemplateChooserSidebar",children:[(0,M4.jsx)("section",{className:"instructions",children:"Hover over a template to see a description and what elements are used. Select the desired template and click next to edit."}),(0,M4.jsx)(ZA,{filterState:a,setFilterState:r}),t.outputChoices==="USER-CHOICE"?(0,M4.jsx)(DA,{selectedOutput:o,setSelectedOutput:i}):null,(0,M4.jsx)(Z1,{disabled:!h,onClick:l,"aria-label":h?"Start editor with selected template":"Need to select a template to proceed","data-balloon-pos":"right",children:v})]})]})})}var jA="a930b0decfffe414c6a3ae56abd1aa0f320624b053fbb03c786d6276971d30db",bU=`._container_1d7pe_1 { display: flex; position: relative; } @@ -2702,7 +2765,7 @@ p._logLine_xjp5l_75 { color: var(--disabled-color); opacity: 0.2; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(rA)){var t=document.createElement("style");t.id=rA,t.textContent=zG,document.head.appendChild(t)}})();var eA={container:"_container_1d7pe_1"};var y8=V(b());function cA({goBackward:t,canGoBackward:a,goForward:r,canGoForward:e}){return(0,y8.jsxs)("div",{className:N1(eA.container,"undo-redo-buttons"),children:[(0,y8.jsx)(Y1,{variant:["transparent","icon"],disabled:!a,"aria-label":"Undo last change",title:"Undo last change",onClick:t,children:(0,y8.jsx)(Dh,{height:"100%"})}),(0,y8.jsx)(Y1,{variant:["transparent","icon"],disabled:!e,"aria-label":"Redo last change",title:"Redo last change",onClick:r,children:(0,y8.jsx)(Th,{height:"100%"})})]})}var qu=V(b());function nA(){return w4(a=>a.connectedToServer)?null:(0,qu.jsx)(yn,{onConfirm:()=>{},onCancel:()=>{},children:(0,qu.jsx)("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}var dA=V(X());var lA="fcfe9186ccd679a4a62912a4edb1b1b361290029f06f1a3091064a33699369b6",fG=`._elementsPalette_qmlez_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(jA)){var t=document.createElement("style");t.id=jA,t.textContent=bU,document.head.appendChild(t)}})();var qA={container:"_container_1d7pe_1"};var k8=V(b());function $A({goBackward:t,canGoBackward:a,goForward:r,canGoForward:e}){return(0,k8.jsxs)("div",{className:J1(qA.container,"undo-redo-buttons"),children:[(0,k8.jsx)(Z1,{variant:["transparent","icon"],disabled:!a,"aria-label":"Undo last change",title:"Undo last change",onClick:t,children:(0,k8.jsx)(rv,{height:"100%"})}),(0,k8.jsx)(Z1,{variant:["transparent","icon"],disabled:!e,"aria-label":"Redo last change",title:"Redo last change",onClick:r,children:(0,k8.jsx)(tv,{height:"100%"})})]})}var ms=V(b());function XA(){return b4(a=>a.connected_to_server)?null:(0,ms.jsx)(En,{onConfirm:()=>{},onCancel:()=>{},children:(0,ms.jsx)("p",{style:{color:"var(--red, pink)",textAlign:"center"},children:"Lost connection to backend. Check console where editor was launched for details."})})}var aS=V($());var KA="3993db3082666f1d333d60ec15540ff6a7ba2880c8d15e2197d816a899b292c4",FU=`._elementsPalette_qmlez_1 { --icon-size: 75px; --padding: 8px; @@ -2758,7 +2821,7 @@ p._logLine_xjp5l_75 { ._OptionItem_qmlez_24 > svg { color: var(--rstudio-blue); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(lA)){var t=document.createElement("style");t.id=lA,t.textContent=fG,document.head.appendChild(t)}})();var oA={elementsPalette:"_elementsPalette_qmlez_1",OptionContainer:"_OptionContainer_qmlez_18",optionContainer:"_OptionContainer_qmlez_18",OptionItem:"_OptionItem_qmlez_24",optionItem:"_OptionItem_qmlez_24",OptionIcon:"_OptionIcon_qmlez_33",optionIcon:"_OptionIcon_qmlez_33",OptionLabel:"_OptionLabel_qmlez_41",optionLabel:"_OptionLabel_qmlez_41"};var iA="36c6b4b0a5cd0f1bde3de656978bd108854e19bf36d9bece869c0e5441b8cda8",MG=`._elementsPalette_qmlez_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(KA)){var t=document.createElement("style");t.id=KA,t.textContent=FU,document.head.appendChild(t)}})();var QA={elementsPalette:"_elementsPalette_qmlez_1",OptionContainer:"_OptionContainer_qmlez_18",optionContainer:"_OptionContainer_qmlez_18",OptionItem:"_OptionItem_qmlez_24",optionItem:"_OptionItem_qmlez_24",OptionIcon:"_OptionIcon_qmlez_33",optionIcon:"_OptionIcon_qmlez_33",OptionLabel:"_OptionLabel_qmlez_41",optionLabel:"_OptionLabel_qmlez_41"};var YA="33f80b505479ad2d633a9ccf0015435fbe2b67cd35e13e1f32ba977e46060cf6",OU=`._elementsPalette_qmlez_1 { --icon-size: 75px; --padding: 8px; @@ -2814,7 +2877,8 @@ p._logLine_xjp5l_75 { ._OptionItem_qmlez_24 > svg { color: var(--rstudio-blue); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(iA)){var t=document.createElement("style");t.id=iA,t.textContent=MG,document.head.appendChild(t)}})();var Oa={elementsPalette:"_elementsPalette_qmlez_1",OptionContainer:"_OptionContainer_qmlez_18",optionContainer:"_OptionContainer_qmlez_18",OptionItem:"_OptionItem_qmlez_24",optionItem:"_OptionItem_qmlez_24",OptionIcon:"_OptionIcon_qmlez_33",optionIcon:"_OptionIcon_qmlez_33",OptionLabel:"_OptionLabel_qmlez_41",optionLabel:"_OptionLabel_qmlez_41"};var A8=V(b());function hA({uiName:t}){let{iconSrc:a,title:r,settingsInfo:e,description:c=r}=N2[t],n={uiName:t,uiArguments:R9(e)},l=pc({nodeInfo:{node:n}});return a===void 0?null:(0,A8.jsx)($t,{popoverContent:c,contentIsMd:!0,openDelayMs:500,triggerEl:(0,A8.jsx)("div",{className:Oa.OptionContainer,children:(0,A8.jsxs)("div",{className:Oa.OptionItem,"data-ui-name":t,...l,children:[(0,A8.jsx)("img",{src:a,alt:r,className:Oa.OptionIcon}),(0,A8.jsx)("label",{className:Oa.OptionLabel,children:r})]})})})}var V6=V(b()),vA=["Inputs","Outputs","gridlayout","uncategorized"];function mG(t,a){let r=vA.indexOf(N2[t]?.category||"uncategorized"),e=vA.indexOf(N2[a]?.category||"uncategorized");return re?1:0}function Xu({availableUi:t=N2}){let a=dA.useMemo(()=>Object.keys(t).sort(mG),[t]);return(0,V6.jsxs)(V6.Fragment,{children:[(0,V6.jsx)(C5,{children:"Elements"}),(0,V6.jsx)("div",{className:oA.elementsPalette,children:a.map(r=>(0,V6.jsx)(hA,{uiName:r},r))})]})}function uA(t){let a=[],r={};for(let e in t)t[e].inputType==="omitted"?a.push(e):r[e]=t[e];return{omitted:a,nonOmittedFormInfo:r}}var d5=V(b());function gA({settings:t,settingsInfo:a,onSettingsChange:r}){let e=Qm(Object.keys(t),Object.keys(a));return e.length===0?null:(0,d5.jsxs)("section",{className:"unknown-arguments-list",children:[(0,d5.jsx)("div",{className:"divider-line",children:(0,d5.jsx)("label",{children:(0,d5.jsx)(iC,{text:"Arguments present in UI code but not known about or editable by the shinyuieditor",position:"left",size:"fit",children:"Unknown arguments"})})}),(0,d5.jsx)("ul",{className:"unknown-form-fields","aria-label":"Unknown arguments list",children:e.map(c=>(0,d5.jsxs)("li",{className:"unknown-argument","aria-label":"Unknown argument",style:{cursor:"default"},children:[(0,d5.jsx)("code",{"aria-label":HG(t[c]),"data-balloon-pos":"left",style:{cursor:"inherit"},children:c}),(0,d5.jsx)(v3,{text:`Remove ${c} argument`,onClick:()=>r(c,{type:"REMOVE"}),type:"button",position:"left",children:(0,d5.jsx)(Q5,{})})]},c))})]})}function xG(t){return Ca(t)?t.uiName==="unknownUiFunction":!1}var sA=50;function HG(t){let a=JSON.stringify(xG(t)?t.uiArguments.text:t);return a.length>sA+4&&(a=a.substring(0,sA),a+="..."),"Value: "+a}var L6=V(b());function pA(t){let{settings:a,settingsInfo:r,onSettingsChange:e,renderInputs:c=({inputs:o})=>(0,L6.jsx)(L6.Fragment,{children:Object.values(o)})}=t,{nonOmittedFormInfo:n}=uA(r),l={inputs:LG({settings:a,settingsInfo:n,onSettingsChange:e}),settings:a};return(0,L6.jsxs)("form",{className:"FormBuilder",onSubmit:VG,children:[c(l),(0,L6.jsx)(gA,{...t})]})}var VG=t=>{t.preventDefault()};function LG({settings:t,settingsInfo:a,onSettingsChange:r}){let e={};return Object.keys(a).forEach(c=>{let n=a[c],l=t[c],o={...n,name:c,value:l,onUpdate:i=>r(c,i)};e[c]=(0,L6.jsx)(Rn,{...o},c)}),e}var zA="baafa57db1e8bc3e4f681e9c8fd76bb6beb18895df8db506f6584c561aa77c8a",CG=`._container_1fh41_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(YA)){var t=document.createElement("style");t.id=YA,t.textContent=OU,document.head.appendChild(t)}})();var Za={elementsPalette:"_elementsPalette_qmlez_1",OptionContainer:"_OptionContainer_qmlez_18",optionContainer:"_OptionContainer_qmlez_18",OptionItem:"_OptionItem_qmlez_24",optionItem:"_OptionItem_qmlez_24",OptionIcon:"_OptionIcon_qmlez_33",optionIcon:"_OptionIcon_qmlez_33",OptionLabel:"_OptionLabel_qmlez_41",optionLabel:"_OptionLabel_qmlez_41"};var _8=V(b());function JA({uiName:t}){let{iconSrc:a,title:r,settingsInfo:e,description:c=r}=L2[t],n={uiName:t,uiArguments:tl(e)},l=wc({nodeInfo:{node:n}});return a===void 0?null:(0,_8.jsx)(r7,{popoverContent:c,contentIsMd:!0,openDelayMs:500,triggerEl:(0,_8.jsx)("div",{className:Za.OptionContainer,children:(0,_8.jsxs)("div",{className:Za.OptionItem,"data-ui-name":t,...l,children:[(0,_8.jsx)("img",{src:a,alt:r,className:Za.OptionIcon}),(0,_8.jsx)("label",{className:Za.OptionLabel,children:r})]})})})}var y6=V(b()),tS=["Inputs","Outputs","gridlayout","uncategorized"];function kU(t,a){let r=tS.indexOf(L2[t]?.category||"uncategorized"),e=tS.indexOf(L2[a]?.category||"uncategorized");return re?1:0}function xs({availableUi:t=L2}){let a=aS.useMemo(()=>Object.keys(t).sort(kU),[t]);return(0,y6.jsxs)(y6.Fragment,{children:[(0,y6.jsx)(D4,{children:"Elements"}),(0,y6.jsx)("div",{className:QA.elementsPalette,children:a.map(r=>(0,y6.jsx)(JA,{uiName:r},r))})]})}function rS(t){let a=[],r={};for(let e in t)t[e].inputType==="omitted"?a.push(e):r[e]=t[e];return{omitted:a,nonOmittedFormInfo:r}}var M5=V(b());function cS({settings:t,settingsInfo:a,onSettingsChange:r}){let e=xx(Object.keys(t),Object.keys(a));return e.length===0?null:(0,M5.jsxs)("section",{className:"unknown-arguments-list",children:[(0,M5.jsx)("div",{className:"divider-line",children:(0,M5.jsx)("label",{children:(0,M5.jsx)(FC,{text:"Arguments present in UI code but not known about or editable by the shinyuieditor",position:"left",size:"fit",children:"Unknown arguments"})})}),(0,M5.jsx)("ul",{className:"unknown-form-fields","aria-label":"Unknown arguments list",children:e.map(c=>(0,M5.jsxs)("li",{className:"unknown-argument","aria-label":"Unknown argument",style:{cursor:"default"},children:[(0,M5.jsx)("code",{"aria-label":RU(t[c]),"data-balloon-pos":"left",style:{cursor:"inherit"},children:c}),(0,M5.jsx)(W0,{text:`Remove ${c} argument`,onClick:()=>r(c,{type:"REMOVE"}),type:"button",position:"left",children:(0,M5.jsx)(c3,{})})]},c))})]})}function _U(t){return i7(t)?t.uiName==="unknownUiFunction":!1}var eS=50;function RU(t){let a=JSON.stringify(_U(t)?t.uiArguments.text:t);return a.length>eS+4&&(a=a.substring(0,eS),a+="..."),"Value: "+a}var A6=V(b());function nS(t){let{settings:a,settingsInfo:r,onSettingsChange:e,renderInputs:c=({inputs:o})=>(0,A6.jsx)(A6.Fragment,{children:Object.values(o)})}=t,{nonOmittedFormInfo:n}=rS(r),l={inputs:EU({settings:a,settingsInfo:n,onSettingsChange:e}),settings:a};return(0,A6.jsxs)("form",{className:"FormBuilder",onSubmit:IU,children:[c(l),(0,A6.jsx)(cS,{...t})]})}var IU=t=>{t.preventDefault()};function EU({settings:t,settingsInfo:a,onSettingsChange:r}){let e={};return Object.keys(a).forEach(c=>{let n=a[c],l=t[c],o={...n,name:c,value:l,onUpdate:i=>r(c,i)};e[c]=(0,A6.jsx)(Un,{...o},c)}),e}var R8=V(b());function lS({node:t}){let{sendMsg:a,mode:r}=y5();if(r!=="VSCODE"||!t)return null;let{serverBindings:e}=L2[t.uiName];return(0,R8.jsxs)("div",{children:[(0,R8.jsx)(PU,{serverOutputInfo:e?.outputs,node:t,sendMsg:a}),(0,R8.jsx)(TU,{serverInputInfo:e?.inputs,node:t,sendMsg:a})]})}function PU({serverOutputInfo:t,node:{uiArguments:a},sendMsg:r}){let e=Ml();if(!(e.mode==="MAIN"&&"output_positions"in e)||typeof t>"u")return null;let c=e.output_positions,n=e.server_pos,{outputIdKey:l,renderScaffold:o}=t,i=typeof l=="string"?l:l(a),h=a[i];if(typeof h!="string")return null;let v=c[h];return(0,R8.jsx)(W0,{text:v?"Show output declaration in app script":"Create output binding in app server",position:"left",variant:"regular",onClick:()=>{r(v?{path:"SHOW-APP-LINES",payload:v}:{path:"INSERT-SNIPPET",payload:{snippet:` +output\\$${h} <- ${o}`,below_line:n[2]-1}})},children:v?"Show in server":"Generate server code"})}function TU({serverInputInfo:t,node:{uiArguments:a},sendMsg:r}){if(typeof t>"u")return null;let{inputIdKey:e}=t,c=typeof e=="string"?e:e(a),n=a[c];return typeof n!="string"?null:(0,R8.jsx)(W0,{text:`Find uses of bound input (input$${n}) in app script`,position:"left",variant:"regular",onClick:()=>{r({path:"FIND-INPUT-USES",payload:{type:"Input",inputId:n}})},children:"Find in server"})}var oS="51003d39579e346d05159911e6a0203545ce5d9e17df8435552c906496850d75",NU=`._container_1fh41_1 { --flex-gap: 8px; padding: var(--vertical-spacing); display: flex; @@ -2892,7 +2956,7 @@ p._logLine_xjp5l_75 { ._node_1fh41_12:first-child::before { top: 50%; } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(zA)){var t=document.createElement("style");t.id=zA,t.textContent=CG,document.head.appendChild(t)}})();var $u={container:"_container_1fh41_1",node:"_node_1fh41_12"};var Ku=V(b());function Qu({tree:t,path:a,onSelect:r}){let e=cl(a,t),c=a.length;return(0,Ku.jsx)("div",{className:$u.container,"aria-label":"Path to selected node",children:e.map((n,l)=>{let o=l===c,i=wG(n);return(0,Ku.jsx)("div",{className:$u.node,"aria-label":o?"current selection":"ancestor of selection",onClick:o?void 0:()=>r(a.slice(0,l)),children:i},n+l)})})}function wG(t){return t.replace(/[a-z]+::/,"")}var fA="176314e58f79f0604fda855318144df78c1416b3ccdd379559219688cf4b5e98",BG=`._settingsPanel_a44hx_1 { +`;(function(){if(!(typeof document>"u")&&!document.getElementById(oS)){var t=document.createElement("style");t.id=oS,t.textContent=NU,document.head.appendChild(t)}})();var Hs={container:"_container_1fh41_1",node:"_node_1fh41_12"};var Vs=V(b());function Ls({tree:t,path:a,onSelect:r}){let e=xl(a,t),c=a.length;return(0,Vs.jsx)("div",{className:Hs.container,"aria-label":"Path to selected node",children:e.map((n,l)=>{let o=l===c,i=DU(n);return(0,Vs.jsx)("div",{className:Hs.node,"aria-label":o?"current selection":"ancestor of selection",onClick:o?void 0:()=>r(a.slice(0,l)),children:i},n+l)})})}function DU(t){return t.replace(/[a-z]+::/,"")}var iS="2c243edf2255e1f734dfff3312a143d72aedee118fd70da2a30522707fbb6aa3",ZU=`._settingsPanel_a44hx_1 { --vertical-gap: var(--vertical-spacing); display: flex; flex-direction: column; @@ -2941,7 +3005,7 @@ form._settingsForm_a44hx_17 { color: var(--red); font-family: var(--mono-fonts); } -`;(function(){if(!(typeof document>"u")&&!document.getElementById(fA)){var t=document.createElement("style");t.id=fA,t.textContent=BG,document.head.appendChild(t)}})();var dl={settingsPanel:"_settingsPanel_a44hx_1",currentElementAbout:"_currentElementAbout_a44hx_10",settingsForm:"_settingsForm_a44hx_17",settingsInputs:"_settingsInputs_a44hx_24",buttonsHolder:"_buttonsHolder_a44hx_28",validationErrorMsg:"_validationErrorMsg_a44hx_45"};var M3=V(X());var MA=yG;function yG(t,a){var r={};typeof a=="string"&&(a=[].slice.call(arguments,1));for(var e in t)(!t.hasOwnProperty||t.hasOwnProperty(e))&&a.indexOf(e)===-1&&(r[e]=t[e]);return r}function xA(t){let a=g0(),[r,e]=Ft(),[c,n]=M3.useState(r!==null?mA(t,r):null),l=M3.useRef(!1),o=M3.useCallback(v=>{!r||!l.current||a(In({path:r,node:v}))},[a,r]);return M3.useEffect(()=>{if(l.current=!1,r===null){n(null);return}n(mA(t,r))},[t,r]),M3.useEffect(()=>{!c||o(c)},[c,o]),{currentNode:c,updateArgumentsByName:(v,d)=>{n(u=>({...u,uiArguments:{...u?.uiArguments,[v]:d}})),l.current=!0},deleteArgumentByName:v=>{n(d=>d===null?d:{...d,uiArguments:MA(d.uiArguments??{},v)}),l.current=!0},selectedPath:r,setNodeSelection:e}}function mA(...t){try{return f0(...t)}catch{return console.warn("Failed to get node. Args:",t),null}}var q0=V(b());function HA({tree:t}){let{currentNode:a,updateArgumentsByName:r,deleteArgumentByName:e,selectedPath:c,setNodeSelection:n}=xA(t);if(c===null)return(0,q0.jsx)("div",{children:"Select an element to edit properties"});if(a===null)return(0,q0.jsxs)("div",{children:["Error finding requested node at path ",c.join(".")]});let l=c.length===0,{uiName:o,uiArguments:i}=a,h=N2[o],v=$m(h.settingsInfo,a);return(0,q0.jsxs)(q0.Fragment,{children:[(0,q0.jsx)(C5,{children:"Properties"}),(0,q0.jsxs)("div",{className:dl.settingsPanel,children:[(0,q0.jsx)("div",{className:dl.currentElementAbout,children:(0,q0.jsx)(Qu,{tree:t,path:c,onSelect:n})}),(0,q0.jsx)(pA,{settings:i,settingsInfo:v,renderInputs:h.settingsFormRender,onSettingsChange:(d,u)=>{switch(u.type){case"UPDATE":r(d,u.value);return;case"REMOVE":e(d);return}}}),(0,q0.jsx)("div",{className:dl.buttonsHolder,children:l?null:(0,q0.jsx)(vc,{path:c})})]})]})}var VA=V(b());function Yu({children:t,...a}){return(0,VA.jsx)("dialog",{...a,ref:AG,children:t})}function AG(t){if(t!==null)try{t.showModal()}catch{}}var C6=V(b());function LA(){let{sendMsg:t,mode:a}=G3();return a!=="VSCODE"?null:(0,C6.jsxs)(C6.Fragment,{children:[(0,C6.jsx)(v3,{text:"Open app code next to editor",onClick:()=>{t({path:"OPEN-COMPANION-EDITOR",payload:"BESIDE"})},className:"OpenSideBySideWindowButton",children:(0,C6.jsx)(rH,{})}),(0,C6.jsx)("div",{className:"divider"})]})}var K1=V(b()),SG={"--properties-panel-width":`${Cn}px`};function CA(){let{state:t,errorInfo:a,history:r}=By(),e;return a?e=(0,K1.jsxs)(Yu,{className:"message-mode",children:[(0,K1.jsxs)("h2",{children:["Error ",a.context?`while ${a.context}`:""]}),(0,K1.jsx)("p",{className:"error-msg",children:a.msg})]}):t.mode==="LOADING"?e=(0,K1.jsx)(Yu,{className:"message-mode",children:(0,K1.jsx)("h2",{children:"Loading initial state from server"})}):t.mode==="MAIN"?e=(0,K1.jsx)(ox,{children:(0,K1.jsx)(wn,{main:(0,K1.jsx)(T0,{node:t.uiTree,path:[]}),left:(0,K1.jsx)(Xu,{}),properties:(0,K1.jsx)(HA,{tree:t.uiTree}),preview:(0,K1.jsx)(Zu,{})})}):e=(0,K1.jsx)(aA,{...t.options}),(0,K1.jsxs)("div",{className:"EditorContainer",style:SG,children:[(0,K1.jsxs)("header",{children:[(0,K1.jsx)(Dy,{className:"shiny-logo"}),(0,K1.jsx)("h1",{className:"app-title",children:"Shiny UI Editor"}),(0,K1.jsxs)("div",{className:"right",children:[t.mode==="MAIN"?(0,K1.jsxs)(K1.Fragment,{children:[(0,K1.jsx)(LA,{}),(0,K1.jsx)(RM,{})]}):null,(0,K1.jsx)("div",{className:"divider"}),(0,K1.jsx)(cA,{...r}),(0,K1.jsx)("div",{className:"spacer last"})]})]}),e,(0,K1.jsx)(nA,{})]})}var bG=V(X());var wA=yt({name:"connectedToServer",initialState:!0,reducers:{DISCONNECTED_FROM_SERVER:(t,a)=>!1}}),{DISCONNECTED_FROM_SERVER:Mu1}=wA.actions;var BA=wA.reducer;function yA(t,a){let r=Math.min(t.length,a.length)-1;return r<=0?!0:fc(t,a,r)}function AA({selectedPath:t,deletedPath:a}){if(t===null)return t;if(r5(a,t))return FG(t);if(t.lengthc)return t;let n=[...t],l=c-1;return l<0||(n[r]=l),n}function FG(t){return t.slice(0,t.length-1)}var SA=At();SA.startListening({actionCreator:rl,effect:async(t,a)=>{let r=t.payload.path,e=a.getState().selectedPath;if(e===null)return;let c=AA({selectedPath:e,deletedPath:r});a.dispatch(c6({path:c}))}});var bA=SA.middleware;function FA({fromPath:t,toPath:a}){let r=V5(t);if(V5(a)a[c])return a;let n=[...a];return n[c]--,n}var OA=At();OA.startListening({actionCreator:Pu,effect:async(t,a)=>{let r=t.payload,e=r.path;Eu(r)&&(e=FA({fromPath:r.currentPath,toPath:e})),a.dispatch(c6({path:e}))}});var kA=OA.middleware;var RA=At();RA.startListening({actionCreator:el,effect:async(t,a)=>{a.dispatch(c6({path:[]}))}});var IA=RA.middleware;var EA=Tm({reducer:{uiTree:Vy,selectedPath:sx,connectedToServer:BA},middleware:t=>t().concat(bA).concat(kA).concat(IA)});var TA=V(b());function OG({children:t}){return(0,TA.jsx)(Yh,{store:EA,children:t})}var PA=OG;var ul=V(b());function _A(t){return(0,ul.jsx)(PA,{children:(0,ul.jsx)(Yz,{...t,children:(0,ul.jsx)(CA,{})})})}var ZA=V(b());function NA({container:t,backendDispatch:{sendMsg:a,incomingMsgs:r,mode:e},showMessages:c}){let n=c?{sendMsg:a,incomingMsgs:{subscribe:(o,i)=>(console.log(`backendMsgs.subscribe("${o}", ...)`),r.subscribe(o,i))},mode:e}:{sendMsg:a,incomingMsgs:r,mode:e};(0,DA.createRoot)(t).render((0,ZA.jsx)(_A,{...n}))}var kG=document.getElementById("root"),GA=!0;(async()=>{try{let t=vs(),a=await Bl({messageDispatch:t,onClose:()=>console.log("Websocket closed!!")});a==="NO-WS-CONNECTION"&&await Bl({messageDispatch:t,onClose:()=>console.log("Websocket closed!!"),pathToWebsocket:"localhost:8888"});let r=a==="NO-WS-CONNECTION"?ss({messageDispatch:t,showMessages:GA}):a;NA({container:kG,backendDispatch:r,showMessages:GA})}catch{}})();})(); +`;(function(){if(!(typeof document>"u")&&!document.getElementById(iS)){var t=document.createElement("style");t.id=iS,t.textContent=ZU,document.head.appendChild(t)}})();var yl={settingsPanel:"_settingsPanel_a44hx_1",currentElementAbout:"_currentElementAbout_a44hx_10",settingsForm:"_settingsForm_a44hx_17",settingsInputs:"_settingsInputs_a44hx_24",buttonsHolder:"_buttonsHolder_a44hx_28",validationErrorMsg:"_validationErrorMsg_a44hx_45"};var C3=V($());var hS=GU;function GU(t,a){var r={};typeof a=="string"&&(a=[].slice.call(arguments,1));for(var e in t)(!t.hasOwnProperty||t.hasOwnProperty(e))&&a.indexOf(e)===-1&&(r[e]=t[e]);return r}function dS(t){let a=z0(),[r,e]=Pt(),[c,n]=C3.useState(r!==null?vS(t,r):null),l=C3.useRef(!1),o=C3.useCallback(v=>{!r||!l.current||a(Wn({path:r,node:v}))},[a,r]);return C3.useEffect(()=>{if(l.current=!1,r===null){n(null);return}n(vS(t,r))},[t,r]),C3.useEffect(()=>{!c||o(c)},[c,o]),{currentNode:c,updateArgumentsByName:(v,d)=>{n(u=>({...u,uiArguments:{...u?.uiArguments,[v]:d}})),l.current=!0},deleteArgumentByName:v=>{n(d=>d===null?d:{...d,uiArguments:hS(d.uiArguments??{},v)}),l.current=!0},selectedPath:r,setNodeSelection:e}}function vS(...t){try{return m0(...t)}catch{return console.warn("Failed to get node. Args:",t),null}}var O0=V(b());function uS({tree:t}){let{currentNode:a,updateArgumentsByName:r,deleteArgumentByName:e,selectedPath:c,setNodeSelection:n}=dS(t);if(c===null)return(0,O0.jsx)("div",{children:"Select an element to edit properties"});if(a===null)return(0,O0.jsxs)("div",{children:["Error finding requested node at path ",c.join(".")]});let l=c.length===0,{uiName:o,uiArguments:i}=a,h=L2[o],v=MB(h.settingsInfo,a);return(0,O0.jsxs)(O0.Fragment,{children:[(0,O0.jsx)(D4,{children:"Properties"}),(0,O0.jsxs)("div",{className:yl.settingsPanel,children:[(0,O0.jsx)("div",{className:yl.currentElementAbout,children:(0,O0.jsx)(Ls,{tree:t,path:c,onSelect:n})}),(0,O0.jsx)(nS,{settings:i,settingsInfo:v,renderInputs:h.settingsFormRender,onSettingsChange:(d,u)=>{switch(u.type){case"UPDATE":r(d,u.value);return;case"REMOVE":e(d);return}}}),(0,O0.jsx)(lS,{node:a}),(0,O0.jsx)("div",{className:yl.buttonsHolder,children:l?null:(0,O0.jsx)(xc,{path:c})})]})]})}var S6=V(b());function sS(){let{sendMsg:t,mode:a}=y5();return a!=="VSCODE"?null:(0,S6.jsxs)(S6.Fragment,{children:[(0,S6.jsx)(W0,{text:"Open app code next to editor",onClick:()=>{t({path:"OPEN-COMPANION-EDITOR",payload:"BESIDE"})},className:"OpenSideBySideWindowButton",children:(0,S6.jsx)(wH,{})}),(0,S6.jsx)("div",{className:"divider"})]})}var Q1=V(b()),UU={"--properties-panel-width":`${_n}px`};function gS(){let{state:t,errorInfo:a,history:r}=uA(),e;return a?e=(0,Q1.jsxs)(Na,{className:"message-mode",children:[(0,Q1.jsxs)("h2",{children:["Error ",a.context?`while ${a.context}`:""]}),(0,Q1.jsx)("p",{className:"error-msg",children:a.msg})]}):t.mode==="LOADING"?e=(0,Q1.jsx)(Na,{className:"message-mode",children:(0,Q1.jsx)("h2",{children:"Loading initial state from server"})}):t.mode==="MAIN"?e=(0,Q1.jsx)(bx,{children:(0,Q1.jsx)(Rn,{main:(0,Q1.jsx)(D0,{node:t.ui_tree,path:[]}),left:(0,Q1.jsx)(xs,{}),properties:(0,Q1.jsx)(uS,{tree:t.ui_tree}),preview:(0,Q1.jsx)(gs,{})})}):e=(0,Q1.jsx)(WA,{...t.options}),(0,Q1.jsxs)("div",{className:"EditorContainer",style:UU,children:[(0,Q1.jsxs)("header",{children:[(0,Q1.jsx)(SA,{className:"shiny-logo"}),(0,Q1.jsx)("h1",{className:"app-title",children:"Shiny UI Editor"}),(0,Q1.jsxs)("div",{className:"right",children:[t.mode==="MAIN"?(0,Q1.jsxs)(Q1.Fragment,{children:[(0,Q1.jsx)(sS,{}),(0,Q1.jsx)(nm,{})]}):null,(0,Q1.jsx)("div",{className:"divider"}),(0,Q1.jsx)($A,{...r}),(0,Q1.jsx)("div",{className:"spacer last"})]})]}),e,(0,Q1.jsx)(XA,{})]})}var WU=V($());var pS=_t({name:"connectedToServer",initialState:!0,reducers:{DISCONNECTED_FROM_SERVER:(t,a)=>!1}}),{DISCONNECTED_FROM_SERVER:Rg1}=pS.actions;var zS=pS.reducer;function fS(t,a){let r=Math.min(t.length,a.length)-1;return r<=0?!0:yc(t,a,r)}function MS({selectedPath:t,deletedPath:a}){if(t===null)return t;if(i5(a,t))return jU(t);if(t.lengthc)return t;let n=[...t],l=c-1;return l<0||(n[r]=l),n}function jU(t){return t.slice(0,t.length-1)}var mS=Rt();mS.startListening({actionCreator:zl,effect:async(t,a)=>{let r=t.payload.path,e=a.getState().selected_path;if(e===null)return;let c=MS({selectedPath:e,deletedPath:r});a.dispatch(h6({path:c}))}});var xS=mS.middleware;function HS({fromPath:t,toPath:a}){let r=b5(t);if(b5(a)a[c])return a;let n=[...a];return n[c]--,n}var VS=Rt();VS.startListening({actionCreator:os,effect:async(t,a)=>{let r=t.payload,e=r.path;Yu(r)&&(e=HS({fromPath:r.currentPath,toPath:e})),a.dispatch(h6({path:e}))}});var LS=VS.middleware;var CS=Rt();CS.startListening({actionCreator:fl,effect:async(t,a)=>{a.dispatch(h6({path:[]}))}});var wS=CS.middleware;var BS=hx({reducer:{app_info:nA,selected_path:Ix,connected_to_server:zS},middleware:t=>t().concat(xS).concat(LS).concat(wS)});var AS=V(b());function qU({children:t}){return(0,AS.jsx)(gv,{store:BS,children:t})}var yS=qU;var Al=V(b());function SS(t){return(0,Al.jsx)(yS,{children:(0,Al.jsx)(Cf,{...t,children:(0,Al.jsx)(gS,{})})})}var OS=V(b());function FS({container:t,backendDispatch:{sendMsg:a,incomingMsgs:r,mode:e},showMessages:c}){let n=c?{sendMsg:a,incomingMsgs:{subscribe:(o,i)=>(console.log(`backendMsgs.subscribe("${o}", ...)`),r.subscribe(o,i))},mode:e}:{sendMsg:a,incomingMsgs:r,mode:e};(0,bS.createRoot)(t).render((0,OS.jsx)(SS,{...n}))}var $U=document.getElementById("root"),kS=!0;(async()=>{try{let t=Rs(),a=await Zl({messageDispatch:t,onClose:()=>console.log("Websocket closed!!")});a==="NO-WS-CONNECTION"&&await Zl({messageDispatch:t,onClose:()=>console.log("Websocket closed!!"),pathToWebsocket:"localhost:8888"});let r=a==="NO-WS-CONNECTION"?Ps({messageDispatch:t,showMessages:kS}):a;FS({container:$U,backendDispatch:r,showMessages:kS})}catch{}})();})(); /*! Copyright (c) 2015 Jed Watson. Based on code that is Copyright 2013-2015, Facebook, Inc. diff --git a/inst/editor/build/build/bundle.js.br b/inst/editor/build/build/bundle.js.br index 69c9dac08..577ac714a 100644 Binary files a/inst/editor/build/build/bundle.js.br and b/inst/editor/build/build/bundle.js.br differ diff --git a/inst/editor/build/build/bundle.js.gz b/inst/editor/build/build/bundle.js.gz index 91c99a3e6..dd72415dd 100644 Binary files a/inst/editor/build/build/bundle.js.gz and b/inst/editor/build/build/bundle.js.gz differ diff --git a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-darwin.png b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-darwin.png index 53aef9a36..f6ecb6a47 100644 Binary files a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-darwin.png and b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-darwin.png differ diff --git a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-linux.png b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-linux.png index 37fa88371..9f49524c7 100644 Binary files a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-linux.png and b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-chromium-linux.png differ diff --git a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-darwin.png b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-darwin.png index 68675d326..f59c7cb9f 100644 Binary files a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-darwin.png and b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-darwin.png differ diff --git a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-linux.png b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-linux.png index 8385dc312..ddd30b7a5 100644 Binary files a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-linux.png and b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-firefox-linux.png differ diff --git a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-darwin.png b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-darwin.png index 40a2026ea..4c5ee8ea0 100644 Binary files a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-darwin.png and b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-darwin.png differ diff --git a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-linux.png b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-linux.png index bb2bed1d7..aa2e32631 100644 Binary files a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-linux.png and b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Landing-page-visual-regression-1-webkit-linux.png differ diff --git a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Template-Chooser-visual-regression-1-webkit-darwin.png b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Template-Chooser-visual-regression-1-webkit-darwin.png index 945fa30f8..cb6066b08 100644 Binary files a/inst/editor/playwright/visual-regression.spec.ts-snapshots/Template-Chooser-visual-regression-1-webkit-darwin.png and b/inst/editor/playwright/visual-regression.spec.ts-snapshots/Template-Chooser-visual-regression-1-webkit-darwin.png differ diff --git a/inst/editor/src/App.css b/inst/editor/src/App.css index 624471503..6344f9121 100644 --- a/inst/editor/src/App.css +++ b/inst/editor/src/App.css @@ -71,6 +71,12 @@ 0.8px 1.6px 2px -0.8px hsl(var(--shadow-color) / 0.36), 2.1px 4.1px 5.2px -1.7px hsl(var(--shadow-color) / 0.36), 5px 10px 12.6px -2.5px hsl(var(--shadow-color) / 0.36); + + --size-xs: 4px; + --size-sm: 8px; + --size-md: 12px; + --size-lg: 20px; + --size-xl: 28px; } * { diff --git a/inst/editor/src/DragAndDropHelpers/useDropHandlers.tsx b/inst/editor/src/DragAndDropHelpers/useDropHandlers.tsx index 7ed9ff82e..624e6679a 100644 --- a/inst/editor/src/DragAndDropHelpers/useDropHandlers.tsx +++ b/inst/editor/src/DragAndDropHelpers/useDropHandlers.tsx @@ -4,7 +4,7 @@ import { getIsValidMove } from "../components/UiNode/TreeManipulation/getIsValid import type { ShinyUiNode } from "../main"; import { makeChildPath } from "../Shiny-Ui-Elements/nodePathUtils"; import type { NodePath, ShinyUiNames } from "../Shiny-Ui-Elements/uiNodeTypes"; -import { usePlaceNode } from "../state/uiTree"; +import { usePlaceNode } from "../state/app_info"; import type { DraggedNodeInfo } from "./DragAndDropHelpers"; import { useFilteredDrop } from "./useFilteredDrop"; diff --git a/inst/editor/src/EditorContainer/DialogPopover.tsx b/inst/editor/src/EditorContainer/DialogPopover.tsx index 324018d80..4fc241187 100644 --- a/inst/editor/src/EditorContainer/DialogPopover.tsx +++ b/inst/editor/src/EditorContainer/DialogPopover.tsx @@ -2,19 +2,37 @@ import React from "react"; export function DialogPopover({ children, + onClose, ...passthrough -}: React.ComponentPropsWithoutRef<"dialog">) { +}: Omit, "onClose"> & { + onClose?: () => void; +}) { + const dialog_ref = React.useRef(null); + // Enable closing via clicking outside modal if we've been passed an onClose + // callback, indicating the user wants the modal to be closable + React.useEffect(() => { + if (!dialog_ref.current || typeof onClose === "undefined") return; + + const dialog = dialog_ref.current; + function onClick(event: MouseEvent) { + if (event.target === dialog) { + onClose?.(); + } + } + dialog.addEventListener("click", onClick); + + try { + dialog.showModal(); + } catch {} + + return () => { + dialog.removeEventListener("click", onClick); + }; + }, [onClose]); + return ( - + {children} ); } - -function openDialog(el: HTMLDialogElement | null) { - if (el === null) return; - - try { - el.showModal(); - } catch {} -} diff --git a/inst/editor/src/EditorContainer/EditorContainer.tsx b/inst/editor/src/EditorContainer/EditorContainer.tsx index 52fd3fc5b..e2a38e4cf 100644 --- a/inst/editor/src/EditorContainer/EditorContainer.tsx +++ b/inst/editor/src/EditorContainer/EditorContainer.tsx @@ -47,9 +47,9 @@ export function EditorContainer() { pageBody = ( } + main={} left={} - properties={} + properties={} preview={} /> diff --git a/inst/editor/src/EditorSkeleton/LostConnectionPopup.tsx b/inst/editor/src/EditorSkeleton/LostConnectionPopup.tsx index 05317a5ab..9ee7555b9 100644 --- a/inst/editor/src/EditorSkeleton/LostConnectionPopup.tsx +++ b/inst/editor/src/EditorSkeleton/LostConnectionPopup.tsx @@ -7,7 +7,7 @@ import type { RootState } from "../state/store"; export function LostConnectionPopup() { const connectedToServer = useSelector( - (state: RootState) => state.connectedToServer + (state: RootState) => state.connected_to_server ); if (connectedToServer) return null; diff --git a/inst/editor/src/NodeSelectionState.tsx b/inst/editor/src/NodeSelectionState.tsx index c552a3a1d..1fef36476 100644 --- a/inst/editor/src/NodeSelectionState.tsx +++ b/inst/editor/src/NodeSelectionState.tsx @@ -11,7 +11,7 @@ type NodeSelectionState = [NodePath | null, (path: NodePath | null) => void]; export function useNodeSelectionState(): NodeSelectionState { const dispatch = useDispatch(); - const selectedPath = useSelector((state: RootState) => state.selectedPath); + const selectedPath = useSelector((state: RootState) => state.selected_path); const setSelectedPath = React.useCallback( (path: NodePath | null) => { dispatch(SET_SELECTION({ path })); @@ -23,7 +23,7 @@ export function useNodeSelectionState(): NodeSelectionState { } export function useSelectedPath() { - const selectedPath = useSelector((state: RootState) => state.selectedPath); + const selectedPath = useSelector((state: RootState) => state.selected_path); return selectedPath; } diff --git a/inst/editor/src/SettingsPanel/GoToSourceBtns.tsx b/inst/editor/src/SettingsPanel/GoToSourceBtns.tsx new file mode 100644 index 000000000..9c7447f00 --- /dev/null +++ b/inst/editor/src/SettingsPanel/GoToSourceBtns.tsx @@ -0,0 +1,138 @@ +import type { MessageToBackend } from "communication-types/src/MessageToBackend"; + +import { useBackendConnection } from "../backendCommunication/useBackendMessageCallbacks"; +import { TooltipButton } from "../components/PopoverEl/Tooltip"; +import type { ShinyUiNode } from "../main"; +import type { ShinyUiNodeInfoUnion } from "../Shiny-Ui-Elements/uiNodeTypes"; +import { shinyUiNodeInfo } from "../Shiny-Ui-Elements/uiNodeTypes"; +import { useCurrentAppInfo } from "../state/app_info"; +import type { PickKeyFn } from "../TypescriptUtils"; + +export function GoToSourceBtns({ node }: { node: ShinyUiNode | null }) { + const { sendMsg, mode } = useBackendConnection(); + + if (mode !== "VSCODE" || !node) return null; + + const { serverBindings } = shinyUiNodeInfo[node.uiName]; + + return ( +
    + + +
    + ); +} + +function GoToOutputsBtn({ + serverOutputInfo, + node: { uiArguments }, + sendMsg, +}: { + node: ShinyUiNode; + serverOutputInfo: Required["serverBindings"]["outputs"]; + sendMsg: (msg: MessageToBackend) => void; +}) { + const current_app_info = useCurrentAppInfo(); + + if ( + !( + current_app_info.mode === "MAIN" && "output_positions" in current_app_info + ) || + typeof serverOutputInfo === "undefined" + ) + return null; + + const current_output_positions = current_app_info.output_positions; + const current_server_position = current_app_info.server_pos; + + const { outputIdKey, renderScaffold } = serverOutputInfo; + + // I have no idea why I have to do this coercsian but for some reason this + // keeps getting narrowed to never type for args unless I do it. + const keyForOutput = + typeof outputIdKey === "string" + ? outputIdKey + : (outputIdKey as PickKeyFn)(uiArguments); + + const outputId = uiArguments[keyForOutput]; + if (typeof outputId !== "string") return null; + + const existing_output_locations = current_output_positions[outputId]; + + return ( + { + if (existing_output_locations) { + sendMsg({ + path: "SHOW-APP-LINES", + payload: existing_output_locations, + }); + } else { + sendMsg({ + path: "INSERT-SNIPPET", + payload: { + snippet: `\noutput\\$${outputId} <- ${renderScaffold}`, + below_line: current_server_position[2] - 1, + }, + }); + } + }} + > + {existing_output_locations ? "Show in server" : "Generate server code"} + + ); +} +function GoToInputsBtn({ + serverInputInfo, + node: { uiArguments }, + sendMsg, +}: { + node: ShinyUiNode; + serverInputInfo: Required["serverBindings"]["inputs"]; + sendMsg: (msg: MessageToBackend) => void; +}) { + if (typeof serverInputInfo === "undefined") return null; + + const { inputIdKey } = serverInputInfo; + + // I have no idea why I have to do this coercsian but for some reason this + // keeps getting narrowed to never type for args unless I do it. + const keyForInputId = + typeof inputIdKey === "string" + ? inputIdKey + : (inputIdKey as PickKeyFn)(uiArguments); + + const inputId = uiArguments[keyForInputId]; + if (typeof inputId !== "string") return null; + + return ( + { + sendMsg({ + path: "FIND-INPUT-USES", + payload: { type: "Input", inputId }, + }); + }} + > + Find in server + + ); +} diff --git a/inst/editor/src/SettingsPanel/SettingsPanel.tsx b/inst/editor/src/SettingsPanel/SettingsPanel.tsx index dd1e8fe21..f60fc7da6 100644 --- a/inst/editor/src/SettingsPanel/SettingsPanel.tsx +++ b/inst/editor/src/SettingsPanel/SettingsPanel.tsx @@ -7,6 +7,7 @@ import { PanelHeader } from "../EditorSkeleton/EditorSkeleton"; import type { ShinyUiNode } from "../main"; import { shinyUiNodeInfo } from "../Shiny-Ui-Elements/uiNodeTypes"; +import { GoToSourceBtns } from "./GoToSourceBtns"; import PathBreadcrumb from "./PathBreadcrumb"; // import PathBreadcrumb from "./PathBreadcrumbLinear"; import classes from "./SettingsPanel.module.css"; @@ -74,6 +75,7 @@ export function SettingsPanel({ tree }: { tree: ShinyUiNode }) { } }} /> +
    {!isRootNode ? : null}
    diff --git a/inst/editor/src/SettingsPanel/useUpdateSettings.tsx b/inst/editor/src/SettingsPanel/useUpdateSettings.tsx index 7a518d1c1..4c204cb2a 100644 --- a/inst/editor/src/SettingsPanel/useUpdateSettings.tsx +++ b/inst/editor/src/SettingsPanel/useUpdateSettings.tsx @@ -7,7 +7,7 @@ import type { KnownInputFieldTypes } from "../components/Inputs/SettingsFormBuil import { getNode } from "../components/UiNode/TreeManipulation/getNode"; import type { ShinyUiNode } from "../main"; import { useNodeSelectionState } from "../NodeSelectionState"; -import { UPDATE_NODE } from "../state/uiTree"; +import { UPDATE_NODE } from "../state/app_info"; export function useUpdateSettings(tree: ShinyUiNode) { const dispatch = useDispatch(); diff --git a/inst/editor/src/Shiny-Ui-Elements/DtDtOutput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/DtDtOutput/index.tsx index 071f6537b..3d4c37783 100644 --- a/inst/editor/src/Shiny-Ui-Elements/DtDtOutput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/DtDtOutput/index.tsx @@ -34,6 +34,12 @@ export const dtDTOutputInfo: UiComponentInfo = { optional: true, }, }, + serverBindings: { + outputs: { + outputIdKey: "outputId", + renderScaffold: `renderDT({\n iris\n})`, + }, + }, acceptsChildren: true, iconSrc: icon, category: "Outputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCard/useGridCardDropDetectors.tsx b/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCard/useGridCardDropDetectors.tsx index 7eca71671..428e7f8d8 100644 --- a/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCard/useGridCardDropDetectors.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCard/useGridCardDropDetectors.tsx @@ -3,7 +3,7 @@ import React from "react"; import { getIsValidMove } from "../../components/UiNode/TreeManipulation/getIsValidMove"; import type { DraggedNodeInfo } from "../../DragAndDropHelpers/DragAndDropHelpers"; import { useFilteredDrop } from "../../DragAndDropHelpers/useFilteredDrop"; -import { usePlaceNode } from "../../state/uiTree"; +import { usePlaceNode } from "../../state/app_info"; import { makeChildPath } from "../nodePathUtils"; import type { NodePath, ShinyUiNode } from "../uiNodeTypes"; diff --git a/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCardPlot/index.tsx b/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCardPlot/index.tsx index 6aea695c3..c7aeb83d1 100644 --- a/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCardPlot/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/GridlayoutGridCardPlot/index.tsx @@ -28,6 +28,13 @@ export const gridlayoutGridCardPlotInfo: UiComponentInfo (args.outputId ? "outputId" : "area"), + renderScaffold: `renderPlot({\n #Plot code goes here\n $0plot(rnorm(100))\n})`, + }, + }, acceptsChildren: false, iconSrc: icon, category: "gridlayout", diff --git a/inst/editor/src/Shiny-Ui-Elements/PlotlyPlotlyOutput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/PlotlyPlotlyOutput/index.tsx index 991067273..50acd4f64 100644 --- a/inst/editor/src/Shiny-Ui-Elements/PlotlyPlotlyOutput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/PlotlyPlotlyOutput/index.tsx @@ -29,6 +29,12 @@ export const plotlyPlotlyOutputInfo: UiComponentInfo = { defaultValue: "400px", }, }, + serverBindings: { + outputs: { + outputIdKey: "outputId", + renderScaffold: `renderPlotly({\n plot_ly(z = ~volcano, type = "surface")\n})`, + }, + }, acceptsChildren: false, iconSrc: icon, category: "Plotting", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyActionButton/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyActionButton/index.tsx index 89ed9e02a..cab32cd3c 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyActionButton/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyActionButton/index.tsx @@ -27,6 +27,11 @@ export const shinyActionButtonInfo: UiComponentInfo = { units: ["%", "px", "rem"], }, }, + serverBindings: { + inputs: { + inputIdKey: "inputId", + }, + }, acceptsChildren: false, iconSrc: buttonIcon, category: "Inputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyCheckboxGroupInput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyCheckboxGroupInput/index.tsx index 59c395923..0a1e02e0c 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyCheckboxGroupInput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyCheckboxGroupInput/index.tsx @@ -32,6 +32,11 @@ export const shinyCheckboxGroupInputInfo: UiComponentInfo = units: ["%", "px", "rem"], }, }, + serverBindings: { + inputs: { + inputIdKey: "inputId", + }, + }, acceptsChildren: false, iconSrc: icon, category: "Inputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyNumericInput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyNumericInput/index.tsx index d54287396..0e17ea470 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyNumericInput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyNumericInput/index.tsx @@ -71,6 +71,11 @@ export const shinyNumericInputInfo: UiComponentInfo = { ); }, + serverBindings: { + inputs: { + inputIdKey: "inputId", + }, + }, acceptsChildren: false, iconSrc: icon, category: "Inputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyPlotOutput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyPlotOutput/index.tsx index 2558fed96..9dcd0eb5d 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyPlotOutput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyPlotOutput/index.tsx @@ -29,6 +29,12 @@ export const shinyPlotOutputInfo: UiComponentInfo = { defaultValue: "400px", }, }, + serverBindings: { + outputs: { + outputIdKey: "outputId", + renderScaffold: `renderPlot({\n #Plot code goes here\n $0plot(rnorm(100))\n})`, + }, + }, acceptsChildren: false, iconSrc: plotIcon, category: "Outputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyRadioButtons/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyRadioButtons/index.tsx index bf4b3d3b1..d394e51cd 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyRadioButtons/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyRadioButtons/index.tsx @@ -39,6 +39,11 @@ export const shinyRadioButtonsInfo: UiComponentInfo = { useDefaultIfOptional: true, }, }, + serverBindings: { + inputs: { + inputIdKey: "inputId", + }, + }, acceptsChildren: false, iconSrc: icon, category: "Inputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinySelectInput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinySelectInput/index.tsx index b39f90b53..45a904939 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinySelectInput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinySelectInput/index.tsx @@ -29,6 +29,11 @@ export const shinySelectInputInfo: UiComponentInfo = { }, }, }, + serverBindings: { + inputs: { + inputIdKey: "inputId", + }, + }, acceptsChildren: false, iconSrc: selectBoxIcon, category: "Inputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinySliderInput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinySliderInput/index.tsx index 6b6d9e30a..72b29125a 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinySliderInput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinySliderInput/index.tsx @@ -74,6 +74,11 @@ export const shinySliderInputInfo: UiComponentInfo = { ); }, + serverBindings: { + inputs: { + inputIdKey: "inputId", + }, + }, acceptsChildren: false, iconSrc: sliderIcon, category: "Inputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyTextInput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyTextInput/index.tsx index 8ebd60122..52e41520e 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyTextInput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyTextInput/index.tsx @@ -41,6 +41,11 @@ export const shinyTextInputInfo: UiComponentInfo = { optional: true, }, }, + serverBindings: { + inputs: { + inputIdKey: "inputId", + }, + }, acceptsChildren: false, iconSrc: icon, category: "Inputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyTextOutput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyTextOutput/index.tsx index 9be86a260..3e25db0b3 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyTextOutput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyTextOutput/index.tsx @@ -17,6 +17,12 @@ export const shinyTextOutputInfo: UiComponentInfo = { defaultValue: "textOutput", }, }, + serverBindings: { + outputs: { + outputIdKey: "outputId", + renderScaffold: `renderText({\n "Hello, World"\n})`, + }, + }, acceptsChildren: false, iconSrc: uiIcon, category: "Outputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/ShinyUiOutput/index.tsx b/inst/editor/src/Shiny-Ui-Elements/ShinyUiOutput/index.tsx index 0737bb2c9..2c8de9af2 100644 --- a/inst/editor/src/Shiny-Ui-Elements/ShinyUiOutput/index.tsx +++ b/inst/editor/src/Shiny-Ui-Elements/ShinyUiOutput/index.tsx @@ -17,6 +17,12 @@ export const shinyUiOutputInfo: UiComponentInfo = { defaultValue: "dynamicUiOutput", }, }, + serverBindings: { + outputs: { + outputIdKey: "outputId", + renderScaffold: `renderUI({\n h1("Hello, World")\n})`, + }, + }, acceptsChildren: false, iconSrc: uiIcon, category: "Outputs", diff --git a/inst/editor/src/Shiny-Ui-Elements/isShinyUiNode.ts b/inst/editor/src/Shiny-Ui-Elements/isShinyUiNode.ts new file mode 100644 index 000000000..4098c3c36 --- /dev/null +++ b/inst/editor/src/Shiny-Ui-Elements/isShinyUiNode.ts @@ -0,0 +1,13 @@ +import type { ShinyUiNode } from "../main"; +import { is_object } from "../utils/is_object"; + +import { shinyUiNodeInfo } from "./uiNodeTypes"; + +export function isShinyUiNode(x: unknown): x is ShinyUiNode { + return ( + is_object(x) && + "uiName" in x && + typeof x.uiName === "string" && + x.uiName in shinyUiNodeInfo + ); +} diff --git a/inst/editor/src/Shiny-Ui-Elements/normalize_ui_name.ts b/inst/editor/src/Shiny-Ui-Elements/normalize_ui_name.ts new file mode 100644 index 000000000..53bea9d3d --- /dev/null +++ b/inst/editor/src/Shiny-Ui-Elements/normalize_ui_name.ts @@ -0,0 +1,28 @@ +import { shinyUiNodeInfo } from "./uiNodeTypes"; + +const get_has_namespace = /^\w+::/; + +/** + * Convert a potentially unspaced ui function name to a namespaced one + * @param fn_name Either bare or namespaced ui name + * @returns Namespace ui name + */ +export function normalize_ui_name(fn_name: string): string { + // If the namespace is already on the name, then just return it + if (get_has_namespace.test(fn_name)) return fn_name; + + // If we have a bare function name we need to loop through the known full + // function names and find the one that ends with the passed bare name + const find_ends_in_fn_name = new RegExp(`^\\w+::${fn_name}$`); + for (const full_name in shinyUiNodeInfo) { + if (find_ends_in_fn_name.test(full_name)) { + return full_name; + } + } + + // If we didnt' find the function in our known functions something has gone + // wrong so we should error + throw new Error( + `Unknown function ${fn_name} made it passed the unknown function filter` + ); +} diff --git a/inst/editor/src/Shiny-Ui-Elements/uiNodeTypes.ts b/inst/editor/src/Shiny-Ui-Elements/uiNodeTypes.ts index 20344e31f..cf8c0665e 100644 --- a/inst/editor/src/Shiny-Ui-Elements/uiNodeTypes.ts +++ b/inst/editor/src/Shiny-Ui-Elements/uiNodeTypes.ts @@ -3,7 +3,8 @@ import type React from "react"; import type { DefaultSettingsFromInfo } from "../components/Inputs/SettingsFormBuilder/buildStaticSettingsInfo"; import type { CustomFormRenderFn } from "../components/Inputs/SettingsFormBuilder/FormBuilder"; import type { DynamicFieldInfo } from "../components/Inputs/SettingsFormBuilder/inputFieldTypes"; -import type { UpdateAction, DeleteAction } from "../state/uiTree"; +import type { DeleteAction, UpdateAction } from "../state/app_info"; +import type { PickKeyFn } from "../TypescriptUtils"; import { dtDTOutputInfo } from "./DtDtOutput"; import { gridlayoutGridCardInfo } from "./GridlayoutGridCard"; @@ -65,6 +66,27 @@ export type UiComponentInfo> = { */ description?: string; + /** + * Does this node have outputs code it connects to in the server side of + * things? If so what's the argument name that links it to the server code? + * Can also supply a function that takes the current arguments for the node + * and returns the key. This is useful for ones where the choice may be + * dynamic. See `GridlayoutGridCardPlot` for an example. + */ + serverBindings?: { + outputs?: { + outputIdKey: keyof NodeSettings | PickKeyFn; + /** Scaffold text to be inserted into the app server if the user requests. + * Can use the [vscode snippet + * syntax](https://code.visualstudio.com/docs/editor/userdefinedsnippets#_create-your-own-snippets). + * */ + renderScaffold: string; + }; + inputs?: { + inputIdKey: keyof NodeSettings | PickKeyFn; + }; + }; + /** * Optional update subscribers */ @@ -139,6 +161,7 @@ export const shinyUiNodeInfo = { }; export type ShinyUiNodeInfo = typeof shinyUiNodeInfo; +export type ShinyUiNodeInfoUnion = ShinyUiNodeInfo[keyof ShinyUiNodeInfo]; type NodeDefaultSettings = DefaultSettingsFromInfo; @@ -178,7 +201,6 @@ export type ShinyUiNodeByName = { uiArguments: ShinyUiArguments[UiName] & Record; /** Any children of this node */ uiChildren?: ShinyUiChildren; - uiHTML?: string; }; }; diff --git a/inst/editor/src/TypescriptUtils.ts b/inst/editor/src/TypescriptUtils.ts index aa02599fd..792e3445e 100644 --- a/inst/editor/src/TypescriptUtils.ts +++ b/inst/editor/src/TypescriptUtils.ts @@ -17,3 +17,5 @@ export type StringKeys> = Extract< keyof T, string >; + +export type PickKeyFn> = (x: Obj) => keyof Obj; diff --git a/inst/editor/src/assets/app-templates/app_templates.ts b/inst/editor/src/assets/app-templates/app_templates.ts index 05ee31a19..575a4fd0b 100644 --- a/inst/editor/src/assets/app-templates/app_templates.ts +++ b/inst/editor/src/assets/app-templates/app_templates.ts @@ -1,52 +1,101 @@ -import type { ShinyUiNode } from "../../main"; +import type { Multi_File_Full_Info, Single_File_Full_Info } from "ast-parsing"; +import { SCRIPT_LOC_KEYS } from "ast-parsing"; +import { indent_line_breaks } from "ast-parsing/src/code_generation/build_function_text"; +import type { MessageToBackendByPath } from "communication-types"; +import type { + Multi_File_Template_Selection, + Single_File_Template_Selection, + TemplateInfo, +} from "communication-types/src/AppTemplates"; + +import { generate_full_app_script } from "../../state/app_model/generate_full_app_script"; +import { write_library_calls } from "../../state/app_model/generate_ui_script"; import { chickWeightsGridTemplate } from "./templates/chickWeightsGrid"; import { chickWeightsNavbar } from "./templates/chickWeightsNavbar"; import { gridGeyserTemplate } from "./templates/gridGeyser"; -/** - * Defines basic information needed to build an app template for the template viewer - */ -export type TemplateInfo = { - /** - * Displayed name of the template in the chooser view - */ - title: string; - /** Long form description of the template available on hover. This can use - * markdown formatting - */ - description: string; - /** - * Main tree definining the template. Used for generating preview and also the - * main ui definition of the template - */ - uiTree: ShinyUiNode; - otherCode: { - /** - * Extra code that will be copied unchanged above the ui definition - */ - uiExtra?: string; - - /** - * List of libraries that need to be loaded in server code - */ - serverLibraries?: string[]; - - /** - * Extra code that will be copied unchanged above server funtion definition - */ - serverExtra?: string; - - /** - * Body of server function. This will be wrapped in the code - * `function(input, output){....}` - */ - serverFunctionBody?: string; - }; -}; - export const app_templates: TemplateInfo[] = [ gridGeyserTemplate, chickWeightsNavbar, chickWeightsGridTemplate, ]; + +export function template_to_app_contents( + selection: Single_File_Template_Selection | Multi_File_Template_Selection +): MessageToBackendByPath["UPDATED-APP"] { + const app_info = + selection.outputType === "SINGLE-FILE" + ? template_to_single_file_info(selection) + : template_to_multi_file_info(selection); + + return generate_full_app_script(app_info, { include_info: true }); +} + +function template_to_single_file_info({ + uiTree, + otherCode: { + uiExtra = "", + serverExtra = "", + serverFunctionBody = "", + serverLibraries = [], + }, +}: Single_File_Template_Selection): Single_File_Full_Info { + const code = `${SCRIPT_LOC_KEYS.libraries} + +${uiExtra} +ui <- ${SCRIPT_LOC_KEYS.ui} + +${serverExtra} +server <- function(input, output) { + ${indent_line_breaks(serverFunctionBody)} +} + +shinyApp(ui, server) + +`; + + return { + app_type: "SINGLE-FILE", + ui_tree: uiTree, + app: { + code, + libraries: ["shiny", ...serverLibraries], + }, + }; +} + +function template_to_multi_file_info({ + uiTree, + otherCode: { + uiExtra = "", + serverExtra = "", + serverFunctionBody = "", + serverLibraries = [], + }, +}: Multi_File_Template_Selection): Multi_File_Full_Info { + const ui_code = `${SCRIPT_LOC_KEYS.libraries} + +${uiExtra} +ui <- ${SCRIPT_LOC_KEYS.ui} +`; + const server_code = `${write_library_calls(serverLibraries)} + +${serverExtra} +server <- function(input, output) { + ${indent_line_breaks(serverFunctionBody)} +} +`; + + return { + app_type: "MULTI-FILE", + ui_tree: uiTree, + ui: { + code: ui_code, + libraries: ["shiny", ...serverLibraries], + }, + server: { + code: server_code, + }, + }; +} diff --git a/inst/editor/src/assets/app-templates/templates/chickWeightsGrid.ts b/inst/editor/src/assets/app-templates/templates/chickWeightsGrid.ts index 487835986..d83ba93bb 100644 --- a/inst/editor/src/assets/app-templates/templates/chickWeightsGrid.ts +++ b/inst/editor/src/assets/app-templates/templates/chickWeightsGrid.ts @@ -1,5 +1,6 @@ +import type { TemplateInfo } from "communication-types/src/AppTemplates"; + import type { ShinyUiNode } from "../../../Shiny-Ui-Elements/uiNodeTypes"; -import type { TemplateInfo } from "../app_templates"; const navbarTree: ShinyUiNode = { uiName: "gridlayout::grid_page", @@ -74,30 +75,30 @@ export const chickWeightsGridTemplate: TemplateInfo = { otherCode: { serverLibraries: ["ggplot2"], serverFunctionBody: ` - output$linePlots <- renderPlot({ - obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks - chicks <- ChickWeight[obs_to_include, ] - - ggplot( - chicks, - aes( - x = Time, - y = weight, - group = Chick - ) - ) + - geom_line(alpha = 0.5) + - ggtitle("Chick weights over time") - }) - - output$dists <- renderPlot({ - ggplot( - ChickWeight, - aes(x = weight) - ) + - facet_wrap(input$distFacet) + - geom_density(fill = "#fa551b", color = "#ee6331") + - ggtitle("Distribution of weights by diet") - })`, +output$linePlots <- renderPlot({ + obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks + chicks <- ChickWeight[obs_to_include, ] + + ggplot( + chicks, + aes( + x = Time, + y = weight, + group = Chick + ) + ) + + geom_line(alpha = 0.5) + + ggtitle("Chick weights over time") +}) + +output$dists <- renderPlot({ + ggplot( + ChickWeight, + aes(x = weight) + ) + + facet_wrap(input$distFacet) + + geom_density(fill = "#fa551b", color = "#ee6331") + + ggtitle("Distribution of weights by diet") +})`, }, }; diff --git a/inst/editor/src/assets/app-templates/templates/chickWeightsNavbar.ts b/inst/editor/src/assets/app-templates/templates/chickWeightsNavbar.ts index 1d6804b11..5beda7118 100644 --- a/inst/editor/src/assets/app-templates/templates/chickWeightsNavbar.ts +++ b/inst/editor/src/assets/app-templates/templates/chickWeightsNavbar.ts @@ -1,5 +1,6 @@ +import type { TemplateInfo } from "communication-types/src/AppTemplates"; + import type { ShinyUiNode } from "../../../main"; -import type { TemplateInfo } from "../app_templates"; const navbarTree: ShinyUiNode = { uiName: "shiny::navbarPage", @@ -116,31 +117,31 @@ export const chickWeightsNavbar: TemplateInfo = { otherCode: { serverLibraries: ["ggplot2"], serverFunctionBody: ` - output$linePlots <- renderPlot({ - obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks - chicks <- ChickWeight[obs_to_include, ] - - ggplot( - chicks, - aes( - x = Time, - y = weight, - group = Chick - ) - ) + - geom_line(alpha = 0.5) + - ggtitle("Chick weights over time") - }) - - output$dists <- renderPlot({ - ggplot( - ChickWeight, - aes(x = weight) - ) + - facet_wrap(input$distFacet) + - geom_density(fill = "#fa551b", color = "#ee6331") + - ggtitle("Distribution of weights by diet") - }) - `, +output$linePlots <- renderPlot({ + obs_to_include <- as.integer(ChickWeight$Chick) <= input$numChicks + chicks <- ChickWeight[obs_to_include, ] + + ggplot( + chicks, + aes( + x = Time, + y = weight, + group = Chick + ) + ) + + geom_line(alpha = 0.5) + + ggtitle("Chick weights over time") +}) + +output$dists <- renderPlot({ + ggplot( + ChickWeight, + aes(x = weight) + ) + + facet_wrap(input$distFacet) + + geom_density(fill = "#fa551b", color = "#ee6331") + + ggtitle("Distribution of weights by diet") +}) +`, }, }; diff --git a/inst/editor/src/assets/app-templates/templates/gridGeyser.ts b/inst/editor/src/assets/app-templates/templates/gridGeyser.ts index 04acc8754..9fd91629b 100644 --- a/inst/editor/src/assets/app-templates/templates/gridGeyser.ts +++ b/inst/editor/src/assets/app-templates/templates/gridGeyser.ts @@ -1,18 +1,19 @@ +import type { TemplateInfo } from "communication-types/src/AppTemplates"; + import type { ShinyUiNode } from "../../../main"; -import type { TemplateInfo } from "../app_templates"; const appTree: ShinyUiNode = { uiName: "gridlayout::grid_page", uiArguments: { - row_sizes: ["100px", "1fr", "1fr", "1fr"], - col_sizes: ["250px", "0.59fr", "1.41fr"], - gap_size: "1rem", layout: [ "header header header", "sidebar bluePlot bluePlot", "table table plotly", "table table plotly", ], + row_sizes: ["100px", "1fr", "1fr", "1fr"], + col_sizes: ["250px", "0.59fr", "1.41fr"], + gap_size: "1rem", }, uiChildren: [ { @@ -107,23 +108,22 @@ export const gridGeyserTemplate: TemplateInfo = { otherCode: { serverLibraries: ["plotly"], serverFunctionBody: ` - output$distPlot <- renderPlotly({ - # generate bins based on input$bins from ui.R - plot_ly(x = ~ faithful[, 2], type = "histogram") - }) - - output$bluePlot <- renderPlot({ - # generate bins based on input$bins from ui.R - x <- faithful[, 2] - bins <- seq(min(x), max(x), length.out = input$bins + 1) - - # draw the histogram with the specified number of bins - hist(x, breaks = bins, col = "steelblue", border = "white") - }) - - - output$myTable <- renderDT({ - head(faithful, input$numRows) - })`, +output$distPlot <- renderPlotly({ + # generate bins based on input$bins from ui.R + plot_ly(x = ~ faithful[, 2], type = "histogram") +}) + +output$bluePlot <- renderPlot({ + # generate bins based on input$bins from ui.R + x <- faithful[, 2] + bins <- seq(min(x), max(x), length.out = input$bins + 1) + + # draw the histogram with the specified number of bins + hist(x, breaks = bins, col = "steelblue", border = "white") +}) + +output$myTable <- renderDT({ + head(faithful, input$numRows) +})`, }, }; diff --git a/inst/editor/src/backendCommunication/messageDispatcher.test.ts b/inst/editor/src/backendCommunication/messageDispatcher.test.ts index f50e886b1..ee1ab1abb 100644 --- a/inst/editor/src/backendCommunication/messageDispatcher.test.ts +++ b/inst/editor/src/backendCommunication/messageDispatcher.test.ts @@ -1,4 +1,4 @@ -import { makeMessageDispatcherGeneric } from "communication-types/src/messageDispatcher"; +import { makeMessageDispatcherGeneric } from "communication-types"; import { vi } from "vitest"; type Payloads = { diff --git a/inst/editor/src/backendCommunication/staticBackend.ts b/inst/editor/src/backendCommunication/staticBackend.ts index a28864d84..4b1748b17 100644 --- a/inst/editor/src/backendCommunication/staticBackend.ts +++ b/inst/editor/src/backendCommunication/staticBackend.ts @@ -1,7 +1,4 @@ -import type { BackendConnection } from "communication-types"; -import type { MessageDispatcher } from "communication-types/src/messageDispatcher"; - -import { TESTING_MODE } from "../env_variables"; +import type { BackendConnection, MessageDispatcher } from "communication-types"; import { getClientsideOnlyTree } from "./getClientsideOnlyTree"; @@ -24,18 +21,26 @@ export function setupStaticBackend({ if (ui_tree === "TEMPLATE_CHOOSER") { messageDispatch.dispatch("TEMPLATE_CHOOSER", "USER-CHOICE"); } else { - messageDispatch.dispatch("UPDATED-TREE", ui_tree); + messageDispatch.dispatch("APP-INFO", { + ui_tree, + app_type: "SINGLE-FILE", + app: { + code: dummy_code, + libraries: ["shiny"], + }, + }); } }); return; } - case "TEMPLATE-SELECTION": { - messageDispatch.dispatch("UPDATED-TREE", msg.payload.uiTree); + case "UPDATED-APP": { + if (msg.payload.info) { + messageDispatch.dispatch("APP-INFO", msg.payload.info); + } return; } case "APP-PREVIEW-REQUEST": { - if (!TESTING_MODE) return; - messageDispatch.dispatch("APP-PREVIEW-STATUS", "FAKE-PREVIEW"); + // Ignore return; } } @@ -45,3 +50,15 @@ export function setupStaticBackend({ }; return messagePassingMethods; } + +const dummy_code: string = ` + + +ui <- + +server <- function(input, output) { + +} + +shinyApp(ui, server) +`; diff --git a/inst/editor/src/backendCommunication/useSyncUiWithBackend.tsx b/inst/editor/src/backendCommunication/useSyncUiWithBackend.tsx index dd7f25d2f..7c988141a 100644 --- a/inst/editor/src/backendCommunication/useSyncUiWithBackend.tsx +++ b/inst/editor/src/backendCommunication/useSyncUiWithBackend.tsx @@ -6,21 +6,23 @@ import { useDispatch } from "react-redux"; import { useDeleteNode } from "../components/DeleteNodeButton/useDeleteNode"; import { useUndoRedo } from "../state-logic/useUndoRedo"; -import { getNamedPath } from "../state/getNamedPath"; -import { useCurrentSelection } from "../state/selectedPath"; -import type { MainStateOption } from "../state/uiTree"; +import type { MainStateOption } from "../state/app_info"; import { - SET_UI_TREE, + SET_APP_INFO, SHOW_TEMPLATE_CHOOSER, - useCurrentUiTree, -} from "../state/uiTree"; + useCurrentAppInfo, +} from "../state/app_info"; +import { generate_full_app_script } from "../state/app_model/generate_full_app_script"; +import { raw_app_info_to_full } from "../state/app_model/raw_app_info_to_full"; +import { getNamedPath } from "../state/getNamedPath"; +import { useCurrentSelection } from "../state/selectedPath"; import { useKeyboardShortcuts } from "../utils/hooks/useKeyboardShortcuts"; import { useBackendConnection } from "./useBackendMessageCallbacks"; export function useSyncUiWithBackend() { const { sendMsg, incomingMsgs: backendMsgs, mode } = useBackendConnection(); - const state = useCurrentUiTree(); + const state = useCurrentAppInfo(); const currentSelection = useCurrentSelection(); const dispatch = useDispatch(); @@ -56,13 +58,13 @@ export function useSyncUiWithBackend() { // Subscribe to messages from the backend React.useEffect(() => { - const updatedTreeSubscription = backendMsgs.subscribe( - "UPDATED-TREE", - (uiTree) => { - dispatch(SET_UI_TREE({ uiTree: uiTree })); - lastRecievedRef.current = { mode: "MAIN", uiTree }; - } - ); + const updatedAppSubscription = backendMsgs.subscribe("APP-INFO", (info) => { + const full_info = "ui_tree" in info ? info : raw_app_info_to_full(info); + + dispatch(SET_APP_INFO(full_info)); + lastRecievedRef.current = { mode: "MAIN", ...full_info }; + console.log("Full app info", full_info); + }); const templateChooserSubscription = backendMsgs.subscribe( "TEMPLATE_CHOOSER", @@ -85,7 +87,7 @@ export function useSyncUiWithBackend() { sendMsg({ path: "READY-FOR-STATE" }); return () => { - updatedTreeSubscription.unsubscribe(); + updatedAppSubscription.unsubscribe(); templateChooserSubscription.unsubscribe(); backendErrorSubscription.unsubscribe(); }; @@ -99,7 +101,7 @@ export function useSyncUiWithBackend() { // Send named path to the backend if we're in VSCODE mode React.useEffect(() => { if (mode !== "VSCODE" || !currentSelection || state.mode !== "MAIN") return; - const namedPath = getNamedPath(currentSelection, state.uiTree); + const namedPath = getNamedPath(currentSelection, state.ui_tree); sendMsg({ path: "NODE-SELECTION", payload: namedPath }); }, [currentSelection, mode, sendMsg, state]); @@ -120,8 +122,8 @@ export function useSyncUiWithBackend() { } debouncedSendMsg({ - path: "UPDATED-TREE", - payload: state.uiTree, + path: "UPDATED-APP", + payload: generate_full_app_script(state, { include_info: false }), }); }, [state, debouncedSendMsg, sendMsg]); diff --git a/inst/editor/src/backendCommunication/websocketBackend.ts b/inst/editor/src/backendCommunication/websocketBackend.ts index 90c735319..40671acdf 100644 --- a/inst/editor/src/backendCommunication/websocketBackend.ts +++ b/inst/editor/src/backendCommunication/websocketBackend.ts @@ -2,8 +2,8 @@ import type { BackendConnection, MessageToClient, MessageToBackend, + MessageDispatcher, } from "communication-types"; -import type { MessageDispatcher } from "communication-types/src/messageDispatcher"; type BackendMessage = { path: string; payload?: string | object }; diff --git a/inst/editor/src/components/AppPreview/FakeDashboard.module.css b/inst/editor/src/components/AppPreview/FakeDashboard.module.css deleted file mode 100644 index eb5b1781d..000000000 --- a/inst/editor/src/components/AppPreview/FakeDashboard.module.css +++ /dev/null @@ -1,42 +0,0 @@ -.fakeApp { - display: grid; - place-content: center; - font-size: 4rem; -} - -.fakeDashboard { - display: grid; - gap: 5px; - grid: - "header header" 100px - "sidebar top " 2fr - "sidebar bottom" 1fr - / 150px 1fr; -} - -.fakeDashboard > div { - width: 100%; - height: 100%; -} - -.fakeDashboard > .header { - grid-area: header; - background-color: hsl(288 59% 58% / 0.7); - display: grid; - place-content: center; -} -.header > h1 { - color: white; -} -.fakeDashboard > .sidebar { - grid-area: sidebar; - background-color: hsl(30 59% 53% / 0.7); -} -.fakeDashboard > .top { - grid-area: top; - background-color: hsl(120 61% 34% / 0.7); -} -.fakeDashboard > .bottom { - grid-area: bottom; - background-color: hsl(207 44% 49% / 0.7); -} diff --git a/inst/editor/src/components/AppPreview/FakeDashboard.tsx b/inst/editor/src/components/AppPreview/FakeDashboard.tsx deleted file mode 100644 index b1acdfc56..000000000 --- a/inst/editor/src/components/AppPreview/FakeDashboard.tsx +++ /dev/null @@ -1,28 +0,0 @@ -import React from "react"; - -import { mergeClasses } from "../../utils/mergeClasses"; - -import previewClasses from "./AppPreview.module.css"; -import classes from "./FakeDashboard.module.css"; - -const FakeDashboard = () => { - return ( -
    -
    -
    -

    App preview not available

    -
    -
    -
    -
    -
    -
    - ); -}; - -export default FakeDashboard; diff --git a/inst/editor/src/components/AppPreview/ShowAppText.module.css b/inst/editor/src/components/AppPreview/ShowAppText.module.css new file mode 100644 index 000000000..b64891547 --- /dev/null +++ b/inst/editor/src/components/AppPreview/ShowAppText.module.css @@ -0,0 +1,48 @@ +.show_btn { + margin: var(--size-md); +} + +.modal { + border: 1px solid grey; + background-color: var(--rstudio-white); + display: flex; + flex-direction: column; + border-radius: var(--corner-radius); + overflow: scroll; + padding-block: var(--size-lg); + padding-inline: var(--size-xl); + max-width: 800px; + width: 99%; +} + +.title { + margin-block-end: var(--size-md); +} + +.description { + padding-inline-start: var(--size-md); +} + +.code_holder { + max-height: 70vh; + overflow-y: scroll; + margin-block: var(--size-sm); +} + +.code_holder > * { + padding: var(--size-md); + background-color: var(--light-grey); +} + +.code_holder > label { + padding-block: var(--size-sm) 0; + border-radius: var(--corner-radius) var(--corner-radius) 0 0; + color: var(--rstudio-blue); +} + +.footer { + display: flex; + flex-direction: row; + justify-content: flex-end; + margin-block-start: var(--size-md); +} diff --git a/inst/editor/src/components/AppPreview/ShowAppText.tsx b/inst/editor/src/components/AppPreview/ShowAppText.tsx new file mode 100644 index 000000000..40f022626 --- /dev/null +++ b/inst/editor/src/components/AppPreview/ShowAppText.tsx @@ -0,0 +1,94 @@ +import React from "react"; + +import type { Multi_File_Full_Info, Single_File_Full_Info } from "ast-parsing"; +import { useStore } from "react-redux"; + +import { DialogPopover } from "../../EditorContainer/DialogPopover"; +import { PanelHeader } from "../../EditorSkeleton/EditorSkeleton"; +import { generate_full_app_script } from "../../state/app_model/generate_full_app_script"; +import type { RootState } from "../../state/store"; +import Button from "../Inputs/Button/Button"; +import { TooltipButton } from "../PopoverEl/Tooltip"; + +import classes from "./AppPreview.module.css"; +import styles from "./ShowAppText.module.css"; + +function AppFilesViewer({ + info, +}: { + info: Single_File_Full_Info | Multi_File_Full_Info; +}) { + const app_scripts = generate_full_app_script(info, { include_info: false }); + + if (app_scripts.app_type === "SINGLE-FILE") { + return ( + <> +

    App script

    +

    + The following code defines the currently being edited app. Copy and + paste it to an app.R file to use. +

    +
    + +
    {app_scripts.app}
    +
    + + ); + } + + return ( + <> +

    App scripts

    +

    + The following code defines the currently being edited app. Copy and + paste the ui and server scripts into ui.R and{" "} + server.R files to use. +

    +
    + +
    {app_scripts.ui}
    +
    +
    + +
    {app_scripts.server}
    +
    + + ); +} +export function ShowAppText() { + const [script_visible, set_script_visible] = React.useState(false); + const store = useStore(); + + const current_state = (store.getState() as RootState).app_info; + + if (current_state.mode !== "MAIN") return null; + + return ( + <> + Code + set_script_visible((is_visible) => !is_visible)} + variant="regular" + > + Get app script + + {script_visible ? ( + set_script_visible(false)} + > +
    + +
    + +
    + +
    + ) : null} + + ); +} diff --git a/inst/editor/src/components/AppPreview/index.tsx b/inst/editor/src/components/AppPreview/index.tsx index 5108ab714..e17d59758 100644 --- a/inst/editor/src/components/AppPreview/index.tsx +++ b/inst/editor/src/components/AppPreview/index.tsx @@ -10,8 +10,8 @@ import Button from "../Inputs/Button/Button"; import { TooltipButton } from "../PopoverEl/Tooltip"; import classes from "./AppPreview.module.css"; -import FakeDashboard from "./FakeDashboard"; import { LogsViewer } from "./LogsViewer"; +import { ShowAppText } from "./ShowAppText"; import { useCommunicateWithBackend } from "./useCommunicateWithBackend"; import { usePreviewScale } from "./usePreviewScale"; @@ -48,7 +48,7 @@ export default function AppPreview() { // in development mode we want to hide the preview window when there's no app // preview present to not confuse users if (appLoc === "HIDDEN") { - return null; + return ; } const ReloadButton = ({ isExpandedMode }: { isExpandedMode: boolean }) => ( @@ -88,9 +88,7 @@ export default function AppPreview() { <>
    - {appLoc === "FAKE-PREVIEW" ? ( - - ) : appLoc === "LOADING" ? ( + {appLoc === "LOADING" ? ( ) : (